# Load libraries
library(knitr)
library(stringr)
library(ggplot2)
library(tidyr)
library(MASS)
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following object is masked from 'package:MASS':
## 
##     select
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union

Part 1 - Introduction:

I was speaking with a friend who commented that the reason she stopped investing in going to the cinema was in part because she didn’t think any “good movies” were being made. The highest grossing films she had read or been told about didn’t appeal to her and thus she formed the opinion such excursions weren’t worth the trouble. My friend, despite her misconceptions regarding movies with a high grossing income (high number of ticket sales, in very rudimentary terms), made the same mistake that I had in that she correlated high-gross with quality content. It would make sense, considering that the better a movie is, the more people would be willing to watch it, however that may not be the case. For example, with Computer Generated Imagery dominating the film industry, there exists the possibility that the quality of a movie may very well not have an impact on how many people are willing to view it. On the other hand, a movie’s box office success may have nothing to do with the plot but everything to do with the amount of exposure before the premier date. Movie rankings, on the other hand, delve more into the quality of the movie, in the sense that they determine worth based on the plot, characterization, acting etc.

In diving into researching the relationship between gross income and movie ranks, we may be able to make it easier for ourselves as viewers to determine if a movie is worth spending our time and money on. In addition, this may help the movie industry in cementing techniques to promote their work if, for example, they spent more of their budget on advertising than originally planned in order to reach a wider audience. As such, the primary questions that will be asked include whether the gross profit is predictive of the rank of a movie and if the profit has an effect on the rating.

Part 2 - Data:

Data was collected by CrowdFlower, a crowd-sourcing company that has an open data library (Data fore Everyone library found here: “https://www.crowdflower.com/data-for-everyone/”). The Blockbuster dataset was found and downloaded in csv format and includes data from the ten most popular movies of each each from 1975 to 2015. Categories within include: Movie titles, Poster URLs, Genre, and ratings (from MPAA, IMDB and Rotten Tomatoes). The raw data from the csv can be found here: “https://raw.githubusercontent.com/Galanopoulog/DATA606-Project-CSV/master/Blockbuster.csv

The Blockbuster dataset contains 398 rows, where each row is a movie and each movie is a case.

Considering that there is more than one question to be answered, the response variable are rank (categorical ordinal) and rating (numerical ordinal), and the explanatory variable is gross profit (numerical).

The nature of this study is observational, primarily because there is no control group (no group to compare the ranking against). The purpose of the study is to simply draw inferences and conclusions from the data without controlling, manipulating or acting upon it in any way.

Due to the nature of this study and the questions being asked, it would be very difficult to take the results and generalize them. The audience that may be interested in the conclusions are individuals interested in seeing if the gross profits reflect movie ranks or quality in any way in order to perhaps expediate their decision in regards to watch a movie. However, because this dataset only includes the top 10 ranked moves, this may not apply to movies that are placed low or even in the middle in the ranking system. Generalization can be made further difficult due to a lack of knowledge behind who is ranking the movies and the criteria for ranking.

As far as causality is concerned, there may be a chance for a link to be created, such as because many people saw a movie, critics were more likely to be swayed into believing it was of a high quality, however the probability of that is unlikely or at the least very low due to how the rating system is primarily based on the audiences’ opinion and any interference from the movie industry’s side will not have much sway.

# Read in csv file
moviedata = read.csv("https://raw.githubusercontent.com/Galanopoulog/DATA606-Project-CSV/master/Blockbuster.csv", sep = ",")
names(moviedata)
##  [1] "audience_freshness" "poster_url"         "rt_audience_score" 
##  [4] "rt_freshness"       "rt_score"           "X2015_inflation"   
##  [7] "adjusted"           "genres"             "Genre_1"           
## [10] "Genre_2"            "Genre_3"            "imdb_rating"       
## [13] "length"             "rank_in_year"       "rating"            
## [16] "release_date"       "studio"             "title"             
## [19] "worldwide_gross"    "year"
# Remove columns we won't use and rows with NA values
movies = na.omit(moviedata[, -c(1:4,6,8,9:11,13,15:16,19)])

# Rearrange and rename columns
movies = movies[, c(6,5,7,4,2,1,3)]
colnames(movies) = c("Title", "Studio", "Year", "Year_Rank", "Gross_Profit", "RotTom", "IMDB")

# Remove "$" from Gross Profit and change it from a character to numeric
movies$Gross_Profit = as.numeric(gsub("," , "",substr(movies$Gross_Profit, 2, 30)))


kable(head(movies))
Title Studio Year Year_Rank Gross_Profit RotTom IMDB
Captain America: The Winter Soldier Marvel Studios 2014 7 712903691 7.5 7.8
Dawn of the Planet of the Apes 20th Century Fox 2014 9 706988166 7.9 7.7
Guardians of the Galaxy Marvel Studios 2014 3 772158880 7.7 8.1
Interstellar Paramount Pictures / Warner Bros. 2014 10 671220455 7.0 8.7
Maleficent Walt Disney Pictures 2014 4 756677676 5.7 7.1
The Amazing Spider-Man 2 Columbia Pictures 2014 8 707732954 5.9 6.9

Part 3 - Exploratory data analysis:

In this section, we perform relevant descriptive statistics, including summary statistics and visualization of the data.

First, we take a glimpse of our data and its structure.

str(movies)
## 'data.frame':    398 obs. of  7 variables:
##  $ Title       : Factor w/ 397 levels "","\"Crocodile\" Dundee",..: 55 73 110 144 169 283 314 319 377 395 ...
##  $ Studio      : Factor w/ 111 levels "","20th Century-Fox",..: 45 4 45 68 94 19 106 43 62 4 ...
##  $ Year        : int  2014 2014 2014 2014 2014 2014 2014 2014 2014 2014 ...
##  $ Year_Rank   : int  7 9 3 10 4 8 2 5 1 6 ...
##  $ Gross_Profit: num  7.13e+08 7.07e+08 7.72e+08 6.71e+08 7.57e+08 ...
##  $ RotTom      : num  7.5 7.9 7.7 7 5.7 5.9 6.3 6.3 3.9 7.6 ...
##  $ IMDB        : num  7.8 7.7 8.1 8.7 7.1 6.9 7.5 6.8 5.8 8.1 ...

From there, we summarize the data and find the mean, median and Inter-Quantile range of each variable.

summary(movies)
##                    Title                      Studio         Year     
##  King Kong            :  2   Warner Bros.        : 45   Min.   :1975  
##  Signs                :  2   Paramount Pictures  : 30   1st Qu.:1985  
##  "Crocodile" Dundee   :  1   Universal Pictures  : 22   Median :1995  
##  "Crocodile" Dundee II:  1   20th Century Fox    : 20   Mean   :1995  
##  10                   :  1   Columbia Pictures   : 19   3rd Qu.:2005  
##  101 Dalmatians       :  1   Walt Disney Pictures: 14   Max.   :2014  
##  (Other)              :390   (Other)             :248                 
##    Year_Rank      Gross_Profit           RotTom           IMDB      
##  Min.   : 1.00   Min.   :1.100e+08   Min.   :0.000   Min.   :4.400  
##  1st Qu.: 3.00   1st Qu.:2.936e+08   1st Qu.:5.700   1st Qu.:6.500  
##  Median : 6.00   Median :4.880e+08   Median :6.600   Median :7.000  
##  Mean   : 5.53   Mean   :5.428e+08   Mean   :6.503   Mean   :7.053  
##  3rd Qu.: 8.00   3rd Qu.:6.986e+08   3rd Qu.:7.500   3rd Qu.:7.675  
##  Max.   :10.00   Max.   :3.026e+09   Max.   :9.100   Max.   :9.000  
## 

Here, we notice that the average gross profit is approximately $542,800,000 with an average Rotten Tomatoes rating of 6.503 and an average IMDB rating of 7.053. These three variables’ distributions will be shown below with histograms:

Ratings histograms

gathered = gather(movies, "Website", "Rating", 6:7)
summarized = gathered %>%  group_by(Website) %>%  summarize(rating.mean = mean(Rating))

  ggplot(gathered, aes(x = Rating, fill = Website)) + 
  geom_histogram(binwidth = .5, alpha = .5, position="identity") +
  geom_vline(data = summarized, aes(xintercept = summarized$rating.mean, colour = Website),
             linetype ="dashed", size=1)

The overlapping histograms show that out of the two websites, Rotten Tomatoes is more likely to grade movies lower (it has a lower mean than IMDB) and even give rating of 0. Rotten Tomatoes also has a wider spread, meaning that it has more variability with its rating. It appears as if IMDB is more likely to grade only within a certain range.

Gross Profit histogram

ggplot(movies, aes(x = Gross_Profit)) + 
  geom_histogram(aes(y = ..density..),
                   colour = "black", fill = "white") +
  geom_density(alpha = .2, fill = "#FF6666")+
  geom_vline(aes(xintercept = mean(Gross_Profit)),
             linetype = "dashed", size = 1, colour = "red")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

The Gross Profit histogram is right skewed, so it may be more useful to use the median as average Gross Profit, since in the histogram above, the mean does not appear to fully represent where most of the data lies.

Mean Ratings and Profits by Year

From here, we can move on to see what the mean ratings and mean gross profits are by year.

movstats = movies %>% group_by(Year) %>% 
  summarise(MeanGross = round(mean(Gross_Profit),2),
            MeanRott = round(mean(RotTom),2),
            MeanIMBD = round(mean(IMDB),2),
            Counts = n())
kable(head(movstats))
Year MeanGross MeanRott MeanIMBD Counts
1975 179796017 4.60 6.64 7
1976 275627492 5.32 6.80 10
1977 382176754 7.07 7.26 10
1978 323918184 6.83 7.00 10
1979 262983710 6.86 7.16 10
1980 254279292 6.37 6.83 10
ggplot(movstats, aes(x = Year, y = MeanGross))+ geom_line()

ggplot(movstats, aes(x = Year, y = MeanGross))+
  geom_line(aes(x = Year, y = MeanRott, colour = "MeanRott")) + 
  geom_line(aes(x = Year, y = MeanIMBD, colour = "MeanIMBD"))

Through these two graphs, we notice that, despite ups and downs throughout the years, overall, the gross profit steadily increases. On the other hand, despite ups and downs, the ratings are not linearly increasing or decreasing. This shows that the gross profit is increasing independently of the movie ratings.

Mean Ratings and Profits by Rank

Since it would be interesting to see, below the mean gross profits and mean ratings are taken after grouping the movies by rank.

movrank = movies %>% group_by(Year_Rank) %>% 
  summarise(MeanGross = round(mean(Gross_Profit),2),
            MeanRott = round(mean(RotTom),2),
            MeanIMBD = round(mean(IMDB),2),
            Counts = n())

ggplot(movrank, aes(x = Year_Rank, y = MeanGross)) + geom_line()

The plot above makes it very clear that the higher the ranking, the higher the gross profits are.

Finally, we can run a correlation matrix, simply to see what variables correlate with each other.

pairs(movies[,3:7])

This plot confirms that there appears to be a linear relationship between Year and Gross_Profit, in addition to the obviously linear relationship between the two ratings’ website.

Part 4 - Inference:

Regression 1

Does the gross profit predict the rank of a movie?

In order to determine if the gross profit is predictive of the rank of a movie, we must run a multiple regression. We must first determine if the all the assumptions are met (independence, normality and homoscedasticity) and then determine which, if any variables, have an impact on a movie’s rank.

Assumptions

Out of the three assumptions, independence is the one that we will have to truly assume. Since each case is a different movie and each ranking is given by the audience (especially in the case of Rotten Tomatoes), we can assume that each case is independent from any other.

#Mutliple Regression
# Normality
rankreg = lm(Year_Rank ~ Gross_Profit + RotTom + IMDB + Studio + Year, data = movies)
qqnorm(rankreg$residuals)
qqline(rankreg$residuals)

# Homoscedasticity
plot(rankreg$residuals)
abline(h = 0, lty = 3)

Judging by how most data points (especially those near and at the center) are close to the line, we can assume normality. In addition, the residuals plot shows even variance throughout and around the zero line, so the homoscedasticity assumption is also met. As such, we may proceed with the multiple regression.

The lengthy results below of the multiple regression include a lot of variables that do not significantly impact the Year_Rank variable. As such, we will use a backwards selection AIC method to remove the variables that do not contribute to the model.

## Results
summary(rankreg)
## 
## Call:
## lm(formula = Year_Rank ~ Gross_Profit + RotTom + IMDB + Studio + 
##     Year, data = movies)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.8526 -0.9997  0.0000  0.9255  9.0578 
## 
## Coefficients:
##                                                                              Estimate
## (Intercept)                                                                -2.512e+02
## Gross_Profit                                                               -6.690e-09
## RotTom                                                                     -1.273e-01
## IMDB                                                                       -2.925e-01
## Studio20th Century-Fox Film Corporation                                     6.009e+00
## Studio20th Century Fox                                                      3.313e+00
## Studio20th Century Fox / Blue Sky                                           4.812e+00
## Studio20th Century Fox / Cinergi Pictures                                  -9.871e-01
## Studio20th Century Fox / Golden Harvest                                     2.667e+00
## Studio20th Century Fox / Gracie Films                                       8.576e-01
## Studio20th Century Fox / Lucasfilm                                          2.681e+00
## Studio20th Century Fox / Silver Pictures                                    4.231e+00
## Studio20th Century Fox Film Corporation                                     4.149e+00
## StudioAmerican International Pictures                                      -3.917e-01
## StudioAssociated Film Distribution                                          8.018e+00
## StudioBuena Vista Pictures Distribution                                     6.354e+00
## StudioColumbia                                                              3.112e+00
## StudioColumbia / Imagine                                                    4.633e+00
## StudioColumbia / Marvel                                                     3.676e+00
## StudioColumbia / Sony Pictures                                              4.262e+00
## StudioColumbia Pictures                                                     3.174e+00
## StudioColumbia Pictures / Castle Rock Entertainment                         4.513e+00
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment  6.718e+00
## StudioColumbia Pictures / Rastar                                            6.435e+00
## StudioDisney                                                                2.707e+00
## StudioDisney / Pixar                                                        3.448e+00
## StudioDisney / Walden Media                                                 5.388e+00
## StudioDreamWorks                                                            2.908e+00
## StudioDreamWorks / 20th Century Fox                                         6.788e+00
## StudioDreamWorks / Fox                                                      5.922e+00
## StudioDreamWorks / Paramount                                                2.611e+00
## StudioDreamWorks / Universal                                                2.191e-01
## StudioDreamWorks Pictures                                                   6.628e+00
## StudioDreamWorks Pictures / Paramount Pictures                              1.973e+00
## StudioEmbassy Pictures                                                      6.883e+00
## StudioFox                                                                   4.882e+00
## StudioFox / Blue Sky                                                        1.740e+00
## StudioFox Searchlight Pictures                                              6.620e+00
## StudioGramercy Pictures / PolyGram                                          5.063e+00
## StudioHollywood Pictures                                                    2.006e+00
## StudioIcon / Newmarket                                                      3.042e+00
## StudioIFC Films                                                             5.379e+00
## StudioLionsgate                                                             4.430e+00
## StudioLionsgate / Summit                                                    3.063e+00
## StudioLionsgate Films                                                       1.604e+00
## StudioLucasfilm / 20th Century Fox                                          3.693e+00
## StudioMarvel Studios                                                        3.277e+00
## StudioMetro-Goldwyn-Mayer                                                   3.859e+00
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                           3.265e+00
## StudioMGM                                                                   2.712e+00
## StudioMGM / Columbia                                                        2.494e+00
## StudioMGM / Universal                                                       6.234e+00
## StudioMiramax Films / Universal Pictures                                    5.845e+00
## StudioNational Air and Space Museum                                         1.966e-01
## StudioNew Line                                                              4.555e+00
## StudioNew Line Cinema                                                       4.339e+00
## StudioOrion Pictures                                                        3.331e+00
## StudioOrion Pictures / Warner Bros.                                         1.687e+00
## StudioParamount                                                             1.419e+00
## StudioParamount / DreamWorks                                                2.893e+00
## StudioParamount / Lucasfilm                                                 3.935e-02
## StudioParamount / Marvel                                                    3.740e+00
## StudioParamount / Marvel Studios                                            5.148e+00
## StudioParamount Pictures                                                    2.746e+00
## StudioParamount Pictures / 20th Century Fox                                 6.568e+00
## StudioParamount Pictures / Lorimar                                          1.077e+00
## StudioParamount Pictures / Lucasfilm                                        1.852e+00
## StudioParamount Pictures / Orion Pictures                                   3.714e+00
## StudioParamount Pictures / PolyGram                                        -3.108e-01
## StudioParamount Pictures / Warner Bros.                                     6.721e+00
## StudioSummit                                                                1.618e+00
## StudioSummit Entertainment                                                  2.496e+00
## StudioSunn Classic Pictures                                                 2.637e+00
## StudioTouchstone                                                            3.093e+00
## StudioTouchstone Pictures                                                   2.287e+00
## StudioTouchstone Pictures / Amblin Entertainment                           -4.079e-01
## StudioTouchstone Pictures / Imagine Entertainment                           4.026e+00
## StudioTriStar Pictures                                                      4.134e+00
## StudioTriStar Pictures / Amblin Entertainment                               1.800e+00
## StudioTriStar Pictures / Carolco                                           -8.255e-01
## StudioTriStar Pictures / Carolco Pictures                                   3.185e+00
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment        2.363e+00
## StudioUnited Artists                                                        3.324e+00
## StudioUnited Artists Pictures                                               2.934e+00
## StudioUnited Film Distribution Company                                      6.349e+00
## StudioUniversal                                                             2.899e+00
## StudioUniversal / DreamWorks                                                3.749e+00
## StudioUniversal / Illumination                                              3.454e+00
## StudioUniversal Pictures                                                    4.150e+00
## StudioUniversal Pictures / Amblin Entertainment                             2.970e+00
## StudioUniversal Pictures / Imagine Entertainment                            1.187e+00
## StudioUniversal Pictures / ITC                                              3.861e-01
## StudioUniversal Pictures / RKO Pictures                                     5.421e+00
## StudioUniversal Studios                                                     5.441e+00
## StudioUniversal Studios / Cinema International Corporation                  7.656e+00
## StudioWalt Disney Pictures                                                  2.845e+00
## StudioWalt Disney Pictures / Pixar                                          2.687e+00
## StudioWalt Disney Productions                                               5.560e+00
## StudioWarner Bros                                                           3.676e+00
## StudioWarner Bros / Legendary                                               5.389e+00
## StudioWarner Bros.                                                          3.603e+00
## StudioWarner Bros. / Columbia                                               3.661e+00
## StudioWarner Bros. / Geffen Pictures                                        5.990e+00
## StudioWarner Bros. / Ladd                                                   4.204e+00
## StudioWarner Bros. / Legendary                                              4.192e+00
## StudioWarner Bros. / MGM / New Line                                         3.232e+00
## StudioWarner Bros. / New Line / MGM                                         2.642e+00
## StudioWarner Bros. / New Line Cinema / MGM                                  1.632e-01
## StudioWarner Bros. / PolyGram                                               2.973e+00
## StudioWarner Bros. / The Ladd Company                                       2.440e+00
## StudioWarner Bros. / Universal Pictures                                     6.949e-01
## StudioWarner Bros. / Village Roadshow                                       4.576e+00
## StudioWarner Bros. Pictures                                                 3.615e+00
## Year                                                                        1.303e-01
##                                                                            Std. Error
## (Intercept)                                                                 3.752e+01
## Gross_Profit                                                                4.813e-10
## RotTom                                                                      1.452e-01
## IMDB                                                                        2.611e-01
## Studio20th Century-Fox Film Corporation                                     2.903e+00
## Studio20th Century Fox                                                      2.116e+00
## Studio20th Century Fox / Blue Sky                                           2.936e+00
## Studio20th Century Fox / Cinergi Pictures                                   2.936e+00
## Studio20th Century Fox / Golden Harvest                                     2.915e+00
## Studio20th Century Fox / Gracie Films                                       2.909e+00
## Studio20th Century Fox / Lucasfilm                                          2.401e+00
## Studio20th Century Fox / Silver Pictures                                    2.530e+00
## Studio20th Century Fox Film Corporation                                     2.526e+00
## StudioAmerican International Pictures                                       2.913e+00
## StudioAssociated Film Distribution                                          2.908e+00
## StudioBuena Vista Pictures Distribution                                     2.905e+00
## StudioColumbia                                                              2.197e+00
## StudioColumbia / Imagine                                                    2.953e+00
## StudioColumbia / Marvel                                                     2.926e+00
## StudioColumbia / Sony Pictures                                              2.956e+00
## StudioColumbia Pictures                                                     2.113e+00
## StudioColumbia Pictures / Castle Rock Entertainment                         2.917e+00
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment  2.907e+00
## StudioColumbia Pictures / Rastar                                            2.912e+00
## StudioDisney                                                                2.238e+00
## StudioDisney / Pixar                                                        2.244e+00
## StudioDisney / Walden Media                                                 2.942e+00
## StudioDreamWorks                                                            2.326e+00
## StudioDreamWorks / 20th Century Fox                                         2.932e+00
## StudioDreamWorks / Fox                                                      2.927e+00
## StudioDreamWorks / Paramount                                                2.554e+00
## StudioDreamWorks / Universal                                                2.952e+00
## StudioDreamWorks Pictures                                                   2.938e+00
## StudioDreamWorks Pictures / Paramount Pictures                              2.533e+00
## StudioEmbassy Pictures                                                      2.904e+00
## StudioFox                                                                   2.215e+00
## StudioFox / Blue Sky                                                        2.423e+00
## StudioFox Searchlight Pictures                                              2.918e+00
## StudioGramercy Pictures / PolyGram                                          2.912e+00
## StudioHollywood Pictures                                                    2.541e+00
## StudioIcon / Newmarket                                                      2.934e+00
## StudioIFC Films                                                             2.924e+00
## StudioLionsgate                                                             2.573e+00
## StudioLionsgate / Summit                                                    2.951e+00
## StudioLionsgate Films                                                       2.955e+00
## StudioLucasfilm / 20th Century Fox                                          2.554e+00
## StudioMarvel Studios                                                        2.318e+00
## StudioMetro-Goldwyn-Mayer                                                   2.377e+00
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                           2.911e+00
## StudioMGM                                                                   2.924e+00
## StudioMGM / Columbia                                                        2.418e+00
## StudioMGM / Universal                                                       2.933e+00
## StudioMiramax Films / Universal Pictures                                    2.922e+00
## StudioNational Air and Space Museum                                         3.093e+00
## StudioNew Line                                                              2.958e+00
## StudioNew Line Cinema                                                       2.224e+00
## StudioOrion Pictures                                                        2.261e+00
## StudioOrion Pictures / Warner Bros.                                         2.901e+00
## StudioParamount                                                             2.220e+00
## StudioParamount / DreamWorks                                                2.230e+00
## StudioParamount / Lucasfilm                                                 2.938e+00
## StudioParamount / Marvel                                                    2.946e+00
## StudioParamount / Marvel Studios                                            2.949e+00
## StudioParamount Pictures                                                    2.091e+00
## StudioParamount Pictures / 20th Century Fox                                 2.562e+00
## StudioParamount Pictures / Lorimar                                          2.901e+00
## StudioParamount Pictures / Lucasfilm                                        2.386e+00
## StudioParamount Pictures / Orion Pictures                                   2.915e+00
## StudioParamount Pictures / PolyGram                                         2.909e+00
## StudioParamount Pictures / Warner Bros.                                     3.002e+00
## StudioSummit                                                                2.589e+00
## StudioSummit Entertainment                                                  2.958e+00
## StudioSunn Classic Pictures                                                 2.979e+00
## StudioTouchstone                                                            2.264e+00
## StudioTouchstone Pictures                                                   2.227e+00
## StudioTouchstone Pictures / Amblin Entertainment                            2.911e+00
## StudioTouchstone Pictures / Imagine Entertainment                           2.913e+00
## StudioTriStar Pictures                                                      2.193e+00
## StudioTriStar Pictures / Amblin Entertainment                               2.928e+00
## StudioTriStar Pictures / Carolco                                            2.922e+00
## StudioTriStar Pictures / Carolco Pictures                                   2.378e+00
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment        2.926e+00
## StudioUnited Artists                                                        2.135e+00
## StudioUnited Artists Pictures                                               2.299e+00
## StudioUnited Film Distribution Company                                      2.910e+00
## StudioUniversal                                                             2.218e+00
## StudioUniversal / DreamWorks                                                2.540e+00
## StudioUniversal / Illumination                                              2.576e+00
## StudioUniversal Pictures                                                    2.106e+00
## StudioUniversal Pictures / Amblin Entertainment                             2.307e+00
## StudioUniversal Pictures / Imagine Entertainment                            2.915e+00
## StudioUniversal Pictures / ITC                                              2.908e+00
## StudioUniversal Pictures / RKO Pictures                                     2.905e+00
## StudioUniversal Studios                                                     2.251e+00
## StudioUniversal Studios / Cinema International Corporation                  2.905e+00
## StudioWalt Disney Pictures                                                  2.148e+00
## StudioWalt Disney Pictures / Pixar                                          2.256e+00
## StudioWalt Disney Productions                                               2.902e+00
## StudioWarner Bros                                                           2.544e+00
## StudioWarner Bros / Legendary                                               2.956e+00
## StudioWarner Bros.                                                          2.092e+00
## StudioWarner Bros. / Columbia                                               2.925e+00
## StudioWarner Bros. / Geffen Pictures                                        2.537e+00
## StudioWarner Bros. / Ladd                                                   2.904e+00
## StudioWarner Bros. / Legendary                                              2.293e+00
## StudioWarner Bros. / MGM / New Line                                         2.967e+00
## StudioWarner Bros. / New Line / MGM                                         2.967e+00
## StudioWarner Bros. / New Line Cinema / MGM                                  2.963e+00
## StudioWarner Bros. / PolyGram                                               2.378e+00
## StudioWarner Bros. / The Ladd Company                                       2.921e+00
## StudioWarner Bros. / Universal Pictures                                     2.913e+00
## StudioWarner Bros. / Village Roadshow                                       2.939e+00
## StudioWarner Bros. Pictures                                                 2.248e+00
## Year                                                                        1.889e-02
##                                                                            t value
## (Intercept)                                                                 -6.694
## Gross_Profit                                                               -13.901
## RotTom                                                                      -0.877
## IMDB                                                                        -1.120
## Studio20th Century-Fox Film Corporation                                      2.070
## Studio20th Century Fox                                                       1.566
## Studio20th Century Fox / Blue Sky                                            1.639
## Studio20th Century Fox / Cinergi Pictures                                   -0.336
## Studio20th Century Fox / Golden Harvest                                      0.915
## Studio20th Century Fox / Gracie Films                                        0.295
## Studio20th Century Fox / Lucasfilm                                           1.117
## Studio20th Century Fox / Silver Pictures                                     1.673
## Studio20th Century Fox Film Corporation                                      1.642
## StudioAmerican International Pictures                                       -0.134
## StudioAssociated Film Distribution                                           2.757
## StudioBuena Vista Pictures Distribution                                      2.187
## StudioColumbia                                                               1.416
## StudioColumbia / Imagine                                                     1.569
## StudioColumbia / Marvel                                                      1.256
## StudioColumbia / Sony Pictures                                               1.442
## StudioColumbia Pictures                                                      1.503
## StudioColumbia Pictures / Castle Rock Entertainment                          1.547
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment   2.311
## StudioColumbia Pictures / Rastar                                             2.210
## StudioDisney                                                                 1.210
## StudioDisney / Pixar                                                         1.537
## StudioDisney / Walden Media                                                  1.831
## StudioDreamWorks                                                             1.250
## StudioDreamWorks / 20th Century Fox                                          2.315
## StudioDreamWorks / Fox                                                       2.023
## StudioDreamWorks / Paramount                                                 1.022
## StudioDreamWorks / Universal                                                 0.074
## StudioDreamWorks Pictures                                                    2.256
## StudioDreamWorks Pictures / Paramount Pictures                               0.779
## StudioEmbassy Pictures                                                       2.370
## StudioFox                                                                    2.204
## StudioFox / Blue Sky                                                         0.718
## StudioFox Searchlight Pictures                                               2.268
## StudioGramercy Pictures / PolyGram                                           1.739
## StudioHollywood Pictures                                                     0.789
## StudioIcon / Newmarket                                                       1.037
## StudioIFC Films                                                              1.839
## StudioLionsgate                                                              1.722
## StudioLionsgate / Summit                                                     1.038
## StudioLionsgate Films                                                        0.543
## StudioLucasfilm / 20th Century Fox                                           1.446
## StudioMarvel Studios                                                         1.413
## StudioMetro-Goldwyn-Mayer                                                    1.624
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                            1.122
## StudioMGM                                                                    0.928
## StudioMGM / Columbia                                                         1.032
## StudioMGM / Universal                                                        2.125
## StudioMiramax Films / Universal Pictures                                     2.001
## StudioNational Air and Space Museum                                          0.064
## StudioNew Line                                                               1.540
## StudioNew Line Cinema                                                        1.951
## StudioOrion Pictures                                                         1.473
## StudioOrion Pictures / Warner Bros.                                          0.582
## StudioParamount                                                              0.639
## StudioParamount / DreamWorks                                                 1.297
## StudioParamount / Lucasfilm                                                  0.013
## StudioParamount / Marvel                                                     1.269
## StudioParamount / Marvel Studios                                             1.746
## StudioParamount Pictures                                                     1.313
## StudioParamount Pictures / 20th Century Fox                                  2.564
## StudioParamount Pictures / Lorimar                                           0.371
## StudioParamount Pictures / Lucasfilm                                         0.777
## StudioParamount Pictures / Orion Pictures                                    1.274
## StudioParamount Pictures / PolyGram                                         -0.107
## StudioParamount Pictures / Warner Bros.                                      2.239
## StudioSummit                                                                 0.625
## StudioSummit Entertainment                                                   0.844
## StudioSunn Classic Pictures                                                  0.885
## StudioTouchstone                                                             1.366
## StudioTouchstone Pictures                                                    1.027
## StudioTouchstone Pictures / Amblin Entertainment                            -0.140
## StudioTouchstone Pictures / Imagine Entertainment                            1.382
## StudioTriStar Pictures                                                       1.886
## StudioTriStar Pictures / Amblin Entertainment                                0.615
## StudioTriStar Pictures / Carolco                                            -0.282
## StudioTriStar Pictures / Carolco Pictures                                    1.339
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment         0.807
## StudioUnited Artists                                                         1.557
## StudioUnited Artists Pictures                                                1.276
## StudioUnited Film Distribution Company                                       2.182
## StudioUniversal                                                              1.307
## StudioUniversal / DreamWorks                                                 1.476
## StudioUniversal / Illumination                                               1.341
## StudioUniversal Pictures                                                     1.970
## StudioUniversal Pictures / Amblin Entertainment                              1.287
## StudioUniversal Pictures / Imagine Entertainment                             0.407
## StudioUniversal Pictures / ITC                                               0.133
## StudioUniversal Pictures / RKO Pictures                                      1.866
## StudioUniversal Studios                                                      2.417
## StudioUniversal Studios / Cinema International Corporation                   2.635
## StudioWalt Disney Pictures                                                   1.325
## StudioWalt Disney Pictures / Pixar                                           1.191
## StudioWalt Disney Productions                                                1.916
## StudioWarner Bros                                                            1.445
## StudioWarner Bros / Legendary                                                1.823
## StudioWarner Bros.                                                           1.722
## StudioWarner Bros. / Columbia                                                1.251
## StudioWarner Bros. / Geffen Pictures                                         2.361
## StudioWarner Bros. / Ladd                                                    1.448
## StudioWarner Bros. / Legendary                                               1.828
## StudioWarner Bros. / MGM / New Line                                          1.090
## StudioWarner Bros. / New Line / MGM                                          0.890
## StudioWarner Bros. / New Line Cinema / MGM                                   0.055
## StudioWarner Bros. / PolyGram                                                1.250
## StudioWarner Bros. / The Ladd Company                                        0.835
## StudioWarner Bros. / Universal Pictures                                      0.239
## StudioWarner Bros. / Village Roadshow                                        1.557
## StudioWarner Bros. Pictures                                                  1.608
## Year                                                                         6.897
##                                                                            Pr(>|t|)
## (Intercept)                                                                1.16e-10
## Gross_Profit                                                                < 2e-16
## RotTom                                                                      0.38142
## IMDB                                                                        0.26362
## Studio20th Century-Fox Film Corporation                                     0.03939
## Studio20th Century Fox                                                      0.11854
## Studio20th Century Fox / Blue Sky                                           0.10232
## Studio20th Century Fox / Cinergi Pictures                                   0.73693
## Studio20th Century Fox / Golden Harvest                                     0.36101
## Studio20th Century Fox / Gracie Films                                       0.76833
## Studio20th Century Fox / Lucasfilm                                          0.26504
## Studio20th Century Fox / Silver Pictures                                    0.09552
## Studio20th Century Fox Film Corporation                                     0.10166
## StudioAmerican International Pictures                                       0.89313
## StudioAssociated Film Distribution                                          0.00620
## StudioBuena Vista Pictures Distribution                                     0.02953
## StudioColumbia                                                              0.15781
## StudioColumbia / Imagine                                                    0.11780
## StudioColumbia / Marvel                                                     0.21000
## StudioColumbia / Sony Pictures                                              0.15038
## StudioColumbia Pictures                                                     0.13406
## StudioColumbia Pictures / Castle Rock Entertainment                         0.12296
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment  0.02157
## StudioColumbia Pictures / Rastar                                            0.02790
## StudioDisney                                                                0.22735
## StudioDisney / Pixar                                                        0.12547
## StudioDisney / Walden Media                                                 0.06811
## StudioDreamWorks                                                            0.21233
## StudioDreamWorks / 20th Century Fox                                         0.02132
## StudioDreamWorks / Fox                                                      0.04397
## StudioDreamWorks / Paramount                                                0.30746
## StudioDreamWorks / Universal                                                0.94088
## StudioDreamWorks Pictures                                                   0.02484
## StudioDreamWorks Pictures / Paramount Pictures                              0.43654
## StudioEmbassy Pictures                                                      0.01846
## StudioFox                                                                   0.02830
## StudioFox / Blue Sky                                                        0.47338
## StudioFox Searchlight Pictures                                              0.02405
## StudioGramercy Pictures / PolyGram                                          0.08319
## StudioHollywood Pictures                                                    0.43053
## StudioIcon / Newmarket                                                      0.30079
## StudioIFC Films                                                             0.06689
## StudioLionsgate                                                             0.08620
## StudioLionsgate / Summit                                                    0.30008
## StudioLionsgate Films                                                       0.58776
## StudioLucasfilm / 20th Century Fox                                          0.14920
## StudioMarvel Studios                                                        0.15861
## StudioMetro-Goldwyn-Mayer                                                   0.10550
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                           0.26291
## StudioMGM                                                                   0.35443
## StudioMGM / Columbia                                                        0.30317
## StudioMGM / Universal                                                       0.03444
## StudioMiramax Films / Universal Pictures                                    0.04637
## StudioNational Air and Space Museum                                         0.94937
## StudioNew Line                                                              0.12465
## StudioNew Line Cinema                                                       0.05200
## StudioOrion Pictures                                                        0.14189
## StudioOrion Pictures / Warner Bros.                                         0.56129
## StudioParamount                                                             0.52332
## StudioParamount / DreamWorks                                                0.19556
## StudioParamount / Lucasfilm                                                 0.98932
## StudioParamount / Marvel                                                    0.20541
## StudioParamount / Marvel Studios                                            0.08196
## StudioParamount Pictures                                                    0.19024
## StudioParamount Pictures / 20th Century Fox                                 0.01086
## StudioParamount Pictures / Lorimar                                          0.71064
## StudioParamount Pictures / Lucasfilm                                        0.43810
## StudioParamount Pictures / Orion Pictures                                   0.20367
## StudioParamount Pictures / PolyGram                                         0.91499
## StudioParamount Pictures / Warner Bros.                                     0.02595
## StudioSummit                                                                0.53247
## StudioSummit Entertainment                                                  0.39950
## StudioSunn Classic Pictures                                                 0.37679
## StudioTouchstone                                                            0.17287
## StudioTouchstone Pictures                                                   0.30541
## StudioTouchstone Pictures / Amblin Entertainment                            0.88866
## StudioTouchstone Pictures / Imagine Entertainment                           0.16797
## StudioTriStar Pictures                                                      0.06037
## StudioTriStar Pictures / Amblin Entertainment                               0.53918
## StudioTriStar Pictures / Carolco                                            0.77779
## StudioTriStar Pictures / Carolco Pictures                                   0.18150
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment        0.42010
## StudioUnited Artists                                                        0.12056
## StudioUnited Artists Pictures                                               0.20299
## StudioUnited Film Distribution Company                                      0.02996
## StudioUniversal                                                             0.19224
## StudioUniversal / DreamWorks                                                0.14113
## StudioUniversal / Illumination                                              0.18103
## StudioUniversal Pictures                                                    0.04979
## StudioUniversal Pictures / Amblin Entertainment                             0.19910
## StudioUniversal Pictures / Imagine Entertainment                            0.68404
## StudioUniversal Pictures / ITC                                              0.89446
## StudioUniversal Pictures / RKO Pictures                                     0.06306
## StudioUniversal Studios                                                     0.01630
## StudioUniversal Studios / Cinema International Corporation                  0.00887
## StudioWalt Disney Pictures                                                  0.18627
## StudioWalt Disney Pictures / Pixar                                          0.23458
## StudioWalt Disney Productions                                               0.05637
## StudioWarner Bros                                                           0.14956
## StudioWarner Bros / Legendary                                               0.06937
## StudioWarner Bros.                                                          0.08609
## StudioWarner Bros. / Columbia                                               0.21183
## StudioWarner Bros. / Geffen Pictures                                        0.01893
## StudioWarner Bros. / Ladd                                                   0.14872
## StudioWarner Bros. / Legendary                                              0.06864
## StudioWarner Bros. / MGM / New Line                                         0.27682
## StudioWarner Bros. / New Line / MGM                                         0.37395
## StudioWarner Bros. / New Line Cinema / MGM                                  0.95611
## StudioWarner Bros. / PolyGram                                               0.21220
## StudioWarner Bros. / The Ladd Company                                       0.40418
## StudioWarner Bros. / Universal Pictures                                     0.81165
## StudioWarner Bros. / Village Roadshow                                       0.12061
## StudioWarner Bros. Pictures                                                 0.10892
## Year                                                                       3.45e-11
##                                                                               
## (Intercept)                                                                ***
## Gross_Profit                                                               ***
## RotTom                                                                        
## IMDB                                                                          
## Studio20th Century-Fox Film Corporation                                    *  
## Studio20th Century Fox                                                        
## Studio20th Century Fox / Blue Sky                                             
## Studio20th Century Fox / Cinergi Pictures                                     
## Studio20th Century Fox / Golden Harvest                                       
## Studio20th Century Fox / Gracie Films                                         
## Studio20th Century Fox / Lucasfilm                                            
## Studio20th Century Fox / Silver Pictures                                   .  
## Studio20th Century Fox Film Corporation                                       
## StudioAmerican International Pictures                                         
## StudioAssociated Film Distribution                                         ** 
## StudioBuena Vista Pictures Distribution                                    *  
## StudioColumbia                                                                
## StudioColumbia / Imagine                                                      
## StudioColumbia / Marvel                                                       
## StudioColumbia / Sony Pictures                                                
## StudioColumbia Pictures                                                       
## StudioColumbia Pictures / Castle Rock Entertainment                           
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment *  
## StudioColumbia Pictures / Rastar                                           *  
## StudioDisney                                                                  
## StudioDisney / Pixar                                                          
## StudioDisney / Walden Media                                                .  
## StudioDreamWorks                                                              
## StudioDreamWorks / 20th Century Fox                                        *  
## StudioDreamWorks / Fox                                                     *  
## StudioDreamWorks / Paramount                                                  
## StudioDreamWorks / Universal                                                  
## StudioDreamWorks Pictures                                                  *  
## StudioDreamWorks Pictures / Paramount Pictures                                
## StudioEmbassy Pictures                                                     *  
## StudioFox                                                                  *  
## StudioFox / Blue Sky                                                          
## StudioFox Searchlight Pictures                                             *  
## StudioGramercy Pictures / PolyGram                                         .  
## StudioHollywood Pictures                                                      
## StudioIcon / Newmarket                                                        
## StudioIFC Films                                                            .  
## StudioLionsgate                                                            .  
## StudioLionsgate / Summit                                                      
## StudioLionsgate Films                                                         
## StudioLucasfilm / 20th Century Fox                                            
## StudioMarvel Studios                                                          
## StudioMetro-Goldwyn-Mayer                                                     
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                             
## StudioMGM                                                                     
## StudioMGM / Columbia                                                          
## StudioMGM / Universal                                                      *  
## StudioMiramax Films / Universal Pictures                                   *  
## StudioNational Air and Space Museum                                           
## StudioNew Line                                                                
## StudioNew Line Cinema                                                      .  
## StudioOrion Pictures                                                          
## StudioOrion Pictures / Warner Bros.                                           
## StudioParamount                                                               
## StudioParamount / DreamWorks                                                  
## StudioParamount / Lucasfilm                                                   
## StudioParamount / Marvel                                                      
## StudioParamount / Marvel Studios                                           .  
## StudioParamount Pictures                                                      
## StudioParamount Pictures / 20th Century Fox                                *  
## StudioParamount Pictures / Lorimar                                            
## StudioParamount Pictures / Lucasfilm                                          
## StudioParamount Pictures / Orion Pictures                                     
## StudioParamount Pictures / PolyGram                                           
## StudioParamount Pictures / Warner Bros.                                    *  
## StudioSummit                                                                  
## StudioSummit Entertainment                                                    
## StudioSunn Classic Pictures                                                   
## StudioTouchstone                                                              
## StudioTouchstone Pictures                                                     
## StudioTouchstone Pictures / Amblin Entertainment                              
## StudioTouchstone Pictures / Imagine Entertainment                             
## StudioTriStar Pictures                                                     .  
## StudioTriStar Pictures / Amblin Entertainment                                 
## StudioTriStar Pictures / Carolco                                              
## StudioTriStar Pictures / Carolco Pictures                                     
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment          
## StudioUnited Artists                                                          
## StudioUnited Artists Pictures                                                 
## StudioUnited Film Distribution Company                                     *  
## StudioUniversal                                                               
## StudioUniversal / DreamWorks                                                  
## StudioUniversal / Illumination                                                
## StudioUniversal Pictures                                                   *  
## StudioUniversal Pictures / Amblin Entertainment                               
## StudioUniversal Pictures / Imagine Entertainment                              
## StudioUniversal Pictures / ITC                                                
## StudioUniversal Pictures / RKO Pictures                                    .  
## StudioUniversal Studios                                                    *  
## StudioUniversal Studios / Cinema International Corporation                 ** 
## StudioWalt Disney Pictures                                                    
## StudioWalt Disney Pictures / Pixar                                            
## StudioWalt Disney Productions                                              .  
## StudioWarner Bros                                                             
## StudioWarner Bros / Legendary                                              .  
## StudioWarner Bros.                                                         .  
## StudioWarner Bros. / Columbia                                                 
## StudioWarner Bros. / Geffen Pictures                                       *  
## StudioWarner Bros. / Ladd                                                     
## StudioWarner Bros. / Legendary                                             .  
## StudioWarner Bros. / MGM / New Line                                           
## StudioWarner Bros. / New Line / MGM                                           
## StudioWarner Bros. / New Line Cinema / MGM                                    
## StudioWarner Bros. / PolyGram                                                 
## StudioWarner Bros. / The Ladd Company                                         
## StudioWarner Bros. / Universal Pictures                                       
## StudioWarner Bros. / Village Roadshow                                         
## StudioWarner Bros. Pictures                                                   
## Year                                                                       ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 2.051 on 284 degrees of freedom
## Multiple R-squared:  0.634,  Adjusted R-squared:  0.4884 
## F-statistic: 4.354 on 113 and 284 DF,  p-value: < 2.2e-16

After retaining only significant variables and re-running the regression, we note that only Gross Profit and the IMDB scores explain the yearly rank of movies. However, unlike the previous model that had a higher R-squared value, this model only explains approximately 30% of the variability, which is a rather low percentage. Considering the previous model had an adjusted-r-squared value of approximately 49%, this could mean that there are variables outside the dataset that better explain yearly rank.

# Pick significant variables using a backward stepwise selection process
stepAIC(rankreg, direction = "backward")
## Start:  AIC=665.33
## Year_Rank ~ Gross_Profit + RotTom + IMDB + Studio + Year
## 
##                 Df Sum of Sq    RSS    AIC
## - Studio       109    568.53 1762.8 602.30
## - RotTom         1      3.23 1197.5 664.41
## - IMDB           1      5.28 1199.5 665.09
## <none>                       1194.3 665.33
## - Year           1    200.02 1394.3 724.97
## - Gross_Profit   1    812.62 2006.9 869.92
## 
## Step:  AIC=602.3
## Year_Rank ~ Gross_Profit + RotTom + IMDB + Year
## 
##                Df Sum of Sq    RSS    AIC
## - RotTom        1      0.00 1762.8 600.30
## - IMDB          1      8.32 1771.1 602.18
## <none>                      1762.8 602.30
## - Year          1    529.48 2292.3 704.84
## - Gross_Profit  1   1265.80 3028.6 815.70
## 
## Step:  AIC=600.3
## Year_Rank ~ Gross_Profit + IMDB + Year
## 
##                Df Sum of Sq    RSS    AIC
## <none>                      1762.8 600.30
## - IMDB          1     19.99 1782.8 602.79
## - Year          1    529.52 2292.3 702.84
## - Gross_Profit  1   1267.51 3030.3 813.93
## 
## Call:
## lm(formula = Year_Rank ~ Gross_Profit + IMDB + Year, data = movies)
## 
## Coefficients:
##  (Intercept)  Gross_Profit          IMDB          Year  
##   -2.506e+02    -7.078e-09    -2.813e-01     1.313e-01
# redo the regression with said variables and view results and Remove the Year variable due to obvious reasons
rankreg = lm(Year_Rank ~ Gross_Profit + IMDB, data = movies)
summary(rankreg)
## 
## Call:
## lm(formula = Year_Rank ~ Gross_Profit + IMDB, data = movies)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.9137 -1.7310 -0.1662  1.7942  6.1771 
## 
## Coefficients:
##                Estimate Std. Error t value Pr(>|t|)    
## (Intercept)   1.103e+01  1.032e+00  10.689  < 2e-16 ***
## Gross_Profit -4.156e-09  3.685e-10 -11.278  < 2e-16 ***
## IMDB         -4.604e-01  1.504e-01  -3.062  0.00235 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 2.409 on 395 degrees of freedom
## Multiple R-squared:  0.2975, Adjusted R-squared:  0.294 
## F-statistic: 83.64 on 2 and 395 DF,  p-value: < 2.2e-16

According to the output above, for every one unit increase in gross profit, the year rank is estimated to decrease by 0.000000004196, when all other variables are held constant. Similarly, for every one unit increase in IMDB, the year rank is estimated to decrease by 0.04604, when all other variables are held constant.

Regression 2.1 and 2.2

Does the profit have an effect on the rating (Rotten Tomatoes or IMDB)?

Assumptions

Once again, the assumption of independence will be assumed based on the nature of the data and the method in which the ratings were created.

#Simple Regression

# Rotten Tomatoes
# Normality
GrossTom = glm(RotTom ~ Gross_Profit, data = movies)
qqnorm(GrossTom$residuals)
qqline(GrossTom$residuals)

# Homoscedasticity
plot(GrossTom$residuals)
abline(h = 0, lty = 3)

Judging by how most data points are close to the line, we can assume normality, and based on the residuals plot, there is even variance throughout and around the zero line, so the homoscedasticity assumption is also met. This appears to be true for the IMDB data below.

# IMDB
# Normality
GrossIMDB = lm(IMDB ~ Gross_Profit, data = movies)
qqnorm(GrossIMDB$residuals)
qqline(GrossIMDB$residuals)

# Homoscedasticity
plot(GrossIMDB$residuals)
abline(h = 0, lty = 3)

Since both IMDB and Rotten Tomatoes regressions have had their assumptions, met, we may proceed with analyzing the regression results.

## Results
summary(GrossTom)
## 
## Call:
## glm(formula = RotTom ~ Gross_Profit, data = movies)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -6.6636  -0.8420   0.1239   1.0156   2.7935  
## 
## Coefficients:
##               Estimate Std. Error t value Pr(>|t|)    
## (Intercept)  6.076e+00  1.348e-01  45.088  < 2e-16 ***
## Gross_Profit 7.856e-10  2.104e-10   3.735 0.000215 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for gaussian family taken to be 2.0392)
## 
##     Null deviance: 835.97  on 397  degrees of freedom
## Residual deviance: 807.52  on 396  degrees of freedom
## AIC: 1417.1
## 
## Number of Fisher Scoring iterations: 2
summary(GrossIMDB)
## 
## Call:
## lm(formula = IMDB ~ Gross_Profit, data = movies)
## 
## Residuals:
##      Min       1Q   Median       3Q      Max 
## -2.61058 -0.51699 -0.02443  0.61305  1.85847 
## 
## Coefficients:
##               Estimate Std. Error t value Pr(>|t|)    
## (Intercept)  6.695e+00  7.597e-02  88.133  < 2e-16 ***
## Gross_Profit 6.598e-10  1.186e-10   5.565 4.85e-08 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 0.805 on 396 degrees of freedom
## Multiple R-squared:  0.07252,    Adjusted R-squared:  0.07018 
## F-statistic: 30.96 on 1 and 396 DF,  p-value: 4.849e-08

Even though the output exclaims the Gross_Profit variable as significant in both situations, the R-squared value for the IMDB rating is so small, that the model is explaining only 7% of the variance. As such, I would hesitate to rely on these outputs.

Regression 3.1 and 3.2

What variables explain the star rating (Rotten Tomatoes and IMDB independently)?

Assumptions

As with the previous instances, the assumption of independence will be assumed based on the nature of the data and the method in which the ratings were created.

# Mutliple Regression
# Rotten Tomatoes
# Normality
RotStars = lm(RotTom ~ Gross_Profit + Studio + Year, data = movies)
qqnorm(RotStars$residuals)
qqline(RotStars$residuals)

# Homoscedasticity
plot(RotStars$residuals)
abline(h = 0, lty = 3)

Judging by how most data points are close to the line, we can assume normality, and based on the residuals plot, there is even variance throughout and around the zero line, so the homoscedasticity assumption is also met. This appears to be true for the IMDB data below.

# Normality
# IMDB
IMDBStars = lm(IMDB ~ Gross_Profit + Studio + Year, data = movies)
qqnorm(IMDBStars$residuals)
qqline(IMDBStars$residuals)

# Homoscedasticity
plot(IMDBStars$residuals)
abline(h = 0, lty = 3)

Since the assumptions are met, we may proceed with examining the regression outputs.

## Results
summary(RotStars)
## 
## Call:
## lm(formula = RotTom ~ Gross_Profit + Studio + Year, data = movies)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.0892 -0.5441  0.0000  0.6719  2.7812 
## 
## Coefficients:
##                                                                              Estimate
## (Intercept)                                                                 5.269e+01
## Gross_Profit                                                                1.066e-09
## Studio20th Century-Fox Film Corporation                                    -3.038e-01
## Studio20th Century Fox                                                     -3.235e-01
## Studio20th Century Fox / Blue Sky                                           2.926e-01
## Studio20th Century Fox / Cinergi Pictures                                  -1.039e+00
## Studio20th Century Fox / Golden Harvest                                    -2.461e+00
## Studio20th Century Fox / Gracie Films                                       1.358e+00
## Studio20th Century Fox / Lucasfilm                                         -5.708e-01
## Studio20th Century Fox / Silver Pictures                                    6.561e-01
## Studio20th Century Fox Film Corporation                                     1.182e+00
## StudioAmerican International Pictures                                      -2.407e+00
## StudioAssociated Film Distribution                                          1.066e+00
## StudioBuena Vista Pictures Distribution                                     4.911e-01
## StudioColumbia                                                             -8.178e-01
## StudioColumbia / Imagine                                                   -1.278e+00
## StudioColumbia / Marvel                                                     4.791e-01
## StudioColumbia / Sony Pictures                                             -2.392e+00
## StudioColumbia Pictures                                                    -7.650e-01
## StudioColumbia Pictures / Castle Rock Entertainment                         3.592e-01
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment  4.414e-01
## StudioColumbia Pictures / Rastar                                           -1.587e+00
## StudioDisney                                                               -4.776e-01
## StudioDisney / Pixar                                                        1.526e+00
## StudioDisney / Walden Media                                                -2.169e-02
## StudioDreamWorks                                                           -3.361e-02
## StudioDreamWorks / 20th Century Fox                                         1.627e+00
## StudioDreamWorks / Fox                                                     -9.437e-01
## StudioDreamWorks / Paramount                                               -1.170e+00
## StudioDreamWorks / Universal                                                5.133e-01
## StudioDreamWorks Pictures                                                   1.621e+00
## StudioDreamWorks Pictures / Paramount Pictures                              4.937e-01
## StudioEmbassy Pictures                                                      1.322e+00
## StudioFox                                                                  -1.907e-01
## StudioFox / Blue Sky                                                       -1.217e+00
## StudioFox Searchlight Pictures                                              1.108e+00
## StudioGramercy Pictures / PolyGram                                          1.025e+00
## StudioHollywood Pictures                                                    2.469e-01
## StudioIcon / Newmarket                                                     -8.398e-01
## StudioIFC Films                                                             2.129e-01
## StudioLionsgate                                                             7.778e-01
## StudioLionsgate / Summit                                                   -1.447e+00
## StudioLionsgate Films                                                      -1.907e-01
## StudioLucasfilm / 20th Century Fox                                          1.082e-01
## StudioMarvel Studios                                                        5.187e-01
## StudioMetro-Goldwyn-Mayer                                                   3.249e-01
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                          -4.782e-01
## StudioMGM                                                                  -4.755e-01
## StudioMGM / Columbia                                                        6.683e-01
## StudioMGM / Universal                                                      -1.394e+00
## StudioMiramax Films / Universal Pictures                                    1.789e+00
## StudioNational Air and Space Museum                                        -6.961e+00
## StudioNew Line                                                              1.220e+00
## StudioNew Line Cinema                                                      -3.708e-02
## StudioOrion Pictures                                                        1.240e+00
## StudioOrion Pictures / Warner Bros.                                         4.745e-01
## StudioParamount                                                            -4.663e-01
## StudioParamount / DreamWorks                                               -1.413e-01
## StudioParamount / Lucasfilm                                                 1.493e-01
## StudioParamount / Marvel                                                   -4.620e-03
## StudioParamount / Marvel Studios                                            1.085e+00
## StudioParamount Pictures                                                   -4.608e-01
## StudioParamount Pictures / 20th Century Fox                                -5.122e-01
## StudioParamount Pictures / Lorimar                                          6.236e-01
## StudioParamount Pictures / Lucasfilm                                        1.029e+00
## StudioParamount Pictures / Orion Pictures                                  -9.817e-01
## StudioParamount Pictures / PolyGram                                        -1.949e+00
## StudioParamount Pictures / Warner Bros.                                     5.934e-01
## StudioSummit                                                               -4.249e+00
## StudioSummit Entertainment                                                 -1.191e+00
## StudioSunn Classic Pictures                                                -6.824e+00
## StudioTouchstone                                                           -1.360e-01
## StudioTouchstone Pictures                                                  -1.182e+00
## StudioTouchstone Pictures / Amblin Entertainment                            1.769e+00
## StudioTouchstone Pictures / Imagine Entertainment                          -7.606e-03
## StudioTriStar Pictures                                                     -5.253e-01
## StudioTriStar Pictures / Amblin Entertainment                              -2.384e+00
## StudioTriStar Pictures / Carolco                                           -2.620e+00
## StudioTriStar Pictures / Carolco Pictures                                  -2.724e-01
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment        1.111e+00
## StudioUnited Artists                                                       -8.320e-02
## StudioUnited Artists Pictures                                               4.629e-01
## StudioUnited Film Distribution Company                                      1.841e+00
## StudioUniversal                                                            -6.305e-01
## StudioUniversal / DreamWorks                                               -5.068e-01
## StudioUniversal / Illumination                                              1.127e-01
## StudioUniversal Pictures                                                   -6.742e-01
## StudioUniversal Pictures / Amblin Entertainment                             3.716e-01
## StudioUniversal Pictures / Imagine Entertainment                            1.382e+00
## StudioUniversal Pictures / ITC                                              8.085e-01
## StudioUniversal Pictures / RKO Pictures                                    -1.520e+00
## StudioUniversal Studios                                                    -2.075e-01
## StudioUniversal Studios / Cinema International Corporation                 -8.690e-01
## StudioWalt Disney Pictures                                                  8.354e-02
## StudioWalt Disney Pictures / Pixar                                          1.109e+00
## StudioWalt Disney Productions                                              -5.736e-01
## StudioWarner Bros                                                           4.759e-01
## StudioWarner Bros / Legendary                                               1.319e+00
## StudioWarner Bros.                                                         -1.495e-01
## StudioWarner Bros. / Columbia                                               5.928e-02
## StudioWarner Bros. / Geffen Pictures                                       -4.613e-02
## StudioWarner Bros. / Ladd                                                   1.076e+00
## StudioWarner Bros. / Legendary                                              6.398e-01
## StudioWarner Bros. / MGM / New Line                                        -2.527e-01
## StudioWarner Bros. / New Line / MGM                                         4.793e-02
## StudioWarner Bros. / New Line Cinema / MGM                                 -4.066e-01
## StudioWarner Bros. / PolyGram                                              -6.610e-01
## StudioWarner Bros. / The Ladd Company                                      -2.088e+00
## StudioWarner Bros. / Universal Pictures                                    -9.044e-01
## StudioWarner Bros. / Village Roadshow                                       6.340e-01
## StudioWarner Bros. Pictures                                                -4.144e-01
## Year                                                                       -2.334e-02
##                                                                            Std. Error
## (Intercept)                                                                 2.365e+01
## Gross_Profit                                                                2.944e-10
## Studio20th Century-Fox Film Corporation                                     1.849e+00
## Studio20th Century Fox                                                      1.347e+00
## Studio20th Century Fox / Blue Sky                                           1.864e+00
## Studio20th Century Fox / Cinergi Pictures                                   1.855e+00
## Studio20th Century Fox / Golden Harvest                                     1.849e+00
## Studio20th Century Fox / Gracie Films                                       1.852e+00
## Studio20th Century Fox / Lucasfilm                                          1.529e+00
## Studio20th Century Fox / Silver Pictures                                    1.605e+00
## Studio20th Century Fox Film Corporation                                     1.601e+00
## StudioAmerican International Pictures                                       1.849e+00
## StudioAssociated Film Distribution                                          1.849e+00
## StudioBuena Vista Pictures Distribution                                     1.852e+00
## StudioColumbia                                                              1.399e+00
## StudioColumbia / Imagine                                                    1.876e+00
## StudioColumbia / Marvel                                                     1.865e+00
## StudioColumbia / Sony Pictures                                              1.879e+00
## StudioColumbia Pictures                                                     1.343e+00
## StudioColumbia Pictures / Castle Rock Entertainment                         1.853e+00
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment  1.853e+00
## StudioColumbia Pictures / Rastar                                            1.850e+00
## StudioDisney                                                                1.422e+00
## StudioDisney / Pixar                                                        1.422e+00
## StudioDisney / Walden Media                                                 1.875e+00
## StudioDreamWorks                                                            1.482e+00
## StudioDreamWorks / 20th Century Fox                                         1.864e+00
## StudioDreamWorks / Fox                                                      1.863e+00
## StudioDreamWorks / Paramount                                                1.625e+00
## StudioDreamWorks / Universal                                                1.860e+00
## StudioDreamWorks Pictures                                                   1.860e+00
## StudioDreamWorks Pictures / Paramount Pictures                              1.612e+00
## StudioEmbassy Pictures                                                      1.850e+00
## StudioFox                                                                   1.409e+00
## StudioFox / Blue Sky                                                        1.539e+00
## StudioFox Searchlight Pictures                                              1.859e+00
## StudioGramercy Pictures / PolyGram                                          1.855e+00
## StudioHollywood Pictures                                                    1.611e+00
## StudioIcon / Newmarket                                                      1.865e+00
## StudioIFC Films                                                             1.864e+00
## StudioLionsgate                                                             1.636e+00
## StudioLionsgate / Summit                                                    1.878e+00
## StudioLionsgate Films                                                       1.883e+00
## StudioLucasfilm / 20th Century Fox                                          1.611e+00
## StudioMarvel Studios                                                        1.472e+00
## StudioMetro-Goldwyn-Mayer                                                   1.514e+00
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                           1.850e+00
## StudioMGM                                                                   1.863e+00
## StudioMGM / Columbia                                                        1.538e+00
## StudioMGM / Universal                                                       1.863e+00
## StudioMiramax Films / Universal Pictures                                    1.860e+00
## StudioNational Air and Space Museum                                         1.850e+00
## StudioNew Line                                                              1.874e+00
## StudioNew Line Cinema                                                       1.408e+00
## StudioOrion Pictures                                                        1.434e+00
## StudioOrion Pictures / Warner Bros.                                         1.849e+00
## StudioParamount                                                             1.414e+00
## StudioParamount / DreamWorks                                                1.419e+00
## StudioParamount / Lucasfilm                                                 1.871e+00
## StudioParamount / Marvel                                                    1.876e+00
## StudioParamount / Marvel Studios                                            1.872e+00
## StudioParamount Pictures                                                    1.331e+00
## StudioParamount Pictures / 20th Century Fox                                 1.633e+00
## StudioParamount Pictures / Lorimar                                          1.849e+00
## StudioParamount Pictures / Lucasfilm                                        1.512e+00
## StudioParamount Pictures / Orion Pictures                                   1.853e+00
## StudioParamount Pictures / PolyGram                                         1.850e+00
## StudioParamount Pictures / Warner Bros.                                     1.884e+00
## StudioSummit                                                                1.631e+00
## StudioSummit Entertainment                                                  1.875e+00
## StudioSunn Classic Pictures                                                 1.849e+00
## StudioTouchstone                                                            1.443e+00
## StudioTouchstone Pictures                                                   1.416e+00
## StudioTouchstone Pictures / Amblin Entertainment                            1.851e+00
## StudioTouchstone Pictures / Imagine Entertainment                           1.857e+00
## StudioTriStar Pictures                                                      1.396e+00
## StudioTriStar Pictures / Amblin Entertainment                               1.852e+00
## StudioTriStar Pictures / Carolco                                            1.850e+00
## StudioTriStar Pictures / Carolco Pictures                                   1.514e+00
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment        1.856e+00
## StudioUnited Artists                                                        1.357e+00
## StudioUnited Artists Pictures                                               1.462e+00
## StudioUnited Film Distribution Company                                      1.849e+00
## StudioUniversal                                                             1.412e+00
## StudioUniversal / DreamWorks                                                1.618e+00
## StudioUniversal / Illumination                                              1.634e+00
## StudioUniversal Pictures                                                    1.339e+00
## StudioUniversal Pictures / Amblin Entertainment                             1.468e+00
## StudioUniversal Pictures / Imagine Entertainment                            1.855e+00
## StudioUniversal Pictures / ITC                                              1.849e+00
## StudioUniversal Pictures / RKO Pictures                                     1.850e+00
## StudioUniversal Studios                                                     1.433e+00
## StudioUniversal Studios / Cinema International Corporation                  1.849e+00
## StudioWalt Disney Pictures                                                  1.367e+00
## StudioWalt Disney Pictures / Pixar                                          1.434e+00
## StudioWalt Disney Productions                                               1.850e+00
## StudioWarner Bros                                                           1.619e+00
## StudioWarner Bros / Legendary                                               1.870e+00
## StudioWarner Bros.                                                          1.331e+00
## StudioWarner Bros. / Columbia                                               1.865e+00
## StudioWarner Bros. / Geffen Pictures                                        1.607e+00
## StudioWarner Bros. / Ladd                                                   1.850e+00
## StudioWarner Bros. / Legendary                                              1.445e+00
## StudioWarner Bros. / MGM / New Line                                         1.878e+00
## StudioWarner Bros. / New Line / MGM                                         1.880e+00
## StudioWarner Bros. / New Line Cinema / MGM                                  1.882e+00
## StudioWarner Bros. / PolyGram                                               1.515e+00
## StudioWarner Bros. / The Ladd Company                                       1.850e+00
## StudioWarner Bros. / Universal Pictures                                     1.856e+00
## StudioWarner Bros. / Village Roadshow                                       1.871e+00
## StudioWarner Bros. Pictures                                                 1.432e+00
## Year                                                                        1.195e-02
##                                                                            t value
## (Intercept)                                                                  2.228
## Gross_Profit                                                                 3.621
## Studio20th Century-Fox Film Corporation                                     -0.164
## Studio20th Century Fox                                                      -0.240
## Studio20th Century Fox / Blue Sky                                            0.157
## Studio20th Century Fox / Cinergi Pictures                                   -0.560
## Studio20th Century Fox / Golden Harvest                                     -1.331
## Studio20th Century Fox / Gracie Films                                        0.733
## Studio20th Century Fox / Lucasfilm                                          -0.373
## Studio20th Century Fox / Silver Pictures                                     0.409
## Studio20th Century Fox Film Corporation                                      0.738
## StudioAmerican International Pictures                                       -1.302
## StudioAssociated Film Distribution                                           0.577
## StudioBuena Vista Pictures Distribution                                      0.265
## StudioColumbia                                                              -0.585
## StudioColumbia / Imagine                                                    -0.681
## StudioColumbia / Marvel                                                      0.257
## StudioColumbia / Sony Pictures                                              -1.273
## StudioColumbia Pictures                                                     -0.570
## StudioColumbia Pictures / Castle Rock Entertainment                          0.194
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment   0.238
## StudioColumbia Pictures / Rastar                                            -0.858
## StudioDisney                                                                -0.336
## StudioDisney / Pixar                                                         1.073
## StudioDisney / Walden Media                                                 -0.012
## StudioDreamWorks                                                            -0.023
## StudioDreamWorks / 20th Century Fox                                          0.873
## StudioDreamWorks / Fox                                                      -0.507
## StudioDreamWorks / Paramount                                                -0.720
## StudioDreamWorks / Universal                                                 0.276
## StudioDreamWorks Pictures                                                    0.871
## StudioDreamWorks Pictures / Paramount Pictures                               0.306
## StudioEmbassy Pictures                                                       0.714
## StudioFox                                                                   -0.135
## StudioFox / Blue Sky                                                        -0.791
## StudioFox Searchlight Pictures                                               0.596
## StudioGramercy Pictures / PolyGram                                           0.552
## StudioHollywood Pictures                                                     0.153
## StudioIcon / Newmarket                                                      -0.450
## StudioIFC Films                                                              0.114
## StudioLionsgate                                                              0.475
## StudioLionsgate / Summit                                                    -0.771
## StudioLionsgate Films                                                       -0.101
## StudioLucasfilm / 20th Century Fox                                           0.067
## StudioMarvel Studios                                                         0.352
## StudioMetro-Goldwyn-Mayer                                                    0.215
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                           -0.258
## StudioMGM                                                                   -0.255
## StudioMGM / Columbia                                                         0.435
## StudioMGM / Universal                                                       -0.748
## StudioMiramax Films / Universal Pictures                                     0.962
## StudioNational Air and Space Museum                                         -3.763
## StudioNew Line                                                               0.651
## StudioNew Line Cinema                                                       -0.026
## StudioOrion Pictures                                                         0.865
## StudioOrion Pictures / Warner Bros.                                          0.257
## StudioParamount                                                             -0.330
## StudioParamount / DreamWorks                                                -0.100
## StudioParamount / Lucasfilm                                                  0.080
## StudioParamount / Marvel                                                    -0.002
## StudioParamount / Marvel Studios                                             0.579
## StudioParamount Pictures                                                    -0.346
## StudioParamount Pictures / 20th Century Fox                                 -0.314
## StudioParamount Pictures / Lorimar                                           0.337
## StudioParamount Pictures / Lucasfilm                                         0.681
## StudioParamount Pictures / Orion Pictures                                   -0.530
## StudioParamount Pictures / PolyGram                                         -1.054
## StudioParamount Pictures / Warner Bros.                                      0.315
## StudioSummit                                                                -2.605
## StudioSummit Entertainment                                                  -0.635
## StudioSunn Classic Pictures                                                 -3.690
## StudioTouchstone                                                            -0.094
## StudioTouchstone Pictures                                                   -0.835
## StudioTouchstone Pictures / Amblin Entertainment                             0.956
## StudioTouchstone Pictures / Imagine Entertainment                           -0.004
## StudioTriStar Pictures                                                      -0.376
## StudioTriStar Pictures / Amblin Entertainment                               -1.287
## StudioTriStar Pictures / Carolco                                            -1.416
## StudioTriStar Pictures / Carolco Pictures                                   -0.180
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment         0.599
## StudioUnited Artists                                                        -0.061
## StudioUnited Artists Pictures                                                0.317
## StudioUnited Film Distribution Company                                       0.996
## StudioUniversal                                                             -0.447
## StudioUniversal / DreamWorks                                                -0.313
## StudioUniversal / Illumination                                               0.069
## StudioUniversal Pictures                                                    -0.503
## StudioUniversal Pictures / Amblin Entertainment                              0.253
## StudioUniversal Pictures / Imagine Entertainment                             0.745
## StudioUniversal Pictures / ITC                                               0.437
## StudioUniversal Pictures / RKO Pictures                                     -0.822
## StudioUniversal Studios                                                     -0.145
## StudioUniversal Studios / Cinema International Corporation                  -0.470
## StudioWalt Disney Pictures                                                   0.061
## StudioWalt Disney Pictures / Pixar                                           0.773
## StudioWalt Disney Productions                                               -0.310
## StudioWarner Bros                                                            0.294
## StudioWarner Bros / Legendary                                                0.705
## StudioWarner Bros.                                                          -0.112
## StudioWarner Bros. / Columbia                                                0.032
## StudioWarner Bros. / Geffen Pictures                                        -0.029
## StudioWarner Bros. / Ladd                                                    0.582
## StudioWarner Bros. / Legendary                                               0.443
## StudioWarner Bros. / MGM / New Line                                         -0.135
## StudioWarner Bros. / New Line / MGM                                          0.026
## StudioWarner Bros. / New Line Cinema / MGM                                  -0.216
## StudioWarner Bros. / PolyGram                                               -0.436
## StudioWarner Bros. / The Ladd Company                                       -1.128
## StudioWarner Bros. / Universal Pictures                                     -0.487
## StudioWarner Bros. / Village Roadshow                                        0.339
## StudioWarner Bros. Pictures                                                 -0.289
## Year                                                                        -1.953
##                                                                            Pr(>|t|)
## (Intercept)                                                                0.026640
## Gross_Profit                                                               0.000346
## Studio20th Century-Fox Film Corporation                                    0.869641
## Studio20th Century Fox                                                     0.810311
## Studio20th Century Fox / Blue Sky                                          0.875373
## Studio20th Century Fox / Cinergi Pictures                                  0.575875
## Studio20th Century Fox / Golden Harvest                                    0.184326
## Studio20th Century Fox / Gracie Films                                      0.464129
## Studio20th Century Fox / Lucasfilm                                         0.709210
## Studio20th Century Fox / Silver Pictures                                   0.682955
## Studio20th Century Fox Film Corporation                                    0.461007
## StudioAmerican International Pictures                                      0.193931
## StudioAssociated Film Distribution                                         0.564666
## StudioBuena Vista Pictures Distribution                                    0.791042
## StudioColumbia                                                             0.559331
## StudioColumbia / Imagine                                                   0.496266
## StudioColumbia / Marvel                                                    0.797470
## StudioColumbia / Sony Pictures                                             0.204034
## StudioColumbia Pictures                                                    0.569227
## StudioColumbia Pictures / Castle Rock Entertainment                        0.846482
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment 0.811950
## StudioColumbia Pictures / Rastar                                           0.391792
## StudioDisney                                                               0.737164
## StudioDisney / Pixar                                                       0.283954
## StudioDisney / Walden Media                                                0.990780
## StudioDreamWorks                                                           0.981919
## StudioDreamWorks / 20th Century Fox                                        0.383470
## StudioDreamWorks / Fox                                                     0.612760
## StudioDreamWorks / Paramount                                               0.472052
## StudioDreamWorks / Universal                                               0.782820
## StudioDreamWorks Pictures                                                  0.384316
## StudioDreamWorks Pictures / Paramount Pictures                             0.759612
## StudioEmbassy Pictures                                                     0.475575
## StudioFox                                                                  0.892449
## StudioFox / Blue Sky                                                       0.429700
## StudioFox Searchlight Pictures                                             0.551643
## StudioGramercy Pictures / PolyGram                                         0.581099
## StudioHollywood Pictures                                                   0.878341
## StudioIcon / Newmarket                                                     0.652894
## StudioIFC Films                                                            0.909149
## StudioLionsgate                                                            0.634943
## StudioLionsgate / Summit                                                   0.441560
## StudioLionsgate Films                                                      0.919395
## StudioLucasfilm / 20th Century Fox                                         0.946491
## StudioMarvel Studios                                                       0.724844
## StudioMetro-Goldwyn-Mayer                                                  0.830193
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                          0.796212
## StudioMGM                                                                  0.798753
## StudioMGM / Columbia                                                       0.664248
## StudioMGM / Universal                                                      0.454841
## StudioMiramax Films / Universal Pictures                                   0.336890
## StudioNational Air and Space Museum                                        0.000204
## StudioNew Line                                                             0.515636
## StudioNew Line Cinema                                                      0.979004
## StudioOrion Pictures                                                       0.387838
## StudioOrion Pictures / Warner Bros.                                        0.797648
## StudioParamount                                                            0.741723
## StudioParamount / DreamWorks                                               0.920750
## StudioParamount / Lucasfilm                                                0.936467
## StudioParamount / Marvel                                                   0.998036
## StudioParamount / Marvel Studios                                           0.562792
## StudioParamount Pictures                                                   0.729374
## StudioParamount Pictures / 20th Century Fox                                0.753981
## StudioParamount Pictures / Lorimar                                         0.736153
## StudioParamount Pictures / Lucasfilm                                       0.496623
## StudioParamount Pictures / Orion Pictures                                  0.596714
## StudioParamount Pictures / PolyGram                                        0.292818
## StudioParamount Pictures / Warner Bros.                                    0.753018
## StudioSummit                                                               0.009666
## StudioSummit Entertainment                                                 0.525908
## StudioSunn Classic Pictures                                                0.000268
## StudioTouchstone                                                           0.924968
## StudioTouchstone Pictures                                                  0.404590
## StudioTouchstone Pictures / Amblin Entertainment                           0.340006
## StudioTouchstone Pictures / Imagine Entertainment                          0.996734
## StudioTriStar Pictures                                                     0.706938
## StudioTriStar Pictures / Amblin Entertainment                              0.199168
## StudioTriStar Pictures / Carolco                                           0.157792
## StudioTriStar Pictures / Carolco Pictures                                  0.857357
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment       0.549663
## StudioUnited Artists                                                       0.951167
## StudioUnited Artists Pictures                                              0.751740
## StudioUnited Film Distribution Company                                     0.320264
## StudioUniversal                                                            0.655512
## StudioUniversal / DreamWorks                                               0.754356
## StudioUniversal / Illumination                                             0.945073
## StudioUniversal Pictures                                                   0.615111
## StudioUniversal Pictures / Amblin Entertainment                            0.800335
## StudioUniversal Pictures / Imagine Entertainment                           0.457046
## StudioUniversal Pictures / ITC                                             0.662219
## StudioUniversal Pictures / RKO Pictures                                    0.412012
## StudioUniversal Studios                                                    0.884953
## StudioUniversal Studios / Cinema International Corporation                 0.638789
## StudioWalt Disney Pictures                                                 0.951325
## StudioWalt Disney Pictures / Pixar                                         0.440223
## StudioWalt Disney Productions                                              0.756709
## StudioWarner Bros                                                          0.769081
## StudioWarner Bros / Legendary                                              0.481241
## StudioWarner Bros.                                                         0.910586
## StudioWarner Bros. / Columbia                                              0.974665
## StudioWarner Bros. / Geffen Pictures                                       0.977122
## StudioWarner Bros. / Ladd                                                  0.561344
## StudioWarner Bros. / Legendary                                             0.658329
## StudioWarner Bros. / MGM / New Line                                        0.893058
## StudioWarner Bros. / New Line / MGM                                        0.979673
## StudioWarner Bros. / New Line Cinema / MGM                                 0.829078
## StudioWarner Bros. / PolyGram                                              0.662900
## StudioWarner Bros. / The Ladd Company                                      0.260090
## StudioWarner Bros. / Universal Pictures                                    0.626532
## StudioWarner Bros. / Village Roadshow                                      0.735025
## StudioWarner Bros. Pictures                                                0.772559
## Year                                                                       0.051753
##                                                                               
## (Intercept)                                                                *  
## Gross_Profit                                                               ***
## Studio20th Century-Fox Film Corporation                                       
## Studio20th Century Fox                                                        
## Studio20th Century Fox / Blue Sky                                             
## Studio20th Century Fox / Cinergi Pictures                                     
## Studio20th Century Fox / Golden Harvest                                       
## Studio20th Century Fox / Gracie Films                                         
## Studio20th Century Fox / Lucasfilm                                            
## Studio20th Century Fox / Silver Pictures                                      
## Studio20th Century Fox Film Corporation                                       
## StudioAmerican International Pictures                                         
## StudioAssociated Film Distribution                                            
## StudioBuena Vista Pictures Distribution                                       
## StudioColumbia                                                                
## StudioColumbia / Imagine                                                      
## StudioColumbia / Marvel                                                       
## StudioColumbia / Sony Pictures                                                
## StudioColumbia Pictures                                                       
## StudioColumbia Pictures / Castle Rock Entertainment                           
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment    
## StudioColumbia Pictures / Rastar                                              
## StudioDisney                                                                  
## StudioDisney / Pixar                                                          
## StudioDisney / Walden Media                                                   
## StudioDreamWorks                                                              
## StudioDreamWorks / 20th Century Fox                                           
## StudioDreamWorks / Fox                                                        
## StudioDreamWorks / Paramount                                                  
## StudioDreamWorks / Universal                                                  
## StudioDreamWorks Pictures                                                     
## StudioDreamWorks Pictures / Paramount Pictures                                
## StudioEmbassy Pictures                                                        
## StudioFox                                                                     
## StudioFox / Blue Sky                                                          
## StudioFox Searchlight Pictures                                                
## StudioGramercy Pictures / PolyGram                                            
## StudioHollywood Pictures                                                      
## StudioIcon / Newmarket                                                        
## StudioIFC Films                                                               
## StudioLionsgate                                                               
## StudioLionsgate / Summit                                                      
## StudioLionsgate Films                                                         
## StudioLucasfilm / 20th Century Fox                                            
## StudioMarvel Studios                                                          
## StudioMetro-Goldwyn-Mayer                                                     
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                             
## StudioMGM                                                                     
## StudioMGM / Columbia                                                          
## StudioMGM / Universal                                                         
## StudioMiramax Films / Universal Pictures                                      
## StudioNational Air and Space Museum                                        ***
## StudioNew Line                                                                
## StudioNew Line Cinema                                                         
## StudioOrion Pictures                                                          
## StudioOrion Pictures / Warner Bros.                                           
## StudioParamount                                                               
## StudioParamount / DreamWorks                                                  
## StudioParamount / Lucasfilm                                                   
## StudioParamount / Marvel                                                      
## StudioParamount / Marvel Studios                                              
## StudioParamount Pictures                                                      
## StudioParamount Pictures / 20th Century Fox                                   
## StudioParamount Pictures / Lorimar                                            
## StudioParamount Pictures / Lucasfilm                                          
## StudioParamount Pictures / Orion Pictures                                     
## StudioParamount Pictures / PolyGram                                           
## StudioParamount Pictures / Warner Bros.                                       
## StudioSummit                                                               ** 
## StudioSummit Entertainment                                                    
## StudioSunn Classic Pictures                                                ***
## StudioTouchstone                                                              
## StudioTouchstone Pictures                                                     
## StudioTouchstone Pictures / Amblin Entertainment                              
## StudioTouchstone Pictures / Imagine Entertainment                             
## StudioTriStar Pictures                                                        
## StudioTriStar Pictures / Amblin Entertainment                                 
## StudioTriStar Pictures / Carolco                                              
## StudioTriStar Pictures / Carolco Pictures                                     
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment          
## StudioUnited Artists                                                          
## StudioUnited Artists Pictures                                                 
## StudioUnited Film Distribution Company                                        
## StudioUniversal                                                               
## StudioUniversal / DreamWorks                                                  
## StudioUniversal / Illumination                                                
## StudioUniversal Pictures                                                      
## StudioUniversal Pictures / Amblin Entertainment                               
## StudioUniversal Pictures / Imagine Entertainment                              
## StudioUniversal Pictures / ITC                                                
## StudioUniversal Pictures / RKO Pictures                                       
## StudioUniversal Studios                                                       
## StudioUniversal Studios / Cinema International Corporation                    
## StudioWalt Disney Pictures                                                    
## StudioWalt Disney Pictures / Pixar                                            
## StudioWalt Disney Productions                                                 
## StudioWarner Bros                                                             
## StudioWarner Bros / Legendary                                                 
## StudioWarner Bros.                                                            
## StudioWarner Bros. / Columbia                                                 
## StudioWarner Bros. / Geffen Pictures                                          
## StudioWarner Bros. / Ladd                                                     
## StudioWarner Bros. / Legendary                                                
## StudioWarner Bros. / MGM / New Line                                           
## StudioWarner Bros. / New Line / MGM                                           
## StudioWarner Bros. / New Line Cinema / MGM                                    
## StudioWarner Bros. / PolyGram                                                 
## StudioWarner Bros. / The Ladd Company                                         
## StudioWarner Bros. / Universal Pictures                                       
## StudioWarner Bros. / Village Roadshow                                         
## StudioWarner Bros. Pictures                                                   
## Year                                                                       .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 1.307 on 286 degrees of freedom
## Multiple R-squared:  0.4152, Adjusted R-squared:  0.1883 
## F-statistic:  1.83 on 111 and 286 DF,  p-value: 3.334e-05
summary(IMDBStars)
## 
## Call:
## lm(formula = IMDB ~ Gross_Profit + Studio + Year, data = movies)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -2.5398 -0.3623  0.0000  0.3969  1.6394 
## 
## Coefficients:
##                                                                              Estimate
## (Intercept)                                                                 3.364e+01
## Gross_Profit                                                                8.121e-10
## Studio20th Century-Fox Film Corporation                                     3.131e-01
## Studio20th Century Fox                                                      3.329e-01
## Studio20th Century Fox / Blue Sky                                           1.135e+00
## Studio20th Century Fox / Cinergi Pictures                                   9.864e-01
## Studio20th Century Fox / Golden Harvest                                    -3.981e-01
## Studio20th Century Fox / Gracie Films                                       8.642e-01
## Studio20th Century Fox / Lucasfilm                                          8.036e-02
## Studio20th Century Fox / Silver Pictures                                    1.221e+00
## Studio20th Century Fox Film Corporation                                     1.446e+00
## StudioAmerican International Pictures                                      -4.017e-01
## StudioAssociated Film Distribution                                          1.154e+00
## StudioBuena Vista Pictures Distribution                                     3.977e-01
## StudioColumbia                                                             -2.594e-02
## StudioColumbia / Imagine                                                    3.056e-01
## StudioColumbia / Marvel                                                     3.676e-01
## StudioColumbia / Sony Pictures                                             -9.131e-01
## StudioColumbia Pictures                                                     2.635e-01
## StudioColumbia Pictures / Castle Rock Entertainment                         1.073e+00
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment  2.399e-01
## StudioColumbia Pictures / Rastar                                            5.454e-02
## StudioDisney                                                                4.834e-01
## StudioDisney / Pixar                                                        1.412e+00
## StudioDisney / Walden Media                                                 2.524e-01
## StudioDreamWorks                                                            3.757e-01
## StudioDreamWorks / 20th Century Fox                                         1.261e+00
## StudioDreamWorks / Fox                                                      1.914e-01
## StudioDreamWorks / Paramount                                               -3.521e-02
## StudioDreamWorks / Universal                                                1.906e+00
## StudioDreamWorks Pictures                                                   1.892e+00
## StudioDreamWorks Pictures / Paramount Pictures                              7.494e-01
## StudioEmbassy Pictures                                                      5.648e-01
## StudioFox                                                                   4.495e-01
## StudioFox / Blue Sky                                                        1.887e-01
## StudioFox Searchlight Pictures                                              7.666e-01
## StudioGramercy Pictures / PolyGram                                          6.154e-01
## StudioHollywood Pictures                                                    1.090e+00
## StudioIcon / Newmarket                                                      4.499e-01
## StudioIFC Films                                                             1.504e-01
## StudioLionsgate                                                             9.436e-01
## StudioLionsgate / Summit                                                   -1.012e+00
## StudioLionsgate Films                                                       2.997e-01
## StudioLucasfilm / 20th Century Fox                                          1.461e+00
## StudioMarvel Studios                                                        9.967e-01
## StudioMetro-Goldwyn-Mayer                                                   5.007e-01
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                           6.763e-01
## StudioMGM                                                                  -4.170e-01
## StudioMGM / Columbia                                                        8.628e-01
## StudioMGM / Universal                                                       2.489e-01
## StudioMiramax Films / Universal Pictures                                    7.480e-01
## StudioNational Air and Space Museum                                         2.934e-01
## StudioNew Line                                                              1.690e+00
## StudioNew Line Cinema                                                       9.850e-01
## StudioOrion Pictures                                                        1.292e+00
## StudioOrion Pictures / Warner Bros.                                         3.528e-01
## StudioParamount                                                             1.996e-01
## StudioParamount / DreamWorks                                                4.145e-01
## StudioParamount / Lucasfilm                                                -4.744e-01
## StudioParamount / Marvel                                                    6.051e-01
## StudioParamount / Marvel Studios                                            1.405e+00
## StudioParamount Pictures                                                    2.495e-01
## StudioParamount Pictures / 20th Century Fox                                -3.551e-01
## StudioParamount Pictures / Lorimar                                          4.100e-01
## StudioParamount Pictures / Lucasfilm                                        1.367e+00
## StudioParamount Pictures / Orion Pictures                                   3.223e-01
## StudioParamount Pictures / PolyGram                                        -3.972e-01
## StudioParamount Pictures / Warner Bros.                                     2.264e+00
## StudioSummit                                                               -1.817e+00
## StudioSummit Entertainment                                                 -1.660e+00
## StudioSunn Classic Pictures                                                -2.002e+00
## StudioTouchstone                                                            1.827e-01
## StudioTouchstone Pictures                                                  -6.641e-02
## StudioTouchstone Pictures / Amblin Entertainment                            1.197e+00
## StudioTouchstone Pictures / Imagine Entertainment                           8.259e-02
## StudioTriStar Pictures                                                      2.087e-01
## StudioTriStar Pictures / Amblin Entertainment                               6.837e-02
## StudioTriStar Pictures / Carolco                                           -1.588e-01
## StudioTriStar Pictures / Carolco Pictures                                   2.997e-01
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment        1.560e+00
## StudioUnited Artists                                                        5.484e-01
## StudioUnited Artists Pictures                                               8.347e-01
## StudioUnited Film Distribution Company                                      1.439e+00
## StudioUniversal                                                             1.228e-01
## StudioUniversal / DreamWorks                                                1.473e-01
## StudioUniversal / Illumination                                              1.036e+00
## StudioUniversal Pictures                                                    2.360e-01
## StudioUniversal Pictures / Amblin Entertainment                             7.310e-01
## StudioUniversal Pictures / Imagine Entertainment                            1.002e+00
## StudioUniversal Pictures / ITC                                              1.103e+00
## StudioUniversal Pictures / RKO Pictures                                    -7.706e-01
## StudioUniversal Studios                                                     4.370e-01
## StudioUniversal Studios / Cinema International Corporation                  1.396e-01
## StudioWalt Disney Pictures                                                  4.558e-01
## StudioWalt Disney Pictures / Pixar                                          9.814e-01
## StudioWalt Disney Productions                                              -3.599e-01
## StudioWarner Bros                                                           7.301e-01
## StudioWarner Bros / Legendary                                               1.919e+00
## StudioWarner Bros.                                                          4.955e-01
## StudioWarner Bros. / Columbia                                              -9.444e-02
## StudioWarner Bros. / Geffen Pictures                                        1.088e+00
## StudioWarner Bros. / Ladd                                                   7.297e-01
## StudioWarner Bros. / Legendary                                              1.583e+00
## StudioWarner Bros. / MGM / New Line                                         1.232e+00
## StudioWarner Bros. / New Line / MGM                                         1.305e+00
## StudioWarner Bros. / New Line Cinema / MGM                                  8.352e-01
## StudioWarner Bros. / PolyGram                                              -2.352e-03
## StudioWarner Bros. / The Ladd Company                                       1.456e-01
## StudioWarner Bros. / Universal Pictures                                    -5.435e-01
## StudioWarner Bros. / Village Roadshow                                      -2.734e-01
## StudioWarner Bros. Pictures                                                 5.943e-02
## Year                                                                       -1.378e-02
##                                                                            Std. Error
## (Intercept)                                                                 1.315e+01
## Gross_Profit                                                                1.637e-10
## Studio20th Century-Fox Film Corporation                                     1.028e+00
## Studio20th Century Fox                                                      7.489e-01
## Studio20th Century Fox / Blue Sky                                           1.037e+00
## Studio20th Century Fox / Cinergi Pictures                                   1.032e+00
## Studio20th Century Fox / Golden Harvest                                     1.028e+00
## Studio20th Century Fox / Gracie Films                                       1.030e+00
## Studio20th Century Fox / Lucasfilm                                          8.503e-01
## Studio20th Century Fox / Silver Pictures                                    8.924e-01
## Studio20th Century Fox Film Corporation                                     8.905e-01
## StudioAmerican International Pictures                                       1.028e+00
## StudioAssociated Film Distribution                                          1.028e+00
## StudioBuena Vista Pictures Distribution                                     1.030e+00
## StudioColumbia                                                              7.780e-01
## StudioColumbia / Imagine                                                    1.043e+00
## StudioColumbia / Marvel                                                     1.037e+00
## StudioColumbia / Sony Pictures                                              1.045e+00
## StudioColumbia Pictures                                                     7.465e-01
## StudioColumbia Pictures / Castle Rock Entertainment                         1.031e+00
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment  1.031e+00
## StudioColumbia Pictures / Rastar                                            1.029e+00
## StudioDisney                                                                7.906e-01
## StudioDisney / Pixar                                                        7.907e-01
## StudioDisney / Walden Media                                                 1.043e+00
## StudioDreamWorks                                                            8.239e-01
## StudioDreamWorks / 20th Century Fox                                         1.037e+00
## StudioDreamWorks / Fox                                                      1.036e+00
## StudioDreamWorks / Paramount                                                9.036e-01
## StudioDreamWorks / Universal                                                1.035e+00
## StudioDreamWorks Pictures                                                   1.034e+00
## StudioDreamWorks Pictures / Paramount Pictures                              8.964e-01
## StudioEmbassy Pictures                                                      1.029e+00
## StudioFox                                                                   7.836e-01
## StudioFox / Blue Sky                                                        8.556e-01
## StudioFox Searchlight Pictures                                              1.034e+00
## StudioGramercy Pictures / PolyGram                                          1.032e+00
## StudioHollywood Pictures                                                    8.960e-01
## StudioIcon / Newmarket                                                      1.037e+00
## StudioIFC Films                                                             1.037e+00
## StudioLionsgate                                                             9.100e-01
## StudioLionsgate / Summit                                                    1.044e+00
## StudioLionsgate Films                                                       1.047e+00
## StudioLucasfilm / 20th Century Fox                                          8.958e-01
## StudioMarvel Studios                                                        8.186e-01
## StudioMetro-Goldwyn-Mayer                                                   8.418e-01
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                           1.029e+00
## StudioMGM                                                                   1.036e+00
## StudioMGM / Columbia                                                        8.553e-01
## StudioMGM / Universal                                                       1.036e+00
## StudioMiramax Films / Universal Pictures                                    1.034e+00
## StudioNational Air and Space Museum                                         1.029e+00
## StudioNew Line                                                              1.042e+00
## StudioNew Line Cinema                                                       7.828e-01
## StudioOrion Pictures                                                        7.976e-01
## StudioOrion Pictures / Warner Bros.                                         1.028e+00
## StudioParamount                                                             7.860e-01
## StudioParamount / DreamWorks                                                7.893e-01
## StudioParamount / Lucasfilm                                                 1.040e+00
## StudioParamount / Marvel                                                    1.043e+00
## StudioParamount / Marvel Studios                                            1.041e+00
## StudioParamount Pictures                                                    7.400e-01
## StudioParamount Pictures / 20th Century Fox                                 9.080e-01
## StudioParamount Pictures / Lorimar                                          1.028e+00
## StudioParamount Pictures / Lucasfilm                                        8.407e-01
## StudioParamount Pictures / Orion Pictures                                   1.031e+00
## StudioParamount Pictures / PolyGram                                         1.029e+00
## StudioParamount Pictures / Warner Bros.                                     1.048e+00
## StudioSummit                                                                9.070e-01
## StudioSummit Entertainment                                                  1.043e+00
## StudioSunn Classic Pictures                                                 1.028e+00
## StudioTouchstone                                                            8.022e-01
## StudioTouchstone Pictures                                                   7.876e-01
## StudioTouchstone Pictures / Amblin Entertainment                            1.029e+00
## StudioTouchstone Pictures / Imagine Entertainment                           1.033e+00
## StudioTriStar Pictures                                                      7.761e-01
## StudioTriStar Pictures / Amblin Entertainment                               1.030e+00
## StudioTriStar Pictures / Carolco                                            1.029e+00
## StudioTriStar Pictures / Carolco Pictures                                   8.421e-01
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment        1.032e+00
## StudioUnited Artists                                                        7.548e-01
## StudioUnited Artists Pictures                                               8.129e-01
## StudioUnited Film Distribution Company                                      1.028e+00
## StudioUniversal                                                             7.851e-01
## StudioUniversal / DreamWorks                                                8.998e-01
## StudioUniversal / Illumination                                              9.087e-01
## StudioUniversal Pictures                                                    7.448e-01
## StudioUniversal Pictures / Amblin Entertainment                             8.162e-01
## StudioUniversal Pictures / Imagine Entertainment                            1.032e+00
## StudioUniversal Pictures / ITC                                              1.028e+00
## StudioUniversal Pictures / RKO Pictures                                     1.029e+00
## StudioUniversal Studios                                                     7.967e-01
## StudioUniversal Studios / Cinema International Corporation                  1.028e+00
## StudioWalt Disney Pictures                                                  7.604e-01
## StudioWalt Disney Pictures / Pixar                                          7.976e-01
## StudioWalt Disney Productions                                               1.029e+00
## StudioWarner Bros                                                           9.005e-01
## StudioWarner Bros / Legendary                                               1.040e+00
## StudioWarner Bros.                                                          7.399e-01
## StudioWarner Bros. / Columbia                                               1.037e+00
## StudioWarner Bros. / Geffen Pictures                                        8.937e-01
## StudioWarner Bros. / Ladd                                                   1.028e+00
## StudioWarner Bros. / Legendary                                              8.037e-01
## StudioWarner Bros. / MGM / New Line                                         1.044e+00
## StudioWarner Bros. / New Line / MGM                                         1.045e+00
## StudioWarner Bros. / New Line Cinema / MGM                                  1.046e+00
## StudioWarner Bros. / PolyGram                                               8.423e-01
## StudioWarner Bros. / The Ladd Company                                       1.029e+00
## StudioWarner Bros. / Universal Pictures                                     1.032e+00
## StudioWarner Bros. / Village Roadshow                                       1.041e+00
## StudioWarner Bros. Pictures                                                 7.965e-01
## Year                                                                        6.643e-03
##                                                                            t value
## (Intercept)                                                                  2.559
## Gross_Profit                                                                 4.961
## Studio20th Century-Fox Film Corporation                                      0.304
## Studio20th Century Fox                                                       0.445
## Studio20th Century Fox / Blue Sky                                            1.095
## Studio20th Century Fox / Cinergi Pictures                                    0.956
## Studio20th Century Fox / Golden Harvest                                     -0.387
## Studio20th Century Fox / Gracie Films                                        0.839
## Studio20th Century Fox / Lucasfilm                                           0.095
## Studio20th Century Fox / Silver Pictures                                     1.368
## Studio20th Century Fox Film Corporation                                      1.624
## StudioAmerican International Pictures                                       -0.391
## StudioAssociated Film Distribution                                           1.123
## StudioBuena Vista Pictures Distribution                                      0.386
## StudioColumbia                                                              -0.033
## StudioColumbia / Imagine                                                     0.293
## StudioColumbia / Marvel                                                      0.354
## StudioColumbia / Sony Pictures                                              -0.874
## StudioColumbia Pictures                                                      0.353
## StudioColumbia Pictures / Castle Rock Entertainment                          1.041
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment   0.233
## StudioColumbia Pictures / Rastar                                             0.053
## StudioDisney                                                                 0.611
## StudioDisney / Pixar                                                         1.786
## StudioDisney / Walden Media                                                  0.242
## StudioDreamWorks                                                             0.456
## StudioDreamWorks / 20th Century Fox                                          1.217
## StudioDreamWorks / Fox                                                       0.185
## StudioDreamWorks / Paramount                                                -0.039
## StudioDreamWorks / Universal                                                 1.843
## StudioDreamWorks Pictures                                                    1.829
## StudioDreamWorks Pictures / Paramount Pictures                               0.836
## StudioEmbassy Pictures                                                       0.549
## StudioFox                                                                    0.574
## StudioFox / Blue Sky                                                         0.221
## StudioFox Searchlight Pictures                                               0.742
## StudioGramercy Pictures / PolyGram                                           0.596
## StudioHollywood Pictures                                                     1.216
## StudioIcon / Newmarket                                                       0.434
## StudioIFC Films                                                              0.145
## StudioLionsgate                                                              1.037
## StudioLionsgate / Summit                                                    -0.969
## StudioLionsgate Films                                                        0.286
## StudioLucasfilm / 20th Century Fox                                           1.631
## StudioMarvel Studios                                                         1.218
## StudioMetro-Goldwyn-Mayer                                                    0.595
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                            0.657
## StudioMGM                                                                   -0.402
## StudioMGM / Columbia                                                         1.009
## StudioMGM / Universal                                                        0.240
## StudioMiramax Films / Universal Pictures                                     0.723
## StudioNational Air and Space Museum                                          0.285
## StudioNew Line                                                               1.622
## StudioNew Line Cinema                                                        1.258
## StudioOrion Pictures                                                         1.620
## StudioOrion Pictures / Warner Bros.                                          0.343
## StudioParamount                                                              0.254
## StudioParamount / DreamWorks                                                 0.525
## StudioParamount / Lucasfilm                                                 -0.456
## StudioParamount / Marvel                                                     0.580
## StudioParamount / Marvel Studios                                             1.349
## StudioParamount Pictures                                                     0.337
## StudioParamount Pictures / 20th Century Fox                                 -0.391
## StudioParamount Pictures / Lorimar                                           0.399
## StudioParamount Pictures / Lucasfilm                                         1.626
## StudioParamount Pictures / Orion Pictures                                    0.313
## StudioParamount Pictures / PolyGram                                         -0.386
## StudioParamount Pictures / Warner Bros.                                      2.161
## StudioSummit                                                                -2.003
## StudioSummit Entertainment                                                  -1.593
## StudioSunn Classic Pictures                                                 -1.947
## StudioTouchstone                                                             0.228
## StudioTouchstone Pictures                                                   -0.084
## StudioTouchstone Pictures / Amblin Entertainment                             1.163
## StudioTouchstone Pictures / Imagine Entertainment                            0.080
## StudioTriStar Pictures                                                       0.269
## StudioTriStar Pictures / Amblin Entertainment                                0.066
## StudioTriStar Pictures / Carolco                                            -0.154
## StudioTriStar Pictures / Carolco Pictures                                    0.356
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment         1.512
## StudioUnited Artists                                                         0.726
## StudioUnited Artists Pictures                                                1.027
## StudioUnited Film Distribution Company                                       1.400
## StudioUniversal                                                              0.156
## StudioUniversal / DreamWorks                                                 0.164
## StudioUniversal / Illumination                                               1.140
## StudioUniversal Pictures                                                     0.317
## StudioUniversal Pictures / Amblin Entertainment                              0.896
## StudioUniversal Pictures / Imagine Entertainment                             0.971
## StudioUniversal Pictures / ITC                                               1.072
## StudioUniversal Pictures / RKO Pictures                                     -0.749
## StudioUniversal Studios                                                      0.548
## StudioUniversal Studios / Cinema International Corporation                   0.136
## StudioWalt Disney Pictures                                                   0.599
## StudioWalt Disney Pictures / Pixar                                           1.231
## StudioWalt Disney Productions                                               -0.350
## StudioWarner Bros                                                            0.811
## StudioWarner Bros / Legendary                                                1.846
## StudioWarner Bros.                                                           0.670
## StudioWarner Bros. / Columbia                                               -0.091
## StudioWarner Bros. / Geffen Pictures                                         1.217
## StudioWarner Bros. / Ladd                                                    0.710
## StudioWarner Bros. / Legendary                                               1.970
## StudioWarner Bros. / MGM / New Line                                          1.180
## StudioWarner Bros. / New Line / MGM                                          1.248
## StudioWarner Bros. / New Line Cinema / MGM                                   0.798
## StudioWarner Bros. / PolyGram                                               -0.003
## StudioWarner Bros. / The Ladd Company                                        0.142
## StudioWarner Bros. / Universal Pictures                                     -0.526
## StudioWarner Bros. / Village Roadshow                                       -0.263
## StudioWarner Bros. Pictures                                                  0.075
## Year                                                                        -2.074
##                                                                            Pr(>|t|)
## (Intercept)                                                                  0.0110
## Gross_Profit                                                                1.2e-06
## Studio20th Century-Fox Film Corporation                                      0.7610
## Studio20th Century Fox                                                       0.6570
## Studio20th Century Fox / Blue Sky                                            0.2745
## Studio20th Century Fox / Cinergi Pictures                                    0.3398
## Studio20th Century Fox / Golden Harvest                                      0.6989
## Studio20th Century Fox / Gracie Films                                        0.4021
## Studio20th Century Fox / Lucasfilm                                           0.9248
## Studio20th Century Fox / Silver Pictures                                     0.1723
## Studio20th Century Fox Film Corporation                                      0.1054
## StudioAmerican International Pictures                                        0.6963
## StudioAssociated Film Distribution                                           0.2625
## StudioBuena Vista Pictures Distribution                                      0.6996
## StudioColumbia                                                               0.9734
## StudioColumbia / Imagine                                                     0.7697
## StudioColumbia / Marvel                                                      0.7233
## StudioColumbia / Sony Pictures                                               0.3829
## StudioColumbia Pictures                                                      0.7243
## StudioColumbia Pictures / Castle Rock Entertainment                          0.2986
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment   0.8161
## StudioColumbia Pictures / Rastar                                             0.9578
## StudioDisney                                                                 0.5414
## StudioDisney / Pixar                                                         0.0751
## StudioDisney / Walden Media                                                  0.8089
## StudioDreamWorks                                                             0.6487
## StudioDreamWorks / 20th Century Fox                                          0.2247
## StudioDreamWorks / Fox                                                       0.8535
## StudioDreamWorks / Paramount                                                 0.9689
## StudioDreamWorks / Universal                                                 0.0664
## StudioDreamWorks Pictures                                                    0.0684
## StudioDreamWorks Pictures / Paramount Pictures                               0.4038
## StudioEmbassy Pictures                                                       0.5834
## StudioFox                                                                    0.5667
## StudioFox / Blue Sky                                                         0.8256
## StudioFox Searchlight Pictures                                               0.4589
## StudioGramercy Pictures / PolyGram                                           0.5513
## StudioHollywood Pictures                                                     0.2250
## StudioIcon / Newmarket                                                       0.6648
## StudioIFC Films                                                              0.8847
## StudioLionsgate                                                              0.3006
## StudioLionsgate / Summit                                                     0.3335
## StudioLionsgate Films                                                        0.7749
## StudioLucasfilm / 20th Century Fox                                           0.1040
## StudioMarvel Studios                                                         0.2244
## StudioMetro-Goldwyn-Mayer                                                    0.5524
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                            0.5114
## StudioMGM                                                                    0.6877
## StudioMGM / Columbia                                                         0.3139
## StudioMGM / Universal                                                        0.8103
## StudioMiramax Films / Universal Pictures                                     0.4700
## StudioNational Air and Space Museum                                          0.7757
## StudioNew Line                                                               0.1060
## StudioNew Line Cinema                                                        0.2093
## StudioOrion Pictures                                                         0.1064
## StudioOrion Pictures / Warner Bros.                                          0.7318
## StudioParamount                                                              0.7997
## StudioParamount / DreamWorks                                                 0.5999
## StudioParamount / Lucasfilm                                                  0.6488
## StudioParamount / Marvel                                                     0.5623
## StudioParamount / Marvel Studios                                             0.1783
## StudioParamount Pictures                                                     0.7362
## StudioParamount Pictures / 20th Century Fox                                  0.6960
## StudioParamount Pictures / Lorimar                                           0.6904
## StudioParamount Pictures / Lucasfilm                                         0.1050
## StudioParamount Pictures / Orion Pictures                                    0.7547
## StudioParamount Pictures / PolyGram                                          0.6997
## StudioParamount Pictures / Warner Bros.                                      0.0315
## StudioSummit                                                                 0.0461
## StudioSummit Entertainment                                                   0.1124
## StudioSunn Classic Pictures                                                  0.0525
## StudioTouchstone                                                             0.8200
## StudioTouchstone Pictures                                                    0.9329
## StudioTouchstone Pictures / Amblin Entertainment                             0.2459
## StudioTouchstone Pictures / Imagine Entertainment                            0.9363
## StudioTriStar Pictures                                                       0.7882
## StudioTriStar Pictures / Amblin Entertainment                                0.9471
## StudioTriStar Pictures / Carolco                                             0.8774
## StudioTriStar Pictures / Carolco Pictures                                    0.7222
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment         0.1317
## StudioUnited Artists                                                         0.4681
## StudioUnited Artists Pictures                                                0.3054
## StudioUnited Film Distribution Company                                       0.1627
## StudioUniversal                                                              0.8759
## StudioUniversal / DreamWorks                                                 0.8701
## StudioUniversal / Illumination                                               0.2552
## StudioUniversal Pictures                                                     0.7516
## StudioUniversal Pictures / Amblin Entertainment                              0.3712
## StudioUniversal Pictures / Imagine Entertainment                             0.3321
## StudioUniversal Pictures / ITC                                               0.2845
## StudioUniversal Pictures / RKO Pictures                                      0.4544
## StudioUniversal Studios                                                      0.5838
## StudioUniversal Studios / Cinema International Corporation                   0.8921
## StudioWalt Disney Pictures                                                   0.5494
## StudioWalt Disney Pictures / Pixar                                           0.2195
## StudioWalt Disney Productions                                                0.7267
## StudioWarner Bros                                                            0.4182
## StudioWarner Bros / Legendary                                                0.0660
## StudioWarner Bros.                                                           0.5036
## StudioWarner Bros. / Columbia                                                0.9275
## StudioWarner Bros. / Geffen Pictures                                         0.2247
## StudioWarner Bros. / Ladd                                                    0.4786
## StudioWarner Bros. / Legendary                                               0.0498
## StudioWarner Bros. / MGM / New Line                                          0.2391
## StudioWarner Bros. / New Line / MGM                                          0.2130
## StudioWarner Bros. / New Line Cinema / MGM                                   0.4254
## StudioWarner Bros. / PolyGram                                                0.9978
## StudioWarner Bros. / The Ladd Company                                        0.8875
## StudioWarner Bros. / Universal Pictures                                      0.5990
## StudioWarner Bros. / Village Roadshow                                        0.7930
## StudioWarner Bros. Pictures                                                  0.9406
## Year                                                                         0.0390
##                                                                               
## (Intercept)                                                                *  
## Gross_Profit                                                               ***
## Studio20th Century-Fox Film Corporation                                       
## Studio20th Century Fox                                                        
## Studio20th Century Fox / Blue Sky                                             
## Studio20th Century Fox / Cinergi Pictures                                     
## Studio20th Century Fox / Golden Harvest                                       
## Studio20th Century Fox / Gracie Films                                         
## Studio20th Century Fox / Lucasfilm                                            
## Studio20th Century Fox / Silver Pictures                                      
## Studio20th Century Fox Film Corporation                                       
## StudioAmerican International Pictures                                         
## StudioAssociated Film Distribution                                            
## StudioBuena Vista Pictures Distribution                                       
## StudioColumbia                                                                
## StudioColumbia / Imagine                                                      
## StudioColumbia / Marvel                                                       
## StudioColumbia / Sony Pictures                                                
## StudioColumbia Pictures                                                       
## StudioColumbia Pictures / Castle Rock Entertainment                           
## StudioColumbia Pictures / Castle Rock Entertainment / Nelson Entertainment    
## StudioColumbia Pictures / Rastar                                              
## StudioDisney                                                                  
## StudioDisney / Pixar                                                       .  
## StudioDisney / Walden Media                                                   
## StudioDreamWorks                                                              
## StudioDreamWorks / 20th Century Fox                                           
## StudioDreamWorks / Fox                                                        
## StudioDreamWorks / Paramount                                                  
## StudioDreamWorks / Universal                                               .  
## StudioDreamWorks Pictures                                                  .  
## StudioDreamWorks Pictures / Paramount Pictures                                
## StudioEmbassy Pictures                                                        
## StudioFox                                                                     
## StudioFox / Blue Sky                                                          
## StudioFox Searchlight Pictures                                                
## StudioGramercy Pictures / PolyGram                                            
## StudioHollywood Pictures                                                      
## StudioIcon / Newmarket                                                        
## StudioIFC Films                                                               
## StudioLionsgate                                                               
## StudioLionsgate / Summit                                                      
## StudioLionsgate Films                                                         
## StudioLucasfilm / 20th Century Fox                                            
## StudioMarvel Studios                                                          
## StudioMetro-Goldwyn-Mayer                                                     
## StudioMetro-Goldwyn-Mayer / Warner Bros. / Rastar                             
## StudioMGM                                                                     
## StudioMGM / Columbia                                                          
## StudioMGM / Universal                                                         
## StudioMiramax Films / Universal Pictures                                      
## StudioNational Air and Space Museum                                           
## StudioNew Line                                                                
## StudioNew Line Cinema                                                         
## StudioOrion Pictures                                                          
## StudioOrion Pictures / Warner Bros.                                           
## StudioParamount                                                               
## StudioParamount / DreamWorks                                                  
## StudioParamount / Lucasfilm                                                   
## StudioParamount / Marvel                                                      
## StudioParamount / Marvel Studios                                              
## StudioParamount Pictures                                                      
## StudioParamount Pictures / 20th Century Fox                                   
## StudioParamount Pictures / Lorimar                                            
## StudioParamount Pictures / Lucasfilm                                          
## StudioParamount Pictures / Orion Pictures                                     
## StudioParamount Pictures / PolyGram                                           
## StudioParamount Pictures / Warner Bros.                                    *  
## StudioSummit                                                               *  
## StudioSummit Entertainment                                                    
## StudioSunn Classic Pictures                                                .  
## StudioTouchstone                                                              
## StudioTouchstone Pictures                                                     
## StudioTouchstone Pictures / Amblin Entertainment                              
## StudioTouchstone Pictures / Imagine Entertainment                             
## StudioTriStar Pictures                                                        
## StudioTriStar Pictures / Amblin Entertainment                                 
## StudioTriStar Pictures / Carolco                                              
## StudioTriStar Pictures / Carolco Pictures                                     
## StudioTriStar Pictures / Carolco Pictures / Lightstorm Entertainment          
## StudioUnited Artists                                                          
## StudioUnited Artists Pictures                                                 
## StudioUnited Film Distribution Company                                        
## StudioUniversal                                                               
## StudioUniversal / DreamWorks                                                  
## StudioUniversal / Illumination                                                
## StudioUniversal Pictures                                                      
## StudioUniversal Pictures / Amblin Entertainment                               
## StudioUniversal Pictures / Imagine Entertainment                              
## StudioUniversal Pictures / ITC                                                
## StudioUniversal Pictures / RKO Pictures                                       
## StudioUniversal Studios                                                       
## StudioUniversal Studios / Cinema International Corporation                    
## StudioWalt Disney Pictures                                                    
## StudioWalt Disney Pictures / Pixar                                            
## StudioWalt Disney Productions                                                 
## StudioWarner Bros                                                             
## StudioWarner Bros / Legendary                                              .  
## StudioWarner Bros.                                                            
## StudioWarner Bros. / Columbia                                                 
## StudioWarner Bros. / Geffen Pictures                                          
## StudioWarner Bros. / Ladd                                                     
## StudioWarner Bros. / Legendary                                             *  
## StudioWarner Bros. / MGM / New Line                                           
## StudioWarner Bros. / New Line / MGM                                           
## StudioWarner Bros. / New Line Cinema / MGM                                    
## StudioWarner Bros. / PolyGram                                                 
## StudioWarner Bros. / The Ladd Company                                         
## StudioWarner Bros. / Universal Pictures                                       
## StudioWarner Bros. / Village Roadshow                                         
## StudioWarner Bros. Pictures                                                   
## Year                                                                       *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 0.727 on 286 degrees of freedom
## Multiple R-squared:  0.4536, Adjusted R-squared:  0.2416 
## F-statistic: 2.139 on 111 and 286 DF,  p-value: 2.181e-07

Similarly to our previous regressions, the adjusted r-squared value for this model is low (at approximately 24%), meaning that this linear regression does not explain very well the variability in the dataset. Even though some studios are shown to be significant (especially in the Rotten Tomatoes regression), I would be hesitant to consider the results as meaningful. It is worth mentioning, though, that in both regressions the Gross_Profit variable was deemed significant.

Part 5 - Conclusion:

The results of this endeavor were somewhat disappointing in that it appears that the variables that were significant in explaining the nature of the rating system or the relation between rating scores and gross profit, were absent from the dataset. However, we did determine that despite rating remaining fairly constant, the gross profits of high-ranking movies appear to increase by year.

For the question of whether the gross profit can predict the rank of a movie, we determined that it did and that the other variable that explained yearly rank was the IMDB scores.

For the question of whether profit has an effect on the rating (testing Rotten Tomatoes and IMDB separately), the outcome was unreliable and thus the answer is more than likely no.

For the question of what variables explain the star rating (testing Rotten Tomatoes and IMDB separately, again), gross profit was significant in both models. The other variables that were considered significant were some studios, however since the r-squared value of the regressions was low, it may very well be possible that the Studio variable itself was not deemed significant and, as such, these studios are not significant in turn.

Overall, putting these regression results together, we can see that the gross profit of a movie can predict the rank and has some significant value when regarding the star rating, however as a variable in a simple linear regression, gross profit did not explain the rating. So, it is more than likely that the higher a movie grosses, the more likely it will rank in the top ten movies of the year. And, just as a side note, it is very interesting how these high-ranking movies average at about a 6.5 and 7.0. If someone was to pursue an observational study on this topic, it would be interesting to note how movies ranked 8.5 and higher compared to the top ten movies of the year.

To summerize this experience, the dataset wasn’t difficult to work with, in the sense that it was already cleaned up and any editing or reformatting on my part was minimal. It did pose a challenge, though, because the questions I was asking didn’t seem to fit the data or, rather, the data wasn’t able to answer my questions to the capacity that I had anticipated or desired. Even when I tried to pursue different avenues to, in a roundabout way, answer my primary question, the results were inconclusive. Regardless, this small dataset still contains a wealth of information and, despite approaching it from the wrong direction, if asked more fitting questions, would prove very useful.