Skip to content

Commit

Permalink
unwrap examples
Browse files Browse the repository at this point in the history
  • Loading branch information
aravindhebbali committed Dec 28, 2018
1 parent e41ebf1 commit 6b65596
Show file tree
Hide file tree
Showing 15 changed files with 4 additions and 36 deletions.
2 changes: 0 additions & 2 deletions R/rbin-create-bins.R
Original file line number Diff line number Diff line change
Expand Up @@ -9,10 +9,8 @@
#' @return \code{data} with dummy variables.
#'
#' @examples
#' \donttest{
#' k <- rbin_manual(mbank, y, age, c(29, 31, 34, 36, 39, 42, 46, 51, 56))
#' rbin_create(mbank, age, k)
#' }
#'
#' @export
#'
Expand Down
2 changes: 0 additions & 2 deletions R/rbin-equal-freq.R
Original file line number Diff line number Diff line change
Expand Up @@ -10,9 +10,7 @@
#' @return A \code{tibble}.
#'
#' @examples
#' \donttest{
#' rbin_equal_freq(mbank, y, age, 10)
#' }
#'
#' @importFrom magrittr %>%
#' @importFrom rlang !!
Expand Down
2 changes: 0 additions & 2 deletions R/rbin-equal-length.R
Original file line number Diff line number Diff line change
Expand Up @@ -13,14 +13,12 @@
#' @return A \code{tibble}.
#'
#' @examples
#' \donttest{
#' bins <- rbin_equal_length(mbank, y, age, 10)
#' bins
#'
#' # plot
#' plot(bins)
#'
#' }
#' @export
#'
rbin_equal_length <- function(data = NULL, response = NULL, predictor = NULL, bins = 10, include_na = TRUE) UseMethod("rbin_equal_length")
Expand Down
8 changes: 2 additions & 6 deletions R/rbin-factor.R
Original file line number Diff line number Diff line change
Expand Up @@ -58,14 +58,12 @@ rbin_factor_combine <- function(data, var, new_var, new_name) {
#' @param ... further arguments passed to or from other methods.
#'
#' @examples
#' \donttest{
#' bins <- rbin_factor(mbank, y, education)
#' bins
#'
#' # plot
#' plot(bins)
#' }
#'
#'
#' @importFrom magrittr %<>%
#'
#' @export
Expand Down Expand Up @@ -178,12 +176,10 @@ plot.rbin_factor <- function(x, ...) {
#' @return A \code{tibble} with dummy variables.
#'
#' @examples
#' \donttest{
#' upper <- c("secondary", "tertiary")
#' out <- rbin_factor_combine(mbank, education, upper, "upper")
#' rbin_factor_create(out, education)
#' }
#'
#'
#' @export
#'
rbin_factor_create <- function(data, predictor) {
Expand Down
4 changes: 1 addition & 3 deletions R/rbin-manual.R
Original file line number Diff line number Diff line change
Expand Up @@ -19,14 +19,12 @@
#' values between the minimum and including 36, then you will enter the value 37.
#'
#' @examples
#' \donttest{
#' bins <- rbin_manual(mbank, y, age, c(29, 31, 34, 36, 39, 42, 46, 51, 56))
#' bins
#'
#' # plot
#' plot(bins)
#' }
#'
#'
#' @export
#'
rbin_manual <- function(data = NULL, response = NULL, predictor = NULL, cut_points = NULL, include_na = TRUE) UseMethod("rbin_manual")
Expand Down
4 changes: 1 addition & 3 deletions R/rbin-quantile.R
Original file line number Diff line number Diff line change
Expand Up @@ -13,14 +13,12 @@
#' @return A \code{tibble}.
#'
#' @examples
#' \donttest{
#' bins <- rbin_quantiles(mbank, y, age, 10)
#' bins
#'
#' # plot
#' plot(bins)
#' }
#'
#'
#' @export
#'
rbin_quantiles <- function(data = NULL, response = NULL, predictor = NULL, bins = 10, include_na = TRUE) UseMethod("rbin_quantiles")
Expand Down
2 changes: 0 additions & 2 deletions R/rbin-winsorize.R
Original file line number Diff line number Diff line change
Expand Up @@ -16,13 +16,11 @@
#' @return A \code{tibble}.
#'
#' @examples
#' \donttest{
#' bins <- rbin_winsorize(mbank, y, age, 10, winsor_rate = 0.05)
#' bins
#'
#' # plot
#' plot(bins)
#' }
#'
#' @export
#'
Expand Down
2 changes: 0 additions & 2 deletions man/rbin_create.Rd

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

2 changes: 0 additions & 2 deletions man/rbin_equal_freq.Rd

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

2 changes: 0 additions & 2 deletions man/rbin_equal_length.Rd

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

2 changes: 0 additions & 2 deletions man/rbin_factor.Rd

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

2 changes: 0 additions & 2 deletions man/rbin_factor_create.Rd

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

2 changes: 0 additions & 2 deletions man/rbin_manual.Rd

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

2 changes: 0 additions & 2 deletions man/rbin_quantiles.Rd

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

2 changes: 0 additions & 2 deletions man/rbin_winsorize.Rd

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

0 comments on commit 6b65596

Please sign in to comment.