How to increase font size on scatter plot?

Dear Users,
I'm trying to build a scatter plot for the first time using this script:

pairs(~pH+Oxygen+Salinity+Temperature+Eh+Water_Level+Fe_total+FeII+V, data=RT2, lower.panel=panel.smooth, upper.panel=panel.cor, pch=10, main="")

panel.cor <- function(x, y, digits = 2, prefix = "", cex.cor, ...)
{
usr <- par("usr"); on.exit(par(usr))
par(usr = c(0, 1, 0, 1))
r <- abs(cor(x, y, method = "spearman"))
txt <- format(c(r, 0.123456789), digits=digits)[1]
txt <- paste(prefix, txt, sep = "")
if(missing(cex.cor)) cex.cor <- 0.8/strwidth(txt)
text(0.5, 0.5, txt, cex = cex.cor)
}

Could you please tell me how to increase the font size of my parameters and font size of correlation factors?
Do you think if it is possible to title x- and y- axes?

Thank you in advance!

Hey @Sergey,

I'm not too familiar with base R plotting anymore, but is the pairs function you're using graphics::pairs?

The code you'r providing looks like one of the examples in that link. I think the key line is here:

if(missing(cex.cor)) cex.cor <- 0.8/strwidth(txt)

Since the function you're defining, panel.cor, doesn't receive any argument for cex.cor, so it's defaulting to 80% of strwidth(txt). You could try increasing that multiplier if you're fine to hard code it. I'm not sure whether you can just provide the argument in the call to pairs, like:

upper.panel = panel.cor(cex.cor = 16)

Try it and see (or maybe someone else can confirm)!

2 Likes

Thanks a lot,
I will check this option today.