Skip to content

Commit

Permalink
Merge pull request #114 from thisisdaryn/master
Browse files Browse the repository at this point in the history
Adding clarification to rplot documentation.
  • Loading branch information
juliasilge authored Aug 18, 2020
2 parents 77cafc8 + 0058efc commit 08526a6
Show file tree
Hide file tree
Showing 3 changed files with 15 additions and 1 deletion.
2 changes: 1 addition & 1 deletion NEWS.md
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,7 @@

- Handle correlation of exactly zero or 1 in `network_plot()` (@s-scherrer, #89)

- Add `.order` argument to `rplot()` with options "default" and "alphabet" (@mattwarkentin, #99)
- Add `.order` argument to `rplot()` with options "default" and "alphabet" plus improved documentation (@mattwarkentin, #99 and @thisisdaryn, #114)

- Make `network_plot()` more robust, for example to highly correlated data (@thisisdaryn, #107)

Expand Down
7 changes: 7 additions & 0 deletions R/output.R
Original file line number Diff line number Diff line change
Expand Up @@ -67,6 +67,13 @@ fashion.default <- function(x, decimals = 2, leading_zeros = FALSE, na_print = "
#'
#' Plot a correlation data frame using ggplot2.
#'
#' Each value in the correlation data frame is represented by one point/circle
#' in the output plot. The size of each point corresponds to the absolute value
#' of the correlation (via the \code{size} aesthetic). The color of each point
#' corresponds to the signed value of the correlation (via the \code{color}
#' aesthetic).
#'
#'
#' @param rdf Correlation data frame (see \code{\link{correlate}}) or object
#' that can be coerced to one (see \code{\link{as_cordf}}).
#' @param legend Boolean indicating whether a legend mapping the colors to the
Expand Down
7 changes: 7 additions & 0 deletions man/rplot.Rd

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

0 comments on commit 08526a6

Please sign in to comment.