| plotCorClocks {methylclock} | R Documentation |
Plot correlation among DNAm clockx
plotCorClocks(x, ...)
x |
a tible or data.frame with the different DNAm clocks |
... |
other arguments to be passs through function 'chart.Correlation' from 'PerformanceAnalytics' package |
To be supplied
Plot with Correlation Clocks
library(Biobase)
library(GEOquery)
dd <- GEOquery::getGEO("GSE109446")
gse109446 <- dd[[1]]
controls <- Biobase::pData(gse109446)$`diagnosis:ch1` == "control"
gse <- gse109446[, controls]
age <- as.numeric(Biobase::pData(gse)$`age:ch1`)
age.gse <- DNAmAge(gse, age = age)
plotCorClocks(age.gse)