Session 1: Prepare for the analysis

Load the R packages

# For text mining
library(tm)
# For use the pipe sign
library(dplyr)
# For plot
library(ggplot2)
# For wordcoloud
library(wordcloud)
# For pyramid plot
library(plotrix)
# For word network
library(qdap)

Load the data

# Load the data
library(readxl)
JAM_coded_data <- read_excel("JAM_coded_data.xlsx")

Session 2: Descriptive Data Analysis

Article Numbers by Years

We collected 578 articles throughout a 21-year span from 2000 to 2020.

## Article numbers by years
Article_number_by_year <- JAM_coded_data %>%
  group_by(Year) %>% 
  count()
ggplot(Article_number_by_year,aes(x=Year,y=n))+geom_line()

Author Numbers

# Total Author Numbers
sum(JAM_coded_data$`Total_ N`)  # Total authorship 1435
## [1] 1435
# Average author per article
sum(JAM_coded_data$`Total_ N`)/578  # 2.48 authors per article
## [1] 2.482699
sd(JAM_coded_data$`Total_ N`) # SD= 1.57
## [1] 1.567835
# Article with the most authors
max(JAM_coded_data$`Total_ N`) # Author Number = 12, Y2015, Volume 16, No 4, Title: Psychometric Properties of the Attitudes...
## [1] 12
# Hist of Author Numbers
hist(JAM_coded_data$`Total_ N`)

# Article numbers of Single Author paper
sum(JAM_coded_data$`Total_ N`==1) # 161 articles has single author, 27.85%
## [1] 161
sum(JAM_coded_data$`Total_ N`<=3) # 473 articles have author number less or equal to 3, 81.83%
## [1] 473
sum(JAM_coded_data$`Total_ N`>=10) # Three articles have more than 10 authors
## [1] 3

Place of Authorship

# Frequency Table
table(JAM_coded_data$Place_of_authorship)
## 
##     Argentina     Australia       Austria       Belgium       British 
##             1            72             4             4            15 
##        Canada         China        Cyprus       Denmark        France 
##            13            21             5             6             5 
##        German          Iran        Israel         Italy         Japan 
##             2             1             1             7             3 
##         Korea      Malaysia   Netherlands   New Zealand       Nigeria 
##             2             5             5             1             1 
##        Norway        Russia     Singapore  South Africa         Spain 
##             6             1             5             1             5 
##        Sweden   Switzerland        Taiwan        Turkey United States 
##             4             2             8             1           369 
##       Vietnam 
##             2
# As we can see in the table, these 578 articles coming from 31 different countries. 
369/578 # About 369 articles(63.84%) came from United States.
## [1] 0.6384083
# Besides the United States, the top 3 countries with the most articles are Australia (72, about 12.46%), China (21,about 3.63%), and British (15, about 2.6%)

Domain and Focus, and Rasch Model

# Frequency Table for Domain
table(JAM_coded_data$Domain) 
## 
## Affective Cognitive   Generic     Other  Physical 
##        93       144       182       100        59
# Frequency Table for Focus
table(JAM_coded_data$Focus) # About 284 (49.13%) apply a method.
## 
##             Comparison Conceptual_Theoretical         Methodological 
##                     77                    109                     69 
##                  Other                 Review     Substantive_Method 
##                      5                     34                    284
# Frequency Table for Rasch Model
table(JAM_coded_data$Rasch_Model)
## 
##    Dichotomous     Many-Facet   Multiple Use  Other_or_None Partial-credit 
##            107             59             60            152             69 
##   Rating scale 
##            131
# Proportion of using the basic Rasch Model
# Dichotomous = 107
# Rating scale = 131
# Partial Credit = 69
# Many-Facet = 59
# Multiple Use =60

Data Type and Data Collection

# Frequency Table for Data Type
table(JAM_coded_data$Data_Type) # Only 14 articles uses both real and simulated data, 380 articles (65.74%) used the real data, 113 articles (19.55%) used the simulated data.
## 
##      Both_Data          Other      Real_Data Simulated_Data 
##             14             71            380            113
table(JAM_coded_data$Data_Collection) # Only real data could report data collection method. Among 380 articles which used the real data, 121 (31.84%) used pencil and paper, 75 (19.74%) used Computer-based. 149 (39.21%) of them do not report any data collection method.
## 
## Both Paper & Computer     Computer-adaptive        Computer-based 
##                    17                    18                    75 
##                 other                 Other          Pencil_Paper 
##                     1                   343                   121

Session 3: Text Mining for specific Research Question

Word_Cloud

Build a function to clean and processing the text

clean_corpus <- function(corpus) {
  # Remove punctuation
  corpus <- tm_map(corpus, removePunctuation)
  # Transform to lower case
  corpus <- tm_map(corpus, content_transformer(tolower))
  # Add more stopwords
  corpus <- tm_map(corpus, removeWords, words = c(stopwords("en"),"using","used","two","can"))
  # Strip whitespace
  corpus <- tm_map(corpus,stripWhitespace)
  return(corpus)
}

What’s the common terms for the target articles? (Only Title)

# Make a vector source from titles
Title_source <- VectorSource(JAM_coded_data$Title)
# Make a volatile corpus from Title_source
Title_corpus <- VCorpus(Title_source)
# Clean the corpus
clean_Title <- clean_corpus(Title_corpus)
# Create a term-document matrix from the corpus
Title_tdm <- TermDocumentMatrix(clean_Title)
# Convert coffee_tdm to a matrix
Title_m <- as.matrix(Title_tdm)
# Calculate the row sums of Title_m
term_frequency <- rowSums(Title_m)
# Sort term_frequency in decreasing order
term_frequency <- sort(term_frequency,decreasing=TRUE)
# View the top 10 most common words
term_frequency[1:15]
##       rasch       model measurement        item    analysis       scale 
##         252         139         109          76          73          68 
##   measuring development       items  assessment      models        test 
##          51          43          41          38          38          38 
##        data       study    response 
##          34          29          27
# Plot a barchart of the 10 most common words
barplot(term_frequency[1:15], col = "tan", las = 2)

# Vector of terms
terms_vec <- names(term_frequency)
# Create a word cloud for the values in word_freqs
wordcloud(terms_vec,term_frequency,max.words=50,colors="red")

What’s the common terms for the target articles? (Only Abstract)

# Make a vector source from Abstract
Abstract_source <- VectorSource(JAM_coded_data$Abstract)
# Make a volatile corpus from Abstract_source
Abstract_corpus <- VCorpus(Abstract_source)
# Clean the corpus
clean_Abstract <- clean_corpus(Abstract_corpus)
# Create a term-document matrix from the corpus
Abstract_tdm <- TermDocumentMatrix(clean_Abstract)
# Convert Abstract_tdm to a matrix
Abstract_m <- as.matrix(Abstract_tdm)
# Calculate the row sums of Abstract_m
term_frequency <- rowSums(Abstract_m)
# Sort term_frequency in decreasing order
term_frequency <- sort(term_frequency,decreasing=TRUE)
# View the top 10 most common words
term_frequency[1:15]
##       rasch        item       items       model measurement        data 
##         734         717         717         658         457         448 
##       scale       study     results    analysis        test         fit 
##         439         415         324         314         307         273 
##      models     measure    measures 
##         235         222         215
# Plot a barchart of the 10 most common words
barplot(term_frequency[1:15], col = "tan", las = 2)

# Vector of terms
terms_vec <- names(term_frequency)
# Create a word cloud for the values in word_freqs
wordcloud(terms_vec,term_frequency,max.words=50,colors="red")

Dealing with more stop words and duplicate words

# Replace the duplicate words
JAM_coded_data$Abstract <- gsub("items","item",JAM_coded_data$Abstract)
JAM_coded_data$Abstract <- gsub("models","model",JAM_coded_data$Abstract)

What are the difference between Methodology paper and Apply paper in their dissimiar terms? (Comparison Cloud)

## Pooling out the all method_apply paper
Method_paper <- JAM_coded_data[which(JAM_coded_data$Focus=="Substantive_Method"),]
## Pooling out all the abstracts from method paper
All_method <- paste(Method_paper$Abstract,collapse = "")
## Pooling out all the non-method 
Non_Method_paper <- JAM_coded_data[which(JAM_coded_data$Focus!="Substantive_Method"),]
## Pooling out all the abstracts from non-method paper
All_Non_method <- paste(Non_Method_paper$Abstract,collapse = "")
All_papers <- c(All_method,All_Non_method)
## Clean all papers
All_papers <- VectorSource(All_papers)
All_corpus <- VCorpus(All_papers)
All_clean <- clean_corpus(All_corpus)
All_tdm <- TermDocumentMatrix(All_clean)
colnames(All_tdm) <- c("Method_applied","Non-Method_applied")
All_m <- as.matrix(All_tdm)
# Make comparison cloud
comparison.cloud(All_m,colors=c("orange","blue"),max.words=30)

What are the difference between Methodology paper and Apply paper in their common terms? (pyramid plot)

## Identify terms shared by both documents
common_words <- subset(All_m,All_m[,1]>0 & All_m[,2]>0)
## Find most commonly shared words
difference <- abs(common_words[,1]-common_words[,2])
common_words <- cbind(common_words,difference)
common_words <- common_words[order(common_words[,3],decreasing = TRUE),]
top25_df <- data.frame(x=common_words[1:25],1,y=common_words[1:25,2],labels=rownames(common_words[1:25,]))
## Make pyramid plot
pyramid.plot(top25_df$x,top25_df$y,labels =top25_df$labels,main="Words in Common",gap=80,raxlab=NULL,unit=NULL,top.labels=c("Method_applied","word","Non-Method_applied"))

## 733 733
## [1] 5.1 4.1 4.1 2.1

Word_Networks

# Create word network
word_associate(JAM_coded_data$Title,match.string = c("Rasch"),stopwords = c(stopwords("en"),"using","used","two","can"),network.plot = TRUE,cloud.colors = c("gray85","darkred"))
## Warning in text2color(words = V(g)$label, recode.words = target.words, colors =
## label.colors): length of colors should be 1 more than length of recode.words

##     row group unit text                                                                                                                                                                                                                            
## 1     1   all    1 Attention Deficit Hyperactivity Disorder: Scaling and Standard Setting using Rasch Measurement                                                                                                                                  
## 2     3   all    3 An Approach to Studying Scale for Students in Higher Education: A Rasch Measurement Model Analysis                                                                                                                              
## 3     5   all    5 Rasch Models Overview                                                                                                                                                                                                           
## 4     8   all    8 A Critique of Rasch Residual Fit Statistics                                                                                                                                                                                     
## 5     9   all    9 Construct Validity of Scores/Measures from a Developmental Assessment in Mathematics using Classical and Many-Facet Rasch Measurement                                                                                           
## 6    15   all   15 Metric Development and Score Reporting in Rasch Measurement                                                                                                                                                                     
## 7    18   all   18 Methodological Issues in Using the Rasch Model to Select Cross Culturally Equivalent Items in Order to Develop a Quality of Life Index: The Analysis of Four WHOQOL-100 Data Sets (Argentina, France, Hong Kong, United British)
## 8    19   all   19 Simultaneous Measurement of Reading Growth, Gender, and Relative-Age Effects: Many-Faceted Rasch Applied to CBM Reading Scores                                                                                                  
## 9    20   all   20 Equating and Item Banking with the Rasch Model                                                                                                                                                                                  
## 10   23   all   23 Rasch Measurement in the Assessment of Growth Hormone Deficiency in Adult Patients                                                                                                                                              
## 11   26   all   26 Using the Rasch Measurement Model to Investigate the Construct of Motor Ability in Young Children                                                                                                                               
## 12   32   all   32 Congruence Between a Theoretical Continuum of Masculinity and the Rasch Model: Examining The Conformity to Masculine Norms Inventory                                                                                            
## 13   35   all   35 Detecting Differential Rater Functioning over Time (DRIFT) Using a Rasch Multi-Faceted Rating Scale Model                                                                                                                       
## 14   36   all   36 Evidence for the Reliability of Measures and Validity of Measure Interpretation: A Rasch Measurement Perspective                                                                                                                
## 15   40   all   40 Comparing Holistic and Analytic Scoring for Performance Assessment with Many-Facet Rasch Model                                                                                                                                  
## 16   41   all   41 The Rasch Model, Additive Conjoint Measurement, and New Models of Probabilistic Measurement Theory                                                                                                                              
## 17   42   all   42 A Confirmatory Study of Rasch-Based Optimal Categorization of a Rating Scale                                                                                                                                                    
## 18   45   all   45 Level of Activity in Profound/Severe Mental Retardation (LAPMER): A Rasch-derived Scale of Disability                                                                                                                           
## 19   47   all   47 An Eigenvector Method for Estimating Item Parameters of the Dichotomous and Polytomous Rasch Models                                                                                                                             
## 20   48   all   48 Two Strategies for Fitting Real_Data to Rasch Polytomous Models                                                                                                                                                                 
## 21   53   all   53 Using Rasch Measurement to Investigate the Cross-form Equivalence and Clinical Utility of Spanish and English Versions of a Diabetes Questionnaire: A Pilot Study                                                               
## 22   54   all   54 Moving the Cut Score on Rasch Scored Tests                                                                                                                                                                                      
## 23   57   all   57   Understanding Resistance to the Data-model Relationship in Rasch’s Paradigm: A Reflection for the Next Generation                                                                                                             
## 24   58   all   58 A Multi-factor Rasch Scale for Artistic Judgment                                                                                                                                                                                
## 25   60   all   60 Rasch-transformed Raw Scores and Two-way ANOVA: A Simulation Analysis                                                                                                                                                           
## 26   62   all   62 Measuring Leader Perceptions of School Readiness for Reforms: Use of an Iterative Model Combining Classical and Rasch Methods                                                                                                   
## 27   65   all   65 Rasch Simultaneous Vertical Equating for Measuring Reading Growth                                                                                                                                                               
## 28   68   all   68 Measurement Precision of the Clinician Administered PTSD Scale (CAPS): A RASCH Model Analysis                                                                                                                                   
## 29   70   all   70 An Introduction to Multidimensional Measurement using Rasch Models                                                                                                                                                              
## 30   71   all   71 Maximum Information Approach to Scale Description for Affective Measures Based on the Rasch Model                                                                                                                               
## 31   75   all   75 Rasch Fit Statistics as a Test of the Invariance of Item Parameter Estimates                                                                                                                                                    
## 32   76   all   76 Measuring Attitudes and Behaviors to Studying and Learning for University Students: A Rasch Measurement Model Analysis                                                                                                          
## 33   77   all   77 Rasch Techniques for Detecting Bias in Performance Assessments: An Example Comparing the Performance of Native and Non-native Speakers on a Test of Academic English                                                            
## 34   78   all   78 Conditional Pairwise Estimation in the Rasch Model for Ordered Response Categories using Principal Components                                                                                                                   
## 35   79   all   79 Reliability and True-Score Measures of Binary Items as a Function of Their Rasch Difficulty Parameter                                                                                                                           
## 36   81   all   81 Rasch Measurement in the Assessment of Amytrophic Lateral Sclerosis Patients                                                                                                                                                    
## 37   86   all   86 Rasch Modeling and the Measurement of Social Participation                                                                                                                                                                      
## 38   90   all   90 Measuring Coping at a University Using a Rasch Model                                                                                                                                                                            
## 39   91   all   91 Detecting and Measuring Rater Effects Using Many-Facet Rasch Measurement: Part I                                                                                                                                                
## 40   93   all   93 Comparing Traditional and Rasch Analyses of the Mississippi PTSD Scale: Revealing Limitations of Reverse-Scored Items                                                                                                           
## 41   95   all   95 The Effect of Sample Size for Estimating Rasch/IRT Parameters with Dichotomous Items                                                                                                                                            
## 42   98   all   98 Rasch Model Estimation: Further Topics                                                                                                                                                                                          
## 43  102   all  102 A Rasch Analysis of Three of the Wisconsin Scales of Psychosis Proneness: Measurement of Schizotypy                                                                                                                             
## 44  105   all  105 Detecting and Measuring Rater Effects Using Many-Facet Rasch Measurement: Part II                                                                                                                                               
## 45  107   all  107   Using Rasch Models to Reveal Contours of Teachers’ Knowledge                                                                                                                                                                  
## 46  108   all  108 Validation of Scores from Self-Learning Scales for Primary Students Using True-Score and Rasch Measurement Methods                                                                                                              
## 47  112   all  112 Rasch Measurement Using Dichotomous Scoring                                                                                                                                                                                     
## 48  113   all  113 Measuring Higher Education Outcomes with a Multidimensional Rasch Model                                                                                                                                                         
## 49  114   all  114 Measurement in Clinical vs. Biological Medicine: The Rasch Model as a Bridge on a Widening Gap                                                                                                                                  
## 50  117   all  117 Comparing Factor Analysis and the Rasch Model for Ordered Response Categories: An Investigation of the Scale of Gambling Choices                                                                                                
## 51  119   all  119 Detecting Item Bias with the Rasch Model                                                                                                                                                                                        
## 52  120   all  120 Rasch Analysis of Inattentive, Hyperactive and Impulsive Behavior in Young Children and the Link with Academic Achievement                                                                                                      
## 53  122   all  122 Expected Linking Error Resulting from Item Parameter Drift among the Common Items on Rasch Calibrated Tests                                                                                                                     
## 54  123   all  123 Measuring College Sailing Teams Ability: An Application of the Many-Facet Rasch Model to Ordinal Data                                                                                                                           
## 55  124   all  124 On the Lack of Comonotonicity between Likert Scores and Rasch-Based Measures                                                                                                                                                    
## 56  125   all  125 An Analysis of Dimensionality Using Factor Analysis (True-Score Theory) and Rasch Measurement: What Is the Difference? Which Method Is Better?                                                                                  
## 57  128   all  128 Estimating Parameters in the Rasch Model in the Presence of Null Categories                                                                                                                                                     
## 58  129   all  129 Effect of Item Redundancy on Rasch Item and Person Estimates                                                                                                                                                                    
## 59  132   all  132 Comparing Rasch Analyses Probability Estimates to Sensitivity, Specificity and Likelihood Ratios when Examining the Utility of Medical Diagnostic Tests                                                                         
## 60  134   all  134 Using the Rasch Model to Validate Stages of Understanding the Energy Concept                                                                                                                                                    
## 61  137   all  137 Mixed Model Estimation Methods for the Rasch Model                                                                                                                                                                              
## 62  142   all  142 Unique Properties of Rasch Model Item Information Functions                                                                                                                                                                     
## 63  144   all  144 Rasch Analysis Examining Processing Mechanisms of the Object Location Memory Test Revised                                                                                                                                       
## 64  145   all  145   Using the Rasch Model to Develop a Measure of Second Language Learners’ Willingness to Communicate within a Language Classroom                                                                                                
## 65  148   all  148 The Relationship between the Rating Scale and Partial Credit Models and the Implication of Disordered Thresholds of the Rasch Models for Polytomous Responses                                                                   
## 66  150   all  150 Using Rasch Analysis to Test the Cross-Cultural Item Equivalence of the Harvard Trauma Questionnaire and the Hopkins Symptom Checklist Across Vietnamese and Cambodian Immigrant Mothers                                        
## 67  151   all  151 Using Rasch Measurement to Investigate Volleyball Skills and Inform Coaching                                                                                                                                                    
## 68  152   all  152 The Assessment of Diabetes Knowledge and Self-Efficacy in a Diverse Population Using Rasch Measurement                                                                                                                          
## 69  154   all  154 Development of a Comprehensiveness of Rasch Measurement Application Scale                                                                                                                                                       
## 70  156   all  156 Rasch Analysis of Rank-Ordered Data                                                                                                                                                                                             
## 71  157   all  157 Rasch Analysis of a New Construct: Caregiving for Adult Children with Intellectual Disabilities                                                                                                                                 
## 72  159   all  159 Adjusted Rasch Person-Fit Statistics                                                                                                                                                                                            
## 73  160   all  160 From Rasch Scores to Regression                                                                                                                                                                                                 
## 74  163   all  163 The Mixed-Rasch Model: An Example for Analyzing the Meaning of Response Latencies in a Personality Questionnaire                                                                                                                
## 75  164   all  164 Measuring Teaching Ability with the Rasch Model by Scaling a Series of Product and Performance Tasks                                                                                                                            
## 76  169   all  169 Rasch Modeling of the Structure of Health Risk Behavior in South African Adolescents                                                                                                                                            
## 77  174   all  174 Fitting Polytomous Rasch Models in SAS                                                                                                                                                                                          
## 78  178   all  178   Conception and Construction of a Rasch-Scaled Measure for Self-Confidence in One’s Vocabulary Ability                                                                                                                         
## 79  181   all  181 Comparing Concurrent versus Fixed Parameter equating with Common Items: Using the Rasch Dichotomous and Partial Credit Models in a Mixed Item-Format Test                                                                       
## 80  182   all  182   Understanding Rasch Measurement: Instrument Development Tools and Activities for Measure Validation using Rasch Models: Part I – Instrument Development Tools                                                                 
## 81  183   all  183 Mental Self-Government: Development of the Additional Democratic Learning Style Scale using Rasch Measurement Models                                                                                                            
## 82  184   all  184 Measuring Math Anxiety (in Spanish) with the Rasch Rating Scale Model                                                                                                                                                           
## 83  185   all  185 Using Rasch Analysis to Construct a Clinical Problem-Solving Inventory in the Dental Clinic:A Case Study                                                                                                                        
## 84  187   all  187 Computing Confidence Intervals of Item Fit Statistics in the Family of Rasch Models Using the Bootstrap Method                                                                                                                  
## 85  188   all  188   Understanding Rasch Measurement: Instrument Development Tools and Activities for Measure Validation using Rasch Models: Part II – Validation Activities                                                                       
## 86  196   all  196 Mindfulness Practice: A Rasch Variable Construct Innovation                                                                                                                                                                     
## 87  198   all  198 A Monte Carlo Study of the Impact of Missing Data and Differential Item Functioning on Theta Estimates from Two Polytomous Rasch Family Models                                                                                  
## 88  199   all  199 Investigation of 360-Degree Instrumentation Effects: Application of the Rasch Rating Scale Model                                                                                                                                
## 89  200   all  200 Rasch Measurement of Self-Regulated Learning in an Information and Communication Technology (ICT)-rich Environment                                                                                                              
## 90  203   all  203 A Multidimensional Rasch Analysis of Gender Differences in PISA Mathematics                                                                                                                                                     
## 91  205   all  205 Measuring Job Satisfaction in the Social Services Sector with the Rasch Model                                                                                                                                                   
## 92  206   all  206 Comparing Screening Approaches to Investigate Stability of Common Items in Rasch Equating                                                                                                                                       
## 93  207   all  207 Estimation of the Accessibility of Items and the Confidence of Candidates: A Rasch-Based Approach                                                                                                                               
## 94  208   all  208 Binary Items and Beyond:A Simulation of Computer Adaptive Testing Using the Rasch Partial Credit Model                                                                                                                          
## 95  209   all  209 Effects of Varying Magnitude and Patterns of Response Dependence in the Unidimensional Rasch Model                                                                                                                              
## 96  210   all  210   Fisher’s Information Function and Rasch Measurement                                                                                                                                                                           
## 97  211   all  211 A Rasch Analysis for Classification of Systemic Lupus Erythematosus and Mixed Connective Tissue Disease                                                                                                                         
## 98  214   all  214 Rasch Measurement in Developing Faculty Ratings of Students Applying to Graduate School                                                                                                                                         
## 99  215   all  215 Understanding Rasch Measurement: Using Rasch Scaled Stage Scores to Validate Orders of Hierarchical Complexity of Balance Beam Task Sequences                                                                                   
## 100 216   all  216 Formalizing Dimension and Response Violations of Local Independence in the Unidimensional Rasch Model                                                                                                                           
## 101 218   all  218 The Impact of Data Collection Design, Linking Method, and Sample Size on Vertical Scaling Using the Rasch Model                                                                                                                 
## 102 219   all  219 Understanding the Unit in the Rasch Model                                                                                                                                                                                       
## 103 224   all  224 A Rasch Measurement Analysis of the Use of Cohesive Devices in Writing English as a Foreign Language by Secondary Students in Hong Kong                                                                                         
## 104 231   all  231 Using Paired Comparison Matrices to Estimate Parameters of the Partial Credit Rasch Measurement Model for Rater-Mediated Assessments                                                                                            
## 105 234   all  234 A Rasch Model Prototype for Assessing Vocabulary Learning Resulting from Different Instructional Methods: A Preschool Example                                                                                                   
## 106 236   all  236 Understanding Rasch Measurement: Tools for Measuring Academic Growth                                                                                                                                                            
## 107 243   all  243 Understanding Rasch Measurement: The ISR: Intelligent Student Reports                                                                                                                                                           
## 108 247   all  247 Rasch Family Models in e-Learning: Analyzing Architectural Sketching with a Digital Pen                                                                                                                                         
## 109 250   all  250 Understanding Rasch Measurement: Item and Rater Analysis of Constructed Response Items via the Multi-Faceted Rasch Model                                                                                                        
## 110 251   all  251 The Rasch Model and Additive Conjoint Measurement                                                                                                                                                                               
## 111 254   all  254 Random Parameter Structure and the Testlet Model: Extension of the Rasch Testlet Model                                                                                                                                          
## 112 255   all  255 A Comparative Analysis of the Ratings in Performance Assessment Using Generalizability Theory and Many-Facet Rasch Model                                                                                                        
## 113 256   all  256 The Family Approach to Assessing Fit in Rasch Measurement                                                                                                                                                                       
## 114 257   all  257 Understanding Rasch Measurement: Standard Setting with Dichotomous and Constructed Response Items: Some Rasch Model Approaches                                                                                                  
## 115 258   all  258 Predicting Responses from Rasch Measures                                                                                                                                                                                        
## 116 263   all  263   Thinking about Thinking—Thinking about Measurement: A Rasch Analysis of Recursive Thinking                                                                                                                                    
## 117 264   all  264 Understanding Rasch Measurement: Psychometric Aspects of Item Mapping for Criterion-Referenced Interpretation and Bookmark Standard Setting                                                                                     
## 118 267   all  267   Using Guttman’s Mapping Sentences and Many Facet Rasch Measurement Theory to Develop an Instrument that Examines the Grading Philosophies of Teachers                                                                         
## 119 271   all  271 Understanding Rasch Measurement: Equating Designs and Procedures Used in Rasch Scaling                                                                                                                                          
## 120 274   all  274 Rasch-Derived Latent Trait Measurement of Outcomes: Insightful Use Leads to Precision Case Management and Evidence-Based Practices in Functional Healthcare                                                                     
## 121 282   all  282   Rasch Model’s Contribution to the Study of Items and Item Response Scales Formulation in Opinion/Perception Questionnaires                                                                                                    
## 122 286   all  286 The Practical Application of Optimal Appropriateness Measurement on Empirical Data using Rasch Models                                                                                                                           
## 123 288   all  288 Understanding Rasch Measurement: Developing Examinations that use Equal Raw Scores for Cut Scores                                                                                                                               
## 124 293   all  293 Understanding Rasch Measurement: Distractors with Information in Multiple Choice Items: A Rationale Based on the Rasch Model                                                                                                    
## 125 294   all  294 A Comparison between Robust z and 0.3-Logit Difference Procedures in Assessing Stability of Linking Items for the Rasch Model                                                                                                   
## 126 298   all  298 Exploring Differential Item Functioning (DIF) with the Rasch Model: A Comparison of Gender Differences on Eighth Grade Science Items in the United States and Spain                                                             
## 127 299   all  299 Understanding Rasch Measurement: A Mapmark Method of Standard Setting as Implemented for the National Assessment Governing Board                                                                                                
## 128 300   all  300 Diagnosing a Common Rater Halo Effect in the Polytomous Rasch Model                                                                                                                                                             
## 129 301   all  301 A Comparison of Structural Equation and Multidimensional Rasch Modeling Approaches to Confirmatory Factor Analysis                                                                                                              
## 130 306   all  306 Understanding Rasch Measurement: Selecting Cut Scores with a Composite of Item Types: The Construct Mapping Procedure                                                                                                           
## 131 307   all  307 Reducing the Item Number to Obtain Same-Length Self-Assessment Scales: A Systematic Approach using Result of Graphical Loglinear Rasch Modeling                                                                                 
## 132 308   all  308 Using Rasch Modeling to Measure Acculturation in Youth                                                                                                                                                                          
## 133 312   all  312 Analysis of Letter Name Knowledge using Rasch Measurement                                                                                                                                                                       
## 134 313   all  313 Understanding Rasch Measurement: Converging on the Tipping Point: A Diagnostic Methodology for Standard Setting                                                                                                                 
## 135 315   all  315 Using the Mixed Rasch Model to Analyze Data from the Beliefs and Attitudes About Memory Survey                                                                                                                                  
## 136 320   all  320 Is the Partial Credit Model a Rasch Model?                                                                                                                                                                                      
## 137 321   all  321 Exploring the Alignment of Writing Self-Efficacy with Writing Achievement Using Rasch Measurement Theory and Qualitative Methods                                                                                                
## 138 323   all  323 Item Set Discrimination and the Unit in the Rasch Model                                                                                                                                                                         
## 139 328   all  328 A Study of Rasch, Partial Credit, and Rating Scale Model Parameter Recovery in WINSTEPS and jMetrik                                                                                                                             
## 140 330   all  330 Using Rasch Measurement to Validate the Big Five Factor Marker Questionnaire for a Japanese University Population                                                                                                               
## 141 333   all  333 Conditional Pairwise Person Parameter Estimates in Rasch Models                                                                                                                                                                 
## 142 337   all  337 Using Extended Rasch Models to Assess Validity of Diagnostic Tests in the Presence of a Reference Standard                                                                                                                      
## 143 338   all  338 Measuring Work Stress among Correctional Staff: A Rasch Measurement Approach                                                                                                                                                    
## 144 339   all  339   A Rasch Measure of Teachers’ Views of Teacher-Student Relationships in the Primary School                                                                                                                                     
## 145 340   all  340 A Bootstrap Approach to Evaluating Person and Item Fit to the Rasch Model                                                                                                                                                       
## 146 341   all  341 Using The Rasch Measurement Model to Design a Report Writing Assessment Instrument                                                                                                                                              
## 147 342   all  342 Using Multidimensional Rasch to Enhance Measurement Precision: Initial Results from Simulation and Empirical Studies                                                                                                            
## 148 343   all  343 Using the Dichotomous Rasch Model to Analyze Polytomous Items                                                                                                                                                                   
## 149 344   all  344   With Hiccups and Bumps: The Development of a Rasch-based Instrument to Measure Elementary Students’ Understanding of the Nature of Science                                                                                    
## 150 345   all  345 Application of Single-level and Multi-level Rasch Models using the lme4 Package                                                                                                                                                 
## 151 346   all  346   Rasch Modeling to Assess Albanian and South African Learners’ Preferences for Real-life Situations to be Used in Mathematics: A Pilot Study                                                                                   
## 152 348   all  348 DIF Cancellation in the Rasch Model                                                                                                                                                                                             
## 153 349   all  349 Multidimensional Diagnostic Perspective on Academic Achievement Goal Orientation Structure, Using the Rasch Measurement Models                                                                                                  
## 154 351   all  351 The Development of the de Morton Mobility Index (DEMMI) in an Older Acute Medical Population: Item Reduction using the Rasch Model (Part 1)                                                                                     
## 155 352   all  352 A Comparison of Confirmatory Factor Analysis and Multidimensional Rasch Models to Investigate the Dimensionality of Test-Taking Motivation                                                                                      
## 156 354   all  354 The Development of the de Morton Mobility Index (DEMMI) in an Independent Sample of Older Acute Medical Patients: Refinement and Validation using the Rasch Model (Part 2)                                                      
## 157 355   all  355 Rasch Modeling of Accuracy and Confidence Measures from Cognitive Tests                                                                                                                                                         
## 158 357   all  357 An Experimental Study Using Rasch Analysis to Compare Absolute Magnitude Estimation and Categorical Rating Scaling as Applied in Survey Research                                                                                
## 159 361   all  361 Application of the Rasch Model to Measuring the Performance of Cognitive Radios                                                                                                                                                 
## 160 362   all  362 Properties of Rasch Residual Fit Statistics                                                                                                                                                                                     
## 161 364   all  364 Rasch Analysis for the Evaluation of Rank of Student Response Time in Multiple Choice Examinations                                                                                                                              
## 162 365   all  365 Assessing DIF Among Small Samples with Separate Calibration t and Mantel-Haenszel Chi-Square Statistics in the Rasch Model                                                                                                      
## 163 367   all  367 A Rasch Analysis of the Statistical Anxiety Rating Scale                                                                                                                                                                        
## 164 370   all  370   Rasch Model of a Dynamic Assessment: An Investigation of the Children’s Inferential Thinking Modifiability Test                                                                                                               
## 165 372   all  372   A Rasch Measure of Young Children’s Temperament (Negative Emotionality) in Hong Kong                                                                                                                                          
## 166 373   all  373   Snijders’s Correction of Infit and Outfit Indexes with Estimated Ability Level: An Analysis with the Rasch Model                                                                                                              
## 167 375   all  375 Examining Rating Scales Using Rasch and Mokken Models for Rater-Mediated Assessments                                                                                                                                            
## 168 376   all  376 Differential Item Functioning Analysis Using a Multilevel Rasch Mixture Model: Investigating the Impact of Disability Status and Receipt of Testing Accommodations                                                              
## 169 378   all  378 Improving the Individual Work Performance Questionnaire using Rasch Analysis                                                                                                                                                    
## 170 380   all  380 Rasch Rating Scale Analysis of the Attitudes Toward Research Scale                                                                                                                                                              
## 171 384   all  384 Measuring Teacher Dispositions using the DAATS Battery: A Multifaceted Rasch Analysis of Rater Effect                                                                                                                           
## 172 386   all  386 Performance of the Likelihood Ratio Difference (G2 Diff) Test for Detecting Unidimensionality in Applications of the Multidimensional Rasch Model                                                                               
## 173 387   all  387 Applying the Rasch Sampler to Identify Aberrant Responding through Person Fit Statistics under Fixed Nominal Alpha-level                                                                                                        
## 174 388   all  388 Power Analysis on the Time Effect for the Longitudinal Rasch Model                                                                                                                                                              
## 175 389   all  389 Application of Rasch Analysis to Turkish Version of ECOS-16 Questionnaire                                                                                                                                                       
## 176 393   all  393   Measuring Students’ Perceptions of Plagiarism: Modification and Rasch Validation of a Plagiarism Attitude Scale                                                                                                               
## 177 394   all  394 Survey Analysis with Mixture Rasch Models                                                                                                                                                                                       
## 178 395   all  395  Validating a Developmental Scale for Young Children Using the Rasch Model: Applicability of the Teaching Strategies GOLD®Assessment System                                                                                     
## 179 401   all  401   Measuring Teaching Assistants’ Efficacy using the Rasch Model                                                                                                                                                                 
## 180 404   all  404 Gendered Language Attitudes: Exploring Language as a Gendered Construct using Rasch Measurement Theory                                                                                                                          
## 181 405   all  405 Implications of Removing Random Guessing from Rasch Item Estimates in Vertical Scaling                                                                                                                                          
## 182 406   all  406     Funding Medical Research Projects: Taking into Account Referees’ Severity and Consistency through Many-Faceted Rasch Modeling of Projects’ Scores                                                                           
## 183 410   all  410 Using a Rasch Model to Account for Guessing as a Source of Low Discrimination                                                                                                                                                   
## 184 412   all  412 Properties of the Tampa Scale for Kinesiophobia across Workers with Different Pain Experiences and Cultural Backgrounds: A Rasch Analysis                                                                                       
## 185 414   all  414 Measuring Psychosocial Impact of CBRN Incidents by the Rasch Model                                                                                                                                                              
## 186 416   all  416 Estimation of Parameters of the Rasch Model and Comparison of Groups in Presence of Locally Dependent Items                                                                                                                     
## 187 418   all  418 A Dual-purpose Rasch Model with Joint Maximum Likelihood Estimation                                                                                                                                                             
## 188 419   all  419 Using Rasch Analysis to Evaluate Accuracy of Individual Activities of Daily Living (ADL) and Instrumental Activities of Daily Living (IADL) for Disability Measurement                                                          
## 189 420   all  420 Using the Rasch Model to Measure the Extent to which Students Work Conceptually with Mathematics                                                                                                                                
## 190 421   all  421 Rasch Model Parameter Estimation via the Elastic Net                                                                                                                                                                            
## 191 422   all  422 A Rasch Analysis of the KeyMath-3 Diagnostic Assessment                                                                                                                                                                         
## 192 423   all  423 Psychometric Properties of the Attitudes toward Physical Activity Scale: A Rasch Analysis Based on Data From Five Locations                                                                                                     
## 193 425   all  425 Testing the Multidimensionality in Teacher Interpersonal Behavior: Validating the Questionnaire on Teacher Interaction Using the Rasch Measurement Model                                                                        
## 194 426   all  426 Planning a Study for Testing the Rasch Model given Missing Values due to the use of Test-booklets                                                                                                                               
## 195 427   all  427 The Reliability and Validity of the Power-Load-Margin Inventory: A Rasch Analysis                                                                                                                                               
## 196 428   all  428 Assessing the Validity of a Continuum-of-care Survey: A Rasch Measurement Approach                                                                                                                                              
## 197 430   all  430 Rasch Measurement of Collaborative Problem Solving in an Online Environment                                                                                                                                                     
## 198 434   all  434 Applying the Rasch Model to Measure Mobility of Women: A Comparative Analysis of Mobility of Informal Workers in Fisheries in Kerala, India                                                                                     
## 199 435   all  435 Creating a Physical Activity Self-Report Form for Youth using Rasch Methodology                                                                                                                                                 
## 200 438   all  438 Using the Rasch Model and k-Nearest Neighbors Algorithm for Response Classification                                                                                                                                             
## 201 441   all  441 Measurement Properties of the Nordic Questionnaire for Psychological and Social Factors at Work: A Rasch Analysis                                                                                                               
## 202 443   all  443 Accounting for Local Dependence with the Rasch Model: The Paradox of Information Increase                                                                                                                                       
## 203 444   all  444 Applying the Many-Facet Rasch Measurement Model to Explore Reviewer Ratings of Conference Proposals                                                                                                                             
## 204 450   all  450 Rasch Analysis of the Malaysian Secondary School Student Leadership Inventory (M3SLI)                                                                                                                                           
## 205 452   all  452 Sample Size and Statistical Conclusions from Tests of Fit to the Rasch Model According to the Rasch Unidimensional Measurement Model (Rumm) Program in Health Outcome Measurement                                               
## 206 454   all  454 Examining Class Differences in Method Effects Related to Negative Wording: An Example using Rasch Mixture Modeling                                                                                                              
## 207 456   all  456 A Rasch Rating Scale Analysis of the Presence of Nursing Scale-RN                                                                                                                                                               
## 208 459   all  459 Constructing an Outcome Measure of Occupational Experience: An Application of Rasch Measurement Methods                                                                                                                         
## 209 461   all  461 Rasch Analysis of a Behavioral Checklist for the Assessment of Pain in Critically Ill Adults                                                                                                                                    
## 210 462   all  462 Scale Anchoring with the Rasch Model                                                                                                                                                                                            
## 211 464   all  464   Rasch Derived Teachers’ Emotions Questionnaire                                                                                                                                                                                
## 212 486   all  486 Measuring Anger Types among Malaysian Adolescents using the Rasch Model                                                                                                                                                         
## 213 487   all  487 The Impact of Missing Values and Single Imputation upon Rasch Analysis Outcomes: A Simulation Study                                                                                                                             
## 214 491   all  491   Rasch Analysis of the Teachers’ Knowledge and Use of Data and Assessment (tKUDA) Measure                                                                                                                                      
## 215 493   all  493 Assessment of Test Items with Rasch Measurement Model                                                                                                                                                                           
## 216 494   all  494 Comparing Disability Levels for Community-dwelling Adults in the United States and the Republic of Korea using the Rasch Model                                                                                                  
## 217 495   all  495 Using the Rasch Model to Investigate Inter-board Comparability of Examination Standards in GCSE                                                                                                                                 
## 218 498   all  498 Rasch Analysis of the Brief Symptom Inventory-18 with African Americans                                                                                                                                                         
## 219 499   all  499 Development and Calibration of Chemistry Items to Create an Item Bank, using the Rasch Measurement Model                                                                                                                        
## 220 500   all  500 Psychometric Evaluation of the Revised Current Statistics Self-efficacy (CSSE-26) in a Graduate Student Population using Rasch Analysis                                                                                         
## 221 501   all  501 The Impact of Levels of Discrimination on Vertical Equating in the Rasch Model                                                                                                                                                  
## 222 504   all  504 A Rasch Model Analysis of the Emotion Regulation Questionnaire                                                                                                                                                                  
## 223 509   all  509 Hierarchical and Higher-Order Factor Structures in the Rasch Tradition: A Didactic                                                                                                                                              
## 224 511   all  511 Examination of Item Quality in a State-Wide Music Assessment Program using Rasch Methodology                                                                                                                                    
## 225 514   all  514 Rasch Analysis of the Revised Two-Factor Study Process Questionnaire: A Validation Study                                                                                                                                        
## 226 516   all  516 The Effects of Probability Threshold Choice on an Adjustment for Guessing using the Rasch Model                                                                                                                                 
## 227 518   all  518 Rasch Model Calibrations with SAS PROC IRT and WINSTEPS                                                                                                                                                                         
## 228 519   all  519 Student Perceptions of Grammar Instruction in Iranian Secondary Education: Evaluation of an Instrument using Rasch Measurement Theory                                                                                           
## 229 521   all  521 Examining Rater Judgements in Music Performance Assessment using Many-Facets Rasch Rating Scale Measurement Model                                                                                                               
## 230 524   all  524 Loevinger on Unidimensional Tests with Reference to Guttman, Rasch, and Wright                                                                                                                                                  
## 231 527   all  527 Missing Data and the Rasch Model: The Effects of Missing Data Mechanisms on Item Parameter Estimation                                                                                                                           
## 232 528   all  528 Cross-Cultural Comparisons of School Leadership using Rasch Measurement                                                                                                                                                         
## 233 529   all  529 Development of a Mathematics Self-Efficacy Scale: A Rasch Validation Study                                                                                                                                                      
## 234 530   all  530 Lucky Guess? Applying Rasch Measurement Theory to Grade 5 South African Mathematics Achievement Data                                                                                                                            
## 235 533   all  533 A Validity Study Applying the Rasch Model to the American Association for the Advancement of Science Force and Motion Sub-Topic Assessment for Middle School Students                                                           
## 236 534   all  534 Rasch Analysis of Catholic School Survey Data                                                                                                                                                                                   
## 237 538   all  538 Dimensionality of the Russian CORE-OM from a Rasch Perspective                                                                                                                                                                  
## 238 539   all  539 Evaluating Angoff Method Structured Training Judgments by the Rasch Model                                                                                                                                                       
## 239 540   all  540 An Examination of Sensitivity to Measurement Error in Rasch Residual-based Fit Statistics                                                                                                                                       
## 240 542   all  542 Priors in Bayesian Estimation under the Rasch Model                                                                                                                                                                             
## 241 546   all  546   Using Rasch Analyses To Inform the Revision of a Scale Measuring Students’ Process-Oriented Writing Competence in Portfolios                                                                                                  
## 242 547   all  547 Rasch's Logistic Model Applied to Growth                                                                                                                                                                                        
## 243 548   all  548 Psychometric Properties of the General Movement Optimality Score using Rasch Measurement                                                                                                                                        
## 244 549   all  549 Rasch Analysis of the Burn-Specific Pain Anxiety Scale: Evidence for the Abbreviated Version                                                                                                                                    
## 245 552   all  552 Validation of Egalitarian Education Questionnaire using Rasch Measurement Model                                                                                                                                                 
## 246 555   all  555 The Boston College Living a Life of Meaning and Purpose (BC-LAMP) Portfolio: An Application of Rasch/Guttman Scenario Methodology                                                                                               
## 247 556   all  556 A Multimensional Rasch Analysis of the Preschool Instructional Leadership Survey                                                                                                                                                
## 248 557   all  557 Attitudes Towards Gender Roles in Family: A Rasch-based Validation Study                                                                                                                                                        
## 249 560   all  560 Student's Performance Shown on Google Maps Using Online Rasch Analysis                                                                                                                                                          
## 250 561   all  561 A-priori Weighting of Items with the Rasch Model                                                                                                                                                                                
## 251 562   all  562 The Equivalence of the Test Response Function to the Maximum Likelihood Ability Estimate for the Dichotomous Rasch Model: A poof                                                                                                
## 252 563   all  563 Many-facet Dichotomous Rasch Model Analysis of the Modern Language Aptitude Test                                                                                                                                                
## 253 565   all  565 Examining the Pre-service School Principals' Impromptu Speech Skills with a Many-Facet Rasch Model                                                                                                                              
## 254 566   all  566 Evaluating Longitudinal Anchoring Methods for Rasch Models                                                                                                                                                                      
## 255 570   all  570 Rasch/Guttman Scenario (RGS) Scale: A Methodological Framework                                                                                                                                                                  
## 256 573   all  573 Use the Rasch Model to Measure Comprehension of Fraction Addition                                                                                                                                                               
## 257 576   all  576 Diabetes Distress in Emerging Adults: Refining the Problem Areas in Diabetes - Emerging Adult Version using Rasch Analysis                                                                                                      
## 258 577   all  577 Evaluating the Impact of Multidimensionality on Type I and Type II Error Ratesusing the Q-Index Item Fit Statistic for the Rasch Model                                                                                          
## 259 578   all  578 Development of a Short Form of the CPAI-A (Form B) with Rasch Analyses
## 
## Match Terms
## ===========
## 
## List 1:
## rasch, raschbased, raschderived, raschs, raschtransformed, raschirt, mixedrasch, raschscaled, rasch's, raschguttman
## 

First Decade vs Second Decade

Prepare the Data & Run the comparison cloud

## Pooling out the first half
First_half_data <- JAM_coded_data[which(JAM_coded_data$Volume<=11),]
## Pooling out all the abstracts from method paper
All_First_half <- paste(First_half_data$Abstract,collapse = "")
## Pooling out the second half
Second_half_data <- JAM_coded_data[which(JAM_coded_data$Volume>11),]
## Pooling out all the abstracts from non-method paper
All_Second_half <- paste(Second_half_data$Abstract,collapse = "")
All_papers <- c(All_First_half,All_Second_half)
## Clean all papers
All_papers <- VectorSource(All_papers)
All_corpus <- VCorpus(All_papers)
All_clean <- clean_corpus(All_corpus)
All_tdm <- TermDocumentMatrix(All_clean)
colnames(All_tdm) <- c("First_11_years","Second_10_years")
All_m <- as.matrix(All_tdm)
# Make comparison cloud
comparison.cloud(All_m,colors=c("orange","blue"),max.words=30)
## Warning in comparison.cloud(All_m, colors = c("orange", "blue"), max.words =
## 30): discrimination could not be fit on page. It will not be plotted.
## Warning in comparison.cloud(All_m, colors = c("orange", "blue"), max.words =
## 30): assessments could not be fit on page. It will not be plotted.
## Warning in comparison.cloud(All_m, colors = c("orange", "blue"), max.words =
## 30): properties could not be fit on page. It will not be plotted.
## Warning in comparison.cloud(All_m, colors = c("orange", "blue"), max.words =
## 30): mobility could not be fit on page. It will not be plotted.

Run the pyramid plot

## Identify terms shared by both documents
common_words <- subset(All_m,All_m[,1]>0 & All_m[,2]>0)
## Find most commonly shared words
difference <- abs(common_words[,1]-common_words[,2])
common_words <- cbind(common_words,difference)
common_words <- common_words[order(common_words[,3],decreasing = TRUE),]
top25_df <- data.frame(x=common_words[1:25],1,y=common_words[1:25,2],labels=rownames(common_words[1:25,]))
## Make pyramid plot
pyramid.plot(top25_df$x,top25_df$y,labels =top25_df$labels,main="Words in Common",gap=80,raxlab=NULL,unit=NULL,top.labels=c("Frist_11_years","word","Second_10_years"))

## 380 380
## [1] 5.1 4.1 4.1 2.1

Dichotomous vs Partial Credit + Rating Scale

Prepare the Data & Run the comparison cloud

## Pooling out the first half
Dichotomous_data <- JAM_coded_data[which(JAM_coded_data$Rasch_Model=="Dichotomous"),]
## Pooling out all the abstracts from method paper
All_Dichotomous <- paste(Dichotomous_data$Abstract,collapse = "")
## Pooling out the second half
PC_RS_data <- JAM_coded_data[which(JAM_coded_data$Rasch_Model=="Rating scale"| JAM_coded_data$Rasch_Model=="Partial-credit"),]
## Pooling out all the abstracts from non-method paper
All_PC_RS <- paste(PC_RS_data$Abstract,collapse = "")
All_papers <- c(All_Dichotomous,All_PC_RS)
## Clean all papers
All_papers <- VectorSource(All_papers)
All_corpus <- VCorpus(All_papers)
All_clean <- clean_corpus(All_corpus)
All_tdm <- TermDocumentMatrix(All_clean)
colnames(All_tdm) <- c("Dichotomous Rasch Model","Rating Scale & Partial Credit")
All_m <- as.matrix(All_tdm)
# Make comparison cloud
comparison.cloud(All_m,colors=c("orange","blue"),max.words=30)

Run the pyramid plot

## Identify terms shared by both documents
common_words <- subset(All_m,All_m[,1]>0 & All_m[,2]>0)
## Find most commonly shared words
difference <- abs(common_words[,1]-common_words[,2])
common_words <- cbind(common_words,difference)
common_words <- common_words[order(common_words[,3],decreasing = TRUE),]
top25_df <- data.frame(x=common_words[1:25],1,y=common_words[1:25,2],labels=rownames(common_words[1:25,]))
## Make pyramid plot
pyramid.plot(top25_df$x,top25_df$y,labels =top25_df$labels,main="Words in Common",gap=80,raxlab=NULL,unit=NULL,top.labels=c("Dichotomous Rasch Model","word","Rating Scale & Partial Credit"))

## 505 505
## [1] 5.1 4.1 4.1 2.1