R/utils-glue.R

Defines functions glue_data_chr glue_chr

# wrappers that apply as.character() to glue functions

glue_chr <- function(...) {
  as.character(glue(..., .envir = parent.frame(1)))
}

glue_data_chr <- function(.x, ...) {
  as.character(glue_data(.x = .x, ..., .envir = parent.frame(1)))
}
r-lib/usethis documentation built on April 11, 2025, 7:42 p.m.