R/final.plot.R

Defines functions final.plot

Documented in final.plot

final.plot <- function(x, OV = NULL ) {
  
  #has.ggplot2 <- requireNamespace("ggplot2")
  
#  if (has.ggplot2) {
    #if (!isNamespaceLoaded("ggplot2")) attachNamespace("ggplot2")
    AREA <- NULL
    
    for (i1 in 1:(length(x) - 1)) {
      for (i2 in (i1 + 1):(length(x))) {
        A <- data.frame(x = x[[i1]],
                        group = names(x)[i1],
                        k = paste(names(x)[i1],
                                  names(x)[i2], sep = "-", collapse = ""))
        B <- data.frame(x = x[[i2]],
                        group = names(x)[i2],
                        k = paste(names(x)[i1],
                                  names(x)[i2], sep = "-", collapse = ""))
        AREA <- rbind(AREA, rbind(A, B))
      }
    }
    
    if (!is.null(OV)){
      for (j in 1:length(levels(AREA$k))) {
        levels(AREA$k)[j] <- paste(levels(AREA$k)[j], " (ov. perc. ",
                                   round(OV[grep(levels(AREA$k)[j],
                                                 names(OV), fixed = TRUE)]*100), ")", sep = "")    
      }
    }
    ggplot(AREA, aes(x = x)) +
      facet_wrap(~k) +
      geom_density(aes(fill = AREA$group), alpha = .35) +
      xlab("") + theme(legend.title = element_blank()) 
#  } #else {
#    warning("package ggplot2 is missing.")
#  }
}
masspastore/overlapping documentation built on Oct. 18, 2019, 3:31 a.m.