Skip to content

Commit

Permalink
Replace single quotes with escaped double quotes
Browse files Browse the repository at this point in the history
This fixes the behavior on Windows, which does not always recognize single quotes. This can lead to clangd failing to compile the database correctly.
  • Loading branch information
tylermorganwall authored Nov 19, 2024
1 parent 57c144c commit f8c0945
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/compilation-db.R
Original file line number Diff line number Diff line change
Expand Up @@ -268,5 +268,5 @@ linking_to_flags <- function(desc) {
paths <- vapply(linking_to, function(pkg) system.file("include", package = pkg), "")
paths <- paths[paths != ""]

paste(paste0("-I'", paths, "'"), collapse = " ")
paste(paste0("-I\"", paths, "\""), collapse = " ")

Check warning on line 271 in R/compilation-db.R

View check run for this annotation

Codecov / codecov/patch

R/compilation-db.R#L271

Added line #L271 was not covered by tests
}

0 comments on commit f8c0945

Please sign in to comment.