library(lsr)

first <- c(376,25,68,30,9)
third <- c(302,65,111,3,9)
X <- cbind(first, third)
rownames(X) <- c('be_like', 'go', 'say','think','other')
X
##         first third
## be_like   376   302
## go         25    65
## say        68   111
## think      30     3
## other       9     9
# test the null hypothesis that the distribution of 
# choices is identical in the two conditions
# chi-squared test

chisq.test(X)
## 
##  Pearson's Chi-squared test
## 
## data:  X
## X-squared = 57.969, df = 4, p-value = 7.745e-12
# estimate the effect size
# Cramer's V

cramersV(X)
## [1] 0.2410091