Candice: Maybe explain the basic property of each Asset a little?
sort by weight
gc<- arrange(gc, desc(gc$Weight))
head(gc, 14)%>% DT::datatable()id<- subset(gc, select=-c(Weight))mp1<- ggplot(data=gc, aes(x=reorder(Asset_Name, Weight), y=Weight))+geom_bar(aes(y=Weight, fill=Asset_Name),stat="identity", alpha=0.8 , position="dodge")+ ylab("Weight")+ xlab("Crypto")+coord_flip()+ggtitle(" Importance ")
mp1Bar plot for volumne
by_vol <- test %>%
group_by(Asset_ID) %>%
dplyr::summarize(Tvol = sum(Volume), thigh=max(High), tlow=min(Low))
vol<- merge(id, by_vol, by="Asset_ID")
DT::datatable(vol)