Bryce Thomas
Bryce Thomas

Reputation: 10799

How to invert the y-axis on a plot

I would like to know how to make a plot in R where the y-axis is inverted such that the plotted data appears in what would be the fourth quadrant (IV) of a cartesian plane, as opposed to the first (I) quadrant.

For reference, the plot I am trying to make looks very similar to the following (source):

a plot with inverted y-axis

I have found a number of questions online pertaining to reversing the numbering on the y-axis, but these all still plot the data in the first quadrant. Can anyone suggest how I might produce a plot similar to that shown above?

Upvotes: 13

Views: 20141

Answers (3)

Tung
Tung

Reputation: 28441

It's now quite easy to reverse the y-axis using scale_y_reverse and specify position = "top" for the x-axis in ggplot2

Example

library(ggplot2)
library(scales)

set.seed(99)
Date <- seq(from = as.Date("2017-12-01"), to = as.Date("2017-12-15"),
             by = "days")
Flux <- runif(length(Date), 1, 10000)
Flux_df <- data.frame(Date, Flux)

p1 <- ggplot(Flux_df, aes(Date, Flux)) +
  geom_col() +
  xlab("") +
  scale_x_date(position = "top", breaks = pretty_breaks(), expand = c(0, 0)) +
  scale_y_reverse(expand = expand_scale(mult = c(0.2, 0))) +
  theme_bw(base_size = 16) +
  theme(panel.border = element_blank(),
        panel.grid.major.x = element_blank(),
        panel.grid.minor = element_blank(),
        axis.line = element_line()) +
  theme(legend.position = "none")
p1

enter image description here

If we want both logarithmic and reverse axis, we need a workaround suggested here as ggplot2 does not have that option atm

reverselog_trans <- function(base = exp(1)) { 
  trans <- function(x) -log(x, base) 
  inv <- function(x) base^(-x) 
  scales::trans_new(paste0("reverselog-", format(base)), trans, inv, 
                    scales::log_breaks(base = base), domain = c(1e-100, Inf)) 
}


p1 + scale_y_continuous(trans = reverselog_trans(10),
                        breaks = scales::trans_breaks("log10", function(x) 10^x),
                        labels = scales::trans_format("log10", scales::math_format(10^.x)),
                        expand = expand_scale(mult = c(0.2, 0))) +
  annotation_logticks()

enter image description here

Upvotes: 0

gringer
gringer

Reputation: 420

Answering the question in the title, the best/easiest way to invert the axis is to flip the limit variables around:

> plot(1:10, xlim=c(1,10));

standard plot

> plot(1:10, xlim=c(10,1));

plot with inverted X axis

> plot(1:10, ylim=c(10,1));

plot with inverted Y axis

Doing it this way means that you don't need to mess around with axes that are different from the image coordinates.

This can be combined with the 'xaxt="n"' parameter and an additional axis command to place an axis on another side:

> plot(1:10, ylim=c(10,1), xaxt="n"); axis(3);

Inverted graph with X axis on top

Upvotes: 4

Ben
Ben

Reputation: 42343

Just to provide a worked out answer, following the comments of @timriffe and @joran...

Use the function for minor log ticks from this answer:

minor.ticks.axis <- function(ax,n,t.ratio=0.5,mn,mx,...){

  lims <- par("usr")
  if(ax %in%c(1,3)) lims <- lims[1:2] else lims[3:4]

  major.ticks <- pretty(lims,n=5)
  if(missing(mn)) mn <- min(major.ticks)
  if(missing(mx)) mx <- max(major.ticks)

  major.ticks <- major.ticks[major.ticks >= mn & major.ticks <= mx]

  labels <- sapply(major.ticks,function(i)
    as.expression(bquote(10^ .(i)))
                   )
  axis(ax,at=major.ticks,labels=labels,...)

  n <- n+2
  minors <- log10(pretty(10^major.ticks[1:2],n))-major.ticks[1]
  minors <- minors[-c(1,n)]

  minor.ticks = c(outer(minors,major.ticks,`+`))
  minor.ticks <- minor.ticks[minor.ticks > mn & minor.ticks < mx]


  axis(ax,at=minor.ticks,tcl=par("tcl")*t.ratio,labels=FALSE)

}

Make some reproducible example data:

x <- 1:8
y <- 10^(sort(runif(8, 1, 10), decreasing = TRUE))

Plot without axes:

plot(x, log10(y), # function to plot
xlab="",          # suppress x labels
type = 'l',       # specify line graph
xlim = c(min(x), (max(x)*1.3)),  # extend axis limits to give space for text annotation
ylim = c(0, max(log10(y))),      # ditto
axes = FALSE)    # suppress both axes

Add fancy log axis and turn tick labels right way up (thanks @joran!):

minor.ticks.axis(2, 9, mn=0, mx=10, las=1)

Add x-axis up the top:

axis(3)

Add x-axis label (thanks for the tip, @WojciechSobala)

mtext("x", side = 3, line = 2)

And add an annotation to the end of the line

text(max(x), min(log10(y)), "Example", pos = 1)

Here's the result:

enter image description here

Upvotes: 11

Related Questions