The Western Region is the most profitable and the Central Region is the least profitable.

ggplot(Superstore_Dataset %>% 
  group_by(Region) %>% 
  summarise_at("Profit", sum, na.rm = TRUE),
  aes(Region, Profit, fill=Profit))+
  geom_bar(stat = "identity", na.rm = T)+
  labs(title = "Profits by Region", x = "Region", y = "Profit")+
  geom_text(aes(label=Profit))+
  theme(legend.position="none")

The most profitable segment is Consumer.

ggplot(Superstore_Dataset %>% 
         group_by(Segment) %>% 
         summarise_at("Profit", sum, na.rm = TRUE),
       aes(Segment, Profit, fill=Profit))+
  geom_bar(stat = "identity", na.rm = T)+
  labs(title = "Profits by Segment", x = "Segment", y = "Profit")+
  geom_text(aes(label=Profit))+
  theme(legend.position="none",
        axis.text.y=element_blank(),
        axis.ticks.y=element_blank())

Technology is the most profitable category.

ggplot(Superstore_Dataset %>% 
         group_by(Category) %>% 
         summarise_at("Profit", sum, na.rm = TRUE),
       aes(Category, Profit, fill=Profit))+
  geom_bar(stat = "identity", na.rm = T)+
  labs(title = "Profits by Category", x = "Category", y = "Profit")+
  geom_text(aes(label=Profit))+theme(legend.position="none")

In the Central region the highest selling segment is Corporate.

Superstore_Dataset %>% 
  filter(Region == "Central") %>% 
  ggplot(aes(Sales, Segment, fill = Segment))+
  geom_bar(stat = "identity", position = "dodge")+
  labs(title = "Central Region Sales by Segment", x = "Sales", y = "Segment")+
  theme(legend.position="none")

In the Western region the highest selling segment is Consumer.

Superstore_Dataset %>% 
  filter(Region == "West") %>% 
  ggplot(aes(Sales, Segment, fill = Segment))+
  geom_bar(stat = "identity", position = "dodge")+
  labs(title = "Western Regional Sales by Segment", x = "Sales", y = "Segment")+
  theme(legend.position="none")

Regardless of the segment the highest selling category is Technology.

ggplot(Superstore_Dataset, aes(Category,Sales))+
  geom_col(aes(fill = Category),position = "dodge", na.rm = T)+
  facet_wrap(~Segment, nrow = 1)+ labs(title = "Segment Sales by Category", x = "", y = "Sales")+
  theme(axis.text.x=element_blank(),
        axis.ticks.x=element_blank())