Skip to content

Commit

Permalink
commented out a few more lines
Browse files Browse the repository at this point in the history
  • Loading branch information
topepo committed Nov 15, 2018
1 parent 9a25770 commit 263f3bf
Show file tree
Hide file tree
Showing 3 changed files with 10 additions and 10 deletions.
10 changes: 5 additions & 5 deletions R/posteriors.R
Expand Up @@ -67,8 +67,8 @@ tidy.perf_mod <- function(x, seed = sample.int(10000, 1), ...) {
#'
#' # load(load(url(ex_dat))
#'
#' posterior_values <- tidy(roc_model)
#' summary(posterior_values)
#' # posterior_values <- tidy(roc_model)
#' # summary(posterior_values)
#'
#' @export
#' @importFrom dplyr group_by do summarise full_join
Expand Down Expand Up @@ -104,10 +104,10 @@ summary.posterior <- function(object, prob = 0.90,
#'
#' # load(load(url(ex_dat))
#'
#' posterior_values <- tidy(roc_model)
#' # posterior_values <- tidy(roc_model)
#'
#' library(ggplot2)
#' ggplot(posterior_values) + theme_bw()
#' # library(ggplot2)
#' # ggplot(posterior_values) + theme_bw()
#' @export
#' @importFrom ggplot2 ggplot geom_violin xlab ylab
#' @importFrom stats reorder
Expand Down
6 changes: 3 additions & 3 deletions man/ggplot.posterior.Rd

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

4 changes: 2 additions & 2 deletions man/summary.posterior.Rd

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

0 comments on commit 263f3bf

Please sign in to comment.