txt file # Header 1
## Header 2
Normal paragraphs of text go here.
**I'm bold**
[links!](http://rstudio.com)
* Unordered
* Lists
And Tables
---- -------
Like This
```{r}
x <- rnorm(100)
length(x)
hist(x)
```
## [1] 100
A <- c(25.75, 38.93, 27.61, 7.30)ave_Cu <- mean(CuClass)
fit1 <- lm(Abs ~ Cu + 0)plot(Ratei2 ~ Ci,
xlab = "X Axis Label",
ylab = "Y Axis Label",
pch = 20) bold_all_col_names <- function(x) {paste('\\textbf{', x, '}', sep ='')}
title <- 'Results for the Mass \\% for a Copper Sulfate Complex of form $CuSO_4(NH_3)_x(H_2O)_y$'
print(xtable(Class,
caption = title,
align = "|r|r|r|r|",
digits = c(0, 0, 0, 0),
display = c("d", "f", "f", "f")
),
caption.placement = 'top',
hline.after = seq(-1, nrow(Class)),
include.rownames = FALSE,
comment = FALSE,
caption.width = '4in',
sanitize.colnames.function = bold_all_col_names
)