R中的散点图或色散图

时间:2018-09-03 22:20:36

标签: r ggplot2 bar-chart scatter-plot

好的,所以我想有一个单一的情节,在那里我会有“ x”本小说,并且我们将能够看到特定单词在所有小说中的分散。每个小说都有不同的长度(总单词数),因此“ x”轴必须是小说,“ y”轴必须是每个小说的长度。现在,我可以为每本小说创建一个单独的情节,但是我想将所有这些都放在一起。这是我到目前为止的内容:

input.dir<-("corpus2")
files.v<-dir(input.dir, "\\.txt$")

corpus<-corpus(files.v, input.dir)

tiempo<-tiempo(corpus)

noche<-palabra("día", corpus, tiempo)

dispersion(noche)

#corpus

corpus<-function(files.v, input.dir){
  text.word.vector.l<-list()
  for(i in 1:length(files.v)){
    text.v <- scan(paste(input.dir, files.v[i], sep="/"), what="character", sep="\n")
    Encoding(text.v)<-"UTF-8"
    text.v <- paste(text.v, collapse=" ")
    text.lower.v <- tolower(text.v)
    text.words.v <- strsplit(text.lower.v, "\\W")
    text.words.v <- unlist(text.words.v)
    text.words.v <- text.words.v[which(text.words.v!="")]
    text.word.vector.l[[files.v[i]]] <- text.words.v
  }
  return(text.word.vector.l)
}

#tiempo

tiempo <- function(argument1){
  tiempo.l<-list()
  for (i in 1:length(argument1)){
    time<-seq(1:length(argument1[[i]]))
    tiempo.l[[files.v[i]]]<-time
  }
  return(tiempo.l)
}

#palabra

palabra<-function(keyword, argument1, argument2){
  hits.l<-list()
  for (i in 1:length(argument1)) {
    hits.v<-which(argument1[[i]]==keyword)
    hits.keyword.v<-rep(NA, length(argument2[[i]]))
    hits.keyword.v[hits.v]<-1
    hits.l[[files.v[i]]]<-hits.keyword.v
  }
  return(hits.l)
}

#dispersion

dispersion<-function(argument1){
  options(scipen=5)
  for (i in 1:length(argument1)) {
    plot(argument1[[i]], main="Dispersion plot",
         xlab="time", ylab="keyword", type="h", ylim=c(0,1), yaxt='n')
  }
}

如何将其绘制在一起?这是我的感觉的照片:

example

我试图做的是或多或少地将所有这些情节放在一起: enter image description here

1 个答案:

答案 0 :(得分:3)

您的示例不可复制,因此以下代码使用Jane Austen的小说来使用ggplot2绘制单词位置。希望您可以根据需要修改此代码

library(tidyverse)
library(janeaustenr)
library(scales)

# Function to plot dispersion of a given vector of words in novels by Jane Austen
plot.dispersion = function(words) {

  pattern = paste(words, collapse="|")

  # Get locations of each input word in each text
  # Adapted from Text Mining with R (https://www.tidytextmining.com/tfidf.html)
  texts = austen_books() %>% 
    group_by(book) %>% 
    mutate(text = str_split(tolower(text), "\\W")) %>% 
    unnest %>% 
    filter(text != "") %>% 
    mutate(word.num = 1:n(),
           pct = word.num/n()) %>% 
    filter(grepl(pattern, text)) %>% 
    mutate(text = str_extract(text, pattern))

  # Plot the word locations
  ggplot(texts, aes(y=book, x=pct)) +
    geom_point(shape="|", size=5) +
    facet_grid(text ~ .) +
    scale_x_continuous(labels=percent) +
    labs(x="Percent of book", y="") +
    theme_bw() +
    theme(panel.grid.major.x=element_blank(),
          panel.grid.minor.x=element_blank())
}

plot.dispersion(c("independent", "property"))

enter image description here