Histograms of Failure Loads

concrete %>% 
  ggplot(aes(x=mean.failure.load.lbs)) +
    geom_histogram(binwidth = 500) + 
  xlab("Mean Failure Load (lbs)") +
  ggtitle("Distribution of Mean Failure Loads") +
    big.text

concrete %>% 
  ggplot(aes(x=failure.psi)) +
    geom_histogram(binwidth = 250) +
  xlab("Mean Failure Load (psi)") +
  ggtitle("Distribution of Mean Failure Loads") +
    big.text

Failure Loads vs Mix Design

concrete %>% 
  ggplot(aes(x = Af.Cp.ratio, y = failure.psi)) +
  geom_point() +
  geom_smooth(method= "lm", fill = "yellow") +
  ylab("Mean Failure Load (psi)") +
  xlab("Fine Aggregate : Cement Ratio") +
  big.text

concrete %>% 
  ggplot(aes(x = Ac.Cp.ratio, y = failure.psi)) +
  geom_point() +
  geom_smooth(method= "lm", fill = "yellow") +
  ylab("Mean Failure Load (psi)") +
    xlab("Coarse Aggregate : Cement Ratio") +
  big.text

concrete %>% 
  ggplot(aes(x = H2O.Cp.ratio, y = failure.psi)) +
  geom_point() +
  geom_smooth(method= "lm", fill = "yellow") +
  ylab("Mean Failure Load (psi)") +
  xlab("H2O : Cement Ratio") +
  big.text

concrete %>% 
  ggplot(aes(x = cure.time.days, y = failure.psi)) +
  geom_point() +
  geom_smooth(method= "lm", fill = "yellow") +
  ylab("Mean Failure Load (psi)") +
  xlab("Cure Time (days)") +
  big.text

concrete %>% 
  ggplot(aes(x = H2O.ml/dry.mass.g, y = failure.psi)) +
  geom_point() +
  geom_smooth(method= "lm", fill = "yellow") +
  ylab("Mean Failure Load (psi)") +
  xlab("H2O : Dry Mass Ratio") +
  big.text

concrete %>% 
  ggplot(aes(x = H2O.ml/total.mass.g, y = failure.psi)) +
  geom_point() +
  #geom_smooth() +
  geom_smooth(method= "lm", fill = "yellow") +
  ylab("Mean Failure Load (psi)") +
  xlab("Percent H2O by Mass") +
  big.text

concrete %>% 
  filter(!is.na(class.day)) %>% 
  ggplot(aes(x = class.day, y = failure.psi, fill = class.day)) +
  geom_boxplot() +
  ylab("Mean Failure Load (psi)") +
  xlab("Class Day") +
  big.text

concrete %>% 
  filter(!is.na(class.day)) %>% 
  ggplot(aes(x = class.day, y = mean.failure.load.lbs, fill = class.day)) +
  geom_boxplot() +
  ylab("Mean Failure Load (lbs)") +
  xlab("Class Day") +
  big.text