Skip to content

Commit ee809f6

Browse files
committed
Drop unnecessary namespacing; use the helpers
1 parent 25adfe1 commit ee809f6

File tree

2 files changed

+3
-3
lines changed

2 files changed

+3
-3
lines changed

R/use_github_file.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -136,7 +136,7 @@ parse_file_url <- function(x) {
136136
out$repo_spec <- make_spec(owner = dat$repo_owner, repo = dat$repo_name)
137137
out$path <- dat_fragment$path
138138
out$ref <- dat_fragment$ref
139-
out$host <- as.character(glue("https://{dat$host}"))
139+
out$host <- glue_chr("https://{dat$host}")
140140

141141
out
142142
}

R/utils-glue.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1,9 +1,9 @@
11
# wrappers that apply as.character() to glue functions
22

33
glue_chr <- function(...) {
4-
as.character(glue::glue(..., .envir = parent.frame(1)))
4+
as.character(glue(..., .envir = parent.frame(1)))
55
}
66

77
glue_data_chr <- function(.x, ...) {
8-
as.character(glue::glue_data(.x = .x, ..., .envir = parent.frame(1)))
8+
as.character(glue_data(.x = .x, ..., .envir = parent.frame(1)))
99
}

0 commit comments

Comments
 (0)