Skip to content

Commit

Permalink
Updated copyright year and headers.
Browse files Browse the repository at this point in the history
  • Loading branch information
krivit committed Oct 10, 2024
1 parent b09f7e5 commit a3bcba4
Show file tree
Hide file tree
Showing 39 changed files with 39 additions and 39 deletions.
2 changes: 1 addition & 1 deletion LICENSE
Original file line number Diff line number Diff line change
Expand Up @@ -37,4 +37,4 @@ Martina Morris, University of Washington

The 'statnet' development team

Copyright 2015-2023
Copyright 2015-2024
2 changes: 1 addition & 1 deletion R/EgoStat.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
# An EgoStat.* function takes an egor object and returns a matrix of
# h(e[i]) values, with egos in rows and elements of h(e[i]) in
Expand Down
2 changes: 1 addition & 1 deletion R/EgoStat.duration.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
EgoStat.mean.age <- function(egor, emptyval=0){
startcol <- attr(egor,"alter_design")$startcol
Expand Down
2 changes: 1 addition & 1 deletion R/EgoStat.node.attr.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
#' @name nodal_attributes-API
#' @title Helper functions for specifying nodal attribute levels
Expand Down
2 changes: 1 addition & 1 deletion R/InitErgmTerm.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################

#' A custom term giving a linear combination of change statistics
Expand Down
2 changes: 1 addition & 1 deletion R/control.ergm.ego.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################


Expand Down
2 changes: 1 addition & 1 deletion R/control.simulate.ergm.ego.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################


Expand Down
2 changes: 1 addition & 1 deletion R/degreedist.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################


Expand Down
2 changes: 1 addition & 1 deletion R/egor.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################


Expand Down
2 changes: 1 addition & 1 deletion R/ergm.ego.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################


Expand Down
2 changes: 1 addition & 1 deletion R/fmhfit.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
#' Fitted ergm.ego model object
#'
Expand Down
2 changes: 1 addition & 1 deletion R/gof.ergm.ego.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
# This file contains the following 8 functions for assessing goodness of fit
# <gof> <summary.gofobject>
Expand Down
2 changes: 1 addition & 1 deletion R/predict.ergmego.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
#' ERGM-based predicted tie probabilities for the pseudo-population network
#'
Expand Down
2 changes: 1 addition & 1 deletion R/reweight.egor.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
## reweight.egor <- function(x, g, gw){
## gw <- gw[order(gw[,1]),2]
Expand Down
2 changes: 1 addition & 1 deletion R/simulate.ergm.ego.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################


Expand Down
2 changes: 1 addition & 1 deletion R/summary.ergm.ego.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
## A thin wrapper around summary.ergm to get rid of a spurious error message.
#' @method summary ergm.ego
Expand Down
2 changes: 1 addition & 1 deletion R/summary.statistics.egor.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
#' Calculation of ERGM-style summary statistics for [`egor`]
#' objects.
Expand Down
2 changes: 1 addition & 1 deletion R/zzz.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
#' @import statnet.common
.onAttach <- function(lib, pkg){
Expand Down
2 changes: 1 addition & 1 deletion data-raw/fmhfit.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
library(ergm.ego)

Expand Down
2 changes: 1 addition & 1 deletion inst/NEWS.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
% open source, and has the attribution requirements (GPL Section 7) at
% https://statnet.org/attribution .
%
% Copyright 2015-2023 Statnet Commons
% Copyright 2015-2024 Statnet Commons
%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
\name{NEWS}
\title{NEWS file for the \code{\link[=ergm.ego-package]{ergm.ego}} package}
Expand Down
2 changes: 1 addition & 1 deletion man-roxygen/basis.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,6 +5,6 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
#' @param basis a value (usually an [`egor`]) to override the LHS of the formula.
2 changes: 1 addition & 1 deletion man-roxygen/control.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
#' @param control A list of control parameters for algorithm tuning,
#' typically constructed with [<%=mycontrol%>()]. Its documentation
Expand Down
2 changes: 1 addition & 1 deletion man-roxygen/seed.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
#' @param seed Seed value (integer) for the random number generator. See
#' \code{\link[base]{set.seed}}.
2 changes: 1 addition & 1 deletion man-roxygen/verbose.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
#' @param verbose A logical or an integer to control the amount of
#' progress and diagnostic information to be printed. `FALSE`/`0`
Expand Down
2 changes: 1 addition & 1 deletion src/changestats.c
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
* open source, and has the attribution requirements (GPL Section 7) at
* https://statnet.org/attribution .
*
* Copyright 2015-2023 Statnet Commons
* Copyright 2015-2024 Statnet Commons
*/
#include "ergm_constants.h"
#include "ergm_changestat.h"
Expand Down
2 changes: 1 addition & 1 deletion src/include_stubs.c
Original file line number Diff line number Diff line change
Expand Up @@ -5,6 +5,6 @@
* open source, and has the attribution requirements (GPL Section 7) at
* https://statnet.org/attribution .
*
* Copyright 2015-2023 Statnet Commons
* Copyright 2015-2024 Statnet Commons
*/
#include "ergm_stubs.c"
2 changes: 1 addition & 1 deletion src/init.c
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
* open source, and has the attribution requirements (GPL Section 7) at
* https://statnet.org/attribution .
*
* Copyright 2015-2023 Statnet Commons
* Copyright 2015-2024 Statnet Commons
*/
#include <stdlib.h> // for NULL
#include <R_ext/Rdynload.h>
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
library(testthat)
library(ergm.ego)
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-EgoStat.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
library(purrr)
library(dplyr)
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-boot_jack.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################

data(faux.mesa.high)
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-coef_recovery.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
test_that("complete ERGM and ergm.ego() give similar coef estimates",{
data(faux.mesa.high)
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-degreedist.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################

## |----|--------|---|----------|-----------|
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-drop.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################

nw <- network.initialize(20,directed=FALSE)
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-gof.ergm.ego.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
data("fmhfit", package="ergm.ego")

Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-mixingmatrix.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
data(egor32, package="egor")

Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-netsize.adj.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
data(sampson, package="ergm")

Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-predict.ergm.ego.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################

test_that("it just works for model without offsets", {
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-statmismatch.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################

egos <- data.frame(egoIDcol = 1:12, x = rep(1:3, 4))
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-table_ppop.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
# open source, and has the attribution requirements (GPL Section 7) at
# https://statnet.org/attribution .
#
# Copyright 2015-2023 Statnet Commons
# Copyright 2015-2024 Statnet Commons
################################################################################
test_that("estimation and simulation work", {
data(faux.mesa.high)
Expand Down

0 comments on commit a3bcba4

Please sign in to comment.