Skip to content

Commit 5af2958

Browse files
authored
check for availability of Hmisc. closes #3857 (#3858)
1 parent 1223de2 commit 5af2958

File tree

2 files changed

+4
-0
lines changed

2 files changed

+4
-0
lines changed

R/stat-summary.r

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -226,11 +226,13 @@ summarise_by_x <- function(data, summary, ...) {
226226
#' @return A data frame with columns `y`, `ymin`, and `ymax`.
227227
#' @name hmisc
228228
#' @examples
229+
#' if (requireNamespace("Hmisc", quietly = TRUE)) {
229230
#' x <- rnorm(100)
230231
#' mean_cl_boot(x)
231232
#' mean_cl_normal(x)
232233
#' mean_sdl(x)
233234
#' median_hilow(x)
235+
#' }
234236
NULL
235237

236238
wrap_hmisc <- function(fun) {

man/hmisc.Rd

Lines changed: 2 additions & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)