Progress Report

ABCD
GHI

Read-And-Delete

  1. Data Validation
  2. how to write an equation
  3. Plot in R
  4. Conclusion

Writting an Equations in R

$ CMR = \hat{ \alpha } + \ \hat{ \beta}PGNP + \ \hat{ \gamma } FLR + \ \hat{ \epsilon } $

where : CMR = Child Mortality Rate PGNP = per capita GNP FMR = Female Literacy Rate

plot(cars, pch = 20, col = "blue")

plot of chunk unnamed-chunk-1

summary(cars)
##      speed           dist       
##  Min.   : 4.0   Min.   :  2.00  
##  1st Qu.:12.0   1st Qu.: 26.00  
##  Median :15.0   Median : 36.00  
##  Mean   :15.4   Mean   : 42.98  
##  3rd Qu.:19.0   3rd Qu.: 56.00  
##  Max.   :25.0   Max.   :120.00

How to read data in slidify

setwd("C:/Users/agohil/Book")
## Error in setwd("C:/Users/agohil/Book"): cannot change working directory
data = read.csv("final.csv" , sep = ",", header = TRUE)
## Warning in file(file, "rt"): cannot open file 'final.csv': No such file or
## directory
## Error in file(file, "rt"): cannot open the connection
head(data)
##                                                                      
## 1 function (..., list = character(), package = NULL, lib.loc = NULL, 
## 2     verbose = getOption("verbose"), envir = .GlobalEnv)            
## 3 {                                                                  
## 4     fileExt <- function(x) {                                       
## 5         db <- grepl("\\\\.[^.]+\\\\.(gz|bz2|xz)$", x)              
## 6         ans <- sub(".*\\\\.", "", x)