SNAscript. friend.mat <- as.matrix(read.table("elfriend.dat",header=false,sep=" "))

Size: px
Start display at page:

Download "SNAscript. friend.mat <- as.matrix(read.table("elfriend.dat",header=false,sep=" "))"

Transcription

1 SNAscript ##### Loading the Adjacency Matrices and Nodal Attributes ##data can be loaded from: ## #####Formatting Data into Standard R Format ########################### ### Reading in Networks from.dat Files friend.mat <- as.matrix(read.table("elfriend.dat",header=false,sep=" ")) ### Reading in Nodal Attributes from.dat File node.attr <- read.table("elattr.dat",header=false) ### Naming Columns colnames(node.attr) <- c("seniority","status","gender","office","years","age","practice","school") ### Converting Attributes to Factors node.attr$status <- factor(node.attr$status,levels=c(1,2),labels=c("partner","associate")) node.attr$gender <- factor(node.attr$gender,levels=c(1,2),labels=c("male","female")) node.attr$office <- factor(node.attr$office,levels=c(1,2,3), labels=c("boston","hartford","providence")) node.attr$practice <- factor(node.attr$practice,levels=c(1,2), labels=c("litigation","corporate")) node.attr$school <- factor(node.attr$school,levels=c(1,2,3), labels=c("harvard","yale","other")) ############### ### Helper functions ### Computes matrix of absolute differences cov.abs.diff <- function(node.cov){ nn <- length(node.cov) edge.cov <- matrix(nrow=nn,ncol=nn) for(ii in 1:nn){ for(jj in 1:nn){ edge.cov[ii,jj] <- abs(node.cov[ii] - node.cov[jj]) return(edge.cov) ### Computes matrix with 1 for equality and 0 otherwise cov.same <- function(node.cov){ nn <- length(node.cov) edge.cov <- matrix(nrow=nn,ncol=nn) for(ii in 1:nn){ for(jj in 1:nn){ edge.cov[ii,jj] <- node.cov[ii] == node.cov[jj] return(edge.cov) 1

2 ############# ############# ##Network summary and plotting using "igraph" ################################################################ library(igraph) ### Converting to igraph Object friend.graph <- graph_from_adjacency_matrix(friend.mat) friend.graph$name <- "Lazega Lawyers Friendship Network" vertex_attr(friend.graph) <- node.attr ### Inspecting igraph Object friend.graph ### Vertexes of friend.graph V(friend.graph) ### Edges of friend.graph E(friend.graph) ### Nodal Attributes vertex_attr(friend.graph) ################################## ##### Plotting with igraph ##### ################################## ### Basic Plot Function plot(friend.graph) ### Interactive Plot Functions tkplot(friend.graph) ### 3D Plot Function library(rgl) rglplot(friend.graph) ### Fixing Network Layout kk.layout <- layout_with_kk(friend.graph) plot(friend.graph,layout=kk.layout) ### Coloring Nodes Using Partnership Status pdf("igraph-friend-plot-status.pdf") plot(friend.graph,layout=kk.layout, vertex.color=vertex_attr(friend.graph)$status, vertex.label=na) legend("topright",legend=c("partner","associate"),fill=categorical_pal(2)) ### Coloring Nodes Based on School, Label Based on Status pdf("igraph-friend-plot-school.pdf") plot(friend.graph,layout=kk.layout,vertex.color=vertex_attr(friend.graph)$school, vertex.label=ifelse(vertex_attr(friend.graph)$status=="partner","p","a")) legend("topright",legend=c("harvard","yale","other"),fill=categorical_pal(3)) ### Scaling Age to be Between 10 and 30 2

3 summary(node.attr$age) scaled.age <- 10*(1 + 2*(node.attr$age-min(node.attr$age))/max(node.attr$age - min(node.attr$age))) ### Using Scaled Age as the Size of Nodes pdf("igraph-friend-plot-age-status.pdf") plot(friend.graph,layout=kk.layout,vertex.size=scaled.age,vertex.label=na, vertex.color=vertex_attr(friend.graph)$status,edge.arrow.size=0.5) legend("topright",legend=c("partner","associate"),fill=categorical_pal(2))#,pch=16) ################################# ##### Numerical Summaries ##### ################################# ##### Calculating Degree of Nodes ### In-Degree degree(friend.graph,mode="in") ### Out-Degree degree(friend.graph,mode="out") ### Note Default Degree is In-Degree + Out-Degree for Directed Networks degree(friend.graph) ### Measures of Centrality closeness(friend.graph) betweenness(friend.graph) edge_betweenness(friend.graph) ##transitivity and reciprocity using igraph transitivity(friend.graph) reciprocity(friend.graph) ############### ############### STATNET ############### ## Network summary and plotting using package "network" in statnet library(statnet) ##create an object of class network using the sociomatrix of ## lawyers friendship network friend.net = network(friend.mat) friend.net ##This is a directed network with 71 nodes and no missing edges #assign attributes to the nodes in the network object set.vertex.attribute(friend.net,attrname="gender",value=as.numeric(node.attr$gender == "female")) set.vertex.attribute(friend.net,attrname="harvard",value=as.numeric(node.attr$school == "harvard")) set.vertex.attribute(friend.net,attrname="yale",value=as.numeric(node.attr$school == "yale")) set.vertex.attribute(friend.net,attrname="partner",value=as.numeric(node.attr$status == "partner")) set.vertex.attribute(friend.net,attrname="years",value=as.numeric(node.attr$years)) set.vertex.attribute(friend.net,attrname="age",value=as.numeric(node.attr$age)) #lets look at the network object again to make sure the node attributes are added 3

4 friend.net ########################### ######## PLOTTING using statnet #plot without node labels xy.coord <- plot(friend.net) #plot with node labels plot(friend.net,coord=xy.coord,displaylabels=true) #color nodes by attributes #color nodes by Status StatusColors = rep(0,dim(node.attr)[1]) StatusColors[which(node.attr$status == 1)] = 'red' #Partner StatusColors[which(node.attr$status == 2)] = 'yellow' #Associate pdf("friendsnetworkbystatus.pdf") plot(friend.net,vertex.col=statuscolors,frame=true,vertex.cex=2, coord=xy.coord) legend('topright',legend=c('partner','associate'),col=c('red','yellow'), pch=19,cex=2) #notice very clear clustering by status #Gender GenderColors= ifelse(node.attr$gender=="2","hotpink","dodgerblue") plot(friend.net,vertex.col=gendercolors,frame=true,vertex.cex=2) #pink = females legend("topright",legend=c('female','male'),col=c('hotpink','dodgerblue'), pch=19,cex=2) #notice some clustering by gender #color nodes by Office OfficeColors = rep(0,dim(node.attr)[1]) OfficeColors[which(node.attr$office == 1)] = 'maroon' #Boston OfficeColors[which(node.attr$office == 2)] = 'yellow' #Hartford OfficeColors[which(node.attr$office == 3)] = 'blue' #Providence plot(friend.net,vertex.col=officecolors,frame=true,vertex.cex=2) legend('topright',legend=c('boston','hartford','providence'), col=c('maroon','yellow','blue'),pch=19,cex=2) ##very clear clustering by office #School SchoolColors = rep(0,dim(node.attr)[1]) SchoolColors[which(node.attr$school == 1)] = 'maroon' #Harvard, Yale SchoolColors[which(node.attr$school == 2)] = 'yellow' #UConn SchoolColors[which(node.attr$school == 3)] = 'blue' #others pdf("friendsnetworkbyschool.pdf") plot(friend.net,vertex.col=schoolcolors,frame=true,vertex.cex=2, 4

5 coord=xy.coord) legend('topright',legend=c('harvard/yale','uconn','others'), col=c('maroon','yellow','blue'),pch=19,cex=2) ##### Using Size to Indicate Continuous variables scaled.years <- 1.5*(1 + 2*(node.attr$Years-min(node.attr$Years))/max(node.attr$Years - min(node.attr$ye pdf("friendsnetworkbyofficeyears.pdf") plot(friend.net,vertex.col=officecolors,frame=true,vertex.cex=scaled.years, coord=xy.coord) legend('topright',legend=c('boston','hartford','providence'), col=c('maroon','yellow','blue'),pch=19,cex=2) ##### Using Size to Indicate Continuous variables scaled.years <- 1.5*(1 + 2*(node.attr$years-min(node.attr$years))/max(node.attr$years - min(node.attr$ye pdf("friendsnetworkbygenderyears.pdf") plot(friend.net,vertex.col=gendercolors,frame=true,vertex.cex=scaled.years, coord=xy.coord) legend("topright",legend=c('female','male'),col=c('hotpink','dodgerblue'), pch=19,cex=2) ###### ##Numerical summary statistics using statnet network.size(friend.net) network.edgecount(friend.net) network.density(friend.net) degree(friend.net,cmode='indegree') degree(friend.net,cmode='outdegree') betweenness(friend.net) closeness(friend.net) ### ##to check whether there are any isolates in the network since we got the ##closeness as zero for all the nodes ###isolated nodes make the geodesic distance very large and consequently the closeness tend to be zero node_sub = network.vertex.names(friend.net)[ -which(degree(friend.net)==0)] ##distribution of nodal summary par(mfrow=c(1,3)) hist(degree(friend.net,cmode='outdegree'),breaks=seq(0,25,by=2.5), main='nodal Outdegree',ylim=c(0,26),xlab='Outdegree',cex.main=2,cex.lab=1.75,cex.axis=1.5) hist(degree(friend.net,cmode='indegree'),breaks=seq(0,25,by=2.5), main='nodal Indegree',ylim=c(0,26),xlab='Indegree',cex.main=2,cex.lab=1.75,cex.axis=1.5) hist(betweenness(friend.net),xlab='betweenness', main='nodal Betweenness',cex.main=2,cex.lab=1.75,cex.axis=1.5) 5

6 ################################################################### ########### NETWORK MODELING ##################################################################### ##### ## Network modeling using ERGM ## ##### lazega-ergm.r - Analyzing Data with ERGMs ##### ################################################################xsxs library(ergm) ## note this also loads the 'network' library ##loading 'statnet' package should also load 'ergm' ##### Loading the Adjacency Matrices and Nodal Attributes #load("nodal-covariates.rdata") #load("adjacency-matrices.rdata") #create a network object friend.net <- network(friend.mat) friend.net #assign attributes to the nodes in the network object set.vertex.attribute(friend.net,attrname="gender",value=as.numeric(node.attr$gender == "female")) set.vertex.attribute(friend.net,attrname="harvard",value=as.numeric(node.attr$school == "harvard")) set.vertex.attribute(friend.net,attrname="yale",value=as.numeric(node.attr$school == "yale")) set.vertex.attribute(friend.net,attrname="partner",value=as.numeric(node.attr$status == "partner")) set.vertex.attribute(friend.net,attrname="years",value=as.numeric(node.attr$years)) set.vertex.attribute(friend.net,attrname="age",value=as.numeric(node.attr$age)) ##### Simple ERGM fit.0 <- ergm(friend.net ~ edges) summary(fit.0) par(mfrow=c(2,2)) plot(gof(fit.0)) ##### Simple ERGM fit.1 <- ergm(friend.net ~ triangle) summary(fit.1) par(mfrow=c(2,2)) plot(gof(fit.1)) ##### ERGM with Covariates ##### Note: edges acts as a constant in a regression model fit.2 <- ergm(friend.net ~ edges + nodecov("gender")) summary(fit.2) par(mfrow=c(2,2)) plot(gof(fit.2)) ##### Comparing to Logistic Regression 6

7 nc.2.ec <- function(vec){ nn <- length(vec) mat <- array(rep(vec,each=nn),c(nn,nn)) return(mat + t(mat)) ec.gender <- nc.2.ec(as.numeric(node.attr$gender)-1) diag(friend.mat) <- NA friend.vec <- as.vector(friend.mat[!is.na(friend.mat)]) gender.vec <- as.vector(ec.gender[!is.na(friend.mat)]) fit.log <- glm(friend.vec ~ gender.vec,family="binomial") ##### Complex ERGM with covariates fit.3 <- ergm(friend.net ~ edges + nodecov("gender") + nodecov("harvard") + nodecov("yale") + nodecov("partner") + nodecov("years") + nodecov("age")) summary(fit.3) ##### Using Edge Covariate Information age.diff <- cov.abs.diff(node.attr$age) years.diff <- cov.abs.diff(node.attr$years) fit.4 <- ergm(friend.net ~ edges + nodecov("gender") + nodecov("harvard") + nodecov("yale") + nodecov("partner") + edgecov(age.diff,"age") + edgecov(years.diff,"years")) summary(fit.4) ##### Same School vs. School Absolutes school.same <- cov.same(node.attr$school) gender.same <- cov.same(node.attr$gender) fit.5 <- ergm(friend.net ~ edges + edgecov(gender.same,"same.gender") + nodecov("harvard") + nodecov("ya nodecov("partner") + edgecov(age.diff,"age") + edgecov(years.diff,"years") + edgecov(sch summary(fit.5) ##### Removing Same School (Final Fit) fit.6 <- ergm(friend.net ~ edges + edgecov(gender.same,"same.gender") + nodecov("harvard") + nodecov("ya nodecov("partner") + edgecov(age.diff,"age") + edgecov(years.diff,"years")) summary(fit.6) ############# ############################# ### Latent Space Network Modeling using Latentnet ### Using ERGMM (Exponential Random Graph Mixed Model) function in latentnet ### ####################### library(latentnet) friend.net <- network(friend.mat) friend.net 7

8 ##### LSM fit without covariates system.time(latent.1 <- ergmm(friend.net ~ euclidean(d=2))) summary(latent.1) plot(latent.1) plot(latent.1,what='pmean') mcmc.diagnostics(latent.1) #diagnostic of MCMC ergmm.control(latent.1) #investigating MCMC control parameters ##### Adding edge covariates with latentnet same.status <- cov.same(node.attr$status) system.time(latent.2 <- ergmm(friend.net ~ euclidean(d=2) + edgecov(same.status,"partner"))) #summary, plots and diagnostics summary(latent.2) plot(latent.2) plot(latent.2,what='pmean') mcmc.diagnostics(latent.2) ergmm.control(latent.2) ##LSM with many edge covariates age.diff <- cov.abs.diff(node.attr$age) years.diff <- cov.abs.diff(node.attr$years) school.same <- cov.same(node.attr$school) gender.same <- cov.same(node.attr$gender) latent.3 <- ergmm(friend.net ~ euclidean(d=2) + edgecov(gender.same,"same.gender") + edgecov(same.status,"partner") + edgecov(age.diff,"age") + edgecov(years.diff,"years") + edgecov(school.same,"same.school")) summary(latent.3) plot(latent.3) plot(latent.3,what='pmean') mcmc.diagnostics(latent.3) ergmm.control(latent.3) ## plots of fitted latent positions ############## par(mfrow=c(2,2)) plot(latent.1$mcmc.pmode$z,pch=20,col=node.attr$status, xlab='z_1',ylab='z_2',cex=2,xlim=c(-7.5,7.5),ylim=c(-7.5,7.5), main=paste('fitted Latent Positions','\n', 'using LSM')) plot(latent.2$mcmc.pmode$z,pch=20,col=node.attr$status, xlab='z_1',ylab='z_2',cex=2,xlim=c(-7.5,7.5),ylim=c(-7.5,7.5), main=paste('fitted Latent Positions','\n','using LSM with Covariates')) plot(latent.3$mcmc.pmode$z,pch=20,col=node.attr$status, xlab='z_1',ylab='z_2',cex=2,xlim=c(-7.5,7.5),ylim=c(-7.5,7.5), main=paste('fitted Latent Positions','\n','using LSM with Many Edge Covariates')) 8

Statistical Methods for Network Analysis: Exponential Random Graph Models

Statistical Methods for Network Analysis: Exponential Random Graph Models Day 2: Network Modeling Statistical Methods for Network Analysis: Exponential Random Graph Models NMID workshop September 17 21, 2012 Prof. Martina Morris Prof. Steven Goodreau Supported by the US National

More information

Fitting Social Network Models Using the Varying Truncation S. Truncation Stochastic Approximation MCMC Algorithm

Fitting Social Network Models Using the Varying Truncation S. Truncation Stochastic Approximation MCMC Algorithm Fitting Social Network Models Using the Varying Truncation Stochastic Approximation MCMC Algorithm May. 17, 2012 1 This talk is based on a joint work with Dr. Ick Hoon Jin Abstract The exponential random

More information

Exponential Random Graph Models for Social Networks

Exponential Random Graph Models for Social Networks Exponential Random Graph Models for Social Networks ERGM Introduction Martina Morris Departments of Sociology, Statistics University of Washington Departments of Sociology, Statistics, and EECS, and Institute

More information

The Network Analysis Five-Number Summary

The Network Analysis Five-Number Summary Chapter 2 The Network Analysis Five-Number Summary There is nothing like looking, if you want to find something. You certainly usually find something, if you look, but it is not always quite the something

More information

STATISTICAL METHODS FOR NETWORK ANALYSIS

STATISTICAL METHODS FOR NETWORK ANALYSIS NME Workshop 1 DAY 2: STATISTICAL METHODS FOR NETWORK ANALYSIS Martina Morris, Ph.D. Steven M. Goodreau, Ph.D. Samuel M. Jenness, Ph.D. Supported by the US National Institutes of Health Today we will cover

More information

Computational Issues with ERGM: Pseudo-likelihood for constrained degree models

Computational Issues with ERGM: Pseudo-likelihood for constrained degree models Computational Issues with ERGM: Pseudo-likelihood for constrained degree models For details, see: Mark S. Handcock University of California - Los Angeles MURI-UCI June 3, 2011 van Duijn, Marijtje A. J.,

More information

Exponential Random Graph Models Under Measurement Error

Exponential Random Graph Models Under Measurement Error Exponential Random Graph Models Under Measurement Error Zoe Rehnberg Advisor: Dr. Nan Lin Abstract Understanding social networks is increasingly important in a world dominated by social media and access

More information

STATNET WEB THE EASY WAY TO LEARN (OR TEACH) STATISTICAL MODELING OF NETWORK DATA WITH ERGMS

STATNET WEB THE EASY WAY TO LEARN (OR TEACH) STATISTICAL MODELING OF NETWORK DATA WITH ERGMS statnetweb Workshop (Sunbelt 2018) 1 STATNET WEB THE EASY WAY TO LEARN (OR TEACH) STATISTICAL MODELING OF NETWORK DATA WITH ERGMS SUNBELT June 26, 2018 Martina Morris, Ph.D. Skye Bender-deMoll statnet

More information

Exponential Random Graph (p ) Models for Affiliation Networks

Exponential Random Graph (p ) Models for Affiliation Networks Exponential Random Graph (p ) Models for Affiliation Networks A thesis submitted in partial fulfillment of the requirements of the Postgraduate Diploma in Science (Mathematics and Statistics) The University

More information

Compensatory and Noncompensatory Multidimensional Randomized Item Response Analysis of the CAPS and EAQ Data

Compensatory and Noncompensatory Multidimensional Randomized Item Response Analysis of the CAPS and EAQ Data Compensatory and Noncompensatory Multidimensional Randomized Item Response Analysis of the CAPS and EAQ Data Fox, Klein Entink, Avetisyan BJMSP (March, 2013). This document provides a step by step analysis

More information

Transitivity and Triads

Transitivity and Triads 1 / 32 Tom A.B. Snijders University of Oxford May 14, 2012 2 / 32 Outline 1 Local Structure Transitivity 2 3 / 32 Local Structure in Social Networks From the standpoint of structural individualism, one

More information

Alessandro Del Ponte, Weijia Ran PAD 637 Week 3 Summary January 31, Wasserman and Faust, Chapter 3: Notation for Social Network Data

Alessandro Del Ponte, Weijia Ran PAD 637 Week 3 Summary January 31, Wasserman and Faust, Chapter 3: Notation for Social Network Data Wasserman and Faust, Chapter 3: Notation for Social Network Data Three different network notational schemes Graph theoretic: the most useful for centrality and prestige methods, cohesive subgroup ideas,

More information

Statistical Modeling of Complex Networks Within the ERGM family

Statistical Modeling of Complex Networks Within the ERGM family Statistical Modeling of Complex Networks Within the ERGM family Mark S. Handcock Department of Statistics University of Washington U. Washington network modeling group Research supported by NIDA Grant

More information

##########################################################################

########################################################################## ########################################################################## #Introduction to Network Analysis in R # #In this half of the seminar we will learn the very basics of doing network analysis

More information

An open software system for the advanced statistical analysis of social networks

An open software system for the advanced statistical analysis of social networks StOCNET An open software system for the advanced statistical analysis of social networks User s Manual version 1.7 February 2006 Groningen: ICS / Science Plus http://stat.gamma.rug.nl/stocnet/ Peter Boer

More information

Social Network Analysis With igraph & R. Ofrit Lesser December 11 th, 2014

Social Network Analysis With igraph & R. Ofrit Lesser December 11 th, 2014 Social Network Analysis With igraph & R Ofrit Lesser ofrit.lesser@gmail.com December 11 th, 2014 Outline The igraph R package Basic graph concepts What can you do with igraph? Construction Attributes Centrality

More information

1 Homophily and assortative mixing

1 Homophily and assortative mixing 1 Homophily and assortative mixing Networks, and particularly social networks, often exhibit a property called homophily or assortative mixing, which simply means that the attributes of vertices correlate

More information

Complex-Network Modelling and Inference

Complex-Network Modelling and Inference Complex-Network Modelling and Inference Lecture 8: Graph features (2) Matthew Roughan http://www.maths.adelaide.edu.au/matthew.roughan/notes/ Network_Modelling/ School

More information

#We will get a bit of practice here using some example ego network data #based on a school, with information on grade and race

#We will get a bit of practice here using some example ego network data #based on a school, with information on grade and race ##### #A short tutorial on analyzing ego network data in R #for the Social Networks and Health #workshop at Duke University on May 17, 2016 #In this tutorial we learn some basic functionality #for R with

More information

Statistical Analysis and Data Mining, 5 (4):

Statistical Analysis and Data Mining, 5 (4): Provided by the author(s) and University College Dublin Library in accordance with publisher policies. Please cite the published version when available. Title Review of Statistical Network Analysis: Models,

More information

CHAPTER 3. BUILDING A USEFUL EXPONENTIAL RANDOM GRAPH MODEL

CHAPTER 3. BUILDING A USEFUL EXPONENTIAL RANDOM GRAPH MODEL CHAPTER 3. BUILDING A USEFUL EXPONENTIAL RANDOM GRAPH MODEL Essentially, all models are wrong, but some are useful. Box and Draper (1979, p. 424), as cited in Box and Draper (2007) For decades, network

More information

PSY 9556B (Feb 5) Latent Growth Modeling

PSY 9556B (Feb 5) Latent Growth Modeling PSY 9556B (Feb 5) Latent Growth Modeling Fixed and random word confusion Simplest LGM knowing how to calculate dfs How many time points needed? Power, sample size Nonlinear growth quadratic Nonlinear growth

More information

Package hergm. R topics documented: January 10, Version Date

Package hergm. R topics documented: January 10, Version Date Version 3.1-0 Date 2016-09-22 Package hergm January 10, 2017 Title Hierarchical Exponential-Family Random Graph Models Author Michael Schweinberger [aut, cre], Mark S.

More information

Section 7.13: Homophily (or Assortativity) By: Ralucca Gera, NPS

Section 7.13: Homophily (or Assortativity) By: Ralucca Gera, NPS Section 7.13: Homophily (or Assortativity) By: Ralucca Gera, NPS Are hubs adjacent to hubs? How does a node s degree relate to its neighbors degree? Real networks usually show a non-zero degree correlation

More information

HomeWork 4 Hints {Your Name} deadline

HomeWork 4 Hints {Your Name} deadline HomeWork 4 Hints {Your Name} deadline - 01.06.2015 Contents Power law. Descriptive network analysis 1 Problem 1.................................................. 1 Problem 2..................................................

More information

An introduction to graph analysis and modeling Descriptive Analysis of Network Data

An introduction to graph analysis and modeling Descriptive Analysis of Network Data An introduction to graph analysis and modeling Descriptive Analysis of Network Data MSc in Statistics for Smart Data ENSAI Autumn semester 2017 http://julien.cremeriefamily.info 1 / 68 Outline 1 Basic

More information

Expectation Maximization (EM) and Gaussian Mixture Models

Expectation Maximization (EM) and Gaussian Mixture Models Expectation Maximization (EM) and Gaussian Mixture Models Reference: The Elements of Statistical Learning, by T. Hastie, R. Tibshirani, J. Friedman, Springer 1 2 3 4 5 6 7 8 Unsupervised Learning Motivation

More information

Random graph models with fixed degree sequences: choices, consequences and irreducibilty proofs for sampling

Random graph models with fixed degree sequences: choices, consequences and irreducibilty proofs for sampling Random graph models with fixed degree sequences: choices, consequences and irreducibilty proofs for sampling Joel Nishimura 1, Bailey K Fosdick 2, Daniel B Larremore 3 and Johan Ugander 4 1 Arizona State

More information

Web 2.0 Social Data Analysis

Web 2.0 Social Data Analysis Web 2.0 Social Data Analysis Ing. Jaroslav Kuchař jaroslav.kuchar@fit.cvut.cz Structure (2) Czech Technical University in Prague, Faculty of Information Technologies Software and Web Engineering 2 Contents

More information

Package mcemglm. November 29, 2015

Package mcemglm. November 29, 2015 Type Package Package mcemglm November 29, 2015 Title Maximum Likelihood Estimation for Generalized Linear Mixed Models Version 1.1 Date 2015-11-28 Author Felipe Acosta Archila Maintainer Maximum likelihood

More information

ECE 242. Data Structures

ECE 242. Data Structures ECE 242 Data Structures Lecture 28 Introduction to Graphs Overview Problem: How do we represent irregular connections between locations? Graphs Definition Directed and Undirected graph Simple path and

More information

Package lvm4net. R topics documented: August 29, Title Latent Variable Models for Networks

Package lvm4net. R topics documented: August 29, Title Latent Variable Models for Networks Title Latent Variable Models for Networks Package lvm4net August 29, 2016 Latent variable models for network data using fast inferential procedures. Version 0.2 Depends R (>= 3.1.1), MASS, ergm, network,

More information

V2: Measures and Metrics (II)

V2: Measures and Metrics (II) - Betweenness Centrality V2: Measures and Metrics (II) - Groups of Vertices - Transitivity - Reciprocity - Signed Edges and Structural Balance - Similarity - Homophily and Assortative Mixing 1 Betweenness

More information

Rockefeller College University at Albany

Rockefeller College University at Albany Rockefeller College University at Albany Problem Set #7: Handling Egocentric Network Data Adapted from original by Peter V. Marsden, Harvard University Egocentric network data sometimes known as personal

More information

Generalized additive models I

Generalized additive models I I Patrick Breheny October 6 Patrick Breheny BST 764: Applied Statistical Modeling 1/18 Introduction Thus far, we have discussed nonparametric regression involving a single covariate In practice, we often

More information

Package ITNr. October 11, 2018

Package ITNr. October 11, 2018 Type Package Title Analysis of the International Trade Network Version 0.3.0 Author Matthew Smith Package ITNr October 11, 2018 Maintainer Matthew Smith Functions to clean

More information

Coding Categorical Variables in Regression: Indicator or Dummy Variables. Professor George S. Easton

Coding Categorical Variables in Regression: Indicator or Dummy Variables. Professor George S. Easton Coding Categorical Variables in Regression: Indicator or Dummy Variables Professor George S. Easton DataScienceSource.com This video is embedded on the following web page at DataScienceSource.com: DataScienceSource.com/DummyVariables

More information

d. Using your information from the chart above, fill-in the statement below.

d. Using your information from the chart above, fill-in the statement below. STATION #1: Sum of the Angles in a Triangle Complete the following tasks for station 1. a. Form two different triangles using the Anglegs provided. b. Find the measures of the three angles in the two triangles

More information

CPSC 340: Machine Learning and Data Mining. Principal Component Analysis Fall 2017

CPSC 340: Machine Learning and Data Mining. Principal Component Analysis Fall 2017 CPSC 340: Machine Learning and Data Mining Principal Component Analysis Fall 2017 Assignment 3: 2 late days to hand in tonight. Admin Assignment 4: Due Friday of next week. Last Time: MAP Estimation MAP

More information

Introduction to Graphs

Introduction to Graphs Graphs Introduction to Graphs Graph Terminology Directed Graphs Special Graphs Graph Coloring Representing Graphs Connected Graphs Connected Component Reading (Epp s textbook) 10.1-10.3 1 Introduction

More information

University of Groningen

University of Groningen University of Groningen A framework for the comparison of maximum pseudo-likelihood and maximum likelihood estimation of exponential family random graph models van Duijn, Maria; Gile, Krista J.; Handcock,

More information

SELECTION OF A MULTIVARIATE CALIBRATION METHOD

SELECTION OF A MULTIVARIATE CALIBRATION METHOD SELECTION OF A MULTIVARIATE CALIBRATION METHOD 0. Aim of this document Different types of multivariate calibration methods are available. The aim of this document is to help the user select the proper

More information

Social Networks, Social Interaction, and Outcomes

Social Networks, Social Interaction, and Outcomes Social Networks, Social Interaction, and Outcomes Social Networks and Social Interaction Not all links are created equal: Some links are stronger than others Some links are more useful than others Links

More information

Generative models for social network data

Generative models for social network data Generative models for social network data Kevin S. Xu (University of Toledo) James R. Foulds (University of California-San Diego) SBP-BRiMS 2016 Tutorial About Us Kevin S. Xu Assistant professor at University

More information

Package latentnet. R topics documented: August 20, Version Date

Package latentnet. R topics documented: August 20, Version Date Version 2.8.0 Date 2017-08-20 Package latentnet August 20, 2017 Title Latent Position and Cluster Models for Statistical Networks Fit and simulate latent position and cluster models for statistical networks.

More information

Package fastnet. September 11, 2018

Package fastnet. September 11, 2018 Type Package Title Large-Scale Social Network Analysis Version 0.1.6 Package fastnet September 11, 2018 We present an implementation of the algorithms required to simulate largescale social networks and

More information

An introduction to network inference and mining - TP

An introduction to network inference and mining - TP An introduction to network inference and mining - TP Nathalie Villa-Vialaneix - nathalie.villa@toulouse.inra.fr http://www.nathalievilla.org INRA, UR 0875 MIAT Formation INRA, Niveau 3 Formation INRA (Niveau

More information

Package fastnet. February 12, 2018

Package fastnet. February 12, 2018 Type Package Title Large-Scale Social Network Analysis Version 0.1.4 Package fastnet February 12, 2018 We present an implementation of the algorithms required to simulate largescale social networks and

More information

9/29/13. Outline Data mining tasks. Clustering algorithms. Applications of clustering in biology

9/29/13. Outline Data mining tasks. Clustering algorithms. Applications of clustering in biology 9/9/ I9 Introduction to Bioinformatics, Clustering algorithms Yuzhen Ye (yye@indiana.edu) School of Informatics & Computing, IUB Outline Data mining tasks Predictive tasks vs descriptive tasks Example

More information

Lecture Topic Projects

Lecture Topic Projects Lecture Topic Projects 1 Intro, schedule, and logistics 2 Applications of visual analytics, basic tasks, data types 3 Introduction to D3, basic vis techniques for non-spatial data Project #1 out 4 Data

More information

Random Graph Model; parameterization 2

Random Graph Model; parameterization 2 Agenda Random Graphs Recap giant component and small world statistics problems: degree distribution and triangles Recall that a graph G = (V, E) consists of a set of vertices V and a set of edges E V V.

More information

Introduction to network metrics

Introduction to network metrics Universitat Politècnica de Catalunya Version 0.5 Complex and Social Networks (2018-2019) Master in Innovation and Research in Informatics (MIRI) Instructors Argimiro Arratia, argimiro@cs.upc.edu, http://www.cs.upc.edu/~argimiro/

More information

SpiecEasi - R package tutorial

SpiecEasi - R package tutorial SpiecEasi - R package tutorial Zachary Kurtz August 9, 2016 Sparse InversE Covariance estimation for Ecological Association and Statistical Inference This package will be useful to anybody who wants to

More information

Models for Network Graphs

Models for Network Graphs Models for Network Graphs Gonzalo Mateos Dept. of ECE and Goergen Institute for Data Science University of Rochester gmateosb@ece.rochester.edu http://www.ece.rochester.edu/~gmateosb/ March 29, 2018 Network

More information

Using igraph for Visualisations

Using igraph for Visualisations Using igraph for Visualisations Dr Jamsheed Shorish The Australian National University jamsheed.shorish@anu.edu.au 15 July 2013 - Beihang University Introduction igraph is a network analysis and visualisation

More information

Graphs. Data Structures and Algorithms CSE 373 SU 18 BEN JONES 1

Graphs. Data Structures and Algorithms CSE 373 SU 18 BEN JONES 1 Graphs Data Structures and Algorithms CSE 373 SU 18 BEN JONES 1 Warmup Discuss with your neighbors: Come up with as many kinds of relational data as you can (data that can be represented with a graph).

More information

CIE L*a*b* color model

CIE L*a*b* color model CIE L*a*b* color model To further strengthen the correlation between the color model and human perception, we apply the following non-linear transformation: with where (X n,y n,z n ) are the tristimulus

More information

(Updated 29 Oct 2016)

(Updated 29 Oct 2016) (Updated 29 Oct 2016) 1 Class Maker 2016 Program Description Creating classes for the new school year is a time consuming task that teachers are asked to complete each year. Many schools offer their students

More information

Integrated Math I. IM1.1.3 Understand and use the distributive, associative, and commutative properties.

Integrated Math I. IM1.1.3 Understand and use the distributive, associative, and commutative properties. Standard 1: Number Sense and Computation Students simplify and compare expressions. They use rational exponents and simplify square roots. IM1.1.1 Compare real number expressions. IM1.1.2 Simplify square

More information

CS281 Section 9: Graph Models and Practical MCMC

CS281 Section 9: Graph Models and Practical MCMC CS281 Section 9: Graph Models and Practical MCMC Scott Linderman November 11, 213 Now that we have a few MCMC inference algorithms in our toolbox, let s try them out on some random graph models. Graphs

More information

Networks in economics and finance. Lecture 1 - Measuring networks

Networks in economics and finance. Lecture 1 - Measuring networks Networks in economics and finance Lecture 1 - Measuring networks What are networks and why study them? A network is a set of items (nodes) connected by edges or links. Units (nodes) Individuals Firms Banks

More information

Orange3 Educational Add-on Documentation

Orange3 Educational Add-on Documentation Orange3 Educational Add-on Documentation Release 0.1 Biolab Jun 01, 2018 Contents 1 Widgets 3 2 Indices and tables 27 i ii Widgets in Educational Add-on demonstrate several key data mining and machine

More information

Manipulating Network Data

Manipulating Network Data Chapter 2 Manipulating Network Data 2.1 Introduction We have seen that the term network, broadly speaking, refers to a collection of elements and their inter-relations. The mathematical concept of a graph

More information

Package gibbs.met. February 19, 2015

Package gibbs.met. February 19, 2015 Version 1.1-3 Title Naive Gibbs Sampling with Metropolis Steps Author Longhai Li Package gibbs.met February 19, 2015 Maintainer Longhai Li Depends R (>=

More information

Package DirectedClustering

Package DirectedClustering Type Package Package DirectedClustering Title Directed Weighted Clustering Coefficient Version 0.1.1 Date 2018-01-10 January 11, 2018 Author Gian Paolo Clemente[cre,aut], Rosanna Grassi [ctb] Maintainer

More information

CPSC 340: Machine Learning and Data Mining. Principal Component Analysis Fall 2016

CPSC 340: Machine Learning and Data Mining. Principal Component Analysis Fall 2016 CPSC 340: Machine Learning and Data Mining Principal Component Analysis Fall 2016 A2/Midterm: Admin Grades/solutions will be posted after class. Assignment 4: Posted, due November 14. Extra office hours:

More information

Package latentnet. R topics documented: March 6, Version Date

Package latentnet. R topics documented: March 6, Version Date Package latentnet March 6, 2013 Version 2.4-4 Date 2013-03-05 Title Latent position and cluster models for statistical networks A package to fit and simulate latent position and cluster models for statistical

More information

Solutions. Algebra II Journal. Module 2: Regression. Exploring Other Function Models

Solutions. Algebra II Journal. Module 2: Regression. Exploring Other Function Models Solutions Algebra II Journal Module 2: Regression Exploring Other Function Models This journal belongs to: 1 Algebra II Journal: Reflection 1 Before exploring these function families, let s review what

More information

Practical 2: Plotting

Practical 2: Plotting Practical 2: Plotting Complete this sheet as you work through it. If you run into problems, then ask for help - don t skip sections! Open Rstudio and store any files you download or create in a directory

More information

The O key will power the unit on. To turn the unit off, press the yellow L key, then O key.

The O key will power the unit on. To turn the unit off, press the yellow L key, then O key. fx-9750gii Quick Reference Guide Selecting the RUN Q icon will allow you to perform general computations and arithmetic. The function keys allow you to access the tab (soft key) menus that will come up

More information

(5.2) 151 Math Exercises. Graph Terminology and Special Types of Graphs. Malek Zein AL-Abidin

(5.2) 151 Math Exercises. Graph Terminology and Special Types of Graphs. Malek Zein AL-Abidin King Saud University College of Science Department of Mathematics 151 Math Exercises (5.2) Graph Terminology and Special Types of Graphs Malek Zein AL-Abidin ه Basic Terminology First, we give some terminology

More information

Latent Space Model for Road Networks to Predict Time-Varying Traffic. Presented by: Rob Fitzgerald Spring 2017

Latent Space Model for Road Networks to Predict Time-Varying Traffic. Presented by: Rob Fitzgerald Spring 2017 Latent Space Model for Road Networks to Predict Time-Varying Traffic Presented by: Rob Fitzgerald Spring 2017 Definition of Latent https://en.oxforddictionaries.com/definition/latent Latent Space Model?

More information

Some Graph Theory for Network Analysis. CS 249B: Science of Networks Week 01: Thursday, 01/31/08 Daniel Bilar Wellesley College Spring 2008

Some Graph Theory for Network Analysis. CS 249B: Science of Networks Week 01: Thursday, 01/31/08 Daniel Bilar Wellesley College Spring 2008 Some Graph Theory for Network Analysis CS 9B: Science of Networks Week 0: Thursday, 0//08 Daniel Bilar Wellesley College Spring 008 Goals this lecture Introduce you to some jargon what we call things in

More information

Geometry. Talk About It. Solve It. More Ideas. Formative Assessment

Geometry. Talk About It. Solve It. More Ideas. Formative Assessment 2 7.G.2 Objective Common Core State Standards Construct Triangles Triangles are polygons with three sides, and they are classified by their sides and angles. The sum of the angles of any triangle is 180,

More information

Intro to Random Graphs and Exponential Random Graph Models

Intro to Random Graphs and Exponential Random Graph Models Intro to Random Graphs and Exponential Random Graph Models Danielle Larcomb University of Denver Danielle Larcomb Random Graphs 1/26 Necessity of Random Graphs The study of complex networks plays an increasingly

More information

Econ 430 Lecture 3: Significance and Structural Properties of N

Econ 430 Lecture 3: Significance and Structural Properties of N Econ 430 Lecture 3: Significance and Structural Properties of Networks Alper Duman Izmir University Economics, March 8, 2013 Prevalence of Networks Networks are everywhere! Even in this class. We can classify

More information

Package DCD. September 12, 2017

Package DCD. September 12, 2017 Type Package Package DCD September 12, 2017 Title Differential Community Detection in Paired Biological Networks Version 0.1.0 Author Raghvendra Mall [aut, cre], Khalid Kunji [ctb], Michele Ceccarelli

More information

Latent Distance Models and. Graph Feature Models Dr. Asja Fischer, Prof. Jens Lehmann

Latent Distance Models and. Graph Feature Models Dr. Asja Fischer, Prof. Jens Lehmann Latent Distance Models and Graph Feature Models 2016-02-09 Dr. Asja Fischer, Prof. Jens Lehmann Overview Last lecture we saw how neural networks/multi-layer perceptrons (MLPs) can be applied to SRL. After

More information

Algorithmic and Economic Aspects of Networks. Nicole Immorlica

Algorithmic and Economic Aspects of Networks. Nicole Immorlica Algorithmic and Economic Aspects of Networks Nicole Immorlica Syllabus 1. Jan. 8 th (today): Graph theory, network structure 2. Jan. 15 th : Random graphs, probabilistic network formation 3. Jan. 20 th

More information

CS-E5740. Complex Networks. Scale-free networks

CS-E5740. Complex Networks. Scale-free networks CS-E5740 Complex Networks Scale-free networks Course outline 1. Introduction (motivation, definitions, etc. ) 2. Static network models: random and small-world networks 3. Growing network models: scale-free

More information

Package Bergm. R topics documented: September 25, Type Package

Package Bergm. R topics documented: September 25, Type Package Type Package Package Bergm September 25, 2018 Title Bayesian Exponential Random Graph Models Version 4.2.0 Date 2018-09-25 Author Alberto Caimo [aut, cre], Lampros Bouranis [aut], Robert Krause [aut] Nial

More information

Business Statistics: R tutorials

Business Statistics: R tutorials Business Statistics: R tutorials Jingyu He September 29, 2017 Install R and RStudio R is a free software environment for statistical computing and graphics. Download free R and RStudio for Windows/Mac:

More information

THE KNOWLEDGE MANAGEMENT STRATEGY IN ORGANIZATIONS. Summer semester, 2016/2017

THE KNOWLEDGE MANAGEMENT STRATEGY IN ORGANIZATIONS. Summer semester, 2016/2017 THE KNOWLEDGE MANAGEMENT STRATEGY IN ORGANIZATIONS Summer semester, 2016/2017 SOCIAL NETWORK ANALYSIS: THEORY AND APPLICATIONS 1. A FEW THINGS ABOUT NETWORKS NETWORKS IN THE REAL WORLD There are four categories

More information

11.6 The Coordinate Plane

11.6 The Coordinate Plane 11.6 The Coordinate Plane Introduction The Map Kevin and his pen pal Charlotte are both creating maps of their neighborhoods to show each other what it looks like where they live. Kevin has decided to

More information

MATLAB is a multi-paradigm numerical computing environment fourth-generation programming language. A proprietary programming language developed by

MATLAB is a multi-paradigm numerical computing environment fourth-generation programming language. A proprietary programming language developed by 1 MATLAB is a multi-paradigm numerical computing environment fourth-generation programming language. A proprietary programming language developed by MathWorks In 2004, MATLAB had around one million users

More information

PITSCO Math Individualized Prescriptive Lessons (IPLs)

PITSCO Math Individualized Prescriptive Lessons (IPLs) Orientation Integers 10-10 Orientation I 20-10 Speaking Math Define common math vocabulary. Explore the four basic operations and their solutions. Form equations and expressions. 20-20 Place Value Define

More information

Package DiffCorr. August 29, 2016

Package DiffCorr. August 29, 2016 Type Package Package DiffCorr August 29, 2016 Title Analyzing and Visualizing Differential Correlation Networks in Biological Data Version 0.4.1 Date 2015-03-31 Author, Kozo Nishida Maintainer

More information

Models of Network Formation. Networked Life NETS 112 Fall 2017 Prof. Michael Kearns

Models of Network Formation. Networked Life NETS 112 Fall 2017 Prof. Michael Kearns Models of Network Formation Networked Life NETS 112 Fall 2017 Prof. Michael Kearns Roadmap Recently: typical large-scale social and other networks exhibit: giant component with small diameter sparsity

More information

IMO Training 2010 Double Counting Victoria Krakovna. Double Counting. Victoria Krakovna

IMO Training 2010 Double Counting Victoria Krakovna. Double Counting. Victoria Krakovna Double Counting Victoria Krakovna vkrakovna@gmail.com 1 Introduction In many combinatorics problems, it is useful to count a quantity in two ways. Let s start with a simple example. Example 1. (Iran 2010

More information

Modeling the Variance of Network Populations with Mixed Kronecker Product Graph Models

Modeling the Variance of Network Populations with Mixed Kronecker Product Graph Models Modeling the Variance of Networ Populations with Mixed Kronecer Product Graph Models Sebastian Moreno, Jennifer Neville Department of Computer Science Purdue University West Lafayette, IN 47906 {smorenoa,neville@cspurdueedu

More information

Correctly Compute Complex Samples Statistics

Correctly Compute Complex Samples Statistics SPSS Complex Samples 15.0 Specifications Correctly Compute Complex Samples Statistics When you conduct sample surveys, use a statistics package dedicated to producing correct estimates for complex sample

More information

Checking whether the protocol was followed: gender and age 51

Checking whether the protocol was followed: gender and age 51 Checking whether the protocol was followed: gender and age 51 Session 4: Checking whether the protocol was followed: gender and age In the data cleaning workbook there are two worksheets which form the

More information

Section 2.3: Simple Linear Regression: Predictions and Inference

Section 2.3: Simple Linear Regression: Predictions and Inference Section 2.3: Simple Linear Regression: Predictions and Inference Jared S. Murray The University of Texas at Austin McCombs School of Business Suggested reading: OpenIntro Statistics, Chapter 7.4 1 Simple

More information

Degree Distribution: The case of Citation Networks

Degree Distribution: The case of Citation Networks Network Analysis Degree Distribution: The case of Citation Networks Papers (in almost all fields) refer to works done earlier on same/related topics Citations A network can be defined as Each node is a

More information

Package JGEE. November 18, 2015

Package JGEE. November 18, 2015 Type Package Package JGEE November 18, 2015 Title Joint Generalized Estimating Equation Solver Version 1.1 Date 2015-11-17 Author Gul Inan Maintainer Gul Inan Fits two different joint

More information

An Introduction to Graph Theory

An Introduction to Graph Theory An Introduction to Graph Theory CIS008-2 Logic and Foundations of Mathematics David Goodwin david.goodwin@perisic.com 12:00, Friday 17 th February 2012 Outline 1 Graphs 2 Paths and cycles 3 Graphs and

More information

AA BB CC DD EE. Introduction to Graphics in R

AA BB CC DD EE. Introduction to Graphics in R Introduction to Graphics in R Cori Mar 7/10/18 ### Reading in the data dat

More information

LINEAR TOPICS Notes and Homework: DUE ON EXAM

LINEAR TOPICS Notes and Homework: DUE ON EXAM NAME CLASS PERIOD LINEAR TOPICS Notes and Homework: DUE ON EXAM VOCABULARY: Make sure ou know the definitions of the terms listed below. These will be covered on the exam. Axis Scatter plot b Slope Coordinate

More information

Web Structure Mining Community Detection and Evaluation

Web Structure Mining Community Detection and Evaluation Web Structure Mining Community Detection and Evaluation 1 Community Community. It is formed by individuals such that those within a group interact with each other more frequently than with those outside

More information

Splines and penalized regression

Splines and penalized regression Splines and penalized regression November 23 Introduction We are discussing ways to estimate the regression function f, where E(y x) = f(x) One approach is of course to assume that f has a certain shape,

More information