diff --git a/DESCRIPTION b/DESCRIPTION index 0c6d08c..92ee8fd 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -42,6 +42,7 @@ Imports: yardstick Suggests: covr, + finetune, knitr, markdown, modeldata, diff --git a/NEWS.md b/NEWS.md index 3b66239..0374e7c 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,5 +1,7 @@ # shinymodels (development version) +* Resolved a number of CRAN NOTEs related to documentation formatting. + # shinymodels 0.1.0 * First CRAN release diff --git a/R/multi_class_diag_plots.R b/R/multi_class_diag_plots.R index d19dadb..54a5e60 100644 --- a/R/multi_class_diag_plots.R +++ b/R/multi_class_diag_plots.R @@ -2,7 +2,7 @@ #' model #' #' This function plots the predicted probabilities against the observed class based on -#' {tidymodels} results for a multi-class classification model. +#' tidymodels results for a multi-class classification model. #' @param dat The predictions data frame in the [organize_data()] result. Following #' variables are required: `.outcome`, `.pred`, `.color`, and `.hover`. #' @param y_name The y/response variable for the model. @@ -57,7 +57,7 @@ plot_multiclass_conf_mat <- function(dat) { #' classification model #' #' This function plots the predicted probabilities against a numeric column based -#' on {tidymodels} results for a multi-class classification model. +#' on tidymodels results for a multi-class classification model. #' @inheritParams plot_multiclass_obs_pred #' @param numcol The numerical column to plot against the predicted probabilities. #' @param alpha The opacity for the geom points. @@ -138,7 +138,7 @@ plot_multiclass_pred_numcol <- #' model #' #' This function plots the predicted probabilities against a factor column based on -#' {tidymodels} results for a multi-class classification model. +#' tidymodels results for a multi-class classification model. #' @inheritParams plot_multiclass_obs_pred #' @inheritParams plot_multiclass_pred_numcol #' @param factorcol The factor column to plot against the predicted probabilities. diff --git a/R/regression_diag_plots.R b/R/regression_diag_plots.R index e9537e5..ae1b331 100644 --- a/R/regression_diag_plots.R +++ b/R/regression_diag_plots.R @@ -1,7 +1,7 @@ #' Visualizing observed vs. predicted values for a regression model #' #' This function plots the predicted values against the observed values based on -#' {tidymodels} results for a regression model. +#' tidymodels results for a regression model. #' @param dat The predictions data frame in the [organize_data()] result. Following #' variables are required: `.outcome`, `.pred`, `.color`, and `.hover`. #' @param y_name The y/response variable for the model. @@ -38,7 +38,7 @@ plot_numeric_obs_pred <- function(dat, y_name, alpha = 1, size = 1, source = NUL #' Visualizing residuals vs. predicted values for a regression model #' #' This function plots the predicted values against the residuals based on -#' {tidymodels} results for a regression model. +#' tidymodels results for a regression model. #' @inheritParams plot_numeric_obs_pred #' @keywords internal #' @export @@ -68,7 +68,7 @@ plot_numeric_res_pred <- function(dat, y_name, size = 1, source = NULL) { #' Visualizing residuals vs. a numeric column for a regression model #' #' This function plots the residuals against a numeric column based on -#' {tidymodels} results for a regression model. +#' tidymodels results for a regression model. #' @inheritParams plot_numeric_obs_pred #' @param numcol The numerical column to plot against the residuals. #' @keywords internal @@ -99,7 +99,7 @@ plot_numeric_res_numcol <- #' Visualizing residuals vs. a factor column for a regression model #' #' This function plots the residuals against a factor column based on -#' {tidymodels} results for a regression model. +#' tidymodels results for a regression model. #' @inheritParams plot_numeric_obs_pred #' @param factorcol The factor column to plot against the residuals. #' @keywords internal diff --git a/R/shiny_models.R b/R/shiny_models.R index 0043b70..6e221c4 100644 --- a/R/shiny_models.R +++ b/R/shiny_models.R @@ -12,7 +12,6 @@ #' @param hover_only A logical to determine if interactive highlighting of #' points is enabled (the default) or not. This can be helpful for very large #' data sets. -#' @param original_data Original dataset. #' @param ... Other parameters not currently used. #' @return A shiny application. #' @export diff --git a/R/two_class_diag_plots.R b/R/two_class_diag_plots.R index be1e2e6..d2b7793 100644 --- a/R/two_class_diag_plots.R +++ b/R/two_class_diag_plots.R @@ -2,7 +2,7 @@ #' model #' #' This function plots the predicted probabilities against the observed class based on -#' {tidymodels} results for a two-class classification model. +#' tidymodels results for a two-class classification model. #' @param dat The predictions data frame in the [organize_data()] result. Following #' variables are required: `.outcome`, `.pred`, `.color`, and `.hover`. #' @param y_name The y/response variable for the model. @@ -53,7 +53,7 @@ plot_twoclass_conf_mat <- function(dat) { #' classification model #' #' This function plots the predicted probabilities against a numeric column based -#' on {tidymodels} results for a two-class classification model. +#' on tidymodels results for a two-class classification model. #' @inheritParams plot_twoclass_obs_pred #' @param numcol The numerical column to plot against the predicted probabilities. #' @param alpha The opacity for the geom points. @@ -125,7 +125,7 @@ plot_twoclass_pred_numcol <- #' model #' #' This function plots the predicted probabilities against a factor column based on -#' {tidymodels} results for a two-class classification model. +#' tidymodels results for a two-class classification model. #' @inheritParams plot_twoclass_obs_pred #' @inheritParams plot_twoclass_pred_numcol #' @param factorcol The factor column to plot against the predicted probabilities. diff --git a/inst/welcome/welcome_tab.Rmd b/inst/welcome/welcome_tab.Rmd index 5d84a0e..c778185 100644 --- a/inst/welcome/welcome_tab.Rmd +++ b/inst/welcome/welcome_tab.Rmd @@ -5,9 +5,9 @@ output: html_document ### Welcome to Shinymodels -{shiny} + {tidymodels} = {shinymodels} +shiny + tidymodels = shinymodels -The {shinymodels} app is designed to explore a {tidymodels} object. Our aim is to visualize the modeled data and help detect any problematic observations while modeling. +The shinymodels app is designed to explore a tidymodels object. Our aim is to visualize the modeled data and help detect any problematic observations while modeling. ### General purpose @@ -25,7 +25,7 @@ There are mainly two categories of tabs in the app: This package was built by Shisham Adhikari (UC Davis) under the supervision of Max Kuhn (RStudio) and Julia Silge (RStudio) as a part of the RStudio summer internship 2021. Your suggestions, feedback, complaints, or compliments are highly valued and will guide us to improve the package continuously. To give feedback, file a bug report, or ask a question, go to the [GitHub issues page](https://github.com/tidymodels/shinymodels/issues) or go to [RStudio Community](https://community.rstudio.com/) and create a post with the tag `tidymodels`. -For more information on {tidymodels}: +For more information on tidymodels: * [`tidymodels.org`](https://www.tidymodels.org/) diff --git a/man/plot_multiclass_obs_pred.Rd b/man/plot_multiclass_obs_pred.Rd index 0020fee..f8676c3 100644 --- a/man/plot_multiclass_obs_pred.Rd +++ b/man/plot_multiclass_obs_pred.Rd @@ -20,6 +20,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the predicted probabilities against the observed class based on -{tidymodels} results for a multi-class classification model. +tidymodels results for a multi-class classification model. } \keyword{internal} diff --git a/man/plot_multiclass_pred_factorcol.Rd b/man/plot_multiclass_pred_factorcol.Rd index 2e62deb..9cb30c8 100644 --- a/man/plot_multiclass_pred_factorcol.Rd +++ b/man/plot_multiclass_pred_factorcol.Rd @@ -40,6 +40,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the predicted probabilities against a factor column based on -{tidymodels} results for a multi-class classification model. +tidymodels results for a multi-class classification model. } \keyword{internal} diff --git a/man/plot_multiclass_pred_numcol.Rd b/man/plot_multiclass_pred_numcol.Rd index f1f6df9..c671db1 100644 --- a/man/plot_multiclass_pred_numcol.Rd +++ b/man/plot_multiclass_pred_numcol.Rd @@ -40,6 +40,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the predicted probabilities against a numeric column based -on {tidymodels} results for a multi-class classification model. +on tidymodels results for a multi-class classification model. } \keyword{internal} diff --git a/man/plot_numeric_obs_pred.Rd b/man/plot_numeric_obs_pred.Rd index e9ec610..c9f2e82 100644 --- a/man/plot_numeric_obs_pred.Rd +++ b/man/plot_numeric_obs_pred.Rd @@ -24,6 +24,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the predicted values against the observed values based on -{tidymodels} results for a regression model. +tidymodels results for a regression model. } \keyword{internal} diff --git a/man/plot_numeric_res_factorcol.Rd b/man/plot_numeric_res_factorcol.Rd index 32c808d..b19ba51 100644 --- a/man/plot_numeric_res_factorcol.Rd +++ b/man/plot_numeric_res_factorcol.Rd @@ -33,6 +33,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the residuals against a factor column based on -{tidymodels} results for a regression model. +tidymodels results for a regression model. } \keyword{internal} diff --git a/man/plot_numeric_res_numcol.Rd b/man/plot_numeric_res_numcol.Rd index 257870a..31aa511 100644 --- a/man/plot_numeric_res_numcol.Rd +++ b/man/plot_numeric_res_numcol.Rd @@ -33,6 +33,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the residuals against a numeric column based on -{tidymodels} results for a regression model. +tidymodels results for a regression model. } \keyword{internal} diff --git a/man/plot_numeric_res_pred.Rd b/man/plot_numeric_res_pred.Rd index 56edd79..1215037 100644 --- a/man/plot_numeric_res_pred.Rd +++ b/man/plot_numeric_res_pred.Rd @@ -22,6 +22,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the predicted values against the residuals based on -{tidymodels} results for a regression model. +tidymodels results for a regression model. } \keyword{internal} diff --git a/man/plot_twoclass_obs_pred.Rd b/man/plot_twoclass_obs_pred.Rd index c41de8d..8632373 100644 --- a/man/plot_twoclass_obs_pred.Rd +++ b/man/plot_twoclass_obs_pred.Rd @@ -22,6 +22,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the predicted probabilities against the observed class based on -{tidymodels} results for a two-class classification model. +tidymodels results for a two-class classification model. } \keyword{internal} diff --git a/man/plot_twoclass_pred_factorcol.Rd b/man/plot_twoclass_pred_factorcol.Rd index e3dd9db..b343d7f 100644 --- a/man/plot_twoclass_pred_factorcol.Rd +++ b/man/plot_twoclass_pred_factorcol.Rd @@ -43,6 +43,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the predicted probabilities against a factor column based on -{tidymodels} results for a two-class classification model. +tidymodels results for a two-class classification model. } \keyword{internal} diff --git a/man/plot_twoclass_pred_numcol.Rd b/man/plot_twoclass_pred_numcol.Rd index 1d79a9b..e9abb81 100644 --- a/man/plot_twoclass_pred_numcol.Rd +++ b/man/plot_twoclass_pred_numcol.Rd @@ -43,6 +43,6 @@ A \code{\link[plotly:ggplotly]{plotly::ggplotly()}} object. } \description{ This function plots the predicted probabilities against a numeric column based -on {tidymodels} results for a two-class classification model. +on tidymodels results for a two-class classification model. } \keyword{internal} diff --git a/man/shiny_models.Rd b/man/shiny_models.Rd index 4a7b5a1..230298e 100644 --- a/man/shiny_models.Rd +++ b/man/shiny_models.Rd @@ -35,8 +35,6 @@ points is enabled (the default) or not. This can be helpful for very large data sets.} \item{...}{Other parameters not currently used.} - -\item{original_data}{Original dataset.} } \value{ A shiny application.