Line plot with average and shadow for min / max

I've made a quick example of a dataframe for this below. Basically, I want to create a line graph with the average as a line and a shadow around that line representing the range of values. I understand that I will most likely have to find the min / max string, but I am not sure how to do this for strings, nor do I know how I planned this

TEST <- data.frame(a=c(1,5,7,2), b=c(3,8,2,5), c=c(6,10,2,1))
TEST$mean <- rowMeans(TEST)

      

Any help is appreciated - Thanks

+4


source to share


2 answers


It's probably easy to do this too with R base, but here's the approach ggplot

Adding Min

and Max

and some index for the axisx

TEST <- transform(TEST, Min = pmin(a,b,c), Max = pmax(a,b,c), indx = seq_len(dim(TEST)[1]))

      



Printing using geom_ribbon

library(ggplot2)
ggplot(TEST) +
  geom_line(aes(indx, mean), group = 1) +
  geom_ribbon(aes(x = indx, ymax = Max, ymin = Min), alpha = 0.6, fill = "skyblue")

      

enter image description here

+7


source


To add another option, only basic R can be solved here:

TEST <- data.frame(a=c(1,5,7,2), b=c(3,8,2,5), c=c(6,10,2,1))

# compute mean, min and max of rows
means <- rowMeans(TEST)
maxs <- apply(TEST,1,max)
mins <- apply(TEST,1,min)

# create x-coordinates
xcoords <- 1:nrow(TEST)

# create an empty plot to make space for everything 
plot(x=c(min(xcoords),max(xcoords)),y=c(min(mins),max(maxs)),
     type="n", main="Average",xlab="X",ylab="Y")

# add min-max ranges (color is DodgerBlue with 80/255 of opacity, 
# for rgb values of colors see http://en.wikipedia.org/wiki/Web_colors)
rangecolor <- rgb(30,144,255,alpha=80,maxColorValue=255)
polygon(x=c(xcoords,rev(xcoords)),y=c(maxs,rev(means)),col=rangecolor,border=NA)
polygon(x=c(xcoords,rev(xcoords)),y=c(mins,rev(means)),col=rangecolor,border=NA)

# add average line (black)
meancolor <- "black"
lines(x=xcoords,y=means,col=meancolor)

      

Result:



enter image description here

For future reuse, you can also include it in a useful feature:

plotLineWithRange <- function(x, yVal, yMin, yMax,
                          lineColor="Black", rangeColor="LightBlue",
                          main="", xlab="X", ylab="Y"){
  if(missing(x)){
    x <- 1:length(yVal)
  }
  stopifnot(length(yVal) == length(yMin) && length(yVal) == length(yMax))

  plot(x=c(min(x),max(x)),y=c(min(yMin),max(yMax)),type="n", main=main,xlab=xlab,ylab=ylab)
  polygon(x=c(x,rev(x)),y=c(yMax,rev(yVal)),col=rangeColor,border=NA)
  polygon(x=c(x,rev(x)),y=c(yMin,rev(yVal)),col=rangeColor,border=NA)
  lines(x=x,y=yVal,col=lineColor)
}


# usage example:
plotLineWithRange(yVal=means,yMin=mins,yMax=maxs,main="Average")

      

+3


source







All Articles