Skip to content

Commit

Permalink
fix: fixing CRAN pretest issues
Browse files Browse the repository at this point in the history
  • Loading branch information
ntamas committed Feb 11, 2023
1 parent f2ebc61 commit 61856e1
Show file tree
Hide file tree
Showing 7 changed files with 24 additions and 17 deletions.
4 changes: 4 additions & 0 deletions R/hrg.R
Original file line number Diff line number Diff line change
Expand Up @@ -90,6 +90,7 @@ NULL
#' Notes in Computer Science* 4503, 1--13. Springer-Verlag, Berlin Heidelberg
#' (2007).
#' @examples
#' \dontrun{
#' ## We are not running these examples any more, because they
#' ## take a long time (~15 seconds) to run and this is against the CRAN
#' ## repository policy. Copy and paste them by hand to your R prompt if
Expand All @@ -106,6 +107,7 @@ NULL
#' ## Prediction of missing edges
#' g2 <- make_full_graph(4) + (make_full_graph(4) - path(1, 2))
#' predict_edges(g2)
#' }
#' @export
#' @family hierarchical random graph functions
fit_hrg <- function(graph, hrg = NULL, start = FALSE, steps = 0) {
Expand Down Expand Up @@ -255,6 +257,7 @@ sample_hrg <- sample_hrg
#' Notes in Computer Science* 4503, 1--13. Springer-Verlag, Berlin Heidelberg
#' (2007).
#' @examples
#' \dontrun{
#' ## We are not running these examples any more, because they
#' ## take a long time (~15 seconds) to run and this is against the CRAN
#' ## repository policy. Copy and paste them by hand to your R prompt if
Expand All @@ -271,6 +274,7 @@ sample_hrg <- sample_hrg
#' ## Prediction of missing edges
#' g2 <- make_full_graph(4) + (make_full_graph(4) - path(1, 2))
#' predict_edges(g2)
#' }
#' @export
#' @family hierarchical random graph functions
predict_edges <- function(graph, hrg = NULL, start = FALSE, num.samples = 10000,
Expand Down
6 changes: 4 additions & 2 deletions R/scg.R
Original file line number Diff line number Diff line change
Expand Up @@ -204,7 +204,7 @@ stochastic_matrix <- function(graph, column.wise = FALSE,
#' @keywords graphs
#' @examples
#'
#'
#' \dontrun{
#' ## We are not running these examples any more, because they
#' ## take a long time to run and this is against the CRAN repository
#' ## policy. Copy and paste them by hand to your R prompt if
Expand Down Expand Up @@ -247,6 +247,7 @@ stochastic_matrix <- function(graph, column.wise = FALSE,
#' gr.km <- kmeans(x, 100, 100, 300)$cluster
#' scg_eps(cbind(x), gr.true)
#' scg_eps(cbind(x), gr.km)
#' }
#'
scg_group <- function(V, nt,
mtype = c(
Expand Down Expand Up @@ -522,7 +523,7 @@ scg_semi_proj <- function(groups,
#' @keywords graphs
#' @examples
#'
#'
#' \dontrun{
#' ## We are not running these examples any more, because they
#' ## take a long time (~20 seconds) to run and this is against the CRAN
#' ## repository policy. Copy and paste them by hand to your R prompt if
Expand Down Expand Up @@ -600,6 +601,7 @@ scg_semi_proj <- function(groups,
#' vertex.color = col[com.cg], vertex.label = NA
#' )
#' par(op)
#' }
#'
scg <- function(X, ev, nt, groups = NULL,
mtype = c("symmetric", "laplacian", "stochastic"),
Expand Down
21 changes: 8 additions & 13 deletions inst/CITATION
Original file line number Diff line number Diff line change
@@ -1,15 +1,10 @@
citHeader("To cite 'igraph' in publications use:")

citEntry(entry="article",
title="The igraph software package for complex network research",
author=personList(as.person("Gabor Csardi"),
as.person("Tamas Nepusz")),
journal="InterJournal",
bibentry(bibtype="Article",
header="To cite 'igrpah' in publications use:",
title="The igraph software package for complex network research",
author=c(as.person("Gabor Csardi"), as.person("Tamas Nepusz")),
journal="InterJournal",
volume="Complex Systems",
pages="1695",
year="2006",
url="https://igraph.org",
textVersion=paste("Csardi G, Nepusz T: The igraph software package for ",
"complex network research, InterJournal, ",
"Complex Systems 1695. 2006. ",
"https://igraph.org", sep=""))
year=2006,
url="https://igraph.org")

2 changes: 2 additions & 0 deletions man/fit_hrg.Rd

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

2 changes: 2 additions & 0 deletions man/predict_edges.Rd

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

3 changes: 2 additions & 1 deletion man/scg.Rd

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

3 changes: 2 additions & 1 deletion man/scg_group.Rd

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

0 comments on commit 61856e1

Please sign in to comment.