Transformation of axes in R

[This article was first published on Datavore Consulting » R, and kindly contributed to R-bloggers]. (You can report issue about the content on this page here)
Want to share your content on R-bloggers? click here if you have a blog, or here if you don't.

As a general rule, you should not transform your data to try to fit a linear model. But proportions can be tricky. If the proportion data do not arise from a binomial process (e.g., proportion of a leaf consumed by a caterpillar), then transformation is still the best option. In an excellent paper, David Warton* and Francis Hui propose that the conventional transformation for proportion data (i.e., arcsine square root) is asinine, particularly if you have binomial data, and that the logit transformation is preferable for non-binomial proportion data.

The objective of this post is simply to demonstrate how to transform the axes of plots in R, but the context of the example is the logit transformation of non-binomial proportion data. First, we need to generate some data.

reps = 5
sim.data = data.frame(Trt=c(rep("A",reps),rep("B",reps),rep("C",reps)), Response = c(runif(reps,0,0.25), runif(reps,0.25,0.75), runif(reps,0.75,1)))
eps = min(sim.data$Response)
sim.data$Trans = log((sim.data$Response+eps)/(1-sim.data$Response+eps))

The logit transformation is -infinity at 0 and infinity at 1, but adding a small amount (eps in code above) to both the numerator and denominator of the transformation solves that problem.

Next we run a simple linear model and calculate the predicted means and confidence intervals.

model = lm(Trans~Trt,sim.data)
nd = expand.grid(Trt=levels(sim.data$Trt))
results = data.frame(nd,predict(model,newdata=nd,interval="confidence"))

The plotrix package includes a function for easily plotting points with error bars. The code below produces a figure with the transformed response variable.

library(plotrix)
png(filename="TransScale.png",width=4,height=4,units="in",res=150)
par(mai=c(0.6,0.6,0,0), mgp=c(2,0.5,0))
with(results, plotCI(1:3, fit, li=lwr, ui=upr, pch=16, xlim=c(0.8,3.2), ylim=c(min(sim.data$Trans), max(sim.data$Trans)), bty="n", xlab="Treatment", ylab="Transformed Response"))
dev.off()

The transformed axis allows the reader to infer treatment effects, but is not easily interpreted. Also, the plotCI( ) function is based on a scatter plot and requires numeric input for both x- and y-variables. But both the transformed y-axis and the mislabeled x-axis are easily changed. The general approach is to tell R to exclude one or both of the axes when drawing the plot and then use the axis( ) function to customize the axes by telling R which labels to use and where to put them. In the case of the transformed y-axis, we want labels that range from 0 to 1 and we will put those labels at the value of the corresponding logit transformation.

y.labels = c(0,0.1,0.5,0.9,1)
y.at = log((y.labels+eps)/(1-y.labels+eps))

We exclude the axes from the plot with the argument axes=F and add our custom axes at the bottom, axis(1), and left, axis(2), of the plot.

png(filename="BackTransScale.png",width=4,height=4,units="in",res=150)
par(mai=c(0.6,0.6,0,0), mgp=c(2,0.5,0))
with(results, plotCI(1:3, fit, li=lwr, ui=upr, pch=16, xlim=c(0.8,3.2), ylim=c(head(y.at,1), tail(y.at,1)), bty="n", xlab="Treatment", ylab="Response", axes=F))
axis(1, labels=c("A","B","C"), at=1:3)
axis(2, labels=y.labels, at=y.at)
dev.off()

The back-transformed axis reveals a few key properties of the transformation (i.e., symmetry around 0.5, compressed scale in the middle of the distribution, and spread scale at the ends of the distribution), but obscures the fact that the confidence intervals are not symmetric around the mean.

Alternatively, you can back transform the predicted values from the linear model.

results$orig.fit = (((1/eps)+1)*exp(results$fit)-1)/((1/eps)*exp(results$fit)+(1/eps))
results$orig.lwr = (((1/eps)+1)*exp(results$lwr)-1)/((1/eps)*exp(results$lwr)+(1/eps))
results$orig.upr = (((1/eps)+1)*exp(results$upr)-1)/((1/eps)*exp(results$upr)+(1/eps))

And plot them on the original scale.

png(filename="BackTransData.png",width=4,height=4,units="in",res=150)
par(mai=c(0.6,0.6,0,0), mgp=c(2,0.5,0))
with(results, plotCI(1:3, orig.fit, li=orig.lwr, ui=orig.upr, pch=16, xlim=c(0.8,3.2), ylim=c(0,1), bty="n", xlab="Treatment", ylab="Response", xaxt="n"))
axis(1, labels=c("A","B","C"), at=1:3)
dev.off()

This version provides the more familiar linear y-axis and clearly illustrates the asymmetry in the confidence intervals, but does not confront the reader with the key properties of the transformation.

*David Warton clearly recognizes that good science need not always be so serious as evidenced by his YouTube video promoting his new R package.

To leave a comment for the author, please follow the link and comment on their blog: Datavore Consulting » R.

R-bloggers.com offers daily e-mail updates about R news and tutorials about learning R and many other topics. Click here if you're looking to post or find an R/data-science job.
Want to share your content on R-bloggers? click here if you have a blog, or here if you don't.

Never miss an update!
Subscribe to R-bloggers to receive
e-mails with the latest R posts.
(You will not see this message again.)

Click here to close (This popup will not appear again)