Plotting confidence intervals with NA values
1
0
Entering edit mode
@vinicius-henrique-da-silva-6713
Last seen 11 months ago
Brazil

I would like to plot confidence intervals to a data with NAs, using `Gviz` package. I modified manual example to expose my problem. First as the manual expose:

    library(Gviz)
    
    ## Loading GRanges object
    data(twoGroups)
    
    ## Plot data without NAs
    dTrack <- DataTrack(twoGroups, name = "uniform")
    tiff("Gviz_original.tiff", units="in", width=11, height=8.5, res=200, compress="lzw")
    plotTracks(dTrack, groups = rep(c("control", "treated"),
                                    each = 3), type = c("a", "p", "confint"))
    graphics.off()
    


   Now, using data with `NA` values and `na.rm=TRUE` statment:

      
      ## Transforming in data frame
      df <- as.data.frame(twoGroups)
    
    ## Input NAs to look like my real data
    df[ df <= 0 ] = NA
    df <- df[,-4]
    df <- df[,-4]
    names(df) <- c("chr", "start", "end", "control", "control.1", "control.2", "treated", "treated.1", "treated.2")
    
    ## Plot with NA
    library(GenomicRanges)
    df <- makeGRangesFromDataFrame(df, TRUE)
    dftrack <- DataTrack(df, name = "uniform")
    tiff("Gviz_NA.tiff", units="in", width=11, height=8.5, res=200, compress="lzw")
    plotTracks(dftrack, groups = rep(c("control", "treated"),
                                     each = 3), type = c("a", "p", "confint"), na.rm=TRUE)
    graphics.off()


Please note that I included the `na.rm=TRUE` statment in `plotTracks` function, which allowed the computation of the line following the mean. However, the shaded area which represents the confidence interval, can´t be estimated where I have `NA` values, even with the `na.rm=TRUE`.  
 
Any ideas to deal with this issue? Thank you!

graphics confidence interval NA • 1.5k views
ADD COMMENT
0
Entering edit mode
@james-w-macdonald-5106
Last seen 12 hours ago
United States
dftrack2 <- setPar(dftrack, "na.rm", TRUE)
plotTracks(dftrack2, groups = rep(c("control","treated"), each = 3), type = c("a","p", "confint"))


 

ADD COMMENT

Login before adding your answer.

Traffic: 909 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6