The data comprised of the weekly average reports gathered at LM before the implementation of lean principles and procedures for 3 weeks Weeks 1, week 2 and week 3 represent the levels 1:2:3 Frequency is represented by the response element of the data we are observing. They are stated as:
SPs opened - opened
SPs closed - closed
SPs repeated - repeated
weeks<-c(1,1,1,1,2,2,2,2,3,3,3,3)
opened<-c(3,3,1,1,3,1,2,1,1,4,0,1)
closed<-c(0,0,1,1,0,2,1,1,1,1,1,1)
repeated<-c(2,3,1,0,2,1,1,1,1,2,0,1)
open<-data.frame(weeks,opened)
close<-data.frame(weeks,closed)
repeats<-data.frame(weeks,repeated)
#install.packages("scales")
#?palette
library(ggplot2)
library("scales")
Barplot for Weekly SPs Opened
ggplot(open, aes(x=weeks, y=opened, fill = weeks)) + geom_bar(stat = "identity")
Barplot for Weekly SPs Closed
ggplot(close, aes(x=weeks, y=closed, fill = weeks)) + geom_bar(stat = "identity")
Barplot for Weekly SPs Repeated
ggplot(repeats, aes(x=weeks, y=repeated, fill = weeks)) + geom_bar(stat = "identity")
A Piechart to demonstrate the analysis of the current conditions of repeated SPs reported and what we intend to achieve at the end of the implementation
Current State of Repeated SPs
piescale<-data.frame("Weeks"=c("1","2","3"),"Repeated_SPs"=c(40,33,26))
bp<-ggplot(piescale, aes(x="", y=Repeated_SPs, fill = Weeks)) + geom_bar(stat = "identity")
pie <- bp + coord_polar("y", start=0)
blank_theme <- theme_minimal()+
theme(
axis.title.x = element_blank(),
axis.title.y = element_blank(),
panel.border = element_blank(),
panel.grid=element_blank(),
axis.ticks = element_blank(),
plot.title=element_text(size=14, face="bold")
)
pie + scale_fill_brewer(palette="Dark2") +
blank_theme + theme(axis.text.x=element_blank()) +
geom_text(aes(y = Repeated_SPs/3 + c(0, cumsum(Repeated_SPs)[-length(Repeated_SPs)]),
label = percent(Repeated_SPs/100)), size=5)
The piechart above shows the percentages of SPs reported on a 3 week report before we started implementing the Lean process.
After Lean Implementation
piescales<-data.frame("Weeks"=c("1","2","3"),"Repeated_SPs"=c(5,0.0,95))
bp<-ggplot(piescales, aes(x="", y=Repeated_SPs, fill = Weeks)) + geom_bar(stat = "identity")
pie <- bp + coord_polar("y", start=0)
blank_theme <- theme_minimal()+
theme(
axis.title.x = element_blank(),
axis.title.y = element_blank(),
panel.border = element_blank(),
panel.grid=element_blank(),
axis.ticks = element_blank(),
plot.title=element_text(size=14, face="bold")
)
pie + scale_fill_brewer(palette="green") +
blank_theme + theme(axis.text.x=element_blank()) +
geom_text(aes(y = Repeated_SPs/3 + c(0, cumsum(Repeated_SPs)[-length(Repeated_SPs)]),
label = percent(Repeated_SPs/100)), size=3)
## Warning in pal_name(palette, type): Unknown palette green
After the lean processes have been implemented, we hope to achieve 95% success rate in reducing the percentage of repeated SPs reported. In week 1, TEs will be gradually adjusting to the new process and we have accounted for 5% outliers. The reasons might be due to unawareness of the process or lack of understanding of the new procedure. We have appointed a member for the project team to help in this regards in name of Stephanie. By week 2 things would have been fully implemented and week 3 will not have repeated SPs reported.