# NOT RUN {
## WORD COUNT
word_count(DATA$state)
wc(DATA$state)
word_count(DATA$state, names = TRUE)
word_count(DATA$state, byrow=FALSE, names = TRUE)
sum(word_count(DATA$state))
sapply(split(raj$dialogue, raj$person), wc, FALSE) %>%
sort(decreasing=TRUE) %>%
list2df("wordcount", "person") %>%
`[`(, 2:1)
## PLOT WORD COUNTS
raj2 <- raj
raj2$scaled <- unlist(tapply(wc(raj$dialogue), raj2$act, scale))
raj2$scaled2 <- unlist(tapply(wc(raj$dialogue), raj2$act, scale, scale = FALSE))
raj2$ID <- factor(unlist(tapply(raj2$act, raj2$act, seq_along)))
ggplot(raj2, aes(x = ID, y = scaled, fill =person)) +
geom_bar(stat="identity") +
facet_grid(act~.) +
ylab("Scaled") + xlab("Turn of Talk") +
guides(fill = guide_legend(nrow = 5, byrow = TRUE)) +
theme(legend.position="bottom") +
ggtitle("Scaled and Centered")
ggplot(raj2, aes(x = ID, y = scaled2, fill =person)) +
geom_bar(stat="identity") +
facet_grid(act~.) +
ylab("Scaled") + xlab("Turn of Talk") +
guides(fill = guide_legend(nrow = 5, byrow = TRUE)) +
theme(legend.position="bottom") +
ggtitle("Mean Difference")
raj$wc <- wc(raj$dialogue)
raj$cum.wc <- unlist(with(raj, tapply(wc, act, cumsum)))
raj$turn <- unlist(with(raj, tapply(act, act, seq_along)))
ggplot(raj, aes(y=cum.wc, x=turn)) +
geom_step(direction = "hv") +
facet_wrap(~act)
## CHARACTER COUNTS
character_count(DATA$state)
character_count(DATA$state, byrow=FALSE)
sum(character_count(DATA$state))
## CHARACTER TABLE
x <- character_table(DATA$state, DATA$person)
plot(x)
plot(x, label = TRUE)
plot(x, label = TRUE, text.color = "red")
plot(x, label = TRUE, lab.digits = 1, zero.replace = "PP7")
scores(x)
counts(x)
proportions(x)
plot(scores(x))
plot(counts(x))
plot(proportions(x))
## combine columns
colcomb2class(x, list(vowels = c("a", "e", "i", "o", "u")))
## char_table(DATA$state, DATA$person)
## char_table(DATA$state, DATA$person, percent = TRUE)
## character_table(DATA$state, list(DATA$sex, DATA$adult))
library(ggplot2);library(reshape2)
dat <- character_table(DATA$state, list(DATA$sex, DATA$adult))
dat2 <- colsplit2df(melt(counts(dat)), keep.orig = TRUE)
head(dat2, 15)
ggplot(data = dat2, aes(y = variable, x = value, colour=sex)) +
facet_grid(adult~.) +
geom_line(size=1, aes(group =variable), colour = "black") +
geom_point()
ggplot(data = dat2, aes(x = variable, y = value)) +
geom_bar(aes(fill = variable), stat = "identity") +
facet_grid(sex ~ adult, margins = TRUE) +
theme(legend.position="none")
# }
Run the code above in your browser using DataLab