Multiple graphs using tidyverse

Hello all,
I have just started work with RShiny. I need to make interactive webpage with some analytics. I am exploring my options in terms of graphics.
I have come across the following code that outputs 4 graphs. When I run this in RShiny I get 3 neat small graphs and one big one. When I run the code using CTRL+SHIFT+K I see the same graphs in a browser but now they are all big. I would like the output to be 3 small graphs and 1 big, and for me to be able to choose which one should be showed as large. Hope someone can guide. Thank you!


title: "Untitled"
output: html_notebook %>%

library(nycflights13) # data is in the flights table
library(readr)
library(tidyverse)
library(lubridate)
airlines <- read_csv("notebook-tidyverse-airlines.csv") # readr to read in all kinds of data
data <- nycflights13::flights %>%
  left_join(airlines, by= c('carrier' = 'carrier')) %>% # dplyr can join tables
  mutate(name = str_replace(name, "\\w*\\.", ""), #string to remove abb
         name = as.factor(name),
         dow = wday(time_hour)) %>%
  select(name, arr_delay, dow) %>%
  filter(arr_delay > 0)
  
  samp <- data[sample(1:nrow(data), 500),]
  
  m <- lm(arr_delay ~ ., samp)

  plot (m) 

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.