R/plot_vi.R

Defines functions plot_vi

Documented in plot_vi

#' Plot variable importance
#'
#' Plot variable importance scores for the predictors in a model.
#'
#' @param vi Data frame containing the variable importance scores as returned by
#'   \code{\link{get_vi}}.
#' @return ggplot object showing the variable importance scores in \code{vi}.
#' @examples
#' \dontrun{
#' data('mtpl_be')
#' features <- setdiff(names(mtpl_be), c('id', 'nclaims', 'expo', 'long', 'lat'))
#' set.seed(12345)
#' gbm_fit <- gbm::gbm(as.formula(paste('nclaims ~',
#'                                paste(features, collapse = ' + '))),
#'                     distribution = 'poisson',
#'                     data = mtpl_be,
#'                     n.trees = 50,
#'                     interaction.depth = 3,
#'                     shrinkage = 0.1)
#' gbm_fit %>% get_vi %>% plot_vi
#' gbm_fit %>% get_vi(scale = TRUE) %>% plot_vi
#' gbm_fit %>% get_vi %>% dplyr::mutate(Importance = Importance / 100) %>% plot_vi + scale_y_continuous(labels = scales::percent)
#'
#' }
#' @export
plot_vi <- function(vi) {
  vi %>% ggplot(aes(x = reorder(Variable,Importance), Importance)) +
    geom_bar(stat = 'identity') + theme_bw() + labs(x = '', y = 'Importance') + coord_flip()
}
henckr/maidrr documentation built on July 27, 2023, 3:17 p.m.