|
themep=theme( |
|
plot.title=element_text(face="bold",size=18), |
|
legend.title=element_text(size=16), |
|
legend.text=element_text(size=14), |
|
axis.title.x=element_text(size=14), |
|
axis.title.y=element_text(size=14), |
|
axis.text.x=element_text(size=12), |
|
axis.text.y=element_text(size=12) |
|
|
|
) |
|
|
|
## 2-1, 2-2 |
|
p1=trd %>% group_by(combined_shot_type) %>% summarise(p=round(n()/nrow(trd),3)*100) %>% arrange(p) %>% ungroup %>% mutate(pos=cumsum(p)-0.5*p) %>% |
|
ggplot(.,aes(x="",y=p,fill=combined_shot_type))+ |
|
geom_bar(width=1,stat="identity")+ |
|
coord_polar(theta="y")+ |
|
geom_text(aes(y=pos,label=c("","","",paste0(p[4:6],"%"))),size=6,fontface="bold")+ |
|
scale_fill_discrete(name="combined_shot_type",labels=c("Bank Shot ( 0.5% )","Dunk","Hook Shot ( 0.5% )","Jump Shot","Layup","Tip Shot ( 0.6% )"))+ |
|
ggtitle("(2-1) The Proportion of combined_shot_type")+ |
|
theme_minimal()+ |
|
theme( |
|
plot.title=element_text(face="bold",size=18), |
|
axis.title.x=element_blank(), |
|
axis.title.y=element_blank(), |
|
panel.grid=element_blank(), |
|
axis.text=element_blank(), |
|
legend.title=element_text(size=16), |
|
legend.text=element_text(size=14) |
|
) |
|
|
|
p2=trd %>% group_by(combined_shot_type,shot_made_flag) %>% tally %>% group_by(combined_shot_type) %>% mutate(p=round(n/sum(n),3)*100) %>% |
|
ggplot(.,aes(x=combined_shot_type,y=p,fill=factor(shot_made_flag)))+ |
|
geom_bar(stat="identity",position="dodge")+ |
|
geom_text(aes(label=paste0(p,"%")),position=position_dodge(width=0.9),size=4,colour="white",vjust=1,fontface="bold")+ |
|
scale_fill_discrete(name="shot_made_flag",breaks=c("0","1"),labels=c("Failed","Made"))+ |
|
ggtitle("(2-2) The Field Goal (%) of combined_shot_type")+ |
|
ylab("Proportion")+ |
|
themep |
|
|
|
gridExtra::grid.arrange(p1,p2,nrow=1) |
|
|
|
## 2-3 |
|
combined_pro=trd %>% group_by(combined_shot_type) %>% summarise(p=round(n()/nrow(trd),3)*100) %>% arrange(p) %>% mutate(name=paste0(combined_shot_type," ","(",p,"%)")) |
|
|
|
ComProbD=trd %>% group_by(combined_shot_type,action_type) %>% tally %>% |
|
group_by(combined_shot_type) %>% mutate(p=round(n/sum(n),3)) %>% ungroup %>% |
|
mutate(combined_shot_type=factor(combined_shot_type,levels=combined_procombinedshottype,labels=combinedproname)) %>% |
|
arrange(desc(combined_shot_type),desc(n)) %>% |
|
mutate(action_type=factor(action_type,levels=action_type)) |
|
|
|
ggplot(data=ComProbD,aes(x=action_type,y=p,fill=combined_shot_type))+ |
|
facet_grid(.~combined_shot_type,space="free")+ |
|
geom_bar(stat="identity")+ |
|
geom_text(aes(y=0.65,label=paste0(p*100,"% (",n,")")),colour="black",size=3,fontface="bold",hjust=0)+ |
|
scale_fill_discrete(name="combined_shot_type",breaks=combined_proname,labels=combinedprocombined_shot_type)+ |
|
scale_y_continuous(breaks=seq(0,1,0.25),labels=paste0(seq(0,100,25),"%"))+ |
|
ggtitle("(2-3) The Proportion of action_type categorized by combined_shot_type")+ |
|
ylab("Proportion")+ |
|
theme( |
|
axis.text.x=element_text(angle=90,hjust=1), |
|
strip.text.x=element_text(size=14,face="bold") |
|
)+ |
|
themep+ |
|
coord_flip() |
|
|
|
## 2-4 |
|
trd %>% group_by(combined_shot_type,action_type,shot_made_flag) %>% tally %>% |
|
group_by(combined_shot_type,action_type) %>% mutate(p=round(n/sum(n),3)) %>% ungroup %>% |
|
mutate(combined_shot_type=factor(combined_shot_type,levels=combined_procombinedshottype,labels=combinedproname), |
|
action_type=factor(action_type,levels=levels(ComProbD$action_type))) %>% |
|
arrange(desc(combined_shot_type),action_type,desc(shot_made_flag),desc(p)) %>% |
|
group_by(combined_shot_type,action_type) %>% mutate(loc=cumsum(p)-p/2) %>% ungroup %>% |
|
ggplot(aes(x=action_type,y=p))+ |
|
facet_grid(.~combined_shot_type,space="free")+ |
|
geom_bar(aes(fill=factor(shot_made_flag)),stat="identity")+ |
|
geom_text(aes(y=loc,label=paste0(p*100)),size=4,fontface="bold")+ |
|
scale_fill_discrete(name="shot_made_flag",breaks=c(0,1),labels=c("Missed","Made"))+ |
|
scale_y_continuous(breaks=seq(0,1,0.25),labels=paste0(seq(0,100,25),"%"))+ |
|
ggtitle("(2-4) The Field Goal (%) of action_type categorized by combined_shot_type")+ |
|
ylab("Proportion")+ |
|
theme( |
|
axis.text.x=element_text(angle=90,hjust=1), |
|
strip.text.x=element_text(size=14,face="bold") |
|
)+ |
|
themep+ |
|
coord_flip() |
|
|
|
## 2-5 |
|
new_area_p=trd %>% mutate(new_area=paste0(shot_zone_area," & ",shot_zone_basic)) %>% group_by(new_area) %>% summarise(total=n(),made=sum(shot_made_flag),p=round(sum(shot_made_flag)/n(),3)) |
|
new_area_loc=trd %>% mutate(new_area=paste0(shot_zone_area," & ",shot_zone_basic)) %>% group_by(new_area) %>% summarise(medlat=median(lat),medlon=median(lon)) |
|
new_area_merge=left_join(new_area_p,new_area_loc,"new_area"="new_area") %>% mutate(madelabel=paste0(p*100,"%","\n"," (",made,"/",total,")")) |
|
|
|
trd %>% mutate(newarea=paste0(shot_zone_area," & ",shot_zone_basic)) %>% |
|
ggplot(aes(y=lat,x=lon,colour=factor(newarea)))+ |
|
geom_point()+ |
|
annotate("text",y=new_area_mergemedlat,x=newareamergemedlon,label=new_area_merge$madelabel,size=5,fontface="bold")+ |
|
scale_colour_discrete(name="shot_zone_area & shot_zone_basic")+ |
|
ylab("Latitude")+ |
|
xlab("Longitude")+ |
|
ggtitle("(2-5) The Field Goal (%) of shot_zone_area & shot_zone_basic")+ |
|
themep |
|
|
|
## 2-6 |
|
ShotText=trd %>% mutate(DisLevel=ifelse(shot_zone_area=="Back Court(BC)","BC",shot_distance)) %>% group_by(DisLevel) %>% tally |
|
ShotTextV=paste0(ShotTextDisLevel,"(",ShotTextn,")") |
|
names(ShotTextV)=ShotText$DisLevel |
|
|
|
p261=trd %>% mutate(DisLevel=ifelse(shot_zone_area=="Back Court(BC)","BC",shot_distance)) %>% group_by(DisLevel) %>% summarise(n=n(),m=sum(shot_made_flag),p=m/n) %>% |
|
ggplot(aes(x=factor(DisLevel,levels=c("BC",45:0)),y=p))+ |
|
geom_bar(stat="identity")+ |
|
geom_text(aes(y=p,label=paste0(round(p,3)*100,"% (",m,"/",n,")")),size=4,fontface="bold",hjust=0)+ |
|
coord_flip()+ |
|
ylab("Proportion")+ |
|
xlab("shot_distance")+ |
|
ggtitle("(2-6) The Field Goal (%) of shot_distance")+ |
|
scale_y_continuous(limits=c(0,0.75),breaks=seq(0,0.7,0.1),labels=paste0(seq(0,70,10),"%"))+ |
|
themep |
|
|
|
|
|
ShotDistanceText=trd %>% filter(shot_distance %in% c(2,8,15,21,25)) %>% group_by(shot_distance) %>% summarise(minlat=min(lat),meanlon=mean(lon)) |
|
|
|
ColorV=c("grey",rep("red",5)) |
|
names(ColorV)=c(1,2,8,15,21,25) |
|
p262=trd %>% mutate(PointColour=ifelse(shot_distance %in% c(2,8,15,21,25),shot_distance,1))%>% |
|
ggplot(aes(y=lat,x=lon,colour=factor(PointColour)))+ |
|
geom_point()+ |
|
annotate("text",y=ShotDistanceTextminlat,x=ShotDistanceTextmeanlon,label=paste0(ShotDistanceText$shot_distance," ft."),size=6,fontface="bold")+ |
|
scale_colour_manual(name="",values=ColorV)+ |
|
xlab("Longitude")+ |
|
ylab("Latitude")+ |
|
theme(legend.position="none")+ |
|
themep |
|
|
|
layoutM26=matrix(c(1,1,2,2,2,2,1,1,2,2,2,2),nrow=2,ncol=6,byrow=T) |
|
gridExtra::grid.arrange(p262,p261,layout_matrix=layoutM26) |
|
|
|
##2-7 |
|
|
|
trd %>% filter(action_type %in% c("Jump Shot","Turnaround Jump Shot","Fadeaway Jump Shot"),shot_distance<30) %>% group_by(shot_distance,action_type) %>% |
|
summarise(n=n(),m=sum(shot_made_flag),p=m/n) %>% |
|
ggplot(aes(x=shot_distance,y=p,colour=action_type))+ |
|
geom_line(size=2)+ |
|
geom_text(aes(label=n,group=n),colour="black",size=5,fontface="bold")+ |
|
ggtitle("(2-7) The Field Goal (%) of the top 3 major action_type by combined_shot_type of Jump Shot")+ |
|
ylab("Proportion")+ |
|
scale_x_continuous(breaks=seq(0,30,1),labels=seq(0,30,1))+ |
|
scale_y_continuous(breaks=seq(0,1,0.1),labels=paste0(seq(0,100,10),"%"))+ |
|
themep+ |
|
theme(panel.grid.minor.x=element_blank(), |
|
panel.grid.minor.y=element_blank()) |
|
|
|
##2-8 |
|
|
|
trd %>% group_by(season,shot_type) %>% summarise(shot_type_n=n()) %>% group_by(season) %>% |
|
mutate(season_shot_n=sum(shot_type_n), |
|
p=shot_type_n/season_shot_n, |
|
loc=cumsum(shot_type_n)-0.5*shot_type_n) %>% ungroup %>% |
|
ggplot(aes(x=season,y=shot_type_n,fill=shot_type))+ |
|
geom_bar(stat="identity")+ |
|
geom_text(aes(x=season,y=loc,label=paste0(shot_type_n,"(",round(p,3)*100,"%)")),size=3,fontface="bold")+ |
|
geom_text(aes(x=season,y=season_shot_n,label=season_shot_n),vjust=-1,color="blue",fontface="bold")+ |
|
ggtitle("(2-8-1) The number and proportion of shot_type by each_season")+ |
|
ylab("Number of shot_type")+ |
|
themep |
|
|
|
trd %>% group_by(season,shot_type,shot_made_flag) %>% tally %>% group_by(season,shot_type) %>% mutate(p=ifelse(shot_made_flag==1,paste0(round(n/sum(n),3)*100,"%"),"")) %>% |
|
ungroup %>% arrange(season,shot_type,desc(shot_made_flag)) %>% group_by(season,shot_type) %>% mutate(loc=cumsum(n)-0.5*n,sumn=sum(n)) %>% ungroup %>% |
|
ggplot(aes(x=season,y=n,fill=factor(shot_made_flag)))+ |
|
geom_bar(stat="identity",position="stack")+ |
|
geom_text(aes(x=season,y=loc,label=p),fontface="bold",size=4,color="red")+ |
|
geom_text(aes(x=season,y=sumn,label=sumn),vjust=-1,fontface="bold")+ |
|
scale_fill_manual(name="shot_made_flag",breaks=c("0","1"),labels=c("Failed","Made"),values=RColorBrewer::brewer.pal(3,"Accent")[2:1])+ |
|
facet_grid(~shot_type)+ |
|
ggtitle("(2-8-2) The Field Goal (%) of shot_type by each season")+ |
|
ylab("Number of shot_type")+ |
|
themep+ |
|
theme( |
|
strip.text.x=element_text(size=14,face="bold"), |
|
axis.text.x=element_text(angle=90,vjust=0.3) |
|
) |