setwd("/Users/luanpao/Desktop/Facebook workshop/")

Load necessary packages

#Let's load the libraries 
library(Rfacebook)
## Loading required package: httr
## Loading required package: rjson
## Loading required package: httpuv
## 
## Attaching package: 'Rfacebook'
## The following object is masked from 'package:methods':
## 
##     getGroup
library(ROAuth)

pages <-searchPage(“SP2”, token)

visualization

library(devtools)
library(ggplot2)
library(lubridate)
## 
## Attaching package: 'lubridate'
## The following object is masked from 'package:base':
## 
##     date
library(scales)
library(rCharts)

Road SP2 Facebook page data that you collected above

posts <- read.csv ("sp2_post.csv", header = TRUE)

Clean and standardize timestamps

posts$created_time <- ymd_hms(posts$created_time)
posts$created_time <- with_tz(posts$created_time, "America/New_York")
posts <- posts[order(posts$created_time, decreasing = FALSE), ]
posts$created_date <- as.Date(posts$created_time)

Calculate engagement metrics

#daily count
posts$post_basecount <-1
posts$post_perday <- ave(posts$post_basecount,posts$created_date,FUN=sum)
posts$like_perday <- ave(posts$likes_count,posts$created_date,FUN=sum)
posts$share_perday <- ave(posts$shares_count,posts$created_date,FUN = sum)
posts$comment_perday <- ave(posts$comments_count,posts$created_date,FUN = sum)
posts$love_perday <- ave(posts$love_count,posts$created_date,FUN = sum)
posts$haha_perday <- ave(posts$haha_count,posts$created_date,FUN = sum)
posts$wow_perday <- ave(posts$wow_count,posts$created_date,FUN = sum)
posts$sad_perday <- ave(posts$sad_count,posts$created_date,FUN = sum)
posts$angry_perday <- ave(posts$angry_count,posts$created_date,FUN = sum)

#average count
posts$post_avg <- as.integer(ave(posts$post_basecount,posts$created_date,FUN=mean))
posts$like_avg <- as.integer(ave(posts$likes_count,posts$created_date,FUN=mean))
posts$share_avg <- as.integer(ave(posts$shares_count,posts$created_date,FUN=mean))
posts$comment_avg <- as.integer(ave(posts$comments_count,posts$created_date,FUN=mean))
posts$love_avg <- as.integer(ave(posts$love_count,posts$created_date,FUN=mean))
posts$haha_avg <- as.integer(ave(posts$haha_count,posts$created_date,FUN=mean))
posts$wow_avg <- as.integer(ave(posts$wow_count,posts$created_date,FUN=mean))
posts$sad_avg <- as.integer(ave(posts$sad_count,posts$created_date,FUN=mean))
posts$angry_avg <- as.integer(ave(posts$angry_count,posts$created_date,FUN=mean))

Create a new data frame for the engagement metrics

engagement<- posts[!duplicated(posts$created_date),c("created_date","post_perday","like_perday", 
                                                     "share_perday", "comment_perday", "love_perday", 
                                                     "haha_perday", "wow_perday","sad_perday", "angry_perday",
                                                     "post_avg", "like_avg", "share_avg", "comment_avg", "love_avg",
                                                     "haha_avg","wow_avg", "sad_avg", "angry_avg")]

engagement[is.na(engagement)] <- 0

engagement$post_cumsum <- ave(engagement$post_perday, FUN = cumsum)
engagement$like_cumsum <- ave(engagement$like_perday, FUN = cumsum)
engagement$share_cumsum <- ave(engagement$share_perday, FUN = cumsum)
engagement$comment_cumsum <- ave(engagement$comment_perday, FUN = cumsum)
engagement$love_cumsum <- ave(engagement$love_perday, FUN = cumsum)
engagement$haha_cumsum <- ave(engagement$haha_perday, FUN = cumsum)
engagement$wow_cumsum <- ave(engagement$wow_perday, FUN = cumsum)
engagement$sad_cumsum <- ave(engagement$sad_perday, FUN = cumsum)
engagement$angry_cumsum <- ave(engagement$angry_perday, FUN = cumsum)

Generate a daily count plot for one of the engagement metrics

ggplot(data = engagement, aes(x = created_date, y = post_perday)) + 
  geom_line(size = 1.1, alpha = 0.7, aes (color = post_perday)) + 
  geom_point(size =0.5) +
  ylim(0, NA) +
  theme(legend.title=element_blank(), axis.title.x= element_blank()) +
  ylab("average # of posts per day") +
  ggtitle("Average posts volume per day")

ggplot(data = engagement, aes(x = created_date, y = like_avg)) + 
  geom_line(size = 1.1, alpha = 0.7, aes (color = like_avg)) + 
  geom_point(size = 0.5) +
  ylim(0, NA) +
  theme(legend.title=element_blank(), axis.title.x= element_blank()) +
  ylab("average # of likes per day") +
  ggtitle("Average like volume per day")

Generate a cumulative count plot

ggplot(data = engagement, aes(x = created_date, y = like_cumsum)) + 
  geom_line(size = 1.1, alpha = 0.7, aes (color = like_avg)) + 
  geom_point(size = 0.5) +
  ylim(0, NA) +
  theme(legend.title=element_blank(), axis.title.x= element_blank()) +
  ylab("cumulative count of likes") +
  ggtitle("Cumulative growth of likes")

Generate a plot for Facebook reactions

ggplot(data = engagement, aes(x = created_date)) +
  geom_line(aes(y = love_perday, colour = "love")) +
  geom_line(aes(y = haha_perday, colour = "haha")) +
  geom_line(aes(y = wow_perday, colour = "wow")) +
  geom_line(aes(y = angry_perday, colour = "angry")) +
  xlab("Date") +
  ylab("Daily count of Facebook reactions") +
  ggtitle ("Daily count of Facebook reactions")

Generate a cumulative count plot

ggplot(data = engagement, aes(x = created_date)) +
  geom_line(aes(y = like_cumsum, colour = "like")) +
  geom_line(aes(y = love_cumsum, colour = "love")) +
  geom_line(aes(y = haha_cumsum, colour = "haha")) +
  geom_line(aes(y = wow_cumsum, colour = "wow")) +
  geom_line(aes(y = angry_cumsum, colour = "angry")) +
  xlab("Date") +
  ylab("Cumulative count of Facebook reactions") +
  ggtitle ("Cumulative growth of Facebook reactions")

Interactive chart

require(rCharts)
require(reshape2)
## Loading required package: reshape2
library(knitr)

options(rpubs.upload.method = "internal")
opts_chunk$set(comment = NA, results = "asis", tidy = F)  

engagement$date_show <-as.Date(engagement$created_date,format="%Y-%m-%d")
engagement$date_show <- as.character(engagement$date_show)

m1 <- mPlot(x = 'date_show', y = c("like_perday", "love_perday","haha_perday","wow_perday","sad_perday","angry_perday"), 
            type = 'Line', data = engagement)
m1$set(pointSize = 0, lineWidth = 1)
m1$print('chart2', include_assets = TRUE)
## <link rel='stylesheet' href=/Library/Frameworks/R.framework/Versions/3.4/Resources/library/rCharts/libraries/morris/css/morris.css>
## <script type='text/javascript' src=/Library/Frameworks/R.framework/Versions/3.4/Resources/library/rCharts/libraries/morris/js/jquery-1.8.2.min.js></script>
## <script type='text/javascript' src=/Library/Frameworks/R.framework/Versions/3.4/Resources/library/rCharts/libraries/morris/js/raphael-2.1.0.min.js></script>
## <script type='text/javascript' src=/Library/Frameworks/R.framework/Versions/3.4/Resources/library/rCharts/libraries/morris/js/morris.min.js></script> 
##  <style>
##   .rChart {
##     display: block;
##     margin-left: auto; 
##     margin-right: auto;
##     width: 800px;
##     height: 400px;
##   }  
##   </style>
## <div id = 'chart2' class = 'rChart morris'></div>
## <script type='text/javascript'>
##     var chartParams = {
##  "element": "chart2",
## "width":            800,
## "height":            400,
## "xkey": "date_show",
## "ykeys": [
##  "like_perday",
## "love_perday",
## "haha_perday",
## "wow_perday",
## "sad_perday",
## "angry_perday" 
## ],
## "data": [
##  {
##  "created_date":          17108,
## "post_perday":              1,
## "like_perday": 0,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 0,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":              1,
## "like_cumsum": 0,
## "share_cumsum": 0,
## "comment_cumsum": 0,
## "love_cumsum":              0,
## "haha_cumsum":              0,
## "wow_cumsum":              0,
## "sad_cumsum":              0,
## "angry_cumsum":              0,
## "date_show": "2016-11-03" 
## },
## {
##  "created_date":          17109,
## "post_perday":              1,
## "like_perday": 50,
## "share_perday": 3,
## "comment_perday": 2,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 50,
## "share_avg": 3,
## "comment_avg": 2,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":              2,
## "like_cumsum": 50,
## "share_cumsum": 3,
## "comment_cumsum": 2,
## "love_cumsum":              2,
## "haha_cumsum":              0,
## "wow_cumsum":              0,
## "sad_cumsum":              0,
## "angry_cumsum":              0,
## "date_show": "2016-11-04" 
## },
## {
##  "created_date":          17112,
## "post_perday":              1,
## "like_perday": 9,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":              3,
## "like_cumsum": 59,
## "share_cumsum": 3,
## "comment_cumsum": 3,
## "love_cumsum":              2,
## "haha_cumsum":              0,
## "wow_cumsum":              0,
## "sad_cumsum":              0,
## "angry_cumsum":              0,
## "date_show": "2016-11-07" 
## },
## {
##  "created_date":          17115,
## "post_perday":              1,
## "like_perday": 3,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 3,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":              4,
## "like_cumsum": 62,
## "share_cumsum": 4,
## "comment_cumsum": 3,
## "love_cumsum":              2,
## "haha_cumsum":              0,
## "wow_cumsum":              0,
## "sad_cumsum":              0,
## "angry_cumsum":              0,
## "date_show": "2016-11-10" 
## },
## {
##  "created_date":          17119,
## "post_perday":              2,
## "like_perday": 8,
## "share_perday": 9,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              1,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 4,
## "share_avg": 4,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":              6,
## "like_cumsum": 70,
## "share_cumsum": 13,
## "comment_cumsum": 3,
## "love_cumsum":              2,
## "haha_cumsum":              0,
## "wow_cumsum":              0,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-11-14" 
## },
## {
##  "created_date":          17122,
## "post_perday":              1,
## "like_perday": 3,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 3,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":              7,
## "like_cumsum": 73,
## "share_cumsum": 13,
## "comment_cumsum": 3,
## "love_cumsum":              2,
## "haha_cumsum":              0,
## "wow_cumsum":              0,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-11-17" 
## },
## {
##  "created_date":          17126,
## "post_perday":              2,
## "like_perday": 3,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 1,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":              9,
## "like_cumsum": 76,
## "share_cumsum": 15,
## "comment_cumsum": 3,
## "love_cumsum":              2,
## "haha_cumsum":              0,
## "wow_cumsum":              0,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-11-21" 
## },
## {
##  "created_date":          17127,
## "post_perday":              2,
## "like_perday": 20,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 10,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             11,
## "like_cumsum": 96,
## "share_cumsum": 15,
## "comment_cumsum": 4,
## "love_cumsum":              3,
## "haha_cumsum":              0,
## "wow_cumsum":              0,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-11-22" 
## },
## {
##  "created_date":          17134,
## "post_perday":              1,
## "like_perday": 7,
## "share_perday": 3,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 7,
## "share_avg": 3,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             12,
## "like_cumsum": 103,
## "share_cumsum": 18,
## "comment_cumsum": 4,
## "love_cumsum":              3,
## "haha_cumsum":              0,
## "wow_cumsum":              0,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-11-29" 
## },
## {
##  "created_date":          17135,
## "post_perday":              1,
## "like_perday": 23,
## "share_perday": 3,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              1,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 23,
## "share_avg": 3,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              1,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             13,
## "like_cumsum": 126,
## "share_cumsum": 21,
## "comment_cumsum": 5,
## "love_cumsum":              3,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-11-30" 
## },
## {
##  "created_date":          17136,
## "post_perday":              2,
## "like_perday": 12,
## "share_perday": 3,
## "comment_perday": 2,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 6,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             15,
## "like_cumsum": 138,
## "share_cumsum": 24,
## "comment_cumsum": 7,
## "love_cumsum":              4,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-12-01" 
## },
## {
##  "created_date":          17142,
## "post_perday":              1,
## "like_perday": 7,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 7,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             16,
## "like_cumsum": 145,
## "share_cumsum": 24,
## "comment_cumsum": 7,
## "love_cumsum":              4,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-12-07" 
## },
## {
##  "created_date":          17148,
## "post_perday":              3,
## "like_perday": 8,
## "share_perday": 1,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 2,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             19,
## "like_cumsum": 153,
## "share_cumsum": 25,
## "comment_cumsum": 8,
## "love_cumsum":              4,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-12-13" 
## },
## {
##  "created_date":          17149,
## "post_perday":              2,
## "like_perday": 3,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 1,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             21,
## "like_cumsum": 156,
## "share_cumsum": 25,
## "comment_cumsum": 8,
## "love_cumsum":              4,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-12-14" 
## },
## {
##  "created_date":          17150,
## "post_perday":              1,
## "like_perday": 9,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             22,
## "like_cumsum": 165,
## "share_cumsum": 25,
## "comment_cumsum": 8,
## "love_cumsum":              4,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-12-15" 
## },
## {
##  "created_date":          17155,
## "post_perday":              1,
## "like_perday": 27,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              3,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 27,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              3,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             23,
## "like_cumsum": 192,
## "share_cumsum": 27,
## "comment_cumsum": 8,
## "love_cumsum":              7,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-12-20" 
## },
## {
##  "created_date":          17156,
## "post_perday":              1,
## "like_perday": 18,
## "share_perday": 1,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 18,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             24,
## "like_cumsum": 210,
## "share_cumsum": 28,
## "comment_cumsum": 9,
## "love_cumsum":              7,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-12-21" 
## },
## {
##  "created_date":          17157,
## "post_perday":              1,
## "like_perday": 19,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 19,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             25,
## "like_cumsum": 229,
## "share_cumsum": 28,
## "comment_cumsum": 9,
## "love_cumsum":              7,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-12-22" 
## },
## {
##  "created_date":          17158,
## "post_perday":              1,
## "like_perday": 1,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 1,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             26,
## "like_cumsum": 230,
## "share_cumsum": 28,
## "comment_cumsum": 10,
## "love_cumsum":              7,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2016-12-23" 
## },
## {
##  "created_date":          17169,
## "post_perday":              2,
## "like_perday": 3,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 1,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             28,
## "like_cumsum": 233,
## "share_cumsum": 30,
## "comment_cumsum": 10,
## "love_cumsum":              7,
## "haha_cumsum":              0,
## "wow_cumsum":              1,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-03" 
## },
## {
##  "created_date":          17171,
## "post_perday":              2,
## "like_perday": 28,
## "share_perday": 15,
## "comment_perday": 1,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              1,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 14,
## "share_avg": 7,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             30,
## "like_cumsum": 261,
## "share_cumsum": 45,
## "comment_cumsum": 11,
## "love_cumsum":              9,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-05" 
## },
## {
##  "created_date":          17172,
## "post_perday":              2,
## "like_perday": 4,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 2,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             32,
## "like_cumsum": 265,
## "share_cumsum": 45,
## "comment_cumsum": 11,
## "love_cumsum":              9,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-06" 
## },
## {
##  "created_date":          17175,
## "post_perday":              1,
## "like_perday": 16,
## "share_perday": 1,
## "comment_perday": 1,
## "love_perday":              3,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 16,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              3,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             33,
## "like_cumsum": 281,
## "share_cumsum": 46,
## "comment_cumsum": 12,
## "love_cumsum":             12,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-09" 
## },
## {
##  "created_date":          17176,
## "post_perday":              2,
## "like_perday": 8,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 4,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             35,
## "like_cumsum": 289,
## "share_cumsum": 46,
## "comment_cumsum": 13,
## "love_cumsum":             12,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-10" 
## },
## {
##  "created_date":          17179,
## "post_perday":              1,
## "like_perday": 57,
## "share_perday": 8,
## "comment_perday": 1,
## "love_perday":              6,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 57,
## "share_avg": 8,
## "comment_avg": 1,
## "love_avg":              6,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             36,
## "like_cumsum": 346,
## "share_cumsum": 54,
## "comment_cumsum": 14,
## "love_cumsum":             18,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-13" 
## },
## {
##  "created_date":          17184,
## "post_perday":              4,
## "like_perday": 36,
## "share_perday": 5,
## "comment_perday": 4,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             40,
## "like_cumsum": 382,
## "share_cumsum": 59,
## "comment_cumsum": 18,
## "love_cumsum":             20,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-18" 
## },
## {
##  "created_date":          17185,
## "post_perday":              2,
## "like_perday": 21,
## "share_perday": 5,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 10,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             42,
## "like_cumsum": 403,
## "share_cumsum": 64,
## "comment_cumsum": 18,
## "love_cumsum":             20,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-19" 
## },
## {
##  "created_date":          17186,
## "post_perday":              1,
## "like_perday": 4,
## "share_perday": 0,
## "comment_perday": 2,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 4,
## "share_avg": 0,
## "comment_avg": 2,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             43,
## "like_cumsum": 407,
## "share_cumsum": 64,
## "comment_cumsum": 20,
## "love_cumsum":             20,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-20" 
## },
## {
##  "created_date":          17189,
## "post_perday":              1,
## "like_perday": 7,
## "share_perday": 0,
## "comment_perday": 2,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 7,
## "share_avg": 0,
## "comment_avg": 2,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             44,
## "like_cumsum": 414,
## "share_cumsum": 64,
## "comment_cumsum": 22,
## "love_cumsum":             20,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-23" 
## },
## {
##  "created_date":          17190,
## "post_perday":              1,
## "like_perday": 3,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 3,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             45,
## "like_cumsum": 417,
## "share_cumsum": 64,
## "comment_cumsum": 22,
## "love_cumsum":             20,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-24" 
## },
## {
##  "created_date":          17193,
## "post_perday":              1,
## "like_perday": 3,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 3,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             46,
## "like_cumsum": 420,
## "share_cumsum": 64,
## "comment_cumsum": 23,
## "love_cumsum":             20,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-27" 
## },
## {
##  "created_date":          17197,
## "post_perday":              1,
## "like_perday": 22,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              3,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 22,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              3,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             47,
## "like_cumsum": 442,
## "share_cumsum": 64,
## "comment_cumsum": 24,
## "love_cumsum":             23,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-01-31" 
## },
## {
##  "created_date":          17200,
## "post_perday":              1,
## "like_perday": 16,
## "share_perday": 4,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 16,
## "share_avg": 4,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             48,
## "like_cumsum": 458,
## "share_cumsum": 68,
## "comment_cumsum": 24,
## "love_cumsum":             23,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-02-03" 
## },
## {
##  "created_date":          17205,
## "post_perday":              1,
## "like_perday": 27,
## "share_perday": 6,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 27,
## "share_avg": 6,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             49,
## "like_cumsum": 485,
## "share_cumsum": 74,
## "comment_cumsum": 24,
## "love_cumsum":             23,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-02-08" 
## },
## {
##  "created_date":          17207,
## "post_perday":              1,
## "like_perday": 3,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 3,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             50,
## "like_cumsum": 488,
## "share_cumsum": 76,
## "comment_cumsum": 24,
## "love_cumsum":             23,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-02-10" 
## },
## {
##  "created_date":          17210,
## "post_perday":              1,
## "like_perday": 47,
## "share_perday": 5,
## "comment_perday": 0,
## "love_perday":              9,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 47,
## "share_avg": 5,
## "comment_avg": 0,
## "love_avg":              9,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             51,
## "like_cumsum": 535,
## "share_cumsum": 81,
## "comment_cumsum": 24,
## "love_cumsum":             32,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              0,
## "date_show": "2017-02-13" 
## },
## {
##  "created_date":          17212,
## "post_perday":              2,
## "like_perday": 59,
## "share_perday": 8,
## "comment_perday": 4,
## "love_perday":              5,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              1,
## "post_avg": 1,
## "like_avg": 29,
## "share_avg": 4,
## "comment_avg": 2,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             53,
## "like_cumsum": 594,
## "share_cumsum": 89,
## "comment_cumsum": 28,
## "love_cumsum":             37,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-02-15" 
## },
## {
##  "created_date":          17217,
## "post_perday":              1,
## "like_perday": 5,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 5,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             54,
## "like_cumsum": 599,
## "share_cumsum": 89,
## "comment_cumsum": 28,
## "love_cumsum":             37,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-02-20" 
## },
## {
##  "created_date":          17218,
## "post_perday":              3,
## "like_perday": 13,
## "share_perday": 3,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 4,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             57,
## "like_cumsum": 612,
## "share_cumsum": 92,
## "comment_cumsum": 28,
## "love_cumsum":             37,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-02-21" 
## },
## {
##  "created_date":          17219,
## "post_perday":              1,
## "like_perday": 1,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 1,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             58,
## "like_cumsum": 613,
## "share_cumsum": 92,
## "comment_cumsum": 28,
## "love_cumsum":             37,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-02-22" 
## },
## {
##  "created_date":          17221,
## "post_perday":              1,
## "like_perday": 21,
## "share_perday": 6,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 21,
## "share_avg": 6,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             59,
## "like_cumsum": 634,
## "share_cumsum": 98,
## "comment_cumsum": 28,
## "love_cumsum":             37,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-02-24" 
## },
## {
##  "created_date":          17226,
## "post_perday":              1,
## "like_perday": 42,
## "share_perday": 9,
## "comment_perday": 3,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 42,
## "share_avg": 9,
## "comment_avg": 3,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             60,
## "like_cumsum": 676,
## "share_cumsum": 107,
## "comment_cumsum": 31,
## "love_cumsum":             37,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-01" 
## },
## {
##  "created_date":          17227,
## "post_perday":              1,
## "like_perday": 6,
## "share_perday": 0,
## "comment_perday": 2,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 6,
## "share_avg": 0,
## "comment_avg": 2,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             61,
## "like_cumsum": 682,
## "share_cumsum": 107,
## "comment_cumsum": 33,
## "love_cumsum":             37,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-02" 
## },
## {
##  "created_date":          17228,
## "post_perday":              1,
## "like_perday": 50,
## "share_perday": 13,
## "comment_perday": 0,
## "love_perday":              3,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 50,
## "share_avg": 13,
## "comment_avg": 0,
## "love_avg":              3,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             62,
## "like_cumsum": 732,
## "share_cumsum": 120,
## "comment_cumsum": 33,
## "love_cumsum":             40,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-03" 
## },
## {
##  "created_date":          17231,
## "post_perday":              1,
## "like_perday": 42,
## "share_perday": 6,
## "comment_perday": 0,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 42,
## "share_avg": 6,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             63,
## "like_cumsum": 774,
## "share_cumsum": 126,
## "comment_cumsum": 33,
## "love_cumsum":             41,
## "haha_cumsum":              0,
## "wow_cumsum":              2,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-06" 
## },
## {
##  "created_date":          17232,
## "post_perday":              2,
## "like_perday": 49,
## "share_perday": 6,
## "comment_perday": 7,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              2,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 24,
## "share_avg": 3,
## "comment_avg": 3,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              1,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             65,
## "like_cumsum": 823,
## "share_cumsum": 132,
## "comment_cumsum": 40,
## "love_cumsum":             41,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-07" 
## },
## {
##  "created_date":          17233,
## "post_perday":              1,
## "like_perday": 5,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 5,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             66,
## "like_cumsum": 828,
## "share_cumsum": 132,
## "comment_cumsum": 40,
## "love_cumsum":             41,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-08" 
## },
## {
##  "created_date":          17234,
## "post_perday":              1,
## "like_perday": 8,
## "share_perday": 6,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 8,
## "share_avg": 6,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             67,
## "like_cumsum": 836,
## "share_cumsum": 138,
## "comment_cumsum": 40,
## "love_cumsum":             41,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-09" 
## },
## {
##  "created_date":          17235,
## "post_perday":              2,
## "like_perday": 19,
## "share_perday": 3,
## "comment_perday": 1,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             69,
## "like_cumsum": 855,
## "share_cumsum": 141,
## "comment_cumsum": 41,
## "love_cumsum":             43,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-10" 
## },
## {
##  "created_date":          17238,
## "post_perday":              1,
## "like_perday": 8,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 8,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             70,
## "like_cumsum": 863,
## "share_cumsum": 143,
## "comment_cumsum": 41,
## "love_cumsum":             44,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-13" 
## },
## {
##  "created_date":          17240,
## "post_perday":              2,
## "like_perday": 59,
## "share_perday": 9,
## "comment_perday": 3,
## "love_perday":              9,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 29,
## "share_avg": 4,
## "comment_avg": 1,
## "love_avg":              4,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             72,
## "like_cumsum": 922,
## "share_cumsum": 152,
## "comment_cumsum": 44,
## "love_cumsum":             53,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-15" 
## },
## {
##  "created_date":          17241,
## "post_perday":              2,
## "like_perday": 9,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 4,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             74,
## "like_cumsum": 931,
## "share_cumsum": 153,
## "comment_cumsum": 44,
## "love_cumsum":             53,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-16" 
## },
## {
##  "created_date":          17242,
## "post_perday":              2,
## "like_perday": 39,
## "share_perday": 36,
## "comment_perday": 3,
## "love_perday":              7,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 19,
## "share_avg": 18,
## "comment_avg": 1,
## "love_avg":              3,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             76,
## "like_cumsum": 970,
## "share_cumsum": 189,
## "comment_cumsum": 47,
## "love_cumsum":             60,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-17" 
## },
## {
##  "created_date":          17243,
## "post_perday":              1,
## "like_perday": 37,
## "share_perday": 1,
## "comment_perday": 4,
## "love_perday":              8,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 37,
## "share_avg": 1,
## "comment_avg": 4,
## "love_avg":              8,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             77,
## "like_cumsum": 1007,
## "share_cumsum": 190,
## "comment_cumsum": 51,
## "love_cumsum":             68,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-18" 
## },
## {
##  "created_date":          17246,
## "post_perday":              1,
## "like_perday": 2,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 2,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             78,
## "like_cumsum": 1009,
## "share_cumsum": 190,
## "comment_cumsum": 51,
## "love_cumsum":             68,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-21" 
## },
## {
##  "created_date":          17247,
## "post_perday":              3,
## "like_perday": 41,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              4,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 13,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             81,
## "like_cumsum": 1050,
## "share_cumsum": 191,
## "comment_cumsum": 51,
## "love_cumsum":             72,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-22" 
## },
## {
##  "created_date":          17252,
## "post_perday":              1,
## "like_perday": 2,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 2,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             82,
## "like_cumsum": 1052,
## "share_cumsum": 191,
## "comment_cumsum": 51,
## "love_cumsum":             72,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-27" 
## },
## {
##  "created_date":          17253,
## "post_perday":              1,
## "like_perday": 3,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 3,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             83,
## "like_cumsum": 1055,
## "share_cumsum": 191,
## "comment_cumsum": 52,
## "love_cumsum":             72,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-28" 
## },
## {
##  "created_date":          17255,
## "post_perday":              1,
## "like_perday": 8,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 8,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             84,
## "like_cumsum": 1063,
## "share_cumsum": 193,
## "comment_cumsum": 52,
## "love_cumsum":             72,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-30" 
## },
## {
##  "created_date":          17256,
## "post_perday":              1,
## "like_perday": 22,
## "share_perday": 7,
## "comment_perday": 0,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 22,
## "share_avg": 7,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             85,
## "like_cumsum": 1085,
## "share_cumsum": 200,
## "comment_cumsum": 52,
## "love_cumsum":             73,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-03-31" 
## },
## {
##  "created_date":          17259,
## "post_perday":              1,
## "like_perday": 3,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 3,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             86,
## "like_cumsum": 1088,
## "share_cumsum": 200,
## "comment_cumsum": 52,
## "love_cumsum":             73,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-03" 
## },
## {
##  "created_date":          17261,
## "post_perday":              1,
## "like_perday": 31,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 31,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             87,
## "like_cumsum": 1119,
## "share_cumsum": 202,
## "comment_cumsum": 52,
## "love_cumsum":             73,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-05" 
## },
## {
##  "created_date":          17262,
## "post_perday":              1,
## "like_perday": 2,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 2,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             88,
## "like_cumsum": 1121,
## "share_cumsum": 202,
## "comment_cumsum": 52,
## "love_cumsum":             73,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-06" 
## },
## {
##  "created_date":          17263,
## "post_perday":              1,
## "like_perday": 11,
## "share_perday": 4,
## "comment_perday": 1,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 11,
## "share_avg": 4,
## "comment_avg": 1,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             89,
## "like_cumsum": 1132,
## "share_cumsum": 206,
## "comment_cumsum": 53,
## "love_cumsum":             75,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-07" 
## },
## {
##  "created_date":          17267,
## "post_perday":              2,
## "like_perday": 17,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 8,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             91,
## "like_cumsum": 1149,
## "share_cumsum": 207,
## "comment_cumsum": 53,
## "love_cumsum":             75,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-11" 
## },
## {
##  "created_date":          17268,
## "post_perday":              1,
## "like_perday": 7,
## "share_perday": 6,
## "comment_perday": 0,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 7,
## "share_avg": 6,
## "comment_avg": 0,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             92,
## "like_cumsum": 1156,
## "share_cumsum": 213,
## "comment_cumsum": 53,
## "love_cumsum":             77,
## "haha_cumsum":              0,
## "wow_cumsum":              4,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-12" 
## },
## {
##  "created_date":          17269,
## "post_perday":              1,
## "like_perday": 42,
## "share_perday": 3,
## "comment_perday": 0,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              1,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 42,
## "share_avg": 3,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              1,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             93,
## "like_cumsum": 1198,
## "share_cumsum": 216,
## "comment_cumsum": 53,
## "love_cumsum":             78,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-13" 
## },
## {
##  "created_date":          17273,
## "post_perday":              1,
## "like_perday": 2,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 2,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             94,
## "like_cumsum": 1200,
## "share_cumsum": 216,
## "comment_cumsum": 53,
## "love_cumsum":             78,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-17" 
## },
## {
##  "created_date":          17275,
## "post_perday":              1,
## "like_perday": 0,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 0,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             95,
## "like_cumsum": 1200,
## "share_cumsum": 216,
## "comment_cumsum": 53,
## "love_cumsum":             78,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-19" 
## },
## {
##  "created_date":          17283,
## "post_perday":              1,
## "like_perday": 47,
## "share_perday": 9,
## "comment_perday": 0,
## "love_perday":              3,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 47,
## "share_avg": 9,
## "comment_avg": 0,
## "love_avg":              3,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             96,
## "like_cumsum": 1247,
## "share_cumsum": 225,
## "comment_cumsum": 53,
## "love_cumsum":             81,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-27" 
## },
## {
##  "created_date":          17284,
## "post_perday":              2,
## "like_perday": 14,
## "share_perday": 5,
## "comment_perday": 0,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 7,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":             98,
## "like_cumsum": 1261,
## "share_cumsum": 230,
## "comment_cumsum": 53,
## "love_cumsum":             83,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-04-28" 
## },
## {
##  "created_date":          17287,
## "post_perday":              2,
## "like_perday": 20,
## "share_perday": 3,
## "comment_perday": 1,
## "love_perday":              3,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 10,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            100,
## "like_cumsum": 1281,
## "share_cumsum": 233,
## "comment_cumsum": 54,
## "love_cumsum":             86,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-01" 
## },
## {
##  "created_date":          17290,
## "post_perday":              3,
## "like_perday": 143,
## "share_perday": 9,
## "comment_perday": 15,
## "love_perday":             41,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 47,
## "share_avg": 3,
## "comment_avg": 5,
## "love_avg":             13,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            103,
## "like_cumsum": 1424,
## "share_cumsum": 242,
## "comment_cumsum": 69,
## "love_cumsum":            127,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-04" 
## },
## {
##  "created_date":          17294,
## "post_perday":              2,
## "like_perday": 25,
## "share_perday": 14,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 12,
## "share_avg": 7,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            105,
## "like_cumsum": 1449,
## "share_cumsum": 256,
## "comment_cumsum": 70,
## "love_cumsum":            127,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-08" 
## },
## {
##  "created_date":          17295,
## "post_perday":              1,
## "like_perday": 2,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 2,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            106,
## "like_cumsum": 1451,
## "share_cumsum": 256,
## "comment_cumsum": 70,
## "love_cumsum":            127,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-09" 
## },
## {
##  "created_date":          17296,
## "post_perday":              2,
## "like_perday": 19,
## "share_perday": 2,
## "comment_perday": 1,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            108,
## "like_cumsum": 1470,
## "share_cumsum": 258,
## "comment_cumsum": 71,
## "love_cumsum":            128,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-10" 
## },
## {
##  "created_date":          17297,
## "post_perday":              1,
## "like_perday": 6,
## "share_perday": 1,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 6,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            109,
## "like_cumsum": 1476,
## "share_cumsum": 259,
## "comment_cumsum": 72,
## "love_cumsum":            128,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-11" 
## },
## {
##  "created_date":          17301,
## "post_perday":              3,
## "like_perday": 120,
## "share_perday": 3,
## "comment_perday": 2,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 40,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            112,
## "like_cumsum": 1596,
## "share_cumsum": 262,
## "comment_cumsum": 74,
## "love_cumsum":            128,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-15" 
## },
## {
##  "created_date":          17309,
## "post_perday":              1,
## "like_perday": 33,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 33,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            113,
## "like_cumsum": 1629,
## "share_cumsum": 262,
## "comment_cumsum": 74,
## "love_cumsum":            129,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-23" 
## },
## {
##  "created_date":          17311,
## "post_perday":              1,
## "like_perday": 1,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 1,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            114,
## "like_cumsum": 1630,
## "share_cumsum": 262,
## "comment_cumsum": 74,
## "love_cumsum":            130,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-25" 
## },
## {
##  "created_date":          17316,
## "post_perday":              1,
## "like_perday": 25,
## "share_perday": 1,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 25,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            115,
## "like_cumsum": 1655,
## "share_cumsum": 263,
## "comment_cumsum": 75,
## "love_cumsum":            130,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-05-30" 
## },
## {
##  "created_date":          17318,
## "post_perday":              1,
## "like_perday": 5,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 5,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            116,
## "like_cumsum": 1660,
## "share_cumsum": 265,
## "comment_cumsum": 75,
## "love_cumsum":            130,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-01" 
## },
## {
##  "created_date":          17323,
## "post_perday":              1,
## "like_perday": 23,
## "share_perday": 4,
## "comment_perday": 1,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 23,
## "share_avg": 4,
## "comment_avg": 1,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            117,
## "like_cumsum": 1683,
## "share_cumsum": 269,
## "comment_cumsum": 76,
## "love_cumsum":            132,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-06" 
## },
## {
##  "created_date":          17325,
## "post_perday":              1,
## "like_perday": 10,
## "share_perday": 3,
## "comment_perday": 0,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 10,
## "share_avg": 3,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            118,
## "like_cumsum": 1693,
## "share_cumsum": 272,
## "comment_cumsum": 76,
## "love_cumsum":            133,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-08" 
## },
## {
##  "created_date":          17330,
## "post_perday":              1,
## "like_perday": 35,
## "share_perday": 10,
## "comment_perday": 0,
## "love_perday":              6,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 35,
## "share_avg": 10,
## "comment_avg": 0,
## "love_avg":              6,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            119,
## "like_cumsum": 1728,
## "share_cumsum": 282,
## "comment_cumsum": 76,
## "love_cumsum":            139,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-13" 
## },
## {
##  "created_date":          17331,
## "post_perday":              1,
## "like_perday": 43,
## "share_perday": 9,
## "comment_perday": 8,
## "love_perday":              4,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 43,
## "share_avg": 9,
## "comment_avg": 8,
## "love_avg":              4,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            120,
## "like_cumsum": 1771,
## "share_cumsum": 291,
## "comment_cumsum": 84,
## "love_cumsum":            143,
## "haha_cumsum":              0,
## "wow_cumsum":              5,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-14" 
## },
## {
##  "created_date":          17336,
## "post_perday":              1,
## "like_perday": 13,
## "share_perday": 1,
## "comment_perday": 2,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              2,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 13,
## "share_avg": 1,
## "comment_avg": 2,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              2,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            121,
## "like_cumsum": 1784,
## "share_cumsum": 292,
## "comment_cumsum": 86,
## "love_cumsum":            143,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-19" 
## },
## {
##  "created_date":          17337,
## "post_perday":              1,
## "like_perday": 14,
## "share_perday": 7,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 14,
## "share_avg": 7,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            122,
## "like_cumsum": 1798,
## "share_cumsum": 299,
## "comment_cumsum": 86,
## "love_cumsum":            143,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-20" 
## },
## {
##  "created_date":          17343,
## "post_perday":              1,
## "like_perday": 8,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 8,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            123,
## "like_cumsum": 1806,
## "share_cumsum": 299,
## "comment_cumsum": 86,
## "love_cumsum":            143,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-26" 
## },
## {
##  "created_date":          17344,
## "post_perday":              1,
## "like_perday": 0,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 0,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            124,
## "like_cumsum": 1806,
## "share_cumsum": 299,
## "comment_cumsum": 86,
## "love_cumsum":            143,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-27" 
## },
## {
##  "created_date":          17346,
## "post_perday":              1,
## "like_perday": 13,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 13,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            125,
## "like_cumsum": 1819,
## "share_cumsum": 300,
## "comment_cumsum": 86,
## "love_cumsum":            143,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-06-29" 
## },
## {
##  "created_date":          17353,
## "post_perday":              1,
## "like_perday": 5,
## "share_perday": 6,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 5,
## "share_avg": 6,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            126,
## "like_cumsum": 1824,
## "share_cumsum": 306,
## "comment_cumsum": 86,
## "love_cumsum":            143,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-07-06" 
## },
## {
##  "created_date":          17358,
## "post_perday":              1,
## "like_perday": 21,
## "share_perday": 1,
## "comment_perday": 2,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 21,
## "share_avg": 1,
## "comment_avg": 2,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            127,
## "like_cumsum": 1845,
## "share_cumsum": 307,
## "comment_cumsum": 88,
## "love_cumsum":            145,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-07-11" 
## },
## {
##  "created_date":          17359,
## "post_perday":              1,
## "like_perday": 15,
## "share_perday": 1,
## "comment_perday": 1,
## "love_perday":              3,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 15,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              3,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            128,
## "like_cumsum": 1860,
## "share_cumsum": 308,
## "comment_cumsum": 89,
## "love_cumsum":            148,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-07-12" 
## },
## {
##  "created_date":          17367,
## "post_perday":              1,
## "like_perday": 19,
## "share_perday": 1,
## "comment_perday": 1,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 19,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            129,
## "like_cumsum": 1879,
## "share_cumsum": 309,
## "comment_cumsum": 90,
## "love_cumsum":            150,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-07-20" 
## },
## {
##  "created_date":          17374,
## "post_perday":              1,
## "like_perday": 22,
## "share_perday": 5,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 22,
## "share_avg": 5,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            130,
## "like_cumsum": 1901,
## "share_cumsum": 314,
## "comment_cumsum": 90,
## "love_cumsum":            150,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-07-27" 
## },
## {
##  "created_date":          17381,
## "post_perday":              1,
## "like_perday": 3,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 3,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            131,
## "like_cumsum": 1904,
## "share_cumsum": 315,
## "comment_cumsum": 90,
## "love_cumsum":            150,
## "haha_cumsum":              0,
## "wow_cumsum":              7,
## "sad_cumsum":              1,
## "angry_cumsum":              1,
## "date_show": "2017-08-03" 
## },
## {
##  "created_date":          17385,
## "post_perday":              1,
## "like_perday": 17,
## "share_perday": 6,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              1,
## "sad_perday":              4,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 17,
## "share_avg": 6,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              1,
## "sad_avg":              4,
## "angry_avg":              0,
## "post_cumsum":            132,
## "like_cumsum": 1921,
## "share_cumsum": 321,
## "comment_cumsum": 90,
## "love_cumsum":            150,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-07" 
## },
## {
##  "created_date":          17386,
## "post_perday":              1,
## "like_perday": 6,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 6,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            133,
## "like_cumsum": 1927,
## "share_cumsum": 321,
## "comment_cumsum": 90,
## "love_cumsum":            150,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-08" 
## },
## {
##  "created_date":          17387,
## "post_perday":              1,
## "like_perday": 17,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 17,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            134,
## "like_cumsum": 1944,
## "share_cumsum": 321,
## "comment_cumsum": 91,
## "love_cumsum":            150,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-09" 
## },
## {
##  "created_date":          17388,
## "post_perday":              2,
## "like_perday": 19,
## "share_perday": 3,
## "comment_perday": 3,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            136,
## "like_cumsum": 1963,
## "share_cumsum": 324,
## "comment_cumsum": 94,
## "love_cumsum":            151,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-10" 
## },
## {
##  "created_date":          17393,
## "post_perday":              2,
## "like_perday": 23,
## "share_perday": 9,
## "comment_perday": 0,
## "love_perday":              3,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 11,
## "share_avg": 4,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            138,
## "like_cumsum": 1986,
## "share_cumsum": 333,
## "comment_cumsum": 94,
## "love_cumsum":            154,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-15" 
## },
## {
##  "created_date":          17395,
## "post_perday":              1,
## "like_perday": 6,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 6,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            139,
## "like_cumsum": 1992,
## "share_cumsum": 335,
## "comment_cumsum": 94,
## "love_cumsum":            154,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-17" 
## },
## {
##  "created_date":          17399,
## "post_perday":              1,
## "like_perday": 7,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 7,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            140,
## "like_cumsum": 1999,
## "share_cumsum": 335,
## "comment_cumsum": 95,
## "love_cumsum":            154,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-21" 
## },
## {
##  "created_date":          17400,
## "post_perday":              1,
## "like_perday": 7,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 7,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            141,
## "like_cumsum": 2006,
## "share_cumsum": 335,
## "comment_cumsum": 96,
## "love_cumsum":            154,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-22" 
## },
## {
##  "created_date":          17402,
## "post_perday":              1,
## "like_perday": 36,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 36,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            142,
## "like_cumsum": 2042,
## "share_cumsum": 335,
## "comment_cumsum": 97,
## "love_cumsum":            155,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-24" 
## },
## {
##  "created_date":          17406,
## "post_perday":              3,
## "like_perday": 55,
## "share_perday": 5,
## "comment_perday": 1,
## "love_perday":              3,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 18,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            145,
## "like_cumsum": 2097,
## "share_cumsum": 340,
## "comment_cumsum": 98,
## "love_cumsum":            158,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-28" 
## },
## {
##  "created_date":          17407,
## "post_perday":              9,
## "like_perday": 181,
## "share_perday": 16,
## "comment_perday": 2,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 20,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            154,
## "like_cumsum": 2278,
## "share_cumsum": 356,
## "comment_cumsum": 100,
## "love_cumsum":            158,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-29" 
## },
## {
##  "created_date":          17408,
## "post_perday":              1,
## "like_perday": 7,
## "share_perday": 0,
## "comment_perday": 1,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 7,
## "share_avg": 0,
## "comment_avg": 1,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            155,
## "like_cumsum": 2285,
## "share_cumsum": 356,
## "comment_cumsum": 101,
## "love_cumsum":            158,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-30" 
## },
## {
##  "created_date":          17409,
## "post_perday":              1,
## "like_perday": 19,
## "share_perday": 15,
## "comment_perday": 0,
## "love_perday":              6,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 19,
## "share_avg": 15,
## "comment_avg": 0,
## "love_avg":              6,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            156,
## "like_cumsum": 2304,
## "share_cumsum": 371,
## "comment_cumsum": 101,
## "love_cumsum":            164,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-08-31" 
## },
## {
##  "created_date":          17410,
## "post_perday":              1,
## "like_perday": 4,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 4,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            157,
## "like_cumsum": 2308,
## "share_cumsum": 372,
## "comment_cumsum": 101,
## "love_cumsum":            164,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-01" 
## },
## {
##  "created_date":          17414,
## "post_perday":              1,
## "like_perday": 5,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 5,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            158,
## "like_cumsum": 2313,
## "share_cumsum": 373,
## "comment_cumsum": 101,
## "love_cumsum":            164,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-05" 
## },
## {
##  "created_date":          17415,
## "post_perday":              2,
## "like_perday": 53,
## "share_perday": 7,
## "comment_perday": 1,
## "love_perday":              5,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 26,
## "share_avg": 3,
## "comment_avg": 0,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            160,
## "like_cumsum": 2366,
## "share_cumsum": 380,
## "comment_cumsum": 102,
## "love_cumsum":            169,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-06" 
## },
## {
##  "created_date":          17416,
## "post_perday":              1,
## "like_perday": 23,
## "share_perday": 1,
## "comment_perday": 2,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 23,
## "share_avg": 1,
## "comment_avg": 2,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            161,
## "like_cumsum": 2389,
## "share_cumsum": 381,
## "comment_cumsum": 104,
## "love_cumsum":            171,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-07" 
## },
## {
##  "created_date":          17417,
## "post_perday":              1,
## "like_perday": 4,
## "share_perday": 3,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 4,
## "share_avg": 3,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            162,
## "like_cumsum": 2393,
## "share_cumsum": 384,
## "comment_cumsum": 104,
## "love_cumsum":            171,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-08" 
## },
## {
##  "created_date":          17420,
## "post_perday":              1,
## "like_perday": 9,
## "share_perday": 6,
## "comment_perday": 2,
## "love_perday":              5,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 6,
## "comment_avg": 2,
## "love_avg":              5,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            163,
## "like_cumsum": 2402,
## "share_cumsum": 390,
## "comment_cumsum": 106,
## "love_cumsum":            176,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-11" 
## },
## {
##  "created_date":          17422,
## "post_perday":              1,
## "like_perday": 42,
## "share_perday": 10,
## "comment_perday": 3,
## "love_perday":              7,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 42,
## "share_avg": 10,
## "comment_avg": 3,
## "love_avg":              7,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            164,
## "like_cumsum": 2444,
## "share_cumsum": 400,
## "comment_cumsum": 109,
## "love_cumsum":            183,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-13" 
## },
## {
##  "created_date":          17423,
## "post_perday":              1,
## "like_perday": 10,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 10,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            165,
## "like_cumsum": 2454,
## "share_cumsum": 401,
## "comment_cumsum": 109,
## "love_cumsum":            183,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-14" 
## },
## {
##  "created_date":          17424,
## "post_perday":              1,
## "like_perday": 10,
## "share_perday": 3,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 10,
## "share_avg": 3,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            166,
## "like_cumsum": 2464,
## "share_cumsum": 404,
## "comment_cumsum": 109,
## "love_cumsum":            183,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-15" 
## },
## {
##  "created_date":          17427,
## "post_perday":              2,
## "like_perday": 34,
## "share_perday": 5,
## "comment_perday": 2,
## "love_perday":              4,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 17,
## "share_avg": 2,
## "comment_avg": 1,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            168,
## "like_cumsum": 2498,
## "share_cumsum": 409,
## "comment_cumsum": 111,
## "love_cumsum":            187,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-18" 
## },
## {
##  "created_date":          17431,
## "post_perday":              1,
## "like_perday": 9,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            169,
## "like_cumsum": 2507,
## "share_cumsum": 411,
## "comment_cumsum": 111,
## "love_cumsum":            187,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-22" 
## },
## {
##  "created_date":          17434,
## "post_perday":              1,
## "like_perday": 11,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 11,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            170,
## "like_cumsum": 2518,
## "share_cumsum": 411,
## "comment_cumsum": 111,
## "love_cumsum":            187,
## "haha_cumsum":              0,
## "wow_cumsum":              8,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-25" 
## },
## {
##  "created_date":          17437,
## "post_perday":              3,
## "like_perday": 30,
## "share_perday": 6,
## "comment_perday": 2,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              2,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 10,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            173,
## "like_cumsum": 2548,
## "share_cumsum": 417,
## "comment_cumsum": 113,
## "love_cumsum":            189,
## "haha_cumsum":              0,
## "wow_cumsum":             10,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-28" 
## },
## {
##  "created_date":          17438,
## "post_perday":              1,
## "like_perday": 32,
## "share_perday": 2,
## "comment_perday": 3,
## "love_perday":              4,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 32,
## "share_avg": 2,
## "comment_avg": 3,
## "love_avg":              4,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            174,
## "like_cumsum": 2580,
## "share_cumsum": 419,
## "comment_cumsum": 116,
## "love_cumsum":            193,
## "haha_cumsum":              0,
## "wow_cumsum":             10,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-09-29" 
## },
## {
##  "created_date":          17441,
## "post_perday":              3,
## "like_perday": 18,
## "share_perday": 4,
## "comment_perday": 3,
## "love_perday":              4,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 6,
## "share_avg": 1,
## "comment_avg": 1,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            177,
## "like_cumsum": 2598,
## "share_cumsum": 423,
## "comment_cumsum": 119,
## "love_cumsum":            197,
## "haha_cumsum":              0,
## "wow_cumsum":             10,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-02" 
## },
## {
##  "created_date":          17443,
## "post_perday":              1,
## "like_perday": 4,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 4,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            178,
## "like_cumsum": 2602,
## "share_cumsum": 423,
## "comment_cumsum": 119,
## "love_cumsum":            199,
## "haha_cumsum":              0,
## "wow_cumsum":             10,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-04" 
## },
## {
##  "created_date":          17448,
## "post_perday":              1,
## "like_perday": 7,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 7,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            179,
## "like_cumsum": 2609,
## "share_cumsum": 424,
## "comment_cumsum": 119,
## "love_cumsum":            199,
## "haha_cumsum":              0,
## "wow_cumsum":             10,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-09" 
## },
## {
##  "created_date":          17450,
## "post_perday":              1,
## "like_perday": 2,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 2,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            180,
## "like_cumsum": 2611,
## "share_cumsum": 424,
## "comment_cumsum": 119,
## "love_cumsum":            199,
## "haha_cumsum":              0,
## "wow_cumsum":             10,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-11" 
## },
## {
##  "created_date":          17451,
## "post_perday":              1,
## "like_perday": 4,
## "share_perday": 3,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 4,
## "share_avg": 3,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            181,
## "like_cumsum": 2615,
## "share_cumsum": 427,
## "comment_cumsum": 119,
## "love_cumsum":            199,
## "haha_cumsum":              0,
## "wow_cumsum":             10,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-12" 
## },
## {
##  "created_date":          17452,
## "post_perday":              1,
## "like_perday": 6,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 6,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            182,
## "like_cumsum": 2621,
## "share_cumsum": 428,
## "comment_cumsum": 119,
## "love_cumsum":            199,
## "haha_cumsum":              0,
## "wow_cumsum":             10,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-13" 
## },
## {
##  "created_date":          17455,
## "post_perday":              2,
## "like_perday": 19,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              1,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            184,
## "like_cumsum": 2640,
## "share_cumsum": 429,
## "comment_cumsum": 119,
## "love_cumsum":            199,
## "haha_cumsum":              0,
## "wow_cumsum":             11,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-16" 
## },
## {
##  "created_date":          17457,
## "post_perday":              1,
## "like_perday": 46,
## "share_perday": 5,
## "comment_perday": 0,
## "love_perday":             10,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 46,
## "share_avg": 5,
## "comment_avg": 0,
## "love_avg":             10,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            185,
## "like_cumsum": 2686,
## "share_cumsum": 434,
## "comment_cumsum": 119,
## "love_cumsum":            209,
## "haha_cumsum":              0,
## "wow_cumsum":             11,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-18" 
## },
## {
##  "created_date":          17458,
## "post_perday":              1,
## "like_perday": 13,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 13,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            186,
## "like_cumsum": 2699,
## "share_cumsum": 435,
## "comment_cumsum": 119,
## "love_cumsum":            211,
## "haha_cumsum":              0,
## "wow_cumsum":             11,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-19" 
## },
## {
##  "created_date":          17459,
## "post_perday":              1,
## "like_perday": 19,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              2,
## "haha_perday":              0,
## "wow_perday":              1,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 19,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              2,
## "haha_avg":              0,
## "wow_avg":              1,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            187,
## "like_cumsum": 2718,
## "share_cumsum": 435,
## "comment_cumsum": 119,
## "love_cumsum":            213,
## "haha_cumsum":              0,
## "wow_cumsum":             12,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-20" 
## },
## {
##  "created_date":          17462,
## "post_perday":              1,
## "like_perday": 10,
## "share_perday": 1,
## "comment_perday": 0,
## "love_perday":              0,
## "haha_perday":              0,
## "wow_perday":              1,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 10,
## "share_avg": 1,
## "comment_avg": 0,
## "love_avg":              0,
## "haha_avg":              0,
## "wow_avg":              1,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            188,
## "like_cumsum": 2728,
## "share_cumsum": 436,
## "comment_cumsum": 119,
## "love_cumsum":            213,
## "haha_cumsum":              0,
## "wow_cumsum":             13,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-23" 
## },
## {
##  "created_date":          17463,
## "post_perday":              1,
## "like_perday": 30,
## "share_perday": 2,
## "comment_perday": 0,
## "love_perday":              5,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 30,
## "share_avg": 2,
## "comment_avg": 0,
## "love_avg":              5,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            189,
## "like_cumsum": 2758,
## "share_cumsum": 438,
## "comment_cumsum": 119,
## "love_cumsum":            218,
## "haha_cumsum":              0,
## "wow_cumsum":             13,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-24" 
## },
## {
##  "created_date":          17464,
## "post_perday":              1,
## "like_perday": 9,
## "share_perday": 0,
## "comment_perday": 0,
## "love_perday":              1,
## "haha_perday":              0,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 9,
## "share_avg": 0,
## "comment_avg": 0,
## "love_avg":              1,
## "haha_avg":              0,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            190,
## "like_cumsum": 2767,
## "share_cumsum": 438,
## "comment_cumsum": 119,
## "love_cumsum":            219,
## "haha_cumsum":              0,
## "wow_cumsum":             13,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-25" 
## },
## {
##  "created_date":          17466,
## "post_perday":              1,
## "like_perday": 58,
## "share_perday": 0,
## "comment_perday": 4,
## "love_perday":              7,
## "haha_perday":              3,
## "wow_perday":              0,
## "sad_perday":              0,
## "angry_perday":              0,
## "post_avg": 1,
## "like_avg": 58,
## "share_avg": 0,
## "comment_avg": 4,
## "love_avg":              7,
## "haha_avg":              3,
## "wow_avg":              0,
## "sad_avg":              0,
## "angry_avg":              0,
## "post_cumsum":            191,
## "like_cumsum": 2825,
## "share_cumsum": 438,
## "comment_cumsum": 123,
## "love_cumsum":            226,
## "haha_cumsum":              3,
## "wow_cumsum":             13,
## "sad_cumsum":              5,
## "angry_cumsum":              1,
## "date_show": "2017-10-27" 
## } 
## ],
## "pointSize":              0,
## "lineWidth":              1,
## "id": "chart2",
## "labels": [ "like_perday", "love_perday", "haha_perday", "wow_perday", "sad_perday", "angry_perday" ] 
## },
##       chartType = "Line"
##     new Morris[chartType](chartParams)
## </script>
print(m1)
## <iframe src=' Facebook_download_and_analysis_files/figure-html/unnamed-chunk-12-1.html ' scrolling='no' frameBorder='0' seamless class='rChart morris ' id=iframe- chart2 ></iframe> <style>iframe.rChart{ width: 100%; height: 400px;}</style>