Importing the required libraries

library(stringr)
library(sjmisc)
library(igraph)
## 
## Attaching package: 'igraph'
## The following objects are masked from 'package:stats':
## 
##     decompose, spectrum
## The following object is masked from 'package:base':
## 
##     union
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:igraph':
## 
##     as_data_frame, groups, union
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(ggplot2)

Data Cleaning

# Data Load
Keyword_data <- read.csv("/cloud/project/KCN/Keyword_data.csv")

# Removing the 1st column "Title"
Keyword_data <- Keyword_data[-1]

# Dropping the rows that have null entries
Keyword_data <- Keyword_data[!apply(Keyword_data == "", 1, all), ]
rownames(Keyword_data) <- 1:49

Explore the data

We have this dataset in which we try to find all the unique keywords and calculate the adjacency matrix counting the occurrences of all keyword-pairs in each row.

head(Keyword_data)

Creating a Keyword Adjacency Matrix

An adjacency matrix is a square matrix used to denote the weights between N x N items. In practice, it is used to map the association between graph nodes.

options(warn = -1)

# Obtaining all the unique keywords from the dataset
keywords <- unique(c(Keyword_data$Keyword.1, Keyword_data$Keyword.2, Keyword_data$Keyword.3,
                   Keyword_data$Keyword.4, Keyword_data$Keyword.5, Keyword_data$Keyword.6,
                   Keyword_data$Keyword.7, Keyword_data$Keyword.8, Keyword_data$Keyword.9,
                   Keyword_data$Keyword.10, Keyword_data$Keyword.11, Keyword_data$Keyword.12))
keywords <- keywords[!keywords == ""]

# Concatenate all the keywords in each row to a single string
# Matrix to store the concatenated keywords (Keyword.1, Keyword.2 and so on) for each row
KCN_each_row <- matrix(data = "|", nrow = 49, ncol = 1)

# for loop to iterate through the 49 rows to obtain concatenated strings for each row
# Adding a pipe delimiter between keywords so that it checks for the exact string while matching for creating adjacency matrix
for(i in 1 : nrow(KCN_each_row)) {
  for(j in 1 : ncol(Keyword_data)) {
    KCN_each_row[i,] <- paste(KCN_each_row[i,], Keyword_data[i,j], '|')
  }
}

# Creating a matrix to store the final weighted co-occurrence result
KCN_data <- matrix(data=0, nrow = length(keywords), ncol = length(keywords))
rownames(KCN_data) <- keywords
colnames(KCN_data) <- keywords

# Storing the colnames and rownames in variables to use it to iterate through the final matrix
keywords_rows <- rownames(KCN_data)
keywords_columns <- colnames(KCN_data)

for(i in 1 : nrow(KCN_data)) {
  for(j in 1 : ncol(KCN_data)) {
    
    # Create a matrix to count the co-occurrences of i-th and j-th keyword in each row of Keyword_data
    # Gets reset for each new column keyword of the KCN matrix
    count_each_keyword <- matrix(data = 0, nrow = length(KCN_each_row))
    for(k in 1 : length(KCN_each_row)) {
      
      keyword_to_check_row <- paste('|', keywords_rows[i], '|')
      keyword_to_check_column <- paste('|', keywords_columns[j], '|')
      count_each_keyword[k] <- as.integer((str_contains(KCN_each_row[k], keyword_to_check_row))
         && (str_contains(KCN_each_row[k], keyword_to_check_column)))
      
      # Setting the diagonal elements of the KCN Matrix as O
      if(i == j)
        KCN_data[i,j] <- 0
      else
        # Setting the total occurrence values for each keyword pair
        KCN_data[i,j] <- colSums(count_each_keyword)
    }
  }
}

sum(KCN_data)
## [1] 4878
# View(KCN_data)

Keyword co-occurence (KCN) matrix or adjacency matrix

Now we have obtained the KCN matrix which will be further used to perform network analysis. The KCN matrix looks like this:

head(KCN_data)
##                               EQUITY DIVERSIFICATION in industry
## EQUITY                             0                           0
## DIVERSIFICATION in industry        0                           0
## INTERORGANIZATIONAL relations      0                           0
## EXECUTIVE compensation             0                           0
## KNOWLEDGE management               0                           0
## EMOTIONS (Psychology)              0                           0
##                               INTERORGANIZATIONAL relations
## EQUITY                                                    0
## DIVERSIFICATION in industry                               0
## INTERORGANIZATIONAL relations                             0
## EXECUTIVE compensation                                    0
## KNOWLEDGE management                                      1
## EMOTIONS (Psychology)                                     0
##                               EXECUTIVE compensation KNOWLEDGE management
## EQUITY                                             0                    0
## DIVERSIFICATION in industry                        0                    0
## INTERORGANIZATIONAL relations                      0                    1
## EXECUTIVE compensation                             0                    0
## KNOWLEDGE management                               0                    0
## EMOTIONS (Psychology)                              0                    0
##                               EMOTIONS (Psychology) SUPERVISORS
## EQUITY                                            0           0
## DIVERSIFICATION in industry                       0           0
## INTERORGANIZATIONAL relations                     0           0
## EXECUTIVE compensation                            0           0
## KNOWLEDGE management                              0           0
## EMOTIONS (Psychology)                             0           0
##                               INDUSTRIAL relations DECISION making
## EQUITY                                           0               0
## DIVERSIFICATION in industry                      0               0
## INTERORGANIZATIONAL relations                    0               0
## EXECUTIVE compensation                           0               2
## KNOWLEDGE management                             0               1
## EMOTIONS (Psychology)                            0               0
##                               CORPORATE governance EXECUTIVES
## EQUITY                                           1          0
## DIVERSIFICATION in industry                      0          0
## INTERORGANIZATIONAL relations                    1          0
## EXECUTIVE compensation                           2          0
## KNOWLEDGE management                             2          0
## EMOTIONS (Psychology)                            0          0
##                               FAMILY-owned business enterprises
## EQUITY                                                        0
## DIVERSIFICATION in industry                                   0
## INTERORGANIZATIONAL relations                                 0
## EXECUTIVE compensation                                        1
## KNOWLEDGE management                                          0
## EMOTIONS (Psychology)                                         0
##                               INSTITUTIONAL investors RESEARCH & development
## EQUITY                                              0                      0
## DIVERSIFICATION in industry                         1                      0
## INTERORGANIZATIONAL relations                       0                      0
## EXECUTIVE compensation                              0                      1
## KNOWLEDGE management                                0                      1
## EMOTIONS (Psychology)                               0                      0
##                               PROPERTY STOCK options MANAGEMENT science
## EQUITY                               0             0                  0
## DIVERSIFICATION in industry          0             0                  1
## INTERORGANIZATIONAL relations        0             0                  1
## EXECUTIVE compensation               0             2                  1
## KNOWLEDGE management                 0             0                  1
## EMOTIONS (Psychology)                0             0                  0
##                               AGGRESSION (Psychology) CHIEF executive officers
## EQUITY                                              0                        0
## DIVERSIFICATION in industry                         0                        0
## INTERORGANIZATIONAL relations                       0                        0
## EXECUTIVE compensation                              0                        2
## KNOWLEDGE management                                0                        0
## EMOTIONS (Psychology)                               0                        0
##                               MENTAL fatigue PERSONNEL management
## EQUITY                                     0                    0
## DIVERSIFICATION in industry                0                    0
## INTERORGANIZATIONAL relations              0                    1
## EXECUTIVE compensation                     0                    1
## KNOWLEDGE management                       0                    0
## EMOTIONS (Psychology)                      0                    0
##                               PRODUCT management SOCIAL capital (Sociology)
## EQUITY                                         0                          0
## DIVERSIFICATION in industry                    1                          0
## INTERORGANIZATIONAL relations                  0                          0
## EXECUTIVE compensation                         0                          0
## KNOWLEDGE management                           0                          0
## EMOTIONS (Psychology)                          0                          0
##                               ORGANIZATIONAL behavior NEW products LEADERSHIP
## EQUITY                                              1            0          0
## DIVERSIFICATION in industry                         0            0          0
## INTERORGANIZATIONAL relations                       1            0          0
## EXECUTIVE compensation                              1            0          0
## KNOWLEDGE management                                1            0          0
## EMOTIONS (Psychology)                               0            0          0
##                               TEAMS in the workplace LABOR supply
## EQUITY                                             0            0
## DIVERSIFICATION in industry                        0            0
## INTERORGANIZATIONAL relations                      1            0
## EXECUTIVE compensation                             0            0
## KNOWLEDGE management                               0            0
## EMOTIONS (Psychology)                              0            0
##                               EMPLOYEES -- Attitudes WORK & family
## EQUITY                                             0             0
## DIVERSIFICATION in industry                        0             0
## INTERORGANIZATIONAL relations                      0             0
## EXECUTIVE compensation                             0             0
## KNOWLEDGE management                               0             0
## EMOTIONS (Psychology)                              1             0
##                               HUMAN capital SOCIAL status EMPLOYEE motivation
## EQUITY                                    0             0                   0
## DIVERSIFICATION in industry               0             0                   0
## INTERORGANIZATIONAL relations             0             0                   0
## EXECUTIVE compensation                    1             0                   0
## KNOWLEDGE management                      0             0                   0
## EMOTIONS (Psychology)                     0             0                   0
##                               ORGANIZATIONAL change CREATIVE ability
## EQUITY                                            0                0
## DIVERSIFICATION in industry                       0                0
## INTERORGANIZATIONAL relations                     0                0
## EXECUTIVE compensation                            0                0
## KNOWLEDGE management                              0                0
## EMOTIONS (Psychology)                             0                0
##                               GOING public (Securities)
## EQUITY                                                0
## DIVERSIFICATION in industry                           0
## INTERORGANIZATIONAL relations                         0
## EXECUTIVE compensation                                1
## KNOWLEDGE management                                  0
## EMOTIONS (Psychology)                                 0
##                               INTERNATIONAL business enterprises -- Management
## EQUITY                                                                       0
## DIVERSIFICATION in industry                                                  0
## INTERORGANIZATIONAL relations                                                0
## EXECUTIVE compensation                                                       0
## KNOWLEDGE management                                                         0
## EMOTIONS (Psychology)                                                        0
##                               COMPENSATION management CROSS-functional teams
## EQUITY                                              0                      0
## DIVERSIFICATION in industry                         0                      0
## INTERORGANIZATIONAL relations                       0                      0
## EXECUTIVE compensation                              1                      0
## KNOWLEDGE management                                0                      0
## EMOTIONS (Psychology)                               0                      0
##                               SERVICE industries -- Management
## EQUITY                                                       0
## DIVERSIFICATION in industry                                  0
## INTERORGANIZATIONAL relations                                0
## EXECUTIVE compensation                                       0
## KNOWLEDGE management                                         0
## EMOTIONS (Psychology)                                        0
##                               ORGANIZATIONAL sociology BUSINESS planning
## EQUITY                                               1                 0
## DIVERSIFICATION in industry                          0                 2
## INTERORGANIZATIONAL relations                        1                 0
## EXECUTIVE compensation                               0                 0
## KNOWLEDGE management                                 0                 0
## EMOTIONS (Psychology)                                0                 0
##                               INTERGROUP relations WAGES
## EQUITY                                           0     0
## DIVERSIFICATION in industry                      0     0
## INTERORGANIZATIONAL relations                    2     0
## EXECUTIVE compensation                           0     1
## KNOWLEDGE management                             1     0
## EMOTIONS (Psychology)                            0     0
##                               INFORMATION resources management
## EQUITY                                                       0
## DIVERSIFICATION in industry                                  0
## INTERORGANIZATIONAL relations                                0
## EXECUTIVE compensation                                       0
## KNOWLEDGE management                                         1
## EMOTIONS (Psychology)                                        0
##                               INTERPERSONAL relations JUSTICE
## EQUITY                                              0       0
## DIVERSIFICATION in industry                         0       0
## INTERORGANIZATIONAL relations                       0       0
## EXECUTIVE compensation                              0       0
## KNOWLEDGE management                                0       0
## EMOTIONS (Psychology)                               1       0
##                               INDUSTRIAL management STOCKHOLDERS wealth DEBT
## EQUITY                                            0                   0    0
## DIVERSIFICATION in industry                       0                   0    0
## INTERORGANIZATIONAL relations                     0                   0    0
## EXECUTIVE compensation                            0                   0    0
## KNOWLEDGE management                              0                   0    0
## EMOTIONS (Psychology)                             0                   0    0
##                               INVESTMENTS PERFORMANCE STOCKS (Finance)
## EQUITY                                  0           1                0
## DIVERSIFICATION in industry             0           0                0
## INTERORGANIZATIONAL relations           1           0                0
## EXECUTIVE compensation                  0           0                1
## KNOWLEDGE management                    1           0                0
## EMOTIONS (Psychology)                   0           0                0
##                               INDUSTRIAL organization VIOLENCE
## EQUITY                                              0        0
## DIVERSIFICATION in industry                         0        0
## INTERORGANIZATIONAL relations                       1        0
## EXECUTIVE compensation                              0        0
## KNOWLEDGE management                                0        0
## EMOTIONS (Psychology)                               0        0
##                               PERSONNEL changes JOB stress
## EQUITY                                        0          0
## DIVERSIFICATION in industry                   0          0
## INTERORGANIZATIONAL relations                 1          0
## EXECUTIVE compensation                        0          0
## KNOWLEDGE management                          0          0
## EMOTIONS (Psychology)                         0          1
##                               INFRASTRUCTURE (Economics) MULTILEVEL marketing
## EQUITY                                                 0                    0
## DIVERSIFICATION in industry                            0                    0
## INTERORGANIZATIONAL relations                          0                    0
## EXECUTIVE compensation                                 0                    0
## KNOWLEDGE management                                   0                    0
## EMOTIONS (Psychology)                                  0                    0
##                               PERFORMANCE evaluation LABOR organizing
## EQUITY                                             0                0
## DIVERSIFICATION in industry                        0                0
## INTERORGANIZATIONAL relations                      0                0
## EXECUTIVE compensation                             0                0
## KNOWLEDGE management                               0                0
## EMOTIONS (Psychology)                              0                0
##                               GENEROSITY EXECUTIVE ability (Management)
## EQUITY                                 0                              0
## DIVERSIFICATION in industry            0                              0
## INTERORGANIZATIONAL relations          0                              0
## EXECUTIVE compensation                 0                              1
## KNOWLEDGE management                   0                              0
## EMOTIONS (Psychology)                  0                              0
##                               JOB performance EMPLOYEE rules TAIWANESE
## EQUITY                                      0              0         0
## DIVERSIFICATION in industry                 0              0         0
## INTERORGANIZATIONAL relations               0              0         0
## EXECUTIVE compensation                      0              0         0
## KNOWLEDGE management                        0              0         0
## EMOTIONS (Psychology)                       0              0         0
##                               CORPORATE image CORPORATIONS -- Finance
## EQUITY                                      0                       0
## DIVERSIFICATION in industry                 0                       0
## INTERORGANIZATIONAL relations               0                       0
## EXECUTIVE compensation                      0                       1
## KNOWLEDGE management                        0                       0
## EMOTIONS (Psychology)                       0                       0
##                               FOREIGN subsidiaries -- Management
## EQUITY                                                         0
## DIVERSIFICATION in industry                                    0
## INTERORGANIZATIONAL relations                                  0
## EXECUTIVE compensation                                         0
## KNOWLEDGE management                                           0
## EMOTIONS (Psychology)                                          0
##                               COMPETITIVE advantage CUSTOMER relations
## EQUITY                                            0                  0
## DIVERSIFICATION in industry                       0                  0
## INTERORGANIZATIONAL relations                     0                  0
## EXECUTIVE compensation                            0                  0
## KNOWLEDGE management                              0                  0
## EMOTIONS (Psychology)                             0                  0
##                               PERFORMANCE standards BUSINESS communication
## EQUITY                                            0                      0
## DIVERSIFICATION in industry                       1                      0
## INTERORGANIZATIONAL relations                     0                      1
## EXECUTIVE compensation                            0                      0
## KNOWLEDGE management                              0                      1
## EMOTIONS (Psychology)                             0                      0
##                               MANAGEMENT information systems
## EQUITY                                                     0
## DIVERSIFICATION in industry                                0
## INTERORGANIZATIONAL relations                              0
## EXECUTIVE compensation                                     0
## KNOWLEDGE management                                       1
## EMOTIONS (Psychology)                                      0
##                               STRESS (Psychology) CONFLICT management
## EQUITY                                          0                   0
## DIVERSIFICATION in industry                     0                   0
## INTERORGANIZATIONAL relations                   0                   0
## EXECUTIVE compensation                          0                   0
## KNOWLEDGE management                            0                   0
## EMOTIONS (Psychology)                           1                   0
##                               DECISION theory STOCK repurchasing
## EQUITY                                      0                  0
## DIVERSIFICATION in industry                 0                  0
## INTERORGANIZATIONAL relations               0                  0
## EXECUTIVE compensation                      0                  0
## KNOWLEDGE management                        0                  0
## EMOTIONS (Psychology)                       0                  0
##                               DIRECTORS of corporations STOCKHOLDERS
## EQUITY                                                0            0
## DIVERSIFICATION in industry                           0            0
## INTERORGANIZATIONAL relations                         0            0
## EXECUTIVE compensation                                0            0
## KNOWLEDGE management                                  0            0
## EMOTIONS (Psychology)                                 0            0
##                               SCREENWRITERS SOCIAL psychology
## EQUITY                                    0                 0
## DIVERSIFICATION in industry               0                 0
## INTERORGANIZATIONAL relations             0                 0
## EXECUTIVE compensation                    0                 0
## KNOWLEDGE management                      0                 0
## EMOTIONS (Psychology)                     0                 1
##                               SUCCESSION planning INDUSTRIAL psychology
## EQUITY                                          0                     0
## DIVERSIFICATION in industry                     0                     0
## INTERORGANIZATIONAL relations                   0                     0
## EXECUTIVE compensation                          0                     0
## KNOWLEDGE management                            0                     0
## EMOTIONS (Psychology)                           0                     0
##                               PROBLEM solving VENTURE capital
## EQUITY                                      0               0
## DIVERSIFICATION in industry                 0               0
## INTERORGANIZATIONAL relations               0               0
## EXECUTIVE compensation                      0               0
## KNOWLEDGE management                        0               0
## EMOTIONS (Psychology)                       0               0
##                               ORGANIZATIONAL commitment COMMERCIAL products
## EQUITY                                                0                   0
## DIVERSIFICATION in industry                           0                   0
## INTERORGANIZATIONAL relations                         0                   0
## EXECUTIVE compensation                                0                   0
## KNOWLEDGE management                                  0                   0
## EMOTIONS (Psychology)                                 0                   0
##                               STRATEGIC planning CRITICAL thinking
## EQUITY                                         0                 0
## DIVERSIFICATION in industry                    2                 0
## INTERORGANIZATIONAL relations                  0                 0
## EXECUTIVE compensation                         0                 0
## KNOWLEDGE management                           0                 0
## EMOTIONS (Psychology)                          0                 0
##                               CONDUCT of life CAPITAL investments
## EQUITY                                      0                   0
## DIVERSIFICATION in industry                 0                   0
## INTERORGANIZATIONAL relations               0                   0
## EXECUTIVE compensation                      0                   0
## KNOWLEDGE management                        0                   0
## EMOTIONS (Psychology)                       0                   0
##                               BEHAVIORAL research HUMAN error EMPLOYEES
## EQUITY                                          0           0         0
## DIVERSIFICATION in industry                     0           0         0
## INTERORGANIZATIONAL relations                   0           0         0
## EXECUTIVE compensation                          0           0         0
## KNOWLEDGE management                            0           0         0
## EMOTIONS (Psychology)                           0           0         0
##                               STOCKHOLDERS -- Attitudes INCENTIVES in industry
## EQUITY                                                0                      0
## DIVERSIFICATION in industry                           0                      0
## INTERORGANIZATIONAL relations                         0                      0
## EXECUTIVE compensation                                0                      1
## KNOWLEDGE management                                  0                      0
## EMOTIONS (Psychology)                                 0                      0
##                               CREATIVE ability in business EMPLOYEE selection
## EQUITY                                                   0                  0
## DIVERSIFICATION in industry                              0                  0
## INTERORGANIZATIONAL relations                            0                  0
## EXECUTIVE compensation                                   0                  0
## KNOWLEDGE management                                     0                  0
## EMOTIONS (Psychology)                                    0                  0
##                               BUSINESS networks GROUP identity META-analysis
## EQUITY                                        0              0             1
## DIVERSIFICATION in industry                   0              0             0
## INTERORGANIZATIONAL relations                 2              0             0
## EXECUTIVE compensation                        0              0             0
## KNOWLEDGE management                          0              0             0
## EMOTIONS (Psychology)                         0              0             0
##                               EMPLOYEES -- Rating of LABOR economics
## EQUITY                                             0               0
## DIVERSIFICATION in industry                        1               0
## INTERORGANIZATIONAL relations                      0               0
## EXECUTIVE compensation                             0               1
## KNOWLEDGE management                               0               0
## EMOTIONS (Psychology)                              0               0
##                               BREAK-even analysis SOCIAL interaction MEDIATION
## EQUITY                                          0                  0         0
## DIVERSIFICATION in industry                     0                  0         0
## INTERORGANIZATIONAL relations                   0                  0         0
## EXECUTIVE compensation                          0                  0         0
## KNOWLEDGE management                            1                  0         0
## EMOTIONS (Psychology)                           0                  1         0
##                               AGENCY theory GLOBALIZATION BUSINESS enterprises
## EQUITY                                    1             0                    0
## DIVERSIFICATION in industry               0             1                    0
## INTERORGANIZATIONAL relations             0             0                    0
## EXECUTIVE compensation                    0             0                    1
## KNOWLEDGE management                      0             0                    0
## EMOTIONS (Psychology)                     0             0                    0
##                               PROFIT STOCK ownership
## EQUITY                             0               0
## DIVERSIFICATION in industry        0               0
## INTERORGANIZATIONAL relations      0               0
## EXECUTIVE compensation             0               1
## KNOWLEDGE management               0               0
## EMOTIONS (Psychology)              0               0
##                               ORGANIZATIONAL effectiveness
## EQUITY                                                   1
## DIVERSIFICATION in industry                              1
## INTERORGANIZATIONAL relations                            1
## EXECUTIVE compensation                                   1
## KNOWLEDGE management                                     0
## EMOTIONS (Psychology)                                    0
##                               ORGANIZATIONAL justice EXECUTIVE succession
## EQUITY                                             0                    0
## DIVERSIFICATION in industry                        0                    0
## INTERORGANIZATIONAL relations                      0                    0
## EXECUTIVE compensation                             0                    0
## KNOWLEDGE management                               0                    0
## EMOTIONS (Psychology)                              0                    0
##                               BURNOUT (Psychology) QUALITY of products
## EQUITY                                           0                   0
## DIVERSIFICATION in industry                      0                   0
## INTERORGANIZATIONAL relations                    0                   0
## EXECUTIVE compensation                           0                   0
## KNOWLEDGE management                             0                   0
## EMOTIONS (Psychology)                            0                   0
##                               MARKETING management SELF-management (Psychology)
## EQUITY                                           0                            0
## DIVERSIFICATION in industry                      0                            0
## INTERORGANIZATIONAL relations                    0                            0
## EXECUTIVE compensation                           0                            0
## KNOWLEDGE management                             0                            0
## EMOTIONS (Psychology)                            0                            0
##                               WORKFLOW SOCIAL influence WOMEN employees
## EQUITY                               0                0               0
## DIVERSIFICATION in industry          0                0               0
## INTERORGANIZATIONAL relations        0                0               0
## EXECUTIVE compensation               0                0               0
## KNOWLEDGE management                 0                0               0
## EMOTIONS (Psychology)                0                0               0
##                               LABOR productivity MOTIVATION (Psychology) RISK
## EQUITY                                         0                       0    0
## DIVERSIFICATION in industry                    0                       0    0
## INTERORGANIZATIONAL relations                  0                       0    0
## EXECUTIVE compensation                         0                       0    1
## KNOWLEDGE management                           0                       0    0
## EMOTIONS (Psychology)                          0                       0    0
##                               CAPITALISTS & financiers OPTIONS (Finance)
## EQUITY                                               0                 0
## DIVERSIFICATION in industry                          0                 0
## INTERORGANIZATIONAL relations                        0                 0
## EXECUTIVE compensation                               1                 1
## KNOWLEDGE management                                 0                 0
## EMOTIONS (Psychology)                                0                 0
##                               EXECUTIVES -- Recruiting
## EQUITY                                               0
## DIVERSIFICATION in industry                          0
## INTERORGANIZATIONAL relations                        1
## EXECUTIVE compensation                               0
## KNOWLEDGE management                                 0
## EMOTIONS (Psychology)                                0
##                               HOSPITALS -- Administration PRODUCTION management
## EQUITY                                                  0                     0
## DIVERSIFICATION in industry                             0                     0
## INTERORGANIZATIONAL relations                           0                     0
## EXECUTIVE compensation                                  0                     0
## KNOWLEDGE management                                    0                     0
## EMOTIONS (Psychology)                                   0                     0
##                               PSYCHOMETRICS CORPORATE culture SUPPLY chains
## EQUITY                                    1                 0             0
## DIVERSIFICATION in industry               0                 1             0
## INTERORGANIZATIONAL relations             0                 0             1
## EXECUTIVE compensation                    0                 0             0
## KNOWLEDGE management                      0                 0             1
## EMOTIONS (Psychology)                     0                 0             0
##                               DATA mining PUNCTUATED equilibrium (Evolution)
## EQUITY                                  0                                  0
## DIVERSIFICATION in industry             0                                  0
## INTERORGANIZATIONAL relations           0                                  0
## EXECUTIVE compensation                  0                                  0
## KNOWLEDGE management                    1                                  0
## EMOTIONS (Psychology)                   0                                  0
##                               HIGH technology industries BOARDS of directors
## EQUITY                                                 0                   0
## DIVERSIFICATION in industry                            0                   1
## INTERORGANIZATIONAL relations                          0                   0
## EXECUTIVE compensation                                 0                   0
## KNOWLEDGE management                                   0                   0
## EMOTIONS (Psychology)                                  0                   0
##                               MINORITY stockholders WORK environment
## EQUITY                                            0                0
## DIVERSIFICATION in industry                       0                0
## INTERORGANIZATIONAL relations                     0                0
## EXECUTIVE compensation                            0                0
## KNOWLEDGE management                              0                0
## EMOTIONS (Psychology)                             0                0
##                               SOCIAL networks CONTAGION (Social psychology)
## EQUITY                                      0                             0
## DIVERSIFICATION in industry                 0                             0
## INTERORGANIZATIONAL relations               0                             1
## EXECUTIVE compensation                      0                             0
## KNOWLEDGE management                        0                             0
## EMOTIONS (Psychology)                       0                             0
##                               DECENTRALIZATION in management
## EQUITY                                                     0
## DIVERSIFICATION in industry                                0
## INTERORGANIZATIONAL relations                              0
## EXECUTIVE compensation                                     0
## KNOWLEDGE management                                       0
## EMOTIONS (Psychology)                                      0
##                               QUALITY of work life MARKETING
## EQUITY                                           0         0
## DIVERSIFICATION in industry                      0         0
## INTERORGANIZATIONAL relations                    0         0
## EXECUTIVE compensation                           0         0
## KNOWLEDGE management                             0         0
## EMOTIONS (Psychology)                            0         0
##                               MANAGEMENT -- Employee participation MANAGEMENT
## EQUITY                                                           0          0
## DIVERSIFICATION in industry                                      0          0
## INTERORGANIZATIONAL relations                                    0          0
## EXECUTIVE compensation                                           0          0
## KNOWLEDGE management                                             0          0
## EMOTIONS (Psychology)                                            0          0
##                               EMPLOYEE loyalty INDIVIDUAL differences
## EQUITY                                       0                      0
## DIVERSIFICATION in industry                  0                      0
## INTERORGANIZATIONAL relations                0                      0
## EXECUTIVE compensation                       0                      0
## KNOWLEDGE management                         0                      0
## EMOTIONS (Psychology)                        0                      0
##                               STOCKS (Finance) -- Prices
## EQUITY                                                 0
## DIVERSIFICATION in industry                            0
## INTERORGANIZATIONAL relations                          0
## EXECUTIVE compensation                                 0
## KNOWLEDGE management                                   0
## EMOTIONS (Psychology)                                  0
##                               CONSOLIDATION & merger of corporations
## EQUITY                                                             0
## DIVERSIFICATION in industry                                        0
## INTERORGANIZATIONAL relations                                      0
## EXECUTIVE compensation                                             0
## KNOWLEDGE management                                               0
## EMOTIONS (Psychology)                                              0
##                               SOCIAL exchange MASS media
## EQUITY                                      0          0
## DIVERSIFICATION in industry                 0          0
## INTERORGANIZATIONAL relations               0          0
## EXECUTIVE compensation                      0          0
## KNOWLEDGE management                        0          0
## EMOTIONS (Psychology)                       0          0
##                               CORPORATIONS -- Valuation INNOVATIONS in business
## EQUITY                                                0                       0
## DIVERSIFICATION in industry                           0                       0
## INTERORGANIZATIONAL relations                         0                       0
## EXECUTIVE compensation                                1                       0
## KNOWLEDGE management                                  0                       0
## EMOTIONS (Psychology)                                 0                       0
##                               ORGANIZATIONAL goals ORGANIZATIONAL research
## EQUITY                                           0                       1
## DIVERSIFICATION in industry                      0                       0
## INTERORGANIZATIONAL relations                    0                       0
## EXECUTIVE compensation                           0                       0
## KNOWLEDGE management                             0                       0
## EMOTIONS (Psychology)                            0                       0
##                               ORGANIZATIONAL structure
## EQUITY                                               0
## DIVERSIFICATION in industry                          0
## INTERORGANIZATIONAL relations                        1
## EXECUTIVE compensation                               2
## KNOWLEDGE management                                 0
## EMOTIONS (Psychology)                                0
##                               INTERNATIONAL business enterprises
## EQUITY                                                         0
## DIVERSIFICATION in industry                                    1
## INTERORGANIZATIONAL relations                                  0
## EXECUTIVE compensation                                         0
## KNOWLEDGE management                                           0
## EMOTIONS (Psychology)                                          0
##                               MUNICIPAL corporations EMINENT domain
## EQUITY                                             0              0
## DIVERSIFICATION in industry                        0              0
## INTERORGANIZATIONAL relations                      0              0
## EXECUTIVE compensation                             1              0
## KNOWLEDGE management                               0              0
## EMOTIONS (Psychology)                              0              0
##                               EMPLOYEE stock options
## EQUITY                                             0
## DIVERSIFICATION in industry                        0
## INTERORGANIZATIONAL relations                      0
## EXECUTIVE compensation                             1
## KNOWLEDGE management                               0
## EMOTIONS (Psychology)                              0
##                               SOCIAL judgment theory (Communication)
## EQUITY                                                             0
## DIVERSIFICATION in industry                                        0
## INTERORGANIZATIONAL relations                                      0
## EXECUTIVE compensation                                             0
## KNOWLEDGE management                                               0
## EMOTIONS (Psychology)                                              0
##                               JOB satisfaction CRITICAL incident technique
## EQUITY                                       0                           0
## DIVERSIFICATION in industry                  0                           0
## INTERORGANIZATIONAL relations                0                           0
## EXECUTIVE compensation                       0                           0
## KNOWLEDGE management                         0                           0
## EMOTIONS (Psychology)                        0                           0
##                               EXECUTIVES -- Dismissal of
## EQUITY                                                 0
## DIVERSIFICATION in industry                            0
## INTERORGANIZATIONAL relations                          0
## EXECUTIVE compensation                                 0
## KNOWLEDGE management                                   0
## EMOTIONS (Psychology)                                  0
##                               CORPORATIONS -- Investor relations
## EQUITY                                                         0
## DIVERSIFICATION in industry                                    0
## INTERORGANIZATIONAL relations                                  0
## EXECUTIVE compensation                                         0
## KNOWLEDGE management                                           0
## EMOTIONS (Psychology)                                          0
##                               INNOVATION management
## EQUITY                                            0
## DIVERSIFICATION in industry                       0
## INTERORGANIZATIONAL relations                     0
## EXECUTIVE compensation                            0
## KNOWLEDGE management                              0
## EMOTIONS (Psychology)                             0
##                               WORK environment -- Psychological aspects
## EQUITY                                                                0
## DIVERSIFICATION in industry                                           0
## INTERORGANIZATIONAL relations                                         0
## EXECUTIVE compensation                                                0
## KNOWLEDGE management                                                  0
## EMOTIONS (Psychology)                                                 0
##                               FINANCIAL performance CUSTOMER services
## EQUITY                                            1                 0
## DIVERSIFICATION in industry                       0                 0
## INTERORGANIZATIONAL relations                     0                 0
## EXECUTIVE compensation                            0                 0
## KNOWLEDGE management                              0                 0
## EMOTIONS (Psychology)                             0                 1
##                               INTERORGANIZATIONAL networks
## EQUITY                                                   0
## DIVERSIFICATION in industry                              0
## INTERORGANIZATIONAL relations                            2
## EXECUTIVE compensation                                   0
## KNOWLEDGE management                                     1
## EMOTIONS (Psychology)                                    0
##                               CONTINGENCY theory (Management)
## EQUITY                                                      0
## DIVERSIFICATION in industry                                 0
## INTERORGANIZATIONAL relations                               0
## EXECUTIVE compensation                                      1
## KNOWLEDGE management                                        0
## EMOTIONS (Psychology)                                       0
##                               EMPLOYEE ownership FOREIGN investments
## EQUITY                                         0                   0
## DIVERSIFICATION in industry                    0                   1
## INTERORGANIZATIONAL relations                  0                   0
## EXECUTIVE compensation                         0                   0
## KNOWLEDGE management                           0                   0
## EMOTIONS (Psychology)                          0                   0
##                               MOTION picture authorship ENTREPRENEURSHIP
## EQUITY                                                0                0
## DIVERSIFICATION in industry                           0                0
## INTERORGANIZATIONAL relations                         0                0
## EXECUTIVE compensation                                0                0
## KNOWLEDGE management                                  0                0
## EMOTIONS (Psychology)                                 0                0
##                               AMBIVALENCE MARKETING -- Decision making
## EQUITY                                  0                            0
## DIVERSIFICATION in industry             0                            0
## INTERORGANIZATIONAL relations           0                            0
## EXECUTIVE compensation                  0                            0
## KNOWLEDGE management                    0                            0
## EMOTIONS (Psychology)                   0                            0
##                               TASK analysis SOCIAL context
## EQUITY                                    0              0
## DIVERSIFICATION in industry               0              0
## INTERORGANIZATIONAL relations             0              0
## EXECUTIVE compensation                    0              0
## KNOWLEDGE management                      0              0
## EMOTIONS (Psychology)                     0              0
##                               HUMAN resource accounting SOCIAL factors
## EQUITY                                                0              0
## DIVERSIFICATION in industry                           0              0
## INTERORGANIZATIONAL relations                         0              0
## EXECUTIVE compensation                                0              0
## KNOWLEDGE management                                  0              0
## EMOTIONS (Psychology)                                 0              0
##                               PYGMALION (Greek mythology)
## EQUITY                                                  0
## DIVERSIFICATION in industry                             0
## INTERORGANIZATIONAL relations                           0
## EXECUTIVE compensation                                  0
## KNOWLEDGE management                                    0
## EMOTIONS (Psychology)                                   0
##                               MATHEMATICAL statistics RESOURCE management
## EQUITY                                              0                   0
## DIVERSIFICATION in industry                         0                   0
## INTERORGANIZATIONAL relations                       0                   0
## EXECUTIVE compensation                              0                   0
## KNOWLEDGE management                                0                   0
## EMOTIONS (Psychology)                               0                   0
##                               WAGE payment systems LABOR process
## EQUITY                                           0             0
## DIVERSIFICATION in industry                      0             0
## INTERORGANIZATIONAL relations                    0             0
## EXECUTIVE compensation                           0             0
## KNOWLEDGE management                             0             0
## EMOTIONS (Psychology)                            0             0
##                               RESEARCH & development contracts
## EQUITY                                                       0
## DIVERSIFICATION in industry                                  0
## INTERORGANIZATIONAL relations                                0
## EXECUTIVE compensation                                       0
## KNOWLEDGE management                                         1
## EMOTIONS (Psychology)                                        0
##                               CUSTOMER satisfaction
## EQUITY                                            0
## DIVERSIFICATION in industry                       0
## INTERORGANIZATIONAL relations                     0
## EXECUTIVE compensation                            0
## KNOWLEDGE management                              0
## EMOTIONS (Psychology)                             1
##                               UNITED States -- National Guard PENSION trusts
## EQUITY                                                      0              0
## DIVERSIFICATION in industry                                 0              1
## INTERORGANIZATIONAL relations                               0              0
## EXECUTIVE compensation                                      0              0
## KNOWLEDGE management                                        0              0
## EMOTIONS (Psychology)                                       0              0
##                               STEWARDS SELF-perception SUPPLIERS
## EQUITY                               0               0         0
## DIVERSIFICATION in industry          0               0         0
## INTERORGANIZATIONAL relations        0               0         1
## EXECUTIVE compensation               0               0         0
## KNOWLEDGE management                 0               0         0
## EMOTIONS (Psychology)                0               0         0
##                               VIOLENCE in the workplace MANAGEMENT research
## EQUITY                                                0                   0
## DIVERSIFICATION in industry                           0                   1
## INTERORGANIZATIONAL relations                         0                   0
## EXECUTIVE compensation                                0                   0
## KNOWLEDGE management                                  0                   0
## EMOTIONS (Psychology)                                 0                   0
##                               EMPLOYEE recruitment PRODUCT design
## EQUITY                                           0              0
## DIVERSIFICATION in industry                      0              0
## INTERORGANIZATIONAL relations                    1              0
## EXECUTIVE compensation                           0              0
## KNOWLEDGE management                             0              0
## EMOTIONS (Psychology)                            0              0
##                               CAPITAL market WOMEN -- Employment
## EQUITY                                     0                   0
## DIVERSIFICATION in industry                0                   0
## INTERORGANIZATIONAL relations              0                   0
## EXECUTIVE compensation                     0                   0
## KNOWLEDGE management                       0                   0
## EMOTIONS (Psychology)                      0                   0
##                               EMPLOYEES -- Attitudes -- Research
## EQUITY                                                         0
## DIVERSIFICATION in industry                                    0
## INTERORGANIZATIONAL relations                                  0
## EXECUTIVE compensation                                         0
## KNOWLEDGE management                                           0
## EMOTIONS (Psychology)                                          0
##                               CHARISMATIC authority
## EQUITY                                            0
## DIVERSIFICATION in industry                       0
## INTERORGANIZATIONAL relations                     0
## EXECUTIVE compensation                            0
## KNOWLEDGE management                              0
## EMOTIONS (Psychology)                             0
##                               GALATEA, sea nymph (Greek deity)
## EQUITY                                                       0
## DIVERSIFICATION in industry                                  0
## INTERORGANIZATIONAL relations                                0
## EXECUTIVE compensation                                       0
## KNOWLEDGE management                                         0
## EMOTIONS (Psychology)                                        0
##                               CROSS-cultural differences
## EQUITY                                                 0
## DIVERSIFICATION in industry                            0
## INTERORGANIZATIONAL relations                          0
## EXECUTIVE compensation                                 0
## KNOWLEDGE management                                   0
## EMOTIONS (Psychology)                                  0
##                               CORPORATIONS -- Public relations
## EQUITY                                                       0
## DIVERSIFICATION in industry                                  0
## INTERORGANIZATIONAL relations                                0
## EXECUTIVE compensation                                       0
## KNOWLEDGE management                                         0
## EMOTIONS (Psychology)                                        0
##                               SHIPBUILDING industry
## EQUITY                                            0
## DIVERSIFICATION in industry                       0
## INTERORGANIZATIONAL relations                     0
## EXECUTIVE compensation                            0
## KNOWLEDGE management                              0
## EMOTIONS (Psychology)                             0
##                               RESOURCE-based theory of the firm
## EQUITY                                                        0
## DIVERSIFICATION in industry                                   0
## INTERORGANIZATIONAL relations                                 0
## EXECUTIVE compensation                                        0
## KNOWLEDGE management                                          0
## EMOTIONS (Psychology)                                         0
##                               GROUP decision making BUSINESS models
## EQUITY                                            0               0
## DIVERSIFICATION in industry                       0               0
## INTERORGANIZATIONAL relations                     1               0
## EXECUTIVE compensation                            0               0
## KNOWLEDGE management                              1               0
## EMOTIONS (Psychology)                             0               0
##                               HIGH technology STRATEGIC alliances (Business)
## EQUITY                                      0                              0
## DIVERSIFICATION in industry                 1                              0
## INTERORGANIZATIONAL relations               0                              1
## EXECUTIVE compensation                      0                              0
## KNOWLEDGE management                        0                              0
## EMOTIONS (Psychology)                       0                              0
##                               ANGER in the workplace INTRINSIC motivation
## EQUITY                                             0                    0
## DIVERSIFICATION in industry                        0                    0
## INTERORGANIZATIONAL relations                      0                    0
## EXECUTIVE compensation                             0                    0
## KNOWLEDGE management                               0                    0
## EMOTIONS (Psychology)                              0                    0
##                               PRODUCT lines DELEGATION of authority
## EQUITY                                    0                       0
## DIVERSIFICATION in industry               0                       0
## INTERORGANIZATIONAL relations             0                       0
## EXECUTIVE compensation                    0                       0
## KNOWLEDGE management                      0                       0
## EMOTIONS (Psychology)                     0                       0
##                               LABOR turnover SELF-congruence
## EQUITY                                     0               0
## DIVERSIFICATION in industry                0               0
## INTERORGANIZATIONAL relations              0               0
## EXECUTIVE compensation                     0               0
## KNOWLEDGE management                       0               0
## EMOTIONS (Psychology)                      0               0
##                               GOAL setting in personnel management
## EQUITY                                                           0
## DIVERSIFICATION in industry                                      0
## INTERORGANIZATIONAL relations                                    0
## EXECUTIVE compensation                                           0
## KNOWLEDGE management                                             0
## EMOTIONS (Psychology)                                            0
##                               PUBLIC companies
## EQUITY                                       0
## DIVERSIFICATION in industry                  0
## INTERORGANIZATIONAL relations                0
## EXECUTIVE compensation                       0
## KNOWLEDGE management                         0
## EMOTIONS (Psychology)                        0
##                               BUSINESS enterprises -- Valuation
## EQUITY                                                        0
## DIVERSIFICATION in industry                                   0
## INTERORGANIZATIONAL relations                                 0
## EXECUTIVE compensation                                        1
## KNOWLEDGE management                                          0
## EMOTIONS (Psychology)                                         0
##                               TECHNOLOGICAL innovations -- Economic aspects
## EQUITY                                                                    0
## DIVERSIFICATION in industry                                               0
## INTERORGANIZATIONAL relations                                             0
## EXECUTIVE compensation                                                    0
## KNOWLEDGE management                                                      0
## EMOTIONS (Psychology)                                                     0
##                               HUMAN capital -- Management INTELLECTUAL capital
## EQUITY                                                  0                    0
## DIVERSIFICATION in industry                             0                    0
## INTERORGANIZATIONAL relations                           0                    1
## EXECUTIVE compensation                                  0                    0
## KNOWLEDGE management                                    0                    1
## EMOTIONS (Psychology)                                   0                    0
##                               PEER review (Professional performance)
## EQUITY                                                             0
## DIVERSIFICATION in industry                                        0
## INTERORGANIZATIONAL relations                                      0
## EXECUTIVE compensation                                             0
## KNOWLEDGE management                                               0
## EMOTIONS (Psychology)                                              1
##                               RISK management in business JOB qualifications
## EQUITY                                                  0                  0
## DIVERSIFICATION in industry                             0                  0
## INTERORGANIZATIONAL relations                           0                  0
## EXECUTIVE compensation                                  1                  0
## KNOWLEDGE management                                    0                  0
## EMOTIONS (Psychology)                                   0                  0
##                               PRODUCT information management MANAGEMENT styles
## EQUITY                                                     0                 0
## DIVERSIFICATION in industry                                0                 0
## INTERORGANIZATIONAL relations                              0                 0
## EXECUTIVE compensation                                     0                 0
## KNOWLEDGE management                                       0                 0
## EMOTIONS (Psychology)                                      0                 0
##                               REWARD (Psychology) OCCUPATIONAL roles
## EQUITY                                          0                  0
## DIVERSIFICATION in industry                     0                  0
## INTERORGANIZATIONAL relations                   0                  0
## EXECUTIVE compensation                          0                  0
## KNOWLEDGE management                            0                  0
## EMOTIONS (Psychology)                           0                  0
##                               ERROR rates TURNOVER (Business)
## EQUITY                                  0                   0
## DIVERSIFICATION in industry             0                   0
## INTERORGANIZATIONAL relations           0                   0
## EXECUTIVE compensation                  0                   0
## KNOWLEDGE management                    0                   0
## EMOTIONS (Psychology)                   0                   0
##                               SUCCESS in business DIVISION of labor
## EQUITY                                          0                 0
## DIVERSIFICATION in industry                     0                 0
## INTERORGANIZATIONAL relations                   0                 0
## EXECUTIVE compensation                          0                 0
## KNOWLEDGE management                            0                 0
## EMOTIONS (Psychology)                           0                 0
##                               EMPLOYMENT in foreign countries
## EQUITY                                                      0
## DIVERSIFICATION in industry                                 0
## INTERORGANIZATIONAL relations                               0
## EXECUTIVE compensation                                      0
## KNOWLEDGE management                                        0
## EMOTIONS (Psychology)                                       0
##                               INDUSTRIAL efficiency RESOURCE allocation
## EQUITY                                            0                   0
## DIVERSIFICATION in industry                       0                   0
## INTERORGANIZATIONAL relations                     0                   0
## EXECUTIVE compensation                            0                   0
## KNOWLEDGE management                              0                   0
## EMOTIONS (Psychology)                             0                   0
##                               TECHNOLOGICAL innovations PROBLEM employees
## EQUITY                                                0                 0
## DIVERSIFICATION in industry                           1                 0
## INTERORGANIZATIONAL relations                         0                 0
## EXECUTIVE compensation                                0                 0
## KNOWLEDGE management                                  0                 0
## EMOTIONS (Psychology)                                 0                 0
##                               STRATEGIC business units
## EQUITY                                               0
## DIVERSIFICATION in industry                          0
## INTERORGANIZATIONAL relations                        0
## EXECUTIVE compensation                               0
## KNOWLEDGE management                                 0
## EMOTIONS (Psychology)                                0
##                               SUBSIDIARY corporations -- Management
## EQUITY                                                            0
## DIVERSIFICATION in industry                                       0
## INTERORGANIZATIONAL relations                                     0
## EXECUTIVE compensation                                            0
## KNOWLEDGE management                                              0
## EMOTIONS (Psychology)                                             0
##                               FINANCIAL management CUSTOMER orientation
## EQUITY                                           0                    0
## DIVERSIFICATION in industry                      0                    0
## INTERORGANIZATIONAL relations                    0                    0
## EXECUTIVE compensation                           0                    0
## KNOWLEDGE management                             0                    0
## EMOTIONS (Psychology)                            0                    0
##                               TRANSACTION costs INNOVATION adoption
## EQUITY                                        0                   0
## DIVERSIFICATION in industry                   0                   1
## INTERORGANIZATIONAL relations                 0                   0
## EXECUTIVE compensation                        0                   0
## KNOWLEDGE management                          1                   0
## EMOTIONS (Psychology)                         0                   0
##                               WORK attitudes HOST countries (Business)
## EQUITY                                     0                         0
## DIVERSIFICATION in industry                0                         0
## INTERORGANIZATIONAL relations              0                         0
## EXECUTIVE compensation                     0                         0
## KNOWLEDGE management                       0                         0
## EMOTIONS (Psychology)                      0                         0
##                               MARKETING strategy
## EQUITY                                         0
## DIVERSIFICATION in industry                    0
## INTERORGANIZATIONAL relations                  0
## EXECUTIVE compensation                         0
## KNOWLEDGE management                           0
## EMOTIONS (Psychology)                          0

Creating a weighted Network using Adjacency Matrix

A network is a connection of interacting nodes using edges. When the edges represent the number of connections, then the network is called a weighted network.

Exploring the network graph

# Creating the weighted network
KCN_network <- graph_from_adjacency_matrix(KCN_data, mode = "undirected", weighted = TRUE)
summary(KCN_network)
## IGRAPH 95d3a7d UNW- 248 2141 -- 
## + attr: name (v/c), weight (e/n)
# Exploring the igraph data
# number of edges
print(paste0("Number of edges = ", gsize(KCN_network)))
## [1] "Number of edges = 2141"
# number of vertex
print(paste0("Number of nodes = ", gorder(KCN_network)))
## [1] "Number of nodes = 248"
# node lists
V(KCN_network)
## + 248/248 vertices, named, from 95d3a7d:
##   [1] EQUITY                                          
##   [2] DIVERSIFICATION in industry                     
##   [3] INTERORGANIZATIONAL relations                   
##   [4] EXECUTIVE compensation                          
##   [5] KNOWLEDGE management                            
##   [6] EMOTIONS (Psychology)                           
##   [7] SUPERVISORS                                     
##   [8] INDUSTRIAL relations                            
##   [9] DECISION making                                 
##  [10] CORPORATE governance                            
## + ... omitted several vertices
# edge lists
E(KCN_network)
## + 2141/2141 edges from 95d3a7d (vertex names):
##  [1] EQUITY                     --CORPORATE governance        
##  [2] EQUITY                     --ORGANIZATIONAL behavior     
##  [3] EQUITY                     --ORGANIZATIONAL sociology    
##  [4] EQUITY                     --PERFORMANCE                 
##  [5] EQUITY                     --META-analysis               
##  [6] EQUITY                     --AGENCY theory               
##  [7] EQUITY                     --ORGANIZATIONAL effectiveness
##  [8] EQUITY                     --PSYCHOMETRICS               
##  [9] EQUITY                     --ORGANIZATIONAL research     
## [10] EQUITY                     --FINANCIAL performance       
## + ... omitted several edges

Plotting the network graph

KCN_plot <- igraph::simplify(KCN_network,
                             remove.multiple = TRUE,
                             remove.loops = TRUE)
plot(KCN_plot,
     layout = layout_with_graphopt,
     edge.arrow.size = 0.1,
     vertex.size = 3,
     vertex.color = "red",
     vertex.label.cex = 0.5)
title(main = list("Network Graph of KCN adjacency matrix", cex=1.5))

Determing the Node Degree and Strength of each Node

KCN_degree_strength <- cbind(degree(KCN_network, mode = "all"), strength(KCN_network, mode = "all"))
KCN_degree_strength <- as.data.frame(KCN_degree_strength)
colnames(KCN_degree_strength) <- c("Degree", "Strength")

# View(KCN_degree_strength)
KCN_degree_strength

Finding:

1.) Top 10 Nodes by Degree

2.) Top 10 Nodes by Strength

3.) Top 10 Node Pairs by Weight

# Top 10 Nodes by Degree
KCN_degree_top10 <- KCN_degree_strength %>%
  select(Degree) %>%
  arrange(desc(Degree)) %>%
  top_n(10)
## Selecting by Degree
KCN_degree_top10
# Top 10 Nodes by Strength
KCN_strength_top10 <- KCN_degree_strength %>%
  select(Strength) %>%
  arrange(desc(Strength)) %>%
  top_n(10)
## Selecting by Strength
KCN_strength_top10
# Top 10 Node Pairs by Weight
KCN_node_pairs <- as.data.frame(E(KCN_network)$weight)
edges <- as.data.frame(as_edgelist(KCN_network, names = TRUE))
edges <- as.data.frame(paste(edges$V1, edges$V2, sep = " -- "))
KCN_node_pairs <- cbind(edges = edges, weight = KCN_node_pairs)
colnames(KCN_node_pairs) <- c("Node Pairs", "Weight")
KCN_node_pairs_top10 <- KCN_node_pairs %>%
  arrange(desc(Weight)) %>%
  slice(1:10)

KCN_node_pairs_top10
# View(KCN_degree_top10)
# View(KCN_strength_top10)  
# View(KCN_node_pairs_top10)

Plotting Average Strength v/s Degree of the Network

#Calculating average strength for different degree values
KCN_avg_Strength_by_degree <- KCN_degree_strength %>%
  group_by(Degree) %>%
  summarise(Avg_Strength = mean(Strength))

#Average Strength v/s Degree
  ggplot(KCN_avg_Strength_by_degree, aes(Degree, Avg_Strength, size = Avg_Strength)) +
  geom_point(alpha = 0.5) +
  scale_size(name = "Avg Strength")+
  ggtitle("Average Strength v/s Degree of the Network Graph") +
  xlab("Degree of the network") +
  ylab("Average Strength of the network") +
  theme(plot.title = element_text(size = 13, face = "bold.italic", color = "red", hjust = 0.5),
        axis.title.x = element_text(size = 7, face = "bold", colour = "blue"),
        axis.title.y = element_text(size = 7, face = "bold", colour = "blue"),
        axis.text.x = element_text(size = 5, angle = 0),
        axis.text.y = element_text(size = 5, angle = 90),
        legend.position = "right",
        legend.title = element_text(size = 7, face = "bold"),
        legend.text = element_text(size = 7, face = "bold"),
        strip.text = element_text(size = 7))