This is a tool for use with R to make it function like a Spreadsheet software with Statistical tools and can be customized with other packages.
This is not like: - R Commander Rcmdr - Rattle - R Deducer - and others
URL: - https://dev.jamovi.org/tuts0101-getting-started.html - www.jamovi.org
For Dev
install.packages('jmvtools', repos=c('https://repo.jamovi.org', 'https://cran.r-project.org'))
For Research
install.packages("rjson")
install.packages('jmv')
#library(Deducer)
#library(Rcmdr)
#library(rattle)
library(jmv)
##
## Attaching package: 'jmv'
## The following object is masked from 'package:stats':
##
## anova
data = read.csv("FilmData.csv")
head(data)
## Rank Film Studio Genre
## 1 1 Avatar Fox Action/Adventure
## 2 2 Titanic Par. Drama
## 3 4 Harry Potter and the Deathly Hallows Part 2 WB Action/Adventure
## 4 8 Skyfall Sony Action/Adventure
## 5 9 The Dark Knight Rises WB Action/Adventure
## 6 13 Star Wars: Episode I - The Phantom Menace Fox Action/Adventure
## Year Gross Gross.Dom Pct.Dom Gross.Ovr Pct.Ovr Rotten IMDB Rating
## 1 2009 2782300000 760500000 0.273 2021800000 0.727 83 8.0 PG13
## 2 1997 2185400000 658700000 0.301 1526700000 0.699 88 7.6 PG13
## 3 2011 1341500000 381000000 0.284 960500000 0.716 96 8.1 PG13
## 4 2012 1108600000 304400000 0.275 804200000 0.725 92 7.8 PG13
## 5 2012 1084400000 448100000 0.413 636300000 0.587 87 8.6 PG13
## 6 1999 1027000000 474500000 0.462 552500000 0.538 57 6.5 PG
## Days Budget
## 1 238 237
## 2 219 200
## 3 133 125
## 4 122 200
## 5 147 250
## 6 261 115
dim(data)
## [1] 151 15
nrow(data)
## [1] 151
ncol(data)
## [1] 15
options("scipen"=100, "digits"=7)
jmv::descriptives(
data = data,
vars = c("Rank", "Film", "Studio", "Gross"),
splitBy = "Genre",
freq = TRUE,
hist = TRUE,
bar = TRUE,
box = TRUE)
##
## DESCRIPTIVES
##
## Descriptives
## --------------------------------------------------------------------
## Genre Rank Film Studio Gross
## --------------------------------------------------------------------
## N Action/Adventure 111 111 111 111
## Animation 14 14 14 14
## Comedy 17 17 17 17
## Drama 9 9 9 9
## Missing Action/Adventure 0 0 0 0
## Animation 0 0 0 0
## Comedy 0 0 0 0
## Drama 0 0 0 0
## Mean Action/Adventure 120 5.79e+8
## Animation 130 5.22e+8
## Comedy 151 4.49e+8
## Drama 129 6.59e+8
## Median Action/Adventure 124 4.74e+8
## Animation 108 5.06e+8
## Comedy 145 4.41e+8
## Drama 144 4.41e+8
## Minimum Action/Adventure 1 3.32e+8
## Animation 29 3.47e+8
## Comedy 74 3.42e+8
## Drama 2 3.34e+8
## Maximum Action/Adventure 245 2.78e+9
## Animation 230 8.87e+8
## Comedy 234 6.10e+8
## Drama 242 2.19e+9
## --------------------------------------------------------------------
##
##
## FREQUENCIES
##
## Frequencies of Film
## ----------------------------------------------------------------------------------------------------------------
## Film Action/Adventure Animation Comedy Drama
## ----------------------------------------------------------------------------------------------------------------
## 2012 1 0 0 0
## 300 1 0 0 0
## Alvin and the Chipmunks 0 1 0 0
## Angels & Demons 1 0 0 0
## Apollo 13 0 0 0 1
## Avatar 1 0 0 0
## Back to the Future 1 0 0 0
## Back to the Future Part II 1 0 0 0
## Batman 1 0 0 0
## Batman Begins 1 0 0 0
## Batman Forever 1 0 0 0
## Bruce Almighty 0 0 1 0
## Captain America: The First Avenger 1 0 0 0
## Casino Royale 1 0 0 0
## Cast Away 1 0 0 0
## Charlie and the Chocolate Factory 1 0 0 0
## Clash of the Titans (2010) 1 0 0 0
## Deep Impact 1 0 0 0
## Despicable Me 0 1 0 0
## Die Hard: With A Vengeance 1 0 0 0
## Dr. Seuss' The Lorax 0 1 0 0
## E.T.: The Extra-Terrestrial 1 0 0 0
## Fast and Furious 1 0 0 0
## Fast Five 1 0 0 0
## Forrest Gump 0 0 0 1
## G.I. Joe: Retaliation 1 0 0 0
## Ghost 0 0 0 1
## Godzilla 1 0 0 0
## Grease 0 0 1 0
## Hancock 1 0 0 0
## Happy Feet 0 1 0 0
## Harry Potter and the Chamber of Secrets 1 0 0 0
## Harry Potter and the Deathly Hallows Part 1 1 0 0 0
## Harry Potter and the Deathly Hallows Part 2 1 0 0 0
## Harry Potter and the Goblet of Fire 1 0 0 0
## Harry Potter and the Half-Blood Prince 1 0 0 0
## Harry Potter and the Order of the Phoenix 1 0 0 0
## Harry Potter and the Prisoner of Azkaban 1 0 0 0
## Harry Potter and the Sorcerer's Stone 1 0 0 0
## Hitch 0 0 1 0
## Home Alone 0 0 1 0
## Home Alone 2: Lost in New York 0 0 1 0
## Hotel Transylvania 0 1 0 0
## How the Grinch Stole Christmas 0 0 1 0
## I Am Legend 0 0 0 1
## I, Robot 1 0 0 0
## Ice Age 0 1 0 0
## Ice Age: Continental Drift 0 1 0 0
## Ice Age: Dawn of the Dinosaurs 0 1 0 0
## Ice Age: The Meltdown 0 1 0 0
## Inception 1 0 0 0
## Independence Day 1 0 0 0
## Indiana Jones and the Kingdom of the Crystal Skull 1 0 0 0
## Indiana Jones and the Last Crusade 1 0 0 0
## Indiana Jones and the Temple of Doom 1 0 0 0
## Iron Man 1 0 0 0
## Iron Man 2 1 0 0 0
## Jaws 1 0 0 0
## Journey 2: The Mysterious Island 1 0 0 0
## Jurassic Park 1 0 0 0
## Jurassic Park III 1 0 0 0
## King Kong 1 0 0 0
## Les Miserables (2012) 0 0 0 1
## Life of Pi 1 0 0 0
## Live Free or Die Hard 1 0 0 0
## Mamma Mia! 0 0 1 0
## Meet the Fockers 0 0 1 0
## Men in Black 0 0 1 0
## Men in Black II 1 0 0 0
## MIB 3 1 0 0 0
## Minority Report 1 0 0 0
## Mission: Impossible 1 0 0 0
## Mission: Impossible - Ghost Protocol 1 0 0 0
## Mission: Impossible II 1 0 0 0
## Mission: Impossible III 1 0 0 0
## Mr. & Mrs. Smith 1 0 0 0
## Mrs. Doubtfire 0 0 1 0
## Night at the Museum 1 0 0 0
## Night at the Museum: Battle of the Smithsonian 1 0 0 0
## Notting Hill 0 0 1 0
## Ocean's Eleven 1 0 0 0
## Ocean's Twelve 1 0 0 0
## Planet of the Apes (2001) 1 0 0 0
## Prometheus 1 0 0 0
## Quantum of Solace 1 0 0 0
## Raiders of the Lost Ark 1 0 0 0
## Return of the Jedi 1 0 0 0
## Rio 0 1 0 0
## Rise of the Planet of the Apes 1 0 0 0
## Robin Hood: Prince of Thieves 1 0 0 0
## Sherlock Holmes 1 0 0 0
## Sherlock Holmes: A Game of Shadows 1 0 0 0
## Skyfall 1 0 0 0
## Snow White and the Huntsman 1 0 0 0
## Speed 1 0 0 0
## Spider-Man 1 0 0 0
## Spider-Man 2 1 0 0 0
## Spider-Man 3 1 0 0 0
## Star Trek 1 0 0 0
## Star Wars 1 0 0 0
## Star Wars: Episode I - The Phantom Menace 1 0 0 0
## Star Wars: Episode II - Attack of the Clones 1 0 0 0
## Star Wars: Episode III - Revenge of the Sith 1 0 0 0
## Superman Returns 1 0 0 0
## Taken 2 1 0 0 0
## Ted 0 0 1 0
## Terminator 3: Rise of the Machines 1 0 0 0
## Terminator Salvation 1 0 0 0
## The Adventures of Tintin 0 1 0 0
## The Amazing Spider-Man 1 0 0 0
## The Bodyguard 0 0 0 1
## The Bourne Ultimatum 1 0 0 0
## The Chronicles of Narnia: The Voyage of the Dawn Treader 1 0 0 0
## The Croods 0 1 0 0
## The Curious Case of Benjamin Button 0 0 0 1
## The Da Vinci Code 1 0 0 0
## The Dark Knight 1 0 0 0
## The Dark Knight Rises 1 0 0 0
## The Day After Tomorrow 1 0 0 0
## The Empire Strikes Back 1 0 0 0
## The Exorcist 0 0 0 1
## The Flintstones 0 0 1 0
## The Fugitive 1 0 0 0
## The Hangover 0 0 1 0
## The Hangover Part II 0 0 1 0
## The Hobbit: An Unexpected Journey 1 0 0 0
## The Karate Kid 1 0 0 0
## The Last Samurai 1 0 0 0
## The Lost World: Jurassic Park 1 0 0 0
## The Matrix 1 0 0 0
## The Matrix Reloaded 1 0 0 0
## The Matrix Revolutions 1 0 0 0
## The Mummy 1 0 0 0
## The Mummy Returns 1 0 0 0
## The Mummy: Tomb of the Dragon Emperor 1 0 0 0
## The Simpsons Movie 0 1 0 0
## The Smurfs 0 1 0 0
## There's Something About Mary 0 0 1 0
## Thor 1 0 0 0
## Titanic 0 0 0 1
## Top Gun 1 0 0 0
## Troy 1 0 0 0
## True Lies 1 0 0 0
## Twister 1 0 0 0
## Wanted 1 0 0 0
## War of the Worlds 1 0 0 0
## What Women Want 0 0 1 0
## X-Men Origins: Wolverine 1 0 0 0
## X-Men: First Class 1 0 0 0
## X-Men: The Last Stand 1 0 0 0
## X2: X-Men United 1 0 0 0
## ----------------------------------------------------------------------------------------------------------------
##
##
## Frequencies of Studio
## --------------------------------------------------------------
## Studio Action/Adventure Animation Comedy Drama
## --------------------------------------------------------------
## Fox 29 8 4 0
## Par. 17 1 2 4
## Sony 15 2 2 0
## Uni. 16 2 7 2
## WB 34 1 2 3
## --------------------------------------------------------------
sessionInfo()
## R version 3.3.2 (2016-10-31)
## Platform: x86_64-w64-mingw32/x64 (64-bit)
## Running under: Windows 7 x64 (build 7601) Service Pack 1
##
## locale:
## [1] LC_COLLATE=English_United States.1252
## [2] LC_CTYPE=English_United States.1252
## [3] LC_MONETARY=English_United States.1252
## [4] LC_NUMERIC=C
## [5] LC_TIME=English_United States.1252
##
## attached base packages:
## [1] stats graphics grDevices utils datasets methods base
##
## other attached packages:
## [1] jmv_0.8
##
## loaded via a namespace (and not attached):
## [1] Rcpp_0.12.10 knitr_1.17 magrittr_1.5 munsell_0.4.3
## [5] colorspace_1.3-1 rjson_0.2.15 R6_2.2.0 rlang_0.1.1
## [9] stringr_1.1.0 plyr_1.8.4 tools_3.3.2 grid_3.3.2
## [13] jmvcore_0.8 gtable_0.2.0 htmltools_0.3.5 yaml_2.1.13
## [17] lazyeval_0.2.0 rprojroot_1.1 digest_0.6.10 tibble_1.3.4
## [21] ggplot2_2.2.1 ggridges_0.4.1 evaluate_0.10 rmarkdown_1.5
## [25] labeling_0.3 stringi_1.1.2 scales_0.4.1 backports_1.1.0