1 Introduction

  1. basic Asset
  2. train distrubtion
  3. Arima model

2 Basic Asset

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))

3 Data Visualization

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 ")
mp1

3.1 Example Test data

Bar 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)