This is an R HTML document. When you click the chunk like this:

Frequency Bar chart that counts the frequency of the items specified by the x aesthetics & plots it.
  library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr     1.1.4     ✔ readr     2.1.5
## ✔ forcats   1.0.0     ✔ stringr   1.5.1
## ✔ ggplot2   3.5.1     ✔ tibble    3.2.1
## ✔ lubridate 1.9.3     ✔ tidyr     1.3.1
## ✔ purrr     1.0.2     
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
  plot1 <- ggplot(mtcars, aes(x=cyl)) +
    geom_bar() +
    labs(title="Frequency bar chart")   # Y axis derived from counts of X item
    print(plot1)
plot of chunk unnamed-chunk-1
Static Bar chart of the absolute number, given by Y aesthetic, you need to set stat="identity" inside the geom_bar.
  library(tidyverse)
  library(ggplot2)

  df <- data.frame(var=c("a", "b", "c"), nums=c(1:3))
  plot2 <- ggplot(df, aes(x=var, y=nums)) +
    geom_bar(stat = "identity")  # Y axis is explicit. 'stat=identity'
  print(plot2)
plot of chunk unnamed-chunk-2
The gridExtra package provides the facility to arrage multiple ggplots in a single grid.
  library(tidyverse)
  library(ggplot2)
  library(gridExtra)
## 
## Attaching package: 'gridExtra'
## The following object is masked from 'package:dplyr':
## 
##     combine
  plot1 <- ggplot(mtcars, aes(x=cyl)) +
  plot2 <- ggplot(df, aes(x=var, y=nums)) +
  grid.arrange(plot1, plot2, ncol=2)
## Error in `ggplot_add()`:
## ! Can't add `grid.arrange(plot1, plot2, ncol = 2)` to a <ggplot> object.
plot of chunk unnamed-chunk-3
Flipping coordinates
  library(tidyverse)
  library(ggplot2)
  library(gridExtra)

  df <- data.frame(var=c("a", "b", "c"), nums=c(1:3))
  ggplot(df, aes(x=var, y=nums)) +
    geom_bar(stat = "identity") +
    coord_flip() +
    labs(title="Coordinates are flipped")
plot of chunk unnamed-chunk-4
Flipping coordinates
  library(tidyverse)
  library(ggplot2)
  library(gridExtra)

  df <- data.frame(var=c("a", "b", "c"), nums=c(1:3))
  ggplot(df, aes(x=var, y=nums)) +
    geom_bar(stat = "identity") +
    coord_flip() +
    labs(title="Coordinates are flipped")
plot of chunk unnamed-chunk-5