Recreating (somewhat) the plot here at the Wall Street Journal, just for kicks…

library(dplyr)
pingpongDF <- data_frame(quarters = c("3Q 2014", "4Q 2014", "1Q 2015", "2Q 2015", "3Q 2015", 
              "4Q 2015", "1Q 2016"),
              pingpong = c(142, 230, 215, 190, 145, 153, 60),
              VCdeals = c(1012, 1015, 1001, 1100, 960, 920, 860))
library(ggplot2)
ggplot(pingpongDF, aes(x = pingpong, y = VCdeals, label = quarters)) +
        geom_point(color = "white", size = 7) +
        geom_vline(xintercept = 150, color = "white", size = 1.5) +
        geom_hline(yintercept = 1000, color = "white", size = 1.5) +
        geom_text(check_overlap = TRUE, color = "gray60", family="Roboto-Bold", vjust = 0, nudge_y = 10, nudge_x = -5) +
        annotate("text", label = "In the most\nrecent quarter\nboth measures\nwere low.", family="Roboto-Bold",
                 color = "black", x = 70, y = 868, hjust = 0, size = 4) +
        labs(title = "Tech Bounce",
             subtitle = "Sales of ping-pong tables to companies at a Silicon Valley store\ncorrelate with venture-capital deals made during the same quarter",
             y = "Venture-capital deals made", 
             x = "Ping-pong tables sold",
             caption = "Sources: Billiard Wholesale (sales), Dow Jones VentureSource (deals)") +
        xlim(50, 250) + ylim(850, 1150) +
        theme_minimal(base_family = "RobotoCondensed-Regular", base_size = 14) +
        theme(plot.title=element_text(family="Roboto-Bold")) +
        theme(panel.background = element_rect(fill = "#CBDEB1")) +
        theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank()) +
        theme(plot.caption=element_text(size=9)) +
        theme(plot.caption=element_text(margin=margin(t=10)))