StepReg report

knitr::opts_chunk$set(echo=FALSE)
library(ggplot2)
library(stringr)
library(flextable)

{.tabset}

Statistics

Statistics of Variable Selection:

params$modelSelection
nmetric <- length(unlist(str_split(params$modelSelection[[1]][3,2], "&")))
strategies <- length(unlist(str_split(params$modelSelection[[1]][2,2], "&")))

Visualization

Visualization of Variable Selection:

for(i in names(params$selectionPlot)) {
  print(i)
  print(plot_grid(plotlist = c( rev(params$selectionPlot[[i]])), ncol = 1, rel_heights = c(1, as.numeric(params$relValue))))
}

Model Vote

Model Selection by Vote Across All Combinations of Strategy and Metric:

flextable(params$modelVote)


Try the StepReg package in your browser

Any scripts or data that you put into this service are public.

StepReg documentation built on Oct. 13, 2024, 1:07 a.m.