With color as visual cue.

Sample Data

providers <- c("Basic-Fit","RSG Group","PureGym",
               "Clever Fit","The Gym Group")
share <- c(0.034,0.0316,0.0208,0.0147,0.0123)
providers_df <- data.frame(share=share, provider=providers)

Plot

# parameters you might want to customize
theme_color <- "#41598b"
y_range <- c(0, 0.04)

ggplot(data = providers_df,
       aes(x=reorder(provider, share), y=share, fill=share)) +
    geom_bar(stat="identity", width=0.9) +
    scale_fill_gradient(high=theme_color, low="gray")+
    geom_text(aes(y=share+0.002, label=percent(share)),
              size=5, color="#535353") + 
    coord_flip(ylim=y_range, expand=FALSE)+
    scale_y_continuous(labels = scales::percent) +
    labs(x = "", y = "Market Share",
         title = bquote(bold("Market Shares")~"of Leading Gym Providers"),
         subtitle = "in the EU and the UK in 2021") +
    theme_minimal() + 
    theme(plot.title=element_text(size=18, color='#535353'),
          plot.subtitle=element_text(size=14),
          text = element_text(color='#818181'),
          legend.position = 'none')