Skip to content

Commit

Permalink
Fixed some documentation issues
Browse files Browse the repository at this point in the history
  • Loading branch information
jhollway committed Nov 9, 2022
1 parent 6580522 commit 61a0ded
Show file tree
Hide file tree
Showing 4 changed files with 14 additions and 2 deletions.
2 changes: 2 additions & 0 deletions R/class_models.R
Original file line number Diff line number Diff line change
Expand Up @@ -186,6 +186,7 @@ print.diff_model <- function(x, ...){

#' @export
summary.diff_model <- function(object, ...){
cum_sum <- NULL
ns <- length(attr(object, "mode"))
dplyr::count(object, t) %>%
mutate(cum_sum = cumsum(n)) %>%
Expand All @@ -194,6 +195,7 @@ summary.diff_model <- function(object, ...){

#' @export
plot.diff_model <- function(x, ...){
percent <- NULL
y <- summary(x)
ggplot2::ggplot(y) +
ggplot2::geom_line(aes(x = t, y = percent)) +
Expand Down
4 changes: 4 additions & 0 deletions R/make_play.R
Original file line number Diff line number Diff line change
Expand Up @@ -2,6 +2,10 @@
#' @inheritParams is
#' @param seeds A valid mark vector the length of the
#' number of nodes in the network.
#' @param thresholds A numeric vector indicating the thresholds
#' each node has. By default 1.
#' @param steps The number of steps forward in the diffusion to play.
#' By default the number of nodes in the network.
#' @examples
#' play_diffusion(generate_smallworld(15, 0.025))
#' @export
Expand Down
4 changes: 2 additions & 2 deletions R/manip_add.R
Original file line number Diff line number Diff line change
Expand Up @@ -110,7 +110,7 @@ join_ties <- function(object, object2, attr_name){
}

#' @export
mutate.igraph <- function(object, ...){
object %>% as_tidygraph() %>%
mutate.igraph <- function(.data, ...){
.data %>% as_tidygraph() %>%
mutate(...) %>% as_igraph()
}
6 changes: 6 additions & 0 deletions man/play_diffusion.Rd

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

0 comments on commit 61a0ded

Please sign in to comment.