Skip to content

Commit

Permalink
Merge branch 'master' into v1.17
Browse files Browse the repository at this point in the history
  • Loading branch information
CarterButts committed Jun 6, 2021
2 parents c31e8c2 + a6221ce commit e939fba
Show file tree
Hide file tree
Showing 41 changed files with 68 additions and 68 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
Package: network
Version: 1.17.0
Date: 2021-06-05
Date: 2021-06-06
Title: Classes for Relational Data
Authors@R: c(
person("Carter T.", "Butts", role=c("aut","cre"), email="[email protected]"),
Expand Down
30 changes: 15 additions & 15 deletions R/access.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,7 @@
# David Hunter <[email protected]> and Mark S. Handcock
# <[email protected]>.
#
# Last Modified 02/24/19
# Last Modified 06/06/21
# Licensed under the GNU General Public License version 2 (June, 1991)
# or greater
#
Expand Down Expand Up @@ -104,7 +104,7 @@
#' \code{\link{network.edgelist}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -253,7 +253,7 @@ add.edges.network<-function(x, tail, head, names.eval=NULL, vals.eval=NULL, ...)
#' \code{\link{set.vertex.attribute}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -430,7 +430,7 @@ add.vertices.network<-function(x, nv, vattr=NULL, last.mode=TRUE, ...){
#' \code{\link{as.matrix.network}}, \code{\link{network.extraction}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @author Carter T. Butts \email{[email protected]}
#' @examples
#' #Create a network with three edges
Expand Down Expand Up @@ -537,7 +537,7 @@ delete.edge.attribute.network <- function(x, attrname, ...) {
#'
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @author Carter T. Butts \email{[email protected]}
#'
#' @seealso \code{\link{get.edgeIDs}}, \code{\link{network.extraction}},
Expand Down Expand Up @@ -763,7 +763,7 @@ get.edge.value.list <- get.edge.value.network
#' @seealso \code{\link{get.neighborhood}}, \code{\link{valid.eids}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1049,7 +1049,7 @@ get.network.attribute.network <- function(x, attrname, unlist=FALSE, ...) {
#' @seealso \code{\link{get.edges}}, \code{\link{is.adjacent}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#'
#' Wasserman, S. and Faust, K. 1994. \emph{Social Network Analysis: Methods
#' and Applications.} Cambridge: Cambridge University Press.
Expand Down Expand Up @@ -1176,7 +1176,7 @@ get.vertex.attribute.network <- function(x, attrname, na.omit=FALSE, null.na=TRU
#' \code{set.network.attribute}, \code{\link{add.edges}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1247,7 +1247,7 @@ has.loops<-function(x){
#' \code{\link{attribute.methods}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#'
#' Wasserman, S. and Faust, K. 1994. \emph{Social Network Analysis: Methods
#' and Applications}. Cambridge: Cambridge University Press.
Expand Down Expand Up @@ -1376,7 +1376,7 @@ is.multiplex<-function(x){
#' \code{\link{get.network.attribute}}, \code{is.adjacent}, \code{\link{is.na}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1497,7 +1497,7 @@ is.na.network<-function(x){
#' \code{\link{network.indicators}}, \code{\link{plot.network}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1604,7 +1604,7 @@ network.dyadcount<-function(x, ...) UseMethod("network.dyadcount")
#' \code{\link{network.edgecount}}, \code{\link{is.directed}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1709,7 +1709,7 @@ network.edgecount<-function(x, ...) UseMethod("network.edgecount")
#' @seealso \code{\link{get.network.attribute}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1760,7 +1760,7 @@ network.naedgecount.network<-function(x, ...){
#' @seealso \code{\link{get.network.attribute}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1831,7 +1831,7 @@ network.vertex.names<-function(x){
#' @seealso \code{\link{network}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords manip graphs
#' @examples
#'
Expand Down
6 changes: 3 additions & 3 deletions R/coercion.R
Original file line number Diff line number Diff line change
Expand Up @@ -99,7 +99,7 @@
#' \code{\link{network.extraction}},\code{\link{as.edgelist}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -407,7 +407,7 @@ as.network<-function(x,...)
#' \code{\link{which.matrix.type}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -588,7 +588,7 @@ as.network.matrix<-function(x, matrix.type=NULL,
#' @seealso \code{\link{as.matrix.network}}, \code{\link{network}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords graphs manip
#' @examples
#'
Expand Down
6 changes: 3 additions & 3 deletions R/constructors.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,7 @@
# David Hunter <[email protected]> and Mark S. Handcock
# <[email protected]>.
#
# Last Modified 06/05/21
# Last Modified 06/06/21
# Licensed under the GNU General Public License version 2 (June, 1991)
# or greater
#
Expand Down Expand Up @@ -119,7 +119,7 @@ network<-function(x, vertex.attr=NULL, vertex.attrnames=NULL,
#'
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#'
#' @author Carter T. Butts \email{[email protected]} and David Hunter
#' \email{[email protected]}
Expand Down Expand Up @@ -432,7 +432,7 @@ network.incidence<-function(x, g, ignore.eval=TRUE, names.eval=NULL, ...){
#' @seealso \code{\link{network}}, \code{\link{as.network.matrix}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down
4 changes: 2 additions & 2 deletions R/layout.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,7 @@
# David Hunter <[email protected]> and Mark S. Handcock
# <[email protected]>.
#
# Last Modified 03/4/13
# Last Modified 06/06/21
# Licensed under the GNU General Public License version 2 (June, 1991)
# or greater
#
Expand Down Expand Up @@ -100,7 +100,7 @@
#' @seealso \code{\link{plot.network}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#'
#' Fruchterman, T.M.J. and Reingold, E.M. (1991). \dQuote{Graph Drawing by
#' Force-directed Placement.} \emph{Software - Practice and Experience,}
Expand Down
6 changes: 3 additions & 3 deletions R/misc.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,7 @@
# David Hunter <[email protected]> and Mark S. Handcock
# <[email protected]>.
#
# Last Modified 02/26/13
# Last Modified 06/06/21
# Licensed under the GNU General Public License version 2 (June, 1991)
# or greater
#
Expand Down Expand Up @@ -353,7 +353,7 @@ print.mixingmatrix <- function(x, ...) {
#' @seealso \code{\link{network.edgecount}}, \code{\link{network.size}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#'
#' Wasserman, S. and Faust, K. (1994). \emph{Social Network Analysis: Methods
#' and Applications.} Cambridge: Cambridge University Press.
Expand Down Expand Up @@ -518,7 +518,7 @@ is.discrete<-function(x){
#' @seealso \code{\link{as.matrix.network}}, \code{\link{as.network.matrix}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords graphs
#' @examples
#'
Expand Down
2 changes: 1 addition & 1 deletion R/network-package.R
Original file line number Diff line number Diff line change
Expand Up @@ -183,7 +183,7 @@ NULL
#'
#' Butts, C. T. (2008). \dQuote{network: a Package for Managing Relational
#' Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords classes graphs
#' @examples
#'
Expand Down
10 changes: 5 additions & 5 deletions R/operators.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,7 @@
# David Hunter <[email protected]> and Mark S. Handcock
# <[email protected]>.
#
# Last Modified 01/28/11
# Last Modified 06/06/21
# Licensed under the GNU General Public License version 2 (June, 1991)
# or greater
#
Expand Down Expand Up @@ -156,7 +156,7 @@ out_of_bounds <- function(x, el){
#' \code{\link{network.operators}}, and \code{\link{get.inducedSubgraph}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords graphs manip
#' @examples
#'
Expand Down Expand Up @@ -554,7 +554,7 @@ out_of_bounds <- function(x, el){
#' @seealso \code{\link{network.extraction}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#'
#' Wasserman, S. and Faust, K. (1994). \emph{Social Network Analysis: Methods
#' and Applications.} Cambridge: University of Cambridge Press.
Expand Down Expand Up @@ -1292,7 +1292,7 @@ networkOperatorSetup<-function(x,y=NULL){
#' @seealso \code{\link{network.operators}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords arith graphs
#' @examples
#'
Expand Down Expand Up @@ -1357,7 +1357,7 @@ prod.network<-function(..., attrname=NULL, na.rm=FALSE){
#' @seealso \code{\link{network.operators}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords arith graphs
#' @examples
#'
Expand Down
8 changes: 4 additions & 4 deletions R/plot.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,7 @@
# David Hunter <[email protected]> and Mark S. Handcock
# <[email protected]>.
#
# Last Modified 11/24/19
# Last Modified 06/06/21
# Licensed under the GNU General Public License version 2 (June, 1991)
# or greater
#
Expand Down Expand Up @@ -122,7 +122,7 @@ make.arrow.poly.coords<-function(x0,y0,x1,y1,ahangle,ahlen,swid,toff,hoff,ahead,
#' \code{\link{polygon}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords aplot graphs
#' @examples
#'
Expand Down Expand Up @@ -333,7 +333,7 @@ make.vertex.poly.coords<-function(x,y,r,s,rot){
#' @seealso \code{\link{plot.network}}, \code{\link{polygon}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#' @keywords aplot graphs
#' @examples
#'
Expand Down Expand Up @@ -600,7 +600,7 @@ network.edgelabel<-function(px0,py0,px1,py1,label,directed,loops=FALSE,cex,curve
#' \code{\link{network.loop}}, \code{\link{network.vertex}}
#' @references Butts, C. T. (2008). \dQuote{network: a Package for Managing
#' Relational Data in R.} \emph{Journal of Statistical Software}, 24(2).
#' \url{http://www.jstatsoft.org/v24/i02/}
#' \url{https://www.jstatsoft.org/v24/i02/}
#'
#' Wasserman, S., and Faust, K. (1994). \emph{Social Network Analysis:
#' Methods and Applications.} Cambridge: Cambridge University Press.
Expand Down
2 changes: 1 addition & 1 deletion inst/CITATION
Original file line number Diff line number Diff line change
Expand Up @@ -29,7 +29,7 @@ bibentry("Article",
year = 2008,
volume = 24,
number = 2,
url ="http://www.jstatsoft.org/v24/i02/paper")
url ="https://www.jstatsoft.org/v24/i02/paper")

# add a network-specific footer
citFooter("Some additional information regarding the C-level network API can be found in the README file within the network.api subdirectory under the package \"inst\" directory -- check your installed library tree.")
Expand Down
2 changes: 1 addition & 1 deletion man/add.edges.Rd

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

2 changes: 1 addition & 1 deletion man/add.vertices.Rd

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

2 changes: 1 addition & 1 deletion man/as.matrix.network.Rd

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

2 changes: 1 addition & 1 deletion man/as.network.matrix.Rd

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

2 changes: 1 addition & 1 deletion man/as.sociomatrix.Rd

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

2 changes: 1 addition & 1 deletion man/attribute.methods.Rd

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

Loading

0 comments on commit e939fba

Please sign in to comment.