Warning: file_get_contents(/data/phpspider/zhask/data//catemap/4/r/66.json): failed to open stream: No such file or directory in /data/phpspider/zhask/libs/function.php on line 167

Warning: Invalid argument supplied for foreach() in /data/phpspider/zhask/libs/tag.function.php on line 1116

Notice: Undefined index: in /data/phpspider/zhask/libs/function.php on line 180

Warning: array_chunk() expects parameter 1 to be array, null given in /data/phpspider/zhask/libs/function.php on line 181
R 生成二维ggplot2刻面_R_Ggplot2 - Fatal编程技术网

R 生成二维ggplot2刻面

R 生成二维ggplot2刻面,r,ggplot2,R,Ggplot2,我有一个像这样的数据框。主管(数据管理): 以下代码: require(reshape2) library(ggplot2) library(RColorBrewer) fileName = paste("./4.csv", sep = "") # csv file available here: https://www.dropbox.com/s/bm9hd0t5ak74k89/4.csv?dl=0 mydata = read.csv(fileName,sep=",", header=TR

我有一个像这样的数据框。主管(数据管理):

以下代码:

require(reshape2)
library(ggplot2)
library(RColorBrewer)

fileName = paste("./4.csv", sep = "") # csv file available here: https://www.dropbox.com/s/bm9hd0t5ak74k89/4.csv?dl=0

mydata = read.csv(fileName,sep=",", header=TRUE)

dataM = melt(mydata,c("id"))
dataM = cbind(dataM,
            colsplit(dataM$variable,
                     pattern = "_",
                     names = c("NM", "ORD", "CAT")))
dataM$variable <- NULL
dataM <- dcast(dataM, ... ~ CAT, value.var = "value")

my_palette <- colorRampPalette(rev(brewer.pal(11, "Spectral")))

dataM$NR <- as.integer(dataM$NR)
dataM$ASPL <- as.numeric(dataM$ASPL)

ggplot(dataM, aes(x=NR ,y= ASPL, group=ORD, color=ORD)) +
  geom_point(size = .7,alpha = .3,position="jitter", aes(shape=ORD)) +  ## increased size
  stat_smooth(se = FALSE, method = "loess", size = .5) +
  theme_bw() +
  theme(plot.background = element_blank(),
        axis.line = element_blank(),
        legend.key = element_blank(),
        legend.title = element_blank()) +
  scale_y_continuous("ASPL", expand=c(0,0), limits = c(1, 7)) + 
  scale_x_continuous("NR", expand=c(0,0), limits = c(0, 100)) +
  theme(legend.position="bottom") +
  theme(axis.title.x = element_text(vjust=-0.3, face="bold", size=12)) + 
  theme(axis.title.y = element_text(vjust=1.5, face="bold", size=12)) +
  ggtitle("Title") + theme(plot.title = element_text(lineheight=.8, face="bold")) +
  theme(title = element_text(vjust=2)) +
  facet_grid(NM ~.)
require(重塑2)
图书馆(GG2)
图书馆(RColorBrewer)
文件名=粘贴(“./4.csv”,sep=“”)#此处提供csv文件:https://www.dropbox.com/s/bm9hd0t5ak74k89/4.csv?dl=0
mydata=read.csv(文件名,sep=“,”,标题=TRUE)
dataM=melt(mydata,c(“id”))
dataM=cbind(dataM,
colsplit(dataM$变量,
pattern=“”uuux“,
名称=c(“NM”、“ORD”、“CAT”))

事实上,我想融化是最简单的方法。我不得不把数据弄乱一点,但它确实有效!干杯!
require(reshape2)
library(ggplot2)
library(RColorBrewer)

fileName = paste("./4.csv", sep = "") # csv file available here: https://www.dropbox.com/s/bm9hd0t5ak74k89/4.csv?dl=0

mydata = read.csv(fileName,sep=",", header=TRUE)

dataM = melt(mydata,c("id"))
dataM = cbind(dataM,
            colsplit(dataM$variable,
                     pattern = "_",
                     names = c("NM", "ORD", "CAT")))
dataM$variable <- NULL
dataM <- dcast(dataM, ... ~ CAT, value.var = "value")

my_palette <- colorRampPalette(rev(brewer.pal(11, "Spectral")))

dataM$NR <- as.integer(dataM$NR)
dataM$ASPL <- as.numeric(dataM$ASPL)

ggplot(dataM, aes(x=NR ,y= ASPL, group=ORD, color=ORD)) +
  geom_point(size = .7,alpha = .3,position="jitter", aes(shape=ORD)) +  ## increased size
  stat_smooth(se = FALSE, method = "loess", size = .5) +
  theme_bw() +
  theme(plot.background = element_blank(),
        axis.line = element_blank(),
        legend.key = element_blank(),
        legend.title = element_blank()) +
  scale_y_continuous("ASPL", expand=c(0,0), limits = c(1, 7)) + 
  scale_x_continuous("NR", expand=c(0,0), limits = c(0, 100)) +
  theme(legend.position="bottom") +
  theme(axis.title.x = element_text(vjust=-0.3, face="bold", size=12)) + 
  theme(axis.title.y = element_text(vjust=1.5, face="bold", size=12)) +
  ggtitle("Title") + theme(plot.title = element_text(lineheight=.8, face="bold")) +
  theme(title = element_text(vjust=2)) +
  facet_grid(NM ~.)