Skip to content

Commit

Permalink
Converted the JoSS URLs into DOIs.
Browse files Browse the repository at this point in the history
  • Loading branch information
krivit committed Apr 1, 2024
1 parent 3c6954b commit 5f28b1f
Show file tree
Hide file tree
Showing 38 changed files with 60 additions and 60 deletions.
28 changes: 14 additions & 14 deletions R/access.R
Original file line number Diff line number Diff line change
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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @author Carter T. Butts \email{[email protected]}
#' @examples
#' #Create a network with three edges
Expand Down Expand Up @@ -538,7 +538,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @author Carter T. Butts \email{[email protected]}
#'
#' @seealso \code{\link{get.edgeIDs}}, \code{\link{network.extraction}},
Expand Down Expand Up @@ -770,7 +770,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1056,7 +1056,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#'
#' Wasserman, S. and Faust, K. 1994. \emph{Social Network Analysis: Methods
#' and Applications.} Cambridge: Cambridge University Press.
Expand Down Expand Up @@ -1183,7 +1183,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1254,7 +1254,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#'
#' Wasserman, S. and Faust, K. 1994. \emph{Social Network Analysis: Methods
#' and Applications}. Cambridge: Cambridge University Press.
Expand Down Expand Up @@ -1383,7 +1383,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1504,7 +1504,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1611,7 +1611,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1716,7 +1716,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1767,7 +1767,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -1838,7 +1838,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -375,7 +375,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down Expand Up @@ -560,7 +560,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords graphs manip
#' @examples
#'
Expand Down
4 changes: 2 additions & 2 deletions R/constructors.R
Original file line number Diff line number Diff line change
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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down
2 changes: 1 addition & 1 deletion R/layout.R
Original file line number Diff line number Diff line change
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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#'
#' Fruchterman, T.M.J. and Reingold, E.M. (1991). \dQuote{Graph Drawing by
#' Force-directed Placement.} \emph{Software - Practice and Experience,}
Expand Down
4 changes: 2 additions & 2 deletions R/misc.R
Original file line number Diff line number Diff line change
Expand Up @@ -354,7 +354,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#'
#' Wasserman, S. and Faust, K. (1994). \emph{Social Network Analysis: Methods
#' and Applications.} Cambridge: Cambridge University Press.
Expand Down Expand Up @@ -519,7 +519,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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords classes graphs
#' @examples
#'
Expand Down
8 changes: 4 additions & 4 deletions R/operators.R
Original file line number Diff line number Diff line change
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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.i02}
#' @keywords arith graphs
#' @examples
#'
Expand Down
6 changes: 3 additions & 3 deletions R/plot.R
Original file line number Diff line number Diff line change
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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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{https://www.jstatsoft.org/v24/i02/}
#' \doi{10.18637/jss.v024.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 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.

2 changes: 1 addition & 1 deletion man/deletion.methods.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/edgeset.constructors.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/get.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/get.neighborhood.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/is.adjacent.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/loading.attributes.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/network-operators.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/network.Rd

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

Loading

0 comments on commit 5f28b1f

Please sign in to comment.