Creating data frame

skills <- data.frame(
  Skill = c("SpreadSheet/Excel", "SQL", "Python", "Tableau", "Power BI", 
            "Data Cleaning", "Data Visualization", 
            "Problem Solving", "Communication", "RStudio"),
  Proficiency = c(70, 80, 45, 75, 40, 80, 85, 90, 70, 90)
)

Order by proficiency

skills <- skills[order(skills$Proficiency), ]

##Head summary

head(skills)
##               Skill Proficiency
## 5          Power BI          40
## 3            Python          45
## 1 SpreadSheet/Excel          70
## 9     Communication          70
## 4           Tableau          75
## 2               SQL          80
install.packages("ggplot2", repos = "https://cran.rstudio.com/")
## Installing package into 'C:/Users/kefma/AppData/Local/R/win-library/4.4'
## (as 'lib' is unspecified)
## package 'ggplot2' successfully unpacked and MD5 sums checked
## 
## The downloaded binary packages are in
##  C:\Users\kefma\AppData\Local\Temp\RtmpIhQnD4\downloaded_packages
library(ggplot2)
## Warning: package 'ggplot2' was built under R version 4.4.3

str

str(skills)
## 'data.frame':    10 obs. of  2 variables:
##  $ Skill      : chr  "Power BI" "Python" "SpreadSheet/Excel" "Communication" ...
##  $ Proficiency: num  40 45 70 70 75 80 80 85 90 90

Visualisation

ggplot(skills, aes(x = Proficiency, y = reorder(Skill, Proficiency), fill = Skill)) +
  geom_col(width = 0.4, show.legend = TRUE) +  # Skinny bars
  geom_text(aes(label = paste0(Proficiency, "%")), 
            hjust = -0.1, color = "black", size = 3.5) +
  scale_x_continuous(limits = c(0, 105), expand = c(0, 0)) +
  labs(
    title = "Skill Progress Overview",
    x = "Proficiency (%)",
    y = NULL
  ) +
  theme_minimal(base_size = 12) +
  theme(
    plot.title = element_text(size = 16, face = "bold", hjust = 0.5),
    axis.text = element_text(size = 11)
  )