R/roxygen2.R

Defines functions rfc

rfc <- function(num, sec = NULL) {
  paste0(
    "[",
    if (!is.null(sec)) paste0("Section ", sec, " of "),
    "RFC ", num, "]",
    "(https://datatracker.ietf.org/doc/html/rfc", num,
    if (!is.null(sec)) paste0("#section-", sec),
    ")"
  )
}
r-lib/httr2 documentation built on Aug. 24, 2024, 3:32 a.m.