GOOGLE

r <- data.frame(matrix(c(rev16, rev15, rev14),nrow = 1, ncol = 3))
r
##      X1    X2    X3
## 1 30390 32639 24890
rownames(r) <- c("Revenue")
colnames(r) <- c("2016", "2015", "2014")
r
##          2016  2015  2014
## Revenue 30390 32639 24890
cogs <- data.frame(matrix(c(cog16, cog15, cog14),nrow = 1, ncol = 3))
cogs
##     X1   X2   X3
## 1 4261 4006 3788
rownames(cogs) <- c("Cost of Goods Sold")
colnames(cogs) <- c("2016", "2015", "2014")
cogs
##                    2016 2015 2014
## Cost of Goods Sold 4261 4006 3788
gp <- data.frame(matrix(c(gp16, gp15, gp14),nrow = 1, ncol = 3))
gp
##      X1    X2    X3
## 1 26129 28633 21102
rownames(gp) <- c("Gross Profit")
colnames(gp) <- c("2016", "2015", "2014")
gp
##               2016  2015  2014
## Gross Profit 26129 28633 21102
rd <- data.frame(matrix(c(rd16, rd15, rd14), nrow = 1, ncol = 3))
rd
##     X1   X2   X3
## 1 5098 3014 2854
rownames(rd) <- c("R&D")
colnames(rd) <- c("2016", "2015", "2014")
rd
##     2016 2015 2014
## R&D 5098 3014 2854
sga <- data.frame(matrix(c(sga16, sga15, sga14),nrow = 1, ncol = 3))
sga
##     X1   X2   X3
## 1 3398 3426 2983
rownames(sga) <- c("SG&A")
colnames(sga) <- c("2016", "2015", "2014")
sga
##      2016 2015 2014
## SG&A 3398 3426 2983
opi <- data.frame(matrix(c(opi16, opi15, opi14), nrow = 1, ncol = 3))
opi
##      X1    X2    X3
## 1 17633 22193 15265
rownames(opi) <- c("Operating Income")
colnames(opi) <- c("2016", "2015", "2014")
opi 
##                   2016  2015  2014
## Operating Income 17633 22193 15265
oi <- data.frame(matrix(c(oi16, oi15, oi14),nrow = 1, ncol = 3))
oi
##    X1  X2 X3
## 1 428 154  3
rownames(oi) <- c("Other Income")
colnames(oi) <- c("2016", "2015", "2014")
oi
##              2016 2015 2014
## Other Income  428  154    3
ie <- data.frame(matrix(c(ie16, ie15, ie14), nrow = 1,ncol = 3))
ie
##    X1  X2  X3
## 1 964 688 412
rownames(ie) <- c("Interest Expense")
colnames(ie) <- c("2016", "2015", "2014")
ie
##                  2016 2015 2014
## Interest Expense  964  688  412
pt <- data.frame(matrix(c(pt16, pt15, pt14), nrow = 1, ncol = 3))
pt
##      X1    X2    X3
## 1 17097 21659 14856
rownames(pt) <- c("Pretax Income")
colnames(pt) <- c("2016", "2015", "2014")
pt
##                2016  2015  2014
## Pretax Income 17097 21659 14856
t <- data.frame(matrix(c(t16, t15, t14),nrow = 1, ncol = 3))
t
##     X1   X2   X3
## 1 3609 3553 2797
rownames(t) <- c("Tax")
colnames(t) <- c("2016", "2015", "2014")
t
##     2016 2015 2014
## Tax 3609 3553 2797
mi <- data.frame(matrix(c(mi16, mi15, mi14), nrow = 1, ncol = 3))
mi
##    X1  X2  X3
## 1 476 579 393
rownames(mi) <- c("Minority Interest")
colnames(mi) <- c("2016", "2015", "2014")
mi 
##                   2016 2015 2014
## Minority Interest  476  579  393
ni <-data.frame(matrix(c(ni16, ni15, ni14), nrow = 1, ncol = 3))
ni
##      X1    X2    X3
## 1 13488 18106 12059
rownames(ni) <- c("Net Income")
colnames(ni) <- c("2016", "2015", "2014")
ni
##             2016  2015  2014
## Net Income 13488 18106 12059
gm <-data.frame(matrix(c(gm16, gm15, gm14), nrow = 1, ncol = 3))
gm1 <- round(gm, 2)
rownames(gm1) <- c("Gross Margin")
colnames(gm1) <- c("2016", "2015", "2014")
gm1
##               2016  2015  2014
## Gross Margin 85.98 87.73 84.78
tr <- data.frame(matrix(c(tr16, tr15, tr14), nrow = 1, ncol = 3))
tr1 <- round(tr, 2)
rownames(tr1) <- c("Tax Rate")
colnames(tr1) <- c("2016", "2015", "2014")
tr1
##           2016 2015  2014
## Tax Rate 21.11 16.4 18.83
IS <- rbind(r ,cogs, gp, rd, sga, opi, oi,ie, pt, t, mi, ni, gm1, tr1)
kable(IS, booktabs = T)
2016 2015 2014
Revenue 30390.00 32639.00 24890.00
Cost of Goods Sold 4261.00 4006.00 3788.00
Gross Profit 26129.00 28633.00 21102.00
R&D 5098.00 3014.00 2854.00
SG&A 3398.00 3426.00 2983.00
Operating Income 17633.00 22193.00 15265.00
Other Income 428.00 154.00 3.00
Interest Expense 964.00 688.00 412.00
Pretax Income 17097.00 21659.00 14856.00
Tax 3609.00 3553.00 2797.00
Minority Interest 476.00 579.00 393.00
Net Income 13488.00 18106.00 12059.00
Gross Margin 85.98 87.73 84.78
Tax Rate 21.11 16.40 18.83