Skip to content

Commit

Permalink
import ::: functions
Browse files Browse the repository at this point in the history
  • Loading branch information
lilyclements committed Jun 12, 2024
1 parent cd5beb2 commit d2811c0
Show file tree
Hide file tree
Showing 3 changed files with 6 additions and 6 deletions.
6 changes: 4 additions & 2 deletions R/read_corpora_to_ggwalter_lieth.R
Original file line number Diff line number Diff line change
Expand Up @@ -586,13 +586,15 @@ convert_to_list <- function(x) {
#' }
#' @export
getExample <- function (topic, package = NULL, lib.loc = NULL, character.only = TRUE, give.lines = FALSE, local = FALSE, echo = TRUE, verbose = getOption("verbose"), setRNG = FALSE, ask = getOption("example.ask"), prompt.prefix = abbreviate(topic, 6), run.dontrun = FALSE, run.donttest = interactive()) {
index.search < -utils::getFromNamespace("index.search", "utils")
`.getHelpFile` <- utils::getFromNamespace(".getHelpFile", "utils")
if (!character.only) {
topic <- substitute(topic)
if (!is.character(topic))
topic <- deparse(topic)[1L]
}
pkgpaths <- find.package(package, lib.loc, verbose = verbose)
file <- utils:::index.search(topic, pkgpaths, firstOnly = TRUE)
file <- index.search(topic, pkgpaths, firstOnly = TRUE)
if (!length(file)) {
warning(gettextf("no help found for %s", sQuote(topic)),
domain = NA)
Expand All @@ -604,7 +606,7 @@ getExample <- function (topic, package = NULL, lib.loc = NULL, character.only =
pkgname <- basename(packagePath)
lib <- dirname(packagePath)
tf <- tempfile("Rex")
tools::Rd2ex(utils:::.getHelpFile(file), tf, commentDontrun = !run.dontrun,
tools::Rd2ex(.getHelpFile(file), tf, commentDontrun = !run.dontrun,
commentDonttest = !run.donttest)
if (!file.exists(tf)) {
if (give.lines)
Expand Down
3 changes: 1 addition & 2 deletions R/slopegraph.R
Original file line number Diff line number Diff line change
Expand Up @@ -10,8 +10,7 @@
#'
#' @param data a dataframe or an object that can be coerced to a dataframe.
#' Basic error checking is performed, to include ensuring that the named columns
#' exist in the dataframe. See the \code{\link{newcancer}} dataset for an example of
#' how the dataframe should be organized.
#' exist in the dataframe.
#' @param x a column inside the dataframe that will be plotted on the x axis.
#' Traditionally this is some measure of time. The function accepts a column of class
#' ordered, factor or character. NOTE if your variable is currently a "date" class
Expand Down
3 changes: 1 addition & 2 deletions man/slopegraph.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit d2811c0

Please sign in to comment.