Reproducible Pitch Presentation

Abhijeet Mohite

03/07/2020

Price prdeictor for diamonds

This is a price predictor for diamonds.It uses various inputs from the user to predict the price of diamonds.

This is the link for the shiny app https://abhijeetkmohite.shinyapps.io/Shinyapp/

This is the link for the Reproducible pitch https://rpubs.com/abhijeetkmohite/ReproduciblePitch

Inputs used in the app

Based on the above inputs the price of the diamond is predicted.

This is the code for the diamonds dataset taken in the analysis

library(ggplot2)
## Warning: package 'ggplot2' was built under R version 3.6.3
library(dplyr)
## Warning: package 'dplyr' was built under R version 3.6.3
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
head(diamonds)
## # A tibble: 6 x 10
##   carat cut       color clarity depth table price     x     y     z
##   <dbl> <ord>     <ord> <ord>   <dbl> <dbl> <int> <dbl> <dbl> <dbl>
## 1 0.23  Ideal     E     SI2      61.5    55   326  3.95  3.98  2.43
## 2 0.21  Premium   E     SI1      59.8    61   326  3.89  3.84  2.31
## 3 0.23  Good      E     VS1      56.9    65   327  4.05  4.07  2.31
## 4 0.290 Premium   I     VS2      62.4    58   334  4.2   4.23  2.63
## 5 0.31  Good      J     SI2      63.3    58   335  4.34  4.35  2.75
## 6 0.24  Very Good J     VVS2     62.8    57   336  3.94  3.96  2.48
diam <- diamonds[,c(1:4,7)]

This is the code for one of the plots used in the analysis

fair_diamonds <- diamonds %>%
  filter(cut == "Fair")
ggplot(data = fair_diamonds, aes(x = price, y = carat)) +
  geom_point()

ggplot(data = fair_diamonds, aes(x = price, y = carat)) +
  geom_point(position = "jitter")

Thank You

Thank You for giving your time in seeing my presentation