library(ggplot2)
library(corrplot)
## Warning: package 'corrplot' was built under R version 4.3.3
## corrplot 0.92 loaded
library(lindia)

1. Reading the data:

data <- read.csv ("C:\\Users\\varsh\\OneDrive\\Desktop\\Gitstuff\\age_gaps.CSV")

2. About the Data-

variable class description
movie_name character Name of the film
release_year integer Release year
director character Director of the film
age_difference integer Age difference between the characters in whole years
couple_number integer An identifier for the couple in case multiple couples are listed for this film
actor_1_name character The name of the older actor in this couple
actor_2_name character The name of the younger actor in this couple
character_1_gender character The gender of the older character, as identified by the person who submitted the data for this couple
character_2_gender character The gender of the younger character, as identified by the person who submitted the data for this couple
actor_1_birthdate date The birthdate of the older member of the couple
actor_2_birthdate date The birthdate of the younger member of the couple
actor_1_age integer The age of the older actor when the film was released
actor_2_age integer The age of the younger actor when the film was released

3. Describing the data:

summary(data)
##   movie_name         release_year    director         age_difference 
##  Length:1155        Min.   :1935   Length:1155        Min.   : 0.00  
##  Class :character   1st Qu.:1997   Class :character   1st Qu.: 4.00  
##  Mode  :character   Median :2004   Mode  :character   Median : 8.00  
##                     Mean   :2001                      Mean   :10.42  
##                     3rd Qu.:2012                      3rd Qu.:15.00  
##                     Max.   :2022                      Max.   :52.00  
##  couple_number   actor_1_name       actor_2_name       character_1_gender
##  Min.   :1.000   Length:1155        Length:1155        Length:1155       
##  1st Qu.:1.000   Class :character   Class :character   Class :character  
##  Median :1.000   Mode  :character   Mode  :character   Mode  :character  
##  Mean   :1.398                                                           
##  3rd Qu.:2.000                                                           
##  Max.   :7.000                                                           
##  character_2_gender actor_1_birthdate  actor_2_birthdate   actor_1_age   
##  Length:1155        Length:1155        Length:1155        Min.   :18.00  
##  Class :character   Class :character   Class :character   1st Qu.:33.00  
##  Mode  :character   Mode  :character   Mode  :character   Median :39.00  
##                                                           Mean   :40.64  
##                                                           3rd Qu.:47.00  
##                                                           Max.   :81.00  
##   actor_2_age   
##  Min.   :17.00  
##  1st Qu.:25.00  
##  Median :29.00  
##  Mean   :30.21  
##  3rd Qu.:34.00  
##  Max.   :68.00
  1. Release Year:

    • The dataset contains movies released between 1935 and 2022.

    • The median release year is 2004, indicating that the dataset has a relatively recent focus.

  2. Age Difference:

    • The age difference between couples in the movies ranges from 0 to 52 years, with a median of 8 years.

    • The mean age difference is 10.42 years, suggesting that, on average, there’s a significant age gap between the couples in the movies.

  3. Couple Number:

    • The number of couples varies from 1 to 7, with a median of 1.

    • This indicates that most of the movies in the dataset focus on one couple.

  4. Actor Ages:

    • Actor 1’s age ranges from 18 to 81 years, with a median age of 39.

    • Actor 2’s age ranges from 17 to 68 years, with a median age of 29.

    • On average, Actor 1 tends to be older than Actor 2.

  5. Gender:

    • The dataset includes couples with various gender combinations (man-woman, man-man, woman-woman).

    • However, it seems that the majority of couples are composed of a man and a woman.

4. Exploratory Data Analysis:

1. Histogram of Age Difference:

This will show the distributions of age difference between the couples.

# Histogram of Age Difference
ggplot(data, aes(x = age_difference)) +
  geom_histogram(binwidth = 5, fill = "skyblue", color = "black") +
  labs(title = "Histogram of Age Difference Between Romantic Partners",
       x = "Age Difference",
       y = "Frequency") +
  theme_minimal()

Inferences-

  • From the above plot we can see that this is not a normal distribution and this is skewed towards the right that is towards the higher age difference.

  • This means that there are more instances of larger age differences compared to smaller ones.

  • And we can also observe that majority of the age difference lies between 5-20 years, couples with age differences in this range are quite common.

  • Couples with smaller age differences (closer to 0) are less common, while those with larger age differences are more prevalent.

2. Boxplot of Age Difference by Gender:

This will help visualize how age differences vary between different gender combinations of couples.

ggplot(data, aes(x = character_1_gender, y = age_difference, fill = character_1_gender)) +
  geom_boxplot() +
  labs(title = "Boxplot of Age Difference by Gender",
       x = "Character 1 Gender",
       y = "Age Difference") +
  theme_minimal()

Inferences-

  • The boxplot visually represents the distribution of age differences between romantic partners based on the gender of Character 1.

  • We have two categories for Character 1 gender: “Man” and “Woman.”

  • As we can see from the above plot when the character 1 gender is a man then the distribution is a lot bigger than it is a woman.

  • And when character 1 gender is a man the outlier value are higher than when character 1 gender is a woman.

3. Barplot of Release Year:

A barplot will help show the frequency of movies released in each year, providing an overview of the temporal distribution of the dataset.

ggplot(data, aes(x = factor(release_year))) +
  geom_bar(fill = "darkorange") +
  labs(title = "Barplot of Release Year",
       x = "Release Year",
       y = "Count") +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

Inference-

  • The barplot shows the distribution of movie releases across different years.

  • From the above plot it is clear that most of the movies were released between 1995 to 2019.

  • Also, the maximum number of films were released in the years 1998 and 2001 with the count of 50.

  • The overall trend suggests that movie production has been relatively consistent over the years, with fluctuations around specific periods.

4. Pie Chart of Gender Composition:

This pie chart can illustrate the proportion of different gender combinations of romantic couples in the dataset.

gender_counts <- table(data$character_1_gender, data$character_2_gender)
pie(gender_counts, labels = c("Woman-Woman", "Man-Man", "Man-Woman"), main = "Gender Composition of Romantic Couples", col = c("skyblue", "orange", "pink"))

Inferences-

  • From the above chart we can see that majority of the romantic couples in the dataset are heterosexual.

  • This aligns with societal norms and historical representations in media.

  • All though majority are heterosexual, there seems to be a rise in homosexual movies aswell.

  • The rise in representation of same-sex couples reflects a positive shift toward diversity and inclusivity in media.

5. Scatterplot of Actor Ages:

Scatterplot can be used to visualize the relationship between the ages of Actor 1 and Actor 2, possibly highlighting any patterns or trends.

ggplot(data, aes(x = actor_1_age, y = actor_2_age, color = character_1_gender)) +
  geom_point() +
  labs(title = "Scatterplot of Actor Ages",
       x = "Actor 1 Age",
       y = "Actor 2 Age") +
  theme_minimal()

Inferences-

  • The scatterplot displays the relationship between the ages of two actors in romantic couples.

  • Each point represents a pair of actors, with their ages on the x-axis (Actor 1) and y-axis (Actor 2).

  • There seems to be an abnormally lot of couples whose age difference is more than 50. These extreme cases could involve significant generational gaps or unique casting choices.

  • But majority of age difference of the two actors lies in the range of 5-20 years.

  • This scatterplot allows us to explore the diversity of age dynamics in movie couples.

6. Correlation Matrix-

numeric_df <- data[, sapply(data, is.numeric)]

correlation_matrix <- cor(numeric_df)

print(correlation_matrix)
##                release_year age_difference couple_number actor_1_age
## release_year     1.00000000     -0.2043065    0.02880378 -0.01687673
## age_difference  -0.20430653      1.0000000   -0.24577787  0.70396310
## couple_number    0.02880378     -0.2457779    1.00000000 -0.10008828
## actor_1_age     -0.01687673      0.7039631   -0.10008828  1.00000000
## actor_2_age      0.20850512     -0.1564648    0.13987535  0.59134351
##                actor_2_age
## release_year     0.2085051
## age_difference  -0.1564648
## couple_number    0.1398754
## actor_1_age      0.5913435
## actor_2_age      1.0000000
corrplot(correlation_matrix, method = "color", type = "upper", order = "hclust",
         tl.col = "black", tl.srt = 45, tl.cex = 0.8,
         addCoef.col = "black", number.cex = 0.7)

Inferences-

  • Each cell in a correlation matrix represents the relationship between two variables, ranging from -1 to 1.

  • A positive correlation coefficient (close to 1) indicates that as one variable increases, the other tends to increase as well.

  • A negative correlation coefficient (close to -1) suggests that as one variable increases, the other tends to decrease.

  • age_difference has a strong positive correlation with actor_1_age, and a very weak correlation with actor_2_age.

  • So this means that the movie is made making the actor_1 the priority and actor_2 as the secondary priority.

7. Checking for directors who cast actors with huge age differences.

director_age_diff <- aggregate(age_difference ~ director, data = data, FUN = mean)

director_age_diff <- director_age_diff[order(-director_age_diff$age_difference), ]

head(director_age_diff)
##          director age_difference
## 165     Hal Ashby             52
## 252     Katt Shea             42
## 229     Jon Amiel             39
## 174 Irving Pichel             36
## 442 Sofia Coppola             34
## 90  Daniel Petrie             33
top_ten_directors <- head(director_age_diff, 10)

barplot(top_ten_directors$age_difference, 
        names.arg = top_ten_directors$director, 
        main = "Mean Age Difference by Director (Top 10)", 
        xlab = "Director", 
        ylab = "Mean Age Difference", 
        col = "skyblue",
        ylim = c(0, max(top_ten_directors$age_difference) + 5),
        las = 2)  

text(x = 1:10, y = top_ten_directors$age_difference + 1, labels = round(top_ten_directors$age_difference, 2), pos = 3)

abline(h = 0, lty = 2)

par(las=2)

legend("topright", legend = "Mean Age Difference", fill = "skyblue")

Inferences-

  • From the above we can see that the age descrepencies in movies directed by Hal Ashby is very high with and age difference of 52 years.

  • This is highly significant, suggesting that Ashby intentionally cast actors with long age differences.

  • And there seem to be lot of directors who cast actors whose age difference is more than 30.

  • The fact that numerous directors show this trend suggests that it is not a singular event but rather a repeating pattern in certain films.

5. Modeling-

Model-1

Here age_difference is the response variable and release_year is the explanatory variable.

lm_model <- lm(age_difference ~ release_year, data = data)

summary(lm_model)
## 
## Call:
## lm(formula = age_difference ~ release_year, data = data)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -16.203  -6.531  -2.022   4.844  40.128 
## 
## Coefficients:
##               Estimate Std. Error t value Pr(>|t|)    
## (Intercept)  223.00941   29.99798   7.434 2.05e-13 ***
## release_year  -0.10625    0.01499  -7.087 2.38e-12 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 8.335 on 1153 degrees of freedom
## Multiple R-squared:  0.04174,    Adjusted R-squared:  0.04091 
## F-statistic: 50.22 on 1 and 1153 DF,  p-value: 2.384e-12
ggplot(data, aes(x = release_year, y = age_difference)) +
  geom_point() +  
  geom_smooth(method = "lm", se = FALSE, color = "blue") +
  labs(title = "Scatter Plot of Age Difference vs. Release Year",
       x = "Release Year",
       y = "Age Difference") +
  theme_minimal()
## `geom_smooth()` using formula = 'y ~ x'

Inferences-

  • As we can see the linear regresion model between the two variables age_difference and release_year is a very bad model.

  • Also, it has a very low adjusted r square value which is more of a proof that it is a bad model.

  • Let’s try a GLM with a quadratic equation, to see if this model fits better.

Model-1 GLM

model <- lm(age_difference ~ I(release_year ^ 2) + release_year,
            data)

rsquared <- summary(model)$r.squared

data |>
  ggplot(mapping = aes(x = age_difference ^ 2, 
                       y = release_year)) +
  geom_point() +
  geom_smooth(method = 'lm', color = 'gray', linetype = 'dashed',
              se = FALSE) +
  geom_smooth(se = FALSE) +
  labs(title = "Price vs. (Price Per Sq. Ft.) ^ 2",
       subtitle = paste("Linear Fit R-Squared =", round(rsquared, 3))) +
  theme_classic()
## `geom_smooth()` using formula = 'y ~ x'
## `geom_smooth()` using method = 'gam' and formula = 'y ~ s(x, bs = "cs")'

summary(model)
## 
## Call:
## lm(formula = age_difference ~ I(release_year^2) + release_year, 
##     data = data)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -17.965  -6.511  -2.048   4.918  40.211 
## 
## Coefficients:
##                     Estimate Std. Error t value Pr(>|t|)
## (Intercept)        3.694e+03  2.516e+03   1.469    0.142
## I(release_year^2)  8.796e-04  6.374e-04   1.380    0.168
## release_year      -3.601e+00  2.533e+00  -1.422    0.155
## 
## Residual standard error: 8.332 on 1152 degrees of freedom
## Multiple R-squared:  0.04332,    Adjusted R-squared:  0.04166 
## F-statistic: 26.08 on 2 and 1152 DF,  p-value: 8.336e-12

Inferences:

  • Even this GLM seems to be a bad model as it has very low R-Squared value, a bit higher than our previous model but still bad.
  • Let’s consider some other variables.

Model-2

lm_model <- lm(age_difference ~ actor_1_age, data)
ggplot(data, aes(x = actor_1_age, y = age_difference)) +
  geom_point() +  
  geom_smooth(method = "lm", se = FALSE, color = "blue") +
  labs(title = "Scatter Plot of Age Difference vs. actor 1 age",
       x = "Release Year",
       y = "Age Difference") +
  theme_minimal()
## `geom_smooth()` using formula = 'y ~ x'

summary(lm_model)
## 
## Call:
## lm(formula = age_difference ~ actor_1_age, data = data)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -25.302  -3.886  -0.059   3.988  22.273 
## 
## Coefficients:
##              Estimate Std. Error t value Pr(>|t|)    
## (Intercept) -12.93178    0.71642  -18.05   <2e-16 ***
## actor_1_age   0.57477    0.01708   33.66   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 6.048 on 1153 degrees of freedom
## Multiple R-squared:  0.4956, Adjusted R-squared:  0.4951 
## F-statistic:  1133 on 1 and 1153 DF,  p-value: < 2.2e-16

Inferences:

  • This model is a better model.
  • The actor_1_age has an intercept of 0.57 which means that the values of age_difference increase 0.57 times for every unit increase in actor_1_age.
  • This is a better model but let’s search for an even better model.

Model -3

model <- lm(age_difference ~ actor_1_age + director, data)
summary(model)
## 
## Call:
## lm(formula = age_difference ~ actor_1_age + director, data = data)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -21.005  -2.001   0.000   2.058  16.221 
## 
## Coefficients:
##                                          Estimate Std. Error t value Pr(>|t|)
## (Intercept)                              -7.46283    5.79137  -1.289   0.1980
## actor_1_age                               0.55224    0.02441  22.627   <2e-16
## directorAdam McKay                       -7.40801    6.64601  -1.115   0.2654
## directorAdam Nee, Aaron Nee              -8.56731    8.16591  -1.049   0.2945
## directorAdam Shankman                    -3.75753    6.43945  -0.584   0.5597
## directorAdrian Lyne                      -3.81849    6.22345  -0.614   0.5397
## directorAlan Parker                       3.13429    8.13481   0.385   0.7001
## directorAlan Shapiro                     -2.65673    7.04378  -0.377   0.7062
## directorAlejandro Agresti               -15.73141    8.14019  -1.933   0.0537
## directorAlejandro González Iñárritu       1.61186    8.14359   0.198   0.8432
## directorAlex Garland                     -7.19904    6.64278  -1.084   0.2789
## directorAlex Kurtzman                    -0.91058    8.15967  -0.112   0.9112
## directorAlfonso Arau                     -5.65673    7.04378  -0.803   0.4222
## directorAlfonso Cuarón                   -1.15673    7.04378  -0.164   0.8696
## directorAlfred Hitchcock                  2.19180    6.16651   0.355   0.7224
## directorAmy Heckerling                   -5.00377    6.43215  -0.778   0.4369
## directorAnand Tucker                     -4.48886    6.43611  -0.697   0.4858
## directorAndrew Davis                      2.50737    7.05865   0.355   0.7225
## directorAndrew Niccol                    -6.64183    7.04578  -0.943   0.3462
## directorAndy Cadiff                      -0.89551    8.13316  -0.110   0.9124
## directorAndy Serkis                     -10.31346    8.13434  -1.268   0.2053
## directorAndy Tennant                     -4.29257    6.30129  -0.681   0.4960
## directorAng Lee                          -4.47550    6.14919  -0.728   0.4670
## directorAngela Robinson                  -7.63686    6.64421  -1.149   0.2508
## directorAnne Fletcher                    -5.62693    6.64704  -0.847   0.3976
## directorAnthony Minghella                -8.91795    7.04611  -1.266   0.2061
## directorAntoine Fuqua                     3.94022    7.05355   0.559   0.5766
## directorAnton Corbijn                    -4.59712    8.14915  -0.564   0.5729
## directorAntony Hoffman                   -7.17917    8.13920  -0.882   0.3781
## directorAri Aster                        -3.44776    8.13305  -0.424   0.6718
## directorArthur Hiller                    -7.65673    8.13335  -0.941   0.3469
## directorAtom Egoyan                      -5.30609    7.06978  -0.751   0.4532
## directorAutumn de Wilde                   0.02981    8.13598   0.004   0.9971
## directorAva DuVernay                    -12.17917    8.13920  -1.496   0.1351
## directorBaltasar Kormákur                -5.20898    8.13360  -0.640   0.5221
## directorBarbet Schroeder                 -6.94039    8.14487  -0.852   0.3945
## directorBarry Levinson                   -1.35834    8.15774  -0.167   0.8678
## directorBarry Sonnenfeld                -11.01507    8.16376  -1.349   0.1777
## directorBaz Luhrmann                     -6.06346    6.43138  -0.943   0.3461
## directorBen Stiller                      -6.25876    6.64634  -0.942   0.3467
## directorBen Younger                      -3.86571    8.13481  -0.475   0.6348
## directorBernardo Bertolucci               8.95512    8.14765   1.099   0.2721
## directorBernie Goldmann, Melisa Wallack  -8.07468    7.04851  -1.146   0.2524
## directorBetty Thomas                     -1.28366    8.14125  -0.158   0.8748
## directorBill Condon                      -2.17917    6.64816  -0.328   0.7432
## directorBill Purple                      -8.73141    8.14019  -1.073   0.2838
## directorBille Woodruff                   -1.55224    8.13305  -0.191   0.8487
## directorBilly Bob Thornton               -5.10449    8.13316  -0.628   0.5305
## directorBilly Crystal                   -11.49263    8.14623  -1.411   0.1588
## directorBilly Wilder                      2.83573    7.05634   0.402   0.6879
## directorBlake Edwards                    -9.76122    8.13393  -1.200   0.2306
## directorBoaz Yakin                       -0.36571    7.04547  -0.052   0.9586
## directorBobby Farrelly, Peter Farrelly   -5.28064    6.30381  -0.838   0.4025
## directorBobcat Goldthwait                 0.43269    8.16591   0.053   0.9578
## directorBonnie Hunt                      -4.62693    8.13829  -0.569   0.5699
## directorBoots Riley                      -3.86571    8.13481  -0.475   0.6348
## directorBrad Silberling                  -9.97019    8.13598  -1.225   0.2209
## directorBradley Cooper                   -5.28366    8.14125  -0.649   0.5166
## directorBrian De Palma                    1.71634    8.14125   0.211   0.8331
## directorBrian Helgeland                  -4.10449    7.04357  -0.583   0.5603
## directorBrian Levant                     -3.31346    8.13434  -0.407   0.6839
## directorBrian Robbins                    -8.33590    7.05422  -1.182   0.2378
## directorBruce Joel Rubin                  0.26859    8.14019   0.033   0.9737
## directorBruce Robinson                    2.83573    7.05634   0.402   0.6879
## directorBryan Singer                     -3.64928    6.43099  -0.567   0.5706
## directorCameron Crowe                    -3.91050    6.43458  -0.608   0.5436
## directorCarl Rinsch                      -2.59712    8.14915  -0.319   0.7501
## directorCary Fukunaga                     0.68654    8.13434   0.084   0.9328
## directorCatherine Hardwicke              -4.49551    6.30000  -0.714   0.4757
## directorChad Stahelski                  -13.14936    8.15072  -1.613   0.1072
## directorCharles Shyer                     4.19391    8.15587   0.514   0.6073
## directorCharles Walters                   1.50737    7.05865   0.214   0.8310
## directorCharlie Chaplin                   1.40288    7.06202   0.199   0.8426
## directorChen Kaige                      -10.20898    8.13360  -1.255   0.2099
## directorChris Columbus                   -9.01005    6.65732  -1.353   0.1764
## directorChris Rock                       -7.73141    7.05168  -1.096   0.2733
## directorChris Wedge                      -7.00000    8.13302  -0.861   0.3897
## directorChris Weitz                      -1.02981    8.13598  -0.127   0.8993
## directorChristopher Nolan                -4.40728    6.14999  -0.717   0.4739
## directorChuck Russell                    -0.20898    8.13360  -0.026   0.9795
## directorClint Eastwood                   -8.75385    7.06771  -1.239   0.2160
## directorColin Higgins                    -7.94039    8.14487  -0.975   0.3300
## directorColin Trevorrow                 -10.41795    8.13536  -1.281   0.2008
## directorCourtney Hunt                   -14.01507    7.07887  -1.980   0.0481
## directorCraig Brewer                    -11.41795    8.13536  -1.403   0.1610
## directorCraig Gillespie                  -3.86571    8.13481  -0.475   0.6348
## directorCurtis Hanson                    -8.76875    7.05946  -1.242   0.2146
## directorDagen Merrill                    -2.34327    8.13335  -0.288   0.7734
## directorDamien Chazelle                  -9.52244    8.13668  -1.170   0.2423
## directorDan Kwan, Daniel Scheinert      -16.67180    8.17043  -2.041   0.0417
## directorDaniel Petrie                     9.53717    8.16168   1.169   0.2430
## directorDanny Boyle                      -3.57314    6.29990  -0.567   0.5708
## directorDanny DeVito                     -6.28366    8.14125  -0.772   0.4405
## directorDarren Aronofsky                 -9.78366    7.05291  -1.387   0.1659
## directorDavid Ayer                        1.26859    6.64937   0.191   0.8488
## directorDavid Cronenberg                 -9.49263    8.14623  -1.165   0.2443
## directorDavid Dobkin                     -6.63438    6.43412  -1.031   0.3029
## directorDavid Fincher                    -5.29858    6.07192  -0.873   0.3832
## directorDavid Frankel                    -1.53734    7.04468  -0.218   0.8273
## directorDavid Koepp                       0.22371    8.17524   0.027   0.9782
## directorDavid Leitch                     -0.37324    7.06292  -0.053   0.9579
## directorDavid Lowery                    -10.52244    8.13668  -1.293   0.1964
## directorDavid Mamet                      -8.41795    8.13536  -1.035   0.3012
## directorDavid McNally                    -4.44776    8.13305  -0.547   0.5847
## directorDavid Mirkin                     -8.45529    7.05110  -1.199   0.2309
## directorDavid O. Russell                 -2.45975    6.30347  -0.390   0.6965
## directorDavid Yates                      -5.89060    6.64568  -0.886   0.3757
## directorDavid Zucker                     -7.77629    8.17524  -0.951   0.3419
## directorDax Shepard                     -10.73141    8.14019  -1.318   0.1879
## directorDelmer Daves                      5.95512    8.14765   0.731   0.4651
## directorDemian Lichtenstein              -7.14936    8.15072  -0.877   0.3807
## directorDenise Di Novi                  -13.12693    7.04949  -1.862   0.0630
## directorDennis Dugan                     -5.46938    6.06806  -0.901   0.3677
## directorDerek Cianfrance                 -6.08958    7.04519  -0.864   0.3877
## directorDewey Nicks                      -4.73878    7.04446  -0.673   0.5014
## directorDome Karukoski                   -9.10449    8.13316  -1.119   0.2634
## directorDon Michael Paul                  4.88044    8.16813   0.597   0.5504
## directorDonald Petrie                    -6.64183    7.04578  -0.943   0.3462
## directorDoug Liman                       -3.39808    6.64937  -0.511   0.6095
## directorDouglas McGrath                  -8.95529    7.05110  -1.270   0.2045
## directorDuncan Jones                     -7.86571    8.13481  -0.967   0.3339
## directorDustin Lance Black               -3.35080    7.04899  -0.475   0.6347
## directorEdgar Wright                     -0.97019    7.04682  -0.138   0.8905
## directorEdward Zwick                     -7.10449    8.13316  -0.874   0.3827
## directorEli Roth                          1.29839    6.66426   0.195   0.8456
## directorElio Petri                       -3.17917    8.13920  -0.391   0.6962
## directorEmile Ardolino                   -7.24883    6.64979  -1.090   0.2761
## directorEric Bress, J. Mackye Gruber     -6.00000    8.13302  -0.738   0.4609
## directorEric Brevig                      -5.49263    8.14623  -0.674   0.5004
## directorEricson Core                     -8.86571    8.13481  -1.090   0.2762
## directorF. Gary Gray                     -6.05224    7.04344  -0.859   0.3905
## directorFederico Fellini                 -4.42436    6.15369  -0.719   0.4724
## directorFernando Meirelles               -8.28366    8.14125  -1.017   0.3093
## directorFranc. Reyes                     -8.58958    7.04519  -1.219   0.2232
## directorFrancis Ford Coppola             -6.42789    6.64170  -0.968   0.3335
## directorFrancis Lawrence                 -3.58958    6.43167  -0.558   0.5770
## directorFrank Capra                      -3.04488    7.06029  -0.431   0.6664
## directorFrank Coraci                     -3.68163    6.64257  -0.554   0.5796
## directorFrank Pierson                    -8.07468    8.13745  -0.992   0.3214
## directorFred Zinnemann                    0.33573    7.05634   0.048   0.9621
## directorGabriele Muccino                 -3.62693    8.13829  -0.446   0.6560
## directorGarry Marshall                   -3.14039    6.31511  -0.497   0.6192
## directorGary Ross                         2.64166    8.15774   0.324   0.7462
## directorGary Winick                      -5.74263    6.44642  -0.891   0.3734
## directorGavin Hood                       -6.17917    8.13920  -0.759   0.4480
## directorGeorge Armitage                  -5.65673    8.13335  -0.695   0.4870
## directorGeorge C. Wolfe                  -9.11956    8.16813  -1.116   0.2646
## directorGeorge Clooney                  -10.49263    8.14623  -1.288   0.1982
## directorGeorge Cukor                     -3.42548    7.06477  -0.485   0.6279
## directorGeorge Lucas                      2.13429    8.13481   0.262   0.7931
## directorGeorge Nolfi                     -2.17917    8.13920  -0.268   0.7890
## directorGeorge Roy Hill                 -12.04488    8.14765  -1.478   0.1398
## directorGeorge Seaton                    -3.01507    8.16376  -0.369   0.7120
## directorGeorge Tillman Jr.               -7.45898    6.43046  -1.160   0.2465
## directorGia Coppola                      -0.27612    7.04341  -0.039   0.9687
## directorGil Junger                       -2.02981    7.04682  -0.288   0.7734
## directorGina Prince-Bythewood            -6.55224    8.13305  -0.806   0.4208
## directorGlenn Ficarra, John Requa        -9.22994    6.31477  -1.462   0.1443
## directorGore Verbinski                    1.10449    8.13316   0.136   0.8920
## directorGreg Mottola                     -7.44039    7.05709  -1.054   0.2921
## directorGreta Gerwig                     -4.23878    8.13393  -0.521   0.6025
## directorGuillermo del Toro               -9.00753    6.43945  -1.399   0.1624
## directorGus Van Sant                     -4.24632    7.04722  -0.603   0.5470
## directorGuy Hamilton                     -0.73640    6.07491  -0.121   0.9036
## directorGuy Ritchie                      -6.00000    8.13302  -0.738   0.4609
## directorHal Ashby                        18.04454    8.21351   2.197   0.0284
## directorHal Needham                      -5.17917    8.13920  -0.636   0.5248
## directorHallie Meyers-Shyer              -6.11202    7.05490  -0.866   0.3866
## directorHarold Ramis                     -5.47468    6.30553  -0.868   0.3856
## directorHart Bochner                     -4.07468    8.13745  -0.501   0.6167
## directorHomi Adajania                    -5.89551    8.13316  -0.725   0.4688
## directorHoward Deutch                    -6.41795    8.13536  -0.789   0.4305
## directorHoward Hawks                      1.86186    6.44309   0.289   0.7727
## directorHugh Wilson                       4.50737    8.14623   0.553   0.5802
## directorIrving Pichel                    12.53717    8.16168   1.536   0.1250
## directorIsabel Coixet                    -4.93302    7.10105  -0.695   0.4875
## directorIvan Reitman                     -5.40308    6.31721  -0.855   0.3927
## directorJ.C. Chandor                    -10.97019    8.13598  -1.348   0.1780
## directorJ.J. Abrams                      -6.02244    7.04763  -0.855   0.3931
## directorJack Clayton                     -4.52244    8.13668  -0.556   0.5785
## directorJacob Aaron Estes                -6.49263    7.05865  -0.920   0.3580
## directorJake Kasdan                      -6.73141    8.14019  -0.827   0.4086
## directorJames Cameron                    -4.23878    8.13393  -0.521   0.6025
## directorJames Foley                      -4.86571    8.13481  -0.598   0.5500
## directorJames Franco                     -8.86571    8.13481  -1.090   0.2762
## directorJames Gray                       -9.46283    8.16168  -1.159   0.2467
## directorJames Gunn                      -11.41795    8.13536  -1.403   0.1610
## directorJames L. Brooks                  -5.57223    6.65404  -0.837   0.4027
## directorJames Mangold                    -5.33213    6.43326  -0.829   0.4075
## directorJames Marsh                      -9.20898    8.13360  -1.132   0.2580
## directorJames McTeigue                    0.83573    7.05634   0.118   0.9058
## directorJames Wan                       -12.32100    7.06115  -1.745   0.0815
## directorJan de Bont                      -9.10449    8.13316  -1.119   0.2634
## directorJason Moore                      -5.44776    8.13305  -0.670   0.5032
## directorJason Reitman                    -8.18513    6.30574  -1.298   0.1947
## directorJay Roach                        -4.66795    6.43268  -0.726   0.4683
## directorJean-Jacques Annaud              -1.98510    7.04426  -0.282   0.7782
## directorJean-Marc Vallée                 -6.00000    8.13302  -0.738   0.4609
## directorJean-Pierre Jeunet               -2.57714    6.64156  -0.388   0.6981
## directorJean Negulesco                    8.53717    8.16168   1.046   0.2960
## directorJeff Franklin                    -3.08958    7.04519  -0.439   0.6611
## directorJeff Tomsic                     -14.38814    6.44309  -2.233   0.0259
## directorJeffrey Nachmanoff               -4.35834    8.15774  -0.534   0.5933
## directorJerry Zucker                      0.36805    6.66160   0.055   0.9560
## directorJim Field Smith                  -8.00000    8.13302  -0.984   0.3257
## directorJim Gillespie                    -1.68654    7.04492  -0.239   0.8109
## directorJoan Chen                         1.29839    8.15237   0.159   0.8735
## directorJoe & Anthony Russo              -3.67917    7.05054  -0.522   0.6020
## directorJoe Johnston                     -8.10449    8.13316  -0.996   0.3194
## directorJoe Wright                       -2.12539    6.30008  -0.337   0.7360
## directorJoel Coen                         1.28051    6.31444   0.203   0.8394
## directorJoel Schumacher                  -4.41795    8.13536  -0.543   0.5873
## directorJoel Zwick                      -14.17917    8.13920  -1.742   0.0820
## directorJohn Carney                       5.02981    8.13598   0.618   0.5367
## directorJohn Cassavetes                  -4.53740    6.65303  -0.682   0.4955
## directorJohn Crowley                     -2.34327    8.13335  -0.288   0.7734
## directorJohn Curran                      -6.41304    6.65971  -0.963   0.3359
## directorJohn Fortenberry                 -7.00000    8.13302  -0.861   0.3897
## directorJohn Glen                        -0.13543    5.96315  -0.023   0.9819
## directorJohn Hamburg                     -9.20007    6.30829  -1.458   0.1452
## directorJohn Herzfeld                    -0.56731    8.16591  -0.069   0.9446
## directorJohn Huston                      -3.67426    6.24320  -0.589   0.5564
## directorJohn Krasinski                   -6.97019    8.13598  -0.857   0.3919
## directorJohn M. Chu                      -7.22393    6.64568  -1.087   0.2774
## directorJohn Madden                      -6.00000    8.13302  -0.738   0.4609
## directorJohn McNaughton                  -3.31346    7.04492  -0.470   0.6383
## directorJohn McTiernan                  -12.28366    7.05291  -1.742   0.0820
## directorJohn Patrick Shanley            -12.52244    8.13668  -1.539   0.1243
## directorJohn Stockwell                   -0.79102    8.13360  -0.097   0.9226
## directorJon Amiel                         8.35801    8.19434   1.020   0.3081
## directorJon Avnet                        -3.67180    8.17043  -0.449   0.6533
## directorJon Favreau                      -7.24883    6.64979  -1.090   0.2761
## directorJon M. Chu                       -7.90305    7.05000  -1.121   0.2627
## directorJon Turteltaub                   -3.67917    7.05054  -0.522   0.6020
## directorJon Watts                        -9.19904    6.64278  -1.385   0.1666
## directorJonas Åkerlund                    4.85064    8.15072   0.595   0.5520
## directorJonathan Levine                  -7.47019    7.04682  -1.060   0.2895
## directorJonathan Lynn                     1.03349    6.44555   0.160   0.8727
## directorJonathan Mostow                   1.64166    8.15774   0.201   0.8406
## directorJordan Mechner                   -3.10449    8.13316  -0.382   0.7028
## directorJordan Peele                     -8.48510    7.04426  -1.205   0.2288
## directorJoseph Gordon-Levitt             -4.00753    7.05229  -0.568   0.5701
## directorJoseph Kosinski                 -10.68670    7.07531  -1.510   0.1314
## directorJoseph L. Mankiewicz              9.85064    8.15072   1.209   0.2273
## directorJosh Boone                       -2.23878    8.13393  -0.275   0.7832
## directorJosh Radnor                       1.47756    8.13668   0.182   0.8560
## directorJoss Whedon                      -7.44039    7.05709  -1.054   0.2921
## directorJudd Apatow                      -7.61386    6.10650  -1.247   0.2129
## directorJudy Greer                      -15.59712    7.06202  -2.209   0.0276
## directorJulian Farino                     5.19391    8.15587   0.637   0.5245
## directorJulian Jarrold                   -5.00000    8.13302  -0.615   0.5389
## directorJustin Chadwick                  -0.12693    7.04949  -0.018   0.9856
## directorKatt Shea                        16.88044    8.16813   2.067   0.0392
## directorKelly Makin                     -11.07468    8.13745  -1.361   0.1740
## directorKen Kwapis                       -9.45032    6.22247  -1.519   0.1293
## directorKen Scott                        -4.28366    8.14125  -0.526   0.5990
## directorKenneth Branagh                  -6.32837    7.04350  -0.898   0.3693
## directorKevin Bray                       -4.31346    6.64220  -0.649   0.5163
## directorKevin Lima                       -8.79856    7.04806  -1.248   0.2124
## directorKevin Reynolds                   -5.39928    6.43099  -0.840   0.4015
## directorKevin Rodney Sullivan            -1.62693    8.13829  -0.200   0.8416
## directorKevin Smith                      -4.88061    7.04366  -0.693   0.4886
## directorKevin Spacey                      6.61186    8.14359   0.812   0.4171
## directorKing Vidor                       -2.88061    7.04366  -0.409   0.6827
## directorLana Wachowski, Lilly Wachowski  -8.86571    8.13481  -1.090   0.2762
## directorLarry Charles                   -10.17917    8.13920  -1.251   0.2115
## directorLasse Hallström                  -5.01867    6.43007  -0.781   0.4354
## directorLawrence Kasdan                  -7.95529    7.05110  -1.128   0.2596
## directorLee H. Katzin                   -10.17917    8.13920  -1.251   0.2115
## directorLee Tamahori                     -0.09712    7.06202  -0.014   0.9890
## directorLee Toland Krieger               -5.15673    7.04378  -0.732   0.4644
## directorLeo McCarey                      -4.80609    8.15587  -0.589   0.5559
## directorLewis Gilbert                    -0.54593    6.16244  -0.089   0.9294
## directorLisa Cholodenko                 -16.20161    7.06573  -2.293   0.0222
## directorLone Scherfig                     0.47756    8.13668   0.059   0.9532
## directorLorene Scafaria                   2.85064    8.15072   0.350   0.7266
## directorLouis Leterrier                  -4.00753    7.05229  -0.568   0.5701
## directorLouis Malle                      -0.83590    8.14239  -0.103   0.9183
## directorLuc Besson                        4.26859    8.14019   0.524   0.6002
## directorLuca Guadagnino                  -0.65673    8.13335  -0.081   0.9357
## directorLuis Mandoki                     -8.03985    6.64537  -1.210   0.2268
## directorLynn Shelton                     -3.62693    7.04949  -0.514   0.6071
## directorM. Night Shyamalan               -3.90305    7.05000  -0.554   0.5800
## directorMalcolm Venville                 -6.94039    8.14487  -0.852   0.3945
## directorMarc Forster                     -3.36725    6.31282  -0.533   0.5939
## directorMarc Klein                       -0.59712    8.14915  -0.073   0.9416
## directorMarc Lawrence                    -7.61202    7.05490  -1.079   0.2810
## directorMarc Webb                        -4.65378    6.30512  -0.738   0.4607
## directorMarielle Heller                   1.92532    8.13745   0.237   0.8130
## directorMark Mylod                       -6.86571    8.13481  -0.844   0.3990
## directorMark Neveldine, Brian Taylor     -5.07468    8.13745  -0.624   0.5331
## directorMark Pellington                  -2.80609    8.15587  -0.344   0.7309
## directorMark Piznarski                    0.08958    7.04519   0.013   0.9899
## directorMark Steven Johnson              -6.28366    8.14125  -0.772   0.4405
## directorMark Waters                      -4.31346    7.04492  -0.612   0.5406
## directorMartin Brest                     -6.08958    7.04519  -0.864   0.3877
## directorMartin Campbell                  -1.59210    6.64634  -0.240   0.8108
## directorMartin Scorsese                  -4.04369    5.97594  -0.677   0.4989
## directorMassy Tadjedin                   -4.56720    6.64322  -0.687   0.4920
## directorMatthew Ross                    -18.35834    8.15774  -2.250   0.0248
## directorMatthew Vaughn                   -4.60898    6.30057  -0.732   0.4647
## directorMax Joseph                       -4.00000    8.13302  -0.492   0.6230
## directorMaya Forbes                      -6.59712    8.14915  -0.810   0.4185
## directorMcG                              -9.91795    7.04611  -1.408   0.1597
## directorMel Gibson                       -5.91795    7.04611  -0.840   0.4013
## directorMelville Shavelson                7.64166    8.15774   0.937   0.3492
## directorMichael Apted                    -4.94039    6.65510  -0.742   0.4581
## directorMichael Bay                      -4.68905    6.21176  -0.755   0.4506
## directorMichael Curtiz                   -0.08958    7.04519  -0.013   0.9899
## directorMichael Gracey                   -3.85080    7.04899  -0.546   0.5851
## directorMichael Hoffman                 -11.35080    7.04899  -1.610   0.1078
## directorMichael Lehmann                  -8.01998    6.65254  -1.206   0.2284
## directorMichael Mann                     -6.36202    6.44231  -0.988   0.3238
## directorMichael Patrick King            -11.73518    6.45060  -1.819   0.0693
## directorMichael Rymer                    -4.10449    8.13316  -0.505   0.6140
## directorMichael Showalter                -9.07468    8.13745  -1.115   0.2652
## directorMichael Sucsy                    -9.64183    7.04578  -1.368   0.1716
## directorMichael Tollin                   -0.34327    8.13335  -0.042   0.9663
## directorMichel Gondry                     3.27852    6.65353   0.493   0.6224
## directorMichel Hazanavicius             -10.07468    8.13745  -1.238   0.2161
## directorMichelangelo Antonioni           -2.76122    7.04446  -0.392   0.6952
## directorMick Jackson                     -5.28366    6.65066  -0.794   0.4272
## directorMiguel Arteta                    -4.36571    7.04547  -0.620   0.5357
## directorMike Judge                       -8.20898    8.13360  -1.009   0.3132
## directorMike Mills                        1.82820    7.08657   0.258   0.7965
## directorMike Newell                      -5.00003    6.03382  -0.829   0.4076
## directorMike Nichols                     -4.12112    6.06893  -0.679   0.4973
## directorMimi Leder                       -8.86571    8.13481  -1.090   0.2762
## directorMira Nair                        -5.59712    7.06202  -0.793   0.4283
## directorMorten Tyldum                    -1.97019    8.13598  -0.242   0.8087
## directorNahnatchka Khan                  -7.00011    6.66291  -1.051   0.2938
## directorNancy Meyers                     -9.81770    6.09317  -1.611   0.1076
## directorNeil Burger                      -1.03734    7.04468  -0.147   0.8830
## directorNicholas Jarecki                -12.15690    7.09951  -1.712   0.0873
## directorNicholas Ray                      3.29839    8.15237   0.405   0.6859
## directorNicholas Stoller                 -6.70898    6.43046  -1.043   0.2972
## directorNick Cassavetes                  -6.69089    6.15479  -1.087   0.2774
## directorNick Hurran                      -2.97019    8.13598  -0.365   0.7152
## directorNicolas Winding Refn             -0.65673    8.13335  -0.081   0.9357
## directorNiels Arden Oplev                -0.59712    8.14915  -0.073   0.9416
## directorNikolaj Arcel                     4.50737    8.14623   0.553   0.5802
## directorNoah Baumbach                    -2.28366    7.05291  -0.324   0.7462
## directorNoam Murro                      -11.35834    8.15774  -1.392   0.1643
## directorNora Ephron                      -7.97019    8.13598  -0.980   0.3276
## directorNorman Jewison                   -2.52244    8.13668  -0.310   0.7567
## directorOl Parker                        -6.88061    7.04366  -0.977   0.3290
## directorOliver Stone                     -3.08462    6.64345  -0.464   0.6426
## directorOtto Bathurst                    -6.55224    8.13305  -0.806   0.4208
## directorP.J. Hogan                       -4.81346    7.04492  -0.683   0.4947
## directorPaco Cabezas                     -1.49263    8.14623  -0.183   0.8547
## directorPark Chan-wook                   -0.86571    8.13481  -0.106   0.9153
## directorPat O'Connor                     -3.58707    6.64071  -0.540   0.5893
## directorPatty Jenkins                    -5.48510    7.04426  -0.779   0.4365
## directorPaul Brickman                    -2.79102    8.13360  -0.343   0.7316
## directorPaul Feig                        -9.64183    6.43232  -1.499   0.1344
## directorPaul Haggis                      -3.91427    6.44389  -0.607   0.5438
## directorPaul Mazursky                    -7.62693    7.04949  -1.082   0.2797
## directorPaul McGuigan                    -3.00000    8.13302  -0.369   0.7123
## directorPaul Thomas Anderson             -5.34524    6.11449  -0.874   0.3823
## directorPaul Verhoeven                   -5.04488    8.14765  -0.619   0.5360
## directorPaul Weiland                     -7.29856    7.04806  -1.036   0.3008
## directorPaul Weitz                       -0.89551    8.13316  -0.110   0.9124
## directorPaul Weitz, Chris Weitz          -1.44180    6.29984  -0.229   0.8190
## directorPenelope Spheeris                -5.10449    8.13316  -0.628   0.5305
## directorPeter Berg                       -9.38814    8.14359  -1.153   0.2494
## directorPeter Chelsom                    -4.86571    8.13481  -0.598   0.5500
## directorPeter Farrelly                   -8.67180    8.17043  -1.061   0.2889
## directorPeter Hedges                    -11.83590    7.05422  -1.678   0.0939
## directorPeter Howitt                    -13.70161    8.15237  -1.681   0.0933
## directorPeter Jackson                    -2.62693    7.04949  -0.373   0.7095
## directorPeter Landesman                  -3.49263    8.14623  -0.429   0.6683
## directorPeter R. Hunt                    -5.28857    6.64083  -0.796   0.4261
## directorPeter Segal                      -5.88066    6.22064  -0.945   0.3448
## directorPeter Sollett                     4.08942    8.15967   0.501   0.6164
## directorPeter Webber                     -2.86571    7.04547  -0.407   0.6843
## directorPeyton Reed                      -6.61699    6.65066  -0.995   0.3201
## directorPhil Alden Robinson              -8.65673    8.13335  -1.064   0.2876
## directorPhillip Noyce                    10.52227    7.06671   1.489   0.1370
## directorPhyllida Lloyd                  -11.61202    7.05490  -1.646   0.1003
## directorPierre Morel                    -11.46283    8.16168  -1.404   0.1607
## directorQuentin Tarantino                -4.61699    6.65066  -0.694   0.4878
## directorQuinn Shephard                    4.71634    8.14125   0.579   0.5626
## directorRaja Gosnell                     -2.65673    8.13335  -0.327   0.7440
## directorRand Ravich                      -0.41795    8.13536  -0.051   0.9590
## directorRandall Wallace                 -15.94039    8.14487  -1.957   0.0508
## directorRawson Marshall Thurber         -11.28366    6.65066  -1.697   0.0903
## directorRebecca Miller                   -8.67180    7.08657  -1.224   0.2215
## directorRené Clair                        7.61186    8.14359   0.935   0.3503
## directorRenny Harlin                     -0.01507    8.16376  -0.002   0.9985
## directorRichard Brooks                   -3.76122    8.13393  -0.462   0.6439
## directorRichard Curtis                   -2.83029    6.10866  -0.463   0.6433
## directorRichard Eyre                      7.02981    8.13598   0.864   0.3879
## directorRichard LaGravenese              -7.85080    7.04899  -1.114   0.2658
## directorRichard Linklater                -5.89551    8.13316  -0.725   0.4688
## directorRichard Loncraine                -3.70161    6.66426  -0.555   0.5788
## directorRichard Rush                      3.92532    8.13745   0.482   0.6297
## directorRick Famuyiwa                    -5.88061    7.04366  -0.835   0.4041
## directorRicky Gervais, Matthew Robinson  -8.71651    7.05786  -1.235   0.2173
## directorRidley Scott                     -2.44782    6.30707  -0.388   0.6981
## directorRob Cohen                        -0.65673    7.04378  -0.093   0.9257
## directorRob Marshall                     -9.86571    7.04547  -1.400   0.1619
## directorRob Reiner                       -8.18914    6.07693  -1.348   0.1783
## directorRobert De Niro                   -8.74135    6.64601  -1.315   0.1889
## directorRobert Eggers                     2.05961    8.14487   0.253   0.8004
## directorRobert Iscove                    -2.23878    8.13393  -0.275   0.7832
## directorRobert Luketic                   -2.42090    6.29982  -0.384   0.7009
## directorRobert Redford                   -2.77629    8.17524  -0.340   0.7343
## directorRobert Rodriguez                 -5.86571    8.13481  -0.721   0.4711
## directorRobert Rossen                    -5.41795    8.13536  -0.666   0.5057
## directorRobert Schwentke                 -9.54488    7.06029  -1.352   0.1769
## directorRobert Wise                      -1.41795    7.04611  -0.201   0.8406
## directorRobert Zemeckis                  -6.36079    6.23021  -1.021   0.3077
## directorRodman Flender                   -1.13429    8.13481  -0.139   0.8891
## directorRoger Avary                      -2.76122    8.13393  -0.339   0.7344
## directorRoger Michell                     4.14412    6.68730   0.620   0.5357
## directorRoger Spottiswoode               -3.16427    6.44389  -0.491   0.6236
## directorRoland Emmerich                  -3.89551    8.13316  -0.479   0.6321
## directorRoland Joffé                     -8.97019    8.13598  -1.103   0.2706
## directorRoman Polanski                   -8.97019    8.13598  -1.103   0.2706
## directorRon Howard                       -8.88626    6.10849  -1.455   0.1462
## directorRon Shelton                      -6.69407    7.04645  -0.950   0.3425
## directorRowdy Herrington                 -5.97019    8.13598  -0.734   0.4633
## directorRuben Fleischer                  -2.22096    6.30881  -0.352   0.7249
## directorRyan Coogler                     -6.17917    7.05054  -0.876   0.3811
## directorRyan Murphy                      -9.11956    7.08392  -1.287   0.1984
## directorSam Levinson                     -0.97019    8.13598  -0.119   0.9051
## directorSam Mendes                       -4.55417    6.10801  -0.746   0.4562
## directorSam Raimi                        -1.81795    6.30283  -0.288   0.7731
## directorSam Taylor-Johnson               -5.70898    7.04408  -0.810   0.4180
## directorSanaa Hamri                     -10.97019    8.13598  -1.348   0.1780
## directorSaul Dibb                         1.67158    6.64777   0.251   0.8015
## directorScott Cooper                      3.53717    7.07647   0.500   0.6174
## directorScott Derrickson                -12.62693    8.13829  -1.552   0.1213
## directorScott Hicks                      -2.08958    7.04519  -0.297   0.7669
## directorSean Anders                      -8.94039    7.05709  -1.267   0.2057
## directorSeth Gordon                      -8.08958    7.04519  -1.148   0.2513
## directorSeth MacFarlane                  -3.00753    7.05229  -0.426   0.6699
## directorSharon Maguire                  -10.99263    6.44642  -1.705   0.0886
## directorShawn Levy                       -0.38814    8.14359  -0.048   0.9620
## directorSheree Folkson                   -6.62693    7.04949  -0.940   0.3475
## directorSidney Lumet                     -3.01507    8.16376  -0.369   0.7120
## directorSimon West                       -3.76122    8.13393  -0.462   0.6439
## directorSofia Coppola                    12.19391    8.15587   1.495   0.1354
## directorSpike Lee                        -4.41795    8.13536  -0.543   0.5873
## directorStanley Donen                     2.65657    7.08263   0.375   0.7077
## directorStanley Donen, Gene Kelly         0.87307    7.04949   0.124   0.9015
## directorStephen Chbosky                 -19.14936    8.15072  -2.349   0.0191
## directorStephen Daldry                    4.23878    8.13393   0.521   0.6025
## directorStephen Roberts                   2.71634    8.14125   0.334   0.7388
## directorStephen Sommers                  -7.65673    8.13335  -0.941   0.3469
## directorStephen T. Kay                   -6.00000    8.13302  -0.738   0.4609
## directorSteve Buscemi                     2.92532    8.13745   0.359   0.7193
## directorSteve Kloves                     -5.62693    8.13829  -0.691   0.4896
## directorSteve McQueen                    -9.78120    6.66096  -1.468   0.1425
## directorSteve Pink                        1.00000    8.13302   0.123   0.9022
## directorSteven Baigelman                 -1.08958    7.04519  -0.155   0.8771
## directorSteven Brill                     -8.36571    7.04547  -1.187   0.2355
## directorSteven Shainberg                  1.26859    8.14019   0.156   0.8762
## directorSteven Soderbergh                -5.84186    6.30933  -0.926   0.3548
## directorSteven Spielberg                 -2.06574    6.04087  -0.342   0.7325
## directorSusanna Fogel                    -8.50753    7.05229  -1.206   0.2281
## directorSusanne Bier                      0.92532    8.13745   0.114   0.9095
## directorSydney Pollack                   -4.29488    6.44822  -0.666   0.5056
## directorSylvain White                    -5.89551    8.13316  -0.725   0.4688
## directorTamra Davis                      -1.55224    8.13305  -0.191   0.8487
## directorTarsem Singh                     -3.89551    8.13316  -0.479   0.6321
## directorTate Taylor                      -3.78366    6.44013  -0.588   0.5571
## directorTaylor Hackford                  -5.00502    6.64477  -0.753   0.4516
## directorTed Demme                        -2.52244    8.13668  -0.310   0.7567
## directorTerence Young                    -2.23718    6.06418  -0.369   0.7123
## directorTerry George                     -7.47019    7.04682  -1.060   0.2895
## directorTerry Zwigoff                    -7.04488    8.14765  -0.865   0.3876
## directorThea Sharrock                    -7.60449    7.04357  -1.080   0.2807
## directorTheodore Melfi                  -11.91058    7.07416  -1.684   0.0927
## directorThomas Bezucha                  -10.87073    6.22500  -1.746   0.0812
## directorThomas Carter                     1.34327    8.13335   0.165   0.8689
## directorTim Burton                       -1.55727    6.21715  -0.250   0.8023
## directorTim Miller                      -11.62693    8.13829  -1.429   0.1536
## directorTim Story                        -7.31346    7.04492  -1.038   0.2996
## directorTimur Bekmambetov               -10.41795    8.13536  -1.281   0.2008
## directorTodd Haynes                      -1.94039    8.14487  -0.238   0.8118
## directorTodd Phillips                    -4.27244    6.43435  -0.664   0.5069
## directorTom Ford                          3.90288    7.06202   0.553   0.5807
## directorTom Hanks                        -3.75128    6.64345  -0.565   0.5725
## directorTom Hooper                      -11.06475    6.64937  -1.664   0.0966
## directorTom Shadyac                      -6.33339    6.21767  -1.019   0.3088
## directorTommy Lee Wallace                 5.50737    8.14623   0.676   0.4992
## directorTony Goldwyn                     -8.74632    7.04722  -1.241   0.2150
## directorTony Scott                       -1.71648    6.30639  -0.272   0.7856
## directorTyler Perry                     -11.86571    8.13481  -1.459   0.1452
## directorundefined                         0.05593    6.43306   0.009   0.9931
## directorValerio Zurlini                  -2.23878    8.13393  -0.275   0.7832
## directorVictor Fleming                   -1.52244    8.13668  -0.187   0.8516
## directorVictor Levin                    -15.35834    8.15774  -1.883   0.0602
## directorVincent Gallo                     6.02981    8.13598   0.741   0.4589
## directorVincente Minnelli                 4.92532    8.13745   0.605   0.5452
## directorWally Pfister                    -1.70161    8.15237  -0.209   0.8347
## directorWarren Beatty                     2.77596    8.17280   0.340   0.7342
## directorWayne Kramer                     -4.80609    8.15587  -0.589   0.5559
## directorWayne Wang                       -9.57468    7.04851  -1.358   0.1748
## directorWes Anderson                     -6.68071    6.32391  -1.056   0.2912
## directorWill Gluck                       -6.99006    6.64099  -1.053   0.2929
## directorWilliam A. Wellman               -5.62693    8.13829  -0.691   0.4896
## directorWilliam Friedkin                  4.26859    8.14019   0.524   0.6002
## directorWilliam Wyler                     0.02981    8.13598   0.004   0.9971
## directorWolfgang Petersen                -3.08958    7.04519  -0.439   0.6611
## directorWoody Allen                       0.33198    5.91603   0.056   0.9553
## directorYann Samuell                     -7.10449    8.13316  -0.874   0.3827
## directorYorgos Lanthimos                -10.30978    6.44083  -1.601   0.1099
## directorZach Braff                       -2.55224    8.13305  -0.314   0.7538
## directorZack Snyder                      -9.72148    6.65353  -1.461   0.1445
##                                            
## (Intercept)                                
## actor_1_age                             ***
## directorAdam McKay                         
## directorAdam Nee, Aaron Nee                
## directorAdam Shankman                      
## directorAdrian Lyne                        
## directorAlan Parker                        
## directorAlan Shapiro                       
## directorAlejandro Agresti               .  
## directorAlejandro González Iñárritu        
## directorAlex Garland                       
## directorAlex Kurtzman                      
## directorAlfonso Arau                       
## directorAlfonso Cuarón                     
## directorAlfred Hitchcock                   
## directorAmy Heckerling                     
## directorAnand Tucker                       
## directorAndrew Davis                       
## directorAndrew Niccol                      
## directorAndy Cadiff                        
## directorAndy Serkis                        
## directorAndy Tennant                       
## directorAng Lee                            
## directorAngela Robinson                    
## directorAnne Fletcher                      
## directorAnthony Minghella                  
## directorAntoine Fuqua                      
## directorAnton Corbijn                      
## directorAntony Hoffman                     
## directorAri Aster                          
## directorArthur Hiller                      
## directorAtom Egoyan                        
## directorAutumn de Wilde                    
## directorAva DuVernay                       
## directorBaltasar Kormákur                  
## directorBarbet Schroeder                   
## directorBarry Levinson                     
## directorBarry Sonnenfeld                   
## directorBaz Luhrmann                       
## directorBen Stiller                        
## directorBen Younger                        
## directorBernardo Bertolucci                
## directorBernie Goldmann, Melisa Wallack    
## directorBetty Thomas                       
## directorBill Condon                        
## directorBill Purple                        
## directorBille Woodruff                     
## directorBilly Bob Thornton                 
## directorBilly Crystal                      
## directorBilly Wilder                       
## directorBlake Edwards                      
## directorBoaz Yakin                         
## directorBobby Farrelly, Peter Farrelly     
## directorBobcat Goldthwait                  
## directorBonnie Hunt                        
## directorBoots Riley                        
## directorBrad Silberling                    
## directorBradley Cooper                     
## directorBrian De Palma                     
## directorBrian Helgeland                    
## directorBrian Levant                       
## directorBrian Robbins                      
## directorBruce Joel Rubin                   
## directorBruce Robinson                     
## directorBryan Singer                       
## directorCameron Crowe                      
## directorCarl Rinsch                        
## directorCary Fukunaga                      
## directorCatherine Hardwicke                
## directorChad Stahelski                     
## directorCharles Shyer                      
## directorCharles Walters                    
## directorCharlie Chaplin                    
## directorChen Kaige                         
## directorChris Columbus                     
## directorChris Rock                         
## directorChris Wedge                        
## directorChris Weitz                        
## directorChristopher Nolan                  
## directorChuck Russell                      
## directorClint Eastwood                     
## directorColin Higgins                      
## directorColin Trevorrow                    
## directorCourtney Hunt                   *  
## directorCraig Brewer                       
## directorCraig Gillespie                    
## directorCurtis Hanson                      
## directorDagen Merrill                      
## directorDamien Chazelle                    
## directorDan Kwan, Daniel Scheinert      *  
## directorDaniel Petrie                      
## directorDanny Boyle                        
## directorDanny DeVito                       
## directorDarren Aronofsky                   
## directorDavid Ayer                         
## directorDavid Cronenberg                   
## directorDavid Dobkin                       
## directorDavid Fincher                      
## directorDavid Frankel                      
## directorDavid Koepp                        
## directorDavid Leitch                       
## directorDavid Lowery                       
## directorDavid Mamet                        
## directorDavid McNally                      
## directorDavid Mirkin                       
## directorDavid O. Russell                   
## directorDavid Yates                        
## directorDavid Zucker                       
## directorDax Shepard                        
## directorDelmer Daves                       
## directorDemian Lichtenstein                
## directorDenise Di Novi                  .  
## directorDennis Dugan                       
## directorDerek Cianfrance                   
## directorDewey Nicks                        
## directorDome Karukoski                     
## directorDon Michael Paul                   
## directorDonald Petrie                      
## directorDoug Liman                         
## directorDouglas McGrath                    
## directorDuncan Jones                       
## directorDustin Lance Black                 
## directorEdgar Wright                       
## directorEdward Zwick                       
## directorEli Roth                           
## directorElio Petri                         
## directorEmile Ardolino                     
## directorEric Bress, J. Mackye Gruber       
## directorEric Brevig                        
## directorEricson Core                       
## directorF. Gary Gray                       
## directorFederico Fellini                   
## directorFernando Meirelles                 
## directorFranc. Reyes                       
## directorFrancis Ford Coppola               
## directorFrancis Lawrence                   
## directorFrank Capra                        
## directorFrank Coraci                       
## directorFrank Pierson                      
## directorFred Zinnemann                     
## directorGabriele Muccino                   
## directorGarry Marshall                     
## directorGary Ross                          
## directorGary Winick                        
## directorGavin Hood                         
## directorGeorge Armitage                    
## directorGeorge C. Wolfe                    
## directorGeorge Clooney                     
## directorGeorge Cukor                       
## directorGeorge Lucas                       
## directorGeorge Nolfi                       
## directorGeorge Roy Hill                    
## directorGeorge Seaton                      
## directorGeorge Tillman Jr.                 
## directorGia Coppola                        
## directorGil Junger                         
## directorGina Prince-Bythewood              
## directorGlenn Ficarra, John Requa          
## directorGore Verbinski                     
## directorGreg Mottola                       
## directorGreta Gerwig                       
## directorGuillermo del Toro                 
## directorGus Van Sant                       
## directorGuy Hamilton                       
## directorGuy Ritchie                        
## directorHal Ashby                       *  
## directorHal Needham                        
## directorHallie Meyers-Shyer                
## directorHarold Ramis                       
## directorHart Bochner                       
## directorHomi Adajania                      
## directorHoward Deutch                      
## directorHoward Hawks                       
## directorHugh Wilson                        
## directorIrving Pichel                      
## directorIsabel Coixet                      
## directorIvan Reitman                       
## directorJ.C. Chandor                       
## directorJ.J. Abrams                        
## directorJack Clayton                       
## directorJacob Aaron Estes                  
## directorJake Kasdan                        
## directorJames Cameron                      
## directorJames Foley                        
## directorJames Franco                       
## directorJames Gray                         
## directorJames Gunn                         
## directorJames L. Brooks                    
## directorJames Mangold                      
## directorJames Marsh                        
## directorJames McTeigue                     
## directorJames Wan                       .  
## directorJan de Bont                        
## directorJason Moore                        
## directorJason Reitman                      
## directorJay Roach                          
## directorJean-Jacques Annaud                
## directorJean-Marc Vallée                   
## directorJean-Pierre Jeunet                 
## directorJean Negulesco                     
## directorJeff Franklin                      
## directorJeff Tomsic                     *  
## directorJeffrey Nachmanoff                 
## directorJerry Zucker                       
## directorJim Field Smith                    
## directorJim Gillespie                      
## directorJoan Chen                          
## directorJoe & Anthony Russo                
## directorJoe Johnston                       
## directorJoe Wright                         
## directorJoel Coen                          
## directorJoel Schumacher                    
## directorJoel Zwick                      .  
## directorJohn Carney                        
## directorJohn Cassavetes                    
## directorJohn Crowley                       
## directorJohn Curran                        
## directorJohn Fortenberry                   
## directorJohn Glen                          
## directorJohn Hamburg                       
## directorJohn Herzfeld                      
## directorJohn Huston                        
## directorJohn Krasinski                     
## directorJohn M. Chu                        
## directorJohn Madden                        
## directorJohn McNaughton                    
## directorJohn McTiernan                  .  
## directorJohn Patrick Shanley               
## directorJohn Stockwell                     
## directorJon Amiel                          
## directorJon Avnet                          
## directorJon Favreau                        
## directorJon M. Chu                         
## directorJon Turteltaub                     
## directorJon Watts                          
## directorJonas Åkerlund                     
## directorJonathan Levine                    
## directorJonathan Lynn                      
## directorJonathan Mostow                    
## directorJordan Mechner                     
## directorJordan Peele                       
## directorJoseph Gordon-Levitt               
## directorJoseph Kosinski                    
## directorJoseph L. Mankiewicz               
## directorJosh Boone                         
## directorJosh Radnor                        
## directorJoss Whedon                        
## directorJudd Apatow                        
## directorJudy Greer                      *  
## directorJulian Farino                      
## directorJulian Jarrold                     
## directorJustin Chadwick                    
## directorKatt Shea                       *  
## directorKelly Makin                        
## directorKen Kwapis                         
## directorKen Scott                          
## directorKenneth Branagh                    
## directorKevin Bray                         
## directorKevin Lima                         
## directorKevin Reynolds                     
## directorKevin Rodney Sullivan              
## directorKevin Smith                        
## directorKevin Spacey                       
## directorKing Vidor                         
## directorLana Wachowski, Lilly Wachowski    
## directorLarry Charles                      
## directorLasse Hallström                    
## directorLawrence Kasdan                    
## directorLee H. Katzin                      
## directorLee Tamahori                       
## directorLee Toland Krieger                 
## directorLeo McCarey                        
## directorLewis Gilbert                      
## directorLisa Cholodenko                 *  
## directorLone Scherfig                      
## directorLorene Scafaria                    
## directorLouis Leterrier                    
## directorLouis Malle                        
## directorLuc Besson                         
## directorLuca Guadagnino                    
## directorLuis Mandoki                       
## directorLynn Shelton                       
## directorM. Night Shyamalan                 
## directorMalcolm Venville                   
## directorMarc Forster                       
## directorMarc Klein                         
## directorMarc Lawrence                      
## directorMarc Webb                          
## directorMarielle Heller                    
## directorMark Mylod                         
## directorMark Neveldine, Brian Taylor       
## directorMark Pellington                    
## directorMark Piznarski                     
## directorMark Steven Johnson                
## directorMark Waters                        
## directorMartin Brest                       
## directorMartin Campbell                    
## directorMartin Scorsese                    
## directorMassy Tadjedin                     
## directorMatthew Ross                    *  
## directorMatthew Vaughn                     
## directorMax Joseph                         
## directorMaya Forbes                        
## directorMcG                                
## directorMel Gibson                         
## directorMelville Shavelson                 
## directorMichael Apted                      
## directorMichael Bay                        
## directorMichael Curtiz                     
## directorMichael Gracey                     
## directorMichael Hoffman                    
## directorMichael Lehmann                    
## directorMichael Mann                       
## directorMichael Patrick King            .  
## directorMichael Rymer                      
## directorMichael Showalter                  
## directorMichael Sucsy                      
## directorMichael Tollin                     
## directorMichel Gondry                      
## directorMichel Hazanavicius                
## directorMichelangelo Antonioni             
## directorMick Jackson                       
## directorMiguel Arteta                      
## directorMike Judge                         
## directorMike Mills                         
## directorMike Newell                        
## directorMike Nichols                       
## directorMimi Leder                         
## directorMira Nair                          
## directorMorten Tyldum                      
## directorNahnatchka Khan                    
## directorNancy Meyers                       
## directorNeil Burger                        
## directorNicholas Jarecki                .  
## directorNicholas Ray                       
## directorNicholas Stoller                   
## directorNick Cassavetes                    
## directorNick Hurran                        
## directorNicolas Winding Refn               
## directorNiels Arden Oplev                  
## directorNikolaj Arcel                      
## directorNoah Baumbach                      
## directorNoam Murro                         
## directorNora Ephron                        
## directorNorman Jewison                     
## directorOl Parker                          
## directorOliver Stone                       
## directorOtto Bathurst                      
## directorP.J. Hogan                         
## directorPaco Cabezas                       
## directorPark Chan-wook                     
## directorPat O'Connor                       
## directorPatty Jenkins                      
## directorPaul Brickman                      
## directorPaul Feig                          
## directorPaul Haggis                        
## directorPaul Mazursky                      
## directorPaul McGuigan                      
## directorPaul Thomas Anderson               
## directorPaul Verhoeven                     
## directorPaul Weiland                       
## directorPaul Weitz                         
## directorPaul Weitz, Chris Weitz            
## directorPenelope Spheeris                  
## directorPeter Berg                         
## directorPeter Chelsom                      
## directorPeter Farrelly                     
## directorPeter Hedges                    .  
## directorPeter Howitt                    .  
## directorPeter Jackson                      
## directorPeter Landesman                    
## directorPeter R. Hunt                      
## directorPeter Segal                        
## directorPeter Sollett                      
## directorPeter Webber                       
## directorPeyton Reed                        
## directorPhil Alden Robinson                
## directorPhillip Noyce                      
## directorPhyllida Lloyd                     
## directorPierre Morel                       
## directorQuentin Tarantino                  
## directorQuinn Shephard                     
## directorRaja Gosnell                       
## directorRand Ravich                        
## directorRandall Wallace                 .  
## directorRawson Marshall Thurber         .  
## directorRebecca Miller                     
## directorRené Clair                         
## directorRenny Harlin                       
## directorRichard Brooks                     
## directorRichard Curtis                     
## directorRichard Eyre                       
## directorRichard LaGravenese                
## directorRichard Linklater                  
## directorRichard Loncraine                  
## directorRichard Rush                       
## directorRick Famuyiwa                      
## directorRicky Gervais, Matthew Robinson    
## directorRidley Scott                       
## directorRob Cohen                          
## directorRob Marshall                       
## directorRob Reiner                         
## directorRobert De Niro                     
## directorRobert Eggers                      
## directorRobert Iscove                      
## directorRobert Luketic                     
## directorRobert Redford                     
## directorRobert Rodriguez                   
## directorRobert Rossen                      
## directorRobert Schwentke                   
## directorRobert Wise                        
## directorRobert Zemeckis                    
## directorRodman Flender                     
## directorRoger Avary                        
## directorRoger Michell                      
## directorRoger Spottiswoode                 
## directorRoland Emmerich                    
## directorRoland Joffé                       
## directorRoman Polanski                     
## directorRon Howard                         
## directorRon Shelton                        
## directorRowdy Herrington                   
## directorRuben Fleischer                    
## directorRyan Coogler                       
## directorRyan Murphy                        
## directorSam Levinson                       
## directorSam Mendes                         
## directorSam Raimi                          
## directorSam Taylor-Johnson                 
## directorSanaa Hamri                        
## directorSaul Dibb                          
## directorScott Cooper                       
## directorScott Derrickson                   
## directorScott Hicks                        
## directorSean Anders                        
## directorSeth Gordon                        
## directorSeth MacFarlane                    
## directorSharon Maguire                  .  
## directorShawn Levy                         
## directorSheree Folkson                     
## directorSidney Lumet                       
## directorSimon West                         
## directorSofia Coppola                      
## directorSpike Lee                          
## directorStanley Donen                      
## directorStanley Donen, Gene Kelly          
## directorStephen Chbosky                 *  
## directorStephen Daldry                     
## directorStephen Roberts                    
## directorStephen Sommers                    
## directorStephen T. Kay                     
## directorSteve Buscemi                      
## directorSteve Kloves                       
## directorSteve McQueen                      
## directorSteve Pink                         
## directorSteven Baigelman                   
## directorSteven Brill                       
## directorSteven Shainberg                   
## directorSteven Soderbergh                  
## directorSteven Spielberg                   
## directorSusanna Fogel                      
## directorSusanne Bier                       
## directorSydney Pollack                     
## directorSylvain White                      
## directorTamra Davis                        
## directorTarsem Singh                       
## directorTate Taylor                        
## directorTaylor Hackford                    
## directorTed Demme                          
## directorTerence Young                      
## directorTerry George                       
## directorTerry Zwigoff                      
## directorThea Sharrock                      
## directorTheodore Melfi                  .  
## directorThomas Bezucha                  .  
## directorThomas Carter                      
## directorTim Burton                         
## directorTim Miller                         
## directorTim Story                          
## directorTimur Bekmambetov                  
## directorTodd Haynes                        
## directorTodd Phillips                      
## directorTom Ford                           
## directorTom Hanks                          
## directorTom Hooper                      .  
## directorTom Shadyac                        
## directorTommy Lee Wallace                  
## directorTony Goldwyn                       
## directorTony Scott                         
## directorTyler Perry                        
## directorundefined                          
## directorValerio Zurlini                    
## directorVictor Fleming                     
## directorVictor Levin                    .  
## directorVincent Gallo                      
## directorVincente Minnelli                  
## directorWally Pfister                      
## directorWarren Beatty                      
## directorWayne Kramer                       
## directorWayne Wang                         
## directorWes Anderson                       
## directorWill Gluck                         
## directorWilliam A. Wellman                 
## directorWilliam Friedkin                   
## directorWilliam Wyler                      
## directorWolfgang Petersen                  
## directorWoody Allen                        
## directorYann Samuell                       
## directorYorgos Lanthimos                   
## directorZach Braff                         
## directorZack Snyder                        
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 5.751 on 644 degrees of freedom
## Multiple R-squared:  0.7452, Adjusted R-squared:  0.5434 
## F-statistic: 3.693 on 510 and 644 DF,  p-value: < 2.2e-16

Inferences:

  • This model is a better model.
  • This model has an adjusted R-Squared score of 0.54 which is the best out of all the above ones.
  • This is a better model but lets search for an even better model.

Model - 4

model <- lm(age_difference ~ actor_1_age + director + character_1_gender + character_2_gender + couple_number, data)
summary(model)
## 
## Call:
## lm(formula = age_difference ~ actor_1_age + director + character_1_gender + 
##     character_2_gender + couple_number, data = data)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -20.095  -1.736   0.000   1.743  15.242 
## 
## Coefficients:
##                                          Estimate Std. Error t value Pr(>|t|)
## (Intercept)                               0.40656    6.16157   0.066  0.94741
## actor_1_age                               0.47417    0.02301  20.611  < 2e-16
## directorAdam McKay                       -8.04186    6.21368  -1.294  0.19606
## directorAdam Nee, Aaron Nee              -6.38877    7.54835  -0.846  0.39766
## directorAdam Shankman                    -4.41073    6.14577  -0.718  0.47321
## directorAdrian Lyne                      -3.69870    5.84101  -0.633  0.52681
## directorAlan Parker                       1.18142    7.52164   0.157  0.87524
## directorAlan Shapiro                     -2.24398    6.55558  -0.342  0.73224
## directorAlejandro Agresti               -14.80207    7.52468  -1.967  0.04960
## directorAlejandro González Iñárritu       0.43973    7.52676   0.058  0.95343
## directorAlex Garland                     -8.14519    6.21192  -1.311  0.19025
## directorAlex Kurtzman                    -1.30195    7.53889  -0.173  0.86294
## directorAlfonso Arau                     -6.41182    6.56360  -0.977  0.32900
## directorAlfonso Cuarón                    0.42387    6.55961   0.065  0.94850
## directorAlfred Hitchcock                  1.22044    5.79378   0.211  0.83323
## directorAmy Heckerling                   -4.43031    6.02152  -0.736  0.46215
## directorAnand Tucker                     -3.39295    6.02382  -0.563  0.57346
## directorAndrew Davis                      3.00148    6.57342   0.457  0.64811
## directorAndrew Niccol                    -8.55566    6.56423  -1.303  0.19291
## directorAndy Cadiff                      -3.55106    7.52306  -0.472  0.63707
## directorAndy Serkis                     -12.34441    7.52152  -1.641  0.10124
## directorAndy Tennant                     -5.28357    5.91018  -0.894  0.37167
## directorAng Lee                          -4.11698    5.84482  -0.704  0.48145
## directorAngela Robinson                  -5.58028    6.10012  -0.915  0.36065
## directorAnne Fletcher                    -5.40414    6.20833  -0.870  0.38437
## directorAnthony Minghella                -8.45706    6.56275  -1.289  0.19799
## directorAntoine Fuqua                     2.65099    6.56860   0.404  0.68665
## directorAnton Corbijn                    -5.45694    7.53077  -0.725  0.46895
## directorAntony Hoffman                   -8.66359    7.52387  -1.151  0.24996
## directorAri Aster                        -6.02523    7.52262  -0.801  0.42346
## directorArthur Hiller                    -7.58622    7.51883  -1.009  0.31337
## directorAtom Egoyan                      -3.09383    6.43651  -0.481  0.63092
## directorAutumn de Wilde                  -1.76692    7.52210  -0.235  0.81436
## directorAva DuVernay                    -11.32790    7.52380  -1.506  0.13266
## directorBaltasar Kormákur                -7.39607    7.52148  -0.983  0.32582
## directorBarbet Schroeder                 -5.69874    7.52892  -0.757  0.44938
## directorBarry Levinson                   -1.82778    7.53736  -0.242  0.80847
## directorBarry Sonnenfeld                -11.25029    7.54216  -1.492  0.13628
## directorBaz Luhrmann                     -6.92657    6.02068  -1.150  0.25038
## directorBen Stiller                      -7.87331    6.21389  -1.267  0.20560
## directorBen Younger                      -3.48289    7.51997  -0.463  0.64341
## directorBernardo Bertolucci               8.01723    7.52966   1.065  0.28739
## directorBernie Goldmann, Melisa Wallack  -8.20517    6.56594  -1.250  0.21188
## directorBetty Thomas                     -2.61193    7.52517  -0.347  0.72864
## directorBill Condon                      -0.64342    6.21927  -0.103  0.91763
## directorBill Purple                     -10.13776    7.52448  -1.347  0.17836
## directorBille Woodruff                   -3.97357    7.52195  -0.528  0.59750
## directorBilly Bob Thornton               -7.44774    7.52173  -0.990  0.32247
## directorBilly Crystal                   -12.50860    7.52862  -1.661  0.09711
## directorBilly Wilder                      4.72282    6.57556   0.718  0.47287
## directorBlake Edwards                   -11.87024    7.52147  -1.578  0.11502
## directorBoaz Yakin                       -0.80850    6.56412  -0.123  0.90201
## directorBobby Farrelly, Peter Farrelly   -6.45772    5.91609  -1.092  0.27544
## directorBobcat Goldthwait                 0.27554    7.54389   0.037  0.97087
## directorBonnie Hunt                      -6.18942    7.52332  -0.823  0.41099
## directorBoots Riley                      -3.48289    7.51997  -0.463  0.64341
## directorBrad Silberling                  -9.43123    7.52097  -1.254  0.21030
## directorBradley Cooper                   -3.59176    7.52912  -0.477  0.63349
## directorBrian De Palma                    0.38807    7.52517   0.052  0.95889
## directorBrian Helgeland                  -5.27989    6.55647  -0.805  0.42095
## directorBrian Levant                     -5.34441    7.52152  -0.711  0.47762
## directorBrian Robbins                    -9.58610    6.56904  -1.459  0.14498
## directorBruce Joel Rubin                 -1.13776    7.52448  -0.151  0.87986
## directorBruce Robinson                    3.21274    6.57163   0.489  0.62509
## directorBryan Singer                     -3.81590    6.01978  -0.634  0.52638
## directorCameron Crowe                    -5.60963    6.02972  -0.930  0.35255
## directorCarl Rinsch                      -3.45694    7.53077  -0.459  0.64636
## directorCary Fukunaga                    -1.34441    7.52152  -0.179  0.85820
## directorCatherine Hardwicke              -3.52686    5.92010  -0.596  0.55156
## directorChad Stahelski                  -13.93111    7.53195  -1.850  0.06483
## directorCharles Shyer                     3.64639    7.53590   0.484  0.62864
## directorCharles Walters                   2.00148    6.57342   0.304  0.76086
## directorCharlie Chaplin                   0.54306    6.57459   0.083  0.93420
## directorChen Kaige                      -10.06039    7.51901  -1.338  0.18137
## directorChris Columbus                   -7.43614    6.21697  -1.196  0.23210
## directorChris Rock                       -7.62767    6.56814  -1.161  0.24595
## directorChris Wedge                      -7.16371    7.51871  -0.953  0.34106
## directorChris Weitz                      -1.89619    7.52216  -0.252  0.80106
## directorChristopher Nolan                -5.11041    5.78358  -0.884  0.37724
## directorChuck Russell                    -2.39607    7.52148  -0.319  0.75016
## directorClint Eastwood                   -9.37944    6.57888  -1.426  0.15444
## directorColin Higgins                    -9.03443    7.52765  -1.200  0.23052
## directorColin Trevorrow                 -12.29275    7.52184  -1.634  0.10269
## directorCourtney Hunt                   -12.74020    6.59000  -1.933  0.05364
## directorCraig Brewer                    -13.29275    7.52184  -1.767  0.07767
## directorCraig Gillespie                  -5.81858    7.52164  -0.774  0.43947
## directorCurtis Hanson                    -9.74569    6.57271  -1.483  0.13863
## directorDagen Merrill                    -5.07690    7.52357  -0.675  0.50005
## directorDamien Chazelle                 -11.24109    7.52244  -1.494  0.13558
## directorDan Kwan, Daniel Scheinert      -14.33710    7.55256  -1.898  0.05810
## directorDaniel Petrie                     9.22388    7.54049   1.223  0.22169
## directorDanny Boyle                      -2.74972    5.90599  -0.466  0.64167
## directorDanny DeVito                     -5.27624    7.52564  -0.701  0.48349
## directorDarren Aronofsky                 -9.94408    6.56242  -1.515  0.13019
## directorDavid Ayer                        0.86896    6.21589   0.140  0.88886
## directorDavid Cronenberg                -10.50860    7.52862  -1.396  0.16325
## directorDavid Dobkin                     -6.10742    6.03111  -1.013  0.31161
## directorDavid Fincher                    -5.16181    5.70875  -0.904  0.36623
## directorDavid Frankel                    -2.09724    6.56378  -0.320  0.74944
## directorDavid Koepp                       0.37887    7.55154   0.050  0.96000
## directorDavid Leitch                      0.31606    6.57681   0.048  0.96169
## directorDavid Lowery                    -12.24109    7.52244  -1.627  0.10417
## directorDavid Mamet                     -10.29275    7.52184  -1.368  0.17167
## directorDavid McNally                    -7.02523    7.52262  -0.934  0.35072
## directorDavid Mirkin                     -7.22275    6.56131  -1.101  0.27139
## directorDavid O. Russell                 -2.45998    5.91683  -0.416  0.67772
## directorDavid Yates                      -5.77191    6.20734  -0.930  0.35280
## directorDavid Zucker                     -7.62113    7.55154  -1.009  0.31325
## directorDax Shepard                     -12.13776    7.52448  -1.613  0.10721
## directorDelmer Daves                      5.01723    7.52966   0.666  0.50544
## directorDemian Lichtenstein              -7.93111    7.53195  -1.053  0.29274
## directorDenise Di Novi                  -13.17934    6.56659  -2.007  0.04517
## directorDennis Dugan                     -6.17060    5.70804  -1.081  0.28009
## directorDerek Cianfrance                 -6.91365    6.55699  -1.054  0.29210
## directorDewey Nicks                      -6.11847    6.56643  -0.932  0.35180
## directorDome Karukoski                   -9.11205    7.51872  -1.212  0.22599
## directorDon Michael Paul                  4.80138    7.54570   0.636  0.52480
## directorDonald Petrie                    -8.55566    6.56423  -1.303  0.19291
## directorDoug Liman                       -4.80443    6.21569  -0.773  0.43984
## directorDouglas McGrath                 -10.40068    6.56702  -1.584  0.11374
## directorDuncan Jones                     -7.48289    7.51997  -0.995  0.32008
## directorDustin Lance Black               -2.27441    6.55953  -0.347  0.72891
## directorEdgar Wright                     -0.08899    6.55776  -0.014  0.98918
## directorEdward Zwick                     -9.44774    7.52173  -1.256  0.20955
## directorEli Roth                          3.61489    6.23284   0.580  0.56213
## directorElio Petri                       -4.66359    7.52387  -0.620  0.53558
## directorEmile Ardolino                   -7.62243    6.21618  -1.226  0.22057
## directorEric Bress, J. Mackye Gruber     -6.16371    7.51871  -0.820  0.41264
## directorEric Brevig                      -6.50860    7.52862  -0.865  0.38763
## directorEricson Core                    -10.81858    7.52164  -1.438  0.15083
## directorF. Gary Gray                     -8.47357    6.56449  -1.291  0.19723
## directorFederico Fellini                 -6.07609    5.78543  -1.050  0.29400
## directorFernando Meirelles               -9.61193    7.52517  -1.277  0.20196
## directorFranc. Reyes                     -7.90357    6.55650  -1.205  0.22847
## directorFrancis Ford Coppola             -7.53019    6.21155  -1.212  0.22585
## directorFrancis Lawrence                 -3.65861    6.02018  -0.608  0.54359
## directorFrank Capra                      -2.47269    6.57472  -0.376  0.70697
## directorFrank Coraci                     -5.66052    6.21219  -0.911  0.36253
## directorFrank Pierson                    -0.65475    7.56173  -0.087  0.93103
## directorFred Zinnemann                   -0.79735    6.57049  -0.121  0.90345
## directorGabriele Muccino                 -5.18942    7.52332  -0.690  0.49058
## directorGarry Marshall                   -3.63040    5.92349  -0.613  0.54017
## directorGary Ross                         2.17222    7.53736   0.288  0.77329
## directorGary Winick                      -3.32563    6.03428  -0.551  0.58174
## directorGavin Hood                       -7.66359    7.52387  -1.019  0.30879
## directorGeorge Armitage                  -7.92191    7.52157  -1.053  0.29263
## directorGeorge C. Wolfe                  -9.19862    7.54570  -1.219  0.22327
## directorGeorge Clooney                  -11.50860    7.52862  -1.529  0.12685
## directorGeorge Cukor                     -4.16819    6.57664  -0.634  0.52645
## directorGeorge Lucas                      0.18142    7.52164   0.024  0.98076
## directorGeorge Nolfi                     -3.66359    7.52387  -0.487  0.62647
## directorGeorge Roy Hill                 -12.98277    7.52966  -1.724  0.08515
## directorGeorge Seaton                    -3.25029    7.54216  -0.431  0.66665
## directorGeorge Tillman Jr.               -3.36405    6.02717  -0.558  0.57694
## directorGia Coppola                      -0.05856    6.55552  -0.009  0.99288
## directorGil Junger                       -3.72180    6.56978  -0.567  0.57125
## directorGina Prince-Bythewood            -6.63788    7.51868  -0.883  0.37765
## directorGlenn Ficarra, John Requa        -8.09310    6.01141  -1.346  0.17868
## directorGore Verbinski                   -1.55106    7.52306  -0.206  0.83672
## directorGreg Mottola                     -7.02435    6.57220  -1.069  0.28556
## directorGreta Gerwig                     -4.79287    7.51992  -0.637  0.52412
## directorGuillermo del Toro               -7.69691    6.02664  -1.277  0.20201
## directorGus Van Sant                     -4.91801    6.79465  -0.724  0.46945
## directorGuy Hamilton                      0.63930    5.71570   0.112  0.91098
## directorGuy Ritchie                      -8.49940    7.52225  -1.130  0.25894
## directorHal Ashby                        21.55037    7.59299   2.838  0.00468
## directorHal Needham                      -6.66359    7.52387  -0.886  0.37613
## directorHallie Meyers-Shyer              -4.64525    6.56458  -0.708  0.47944
## directorHarold Ramis                     -6.51122    5.91704  -1.100  0.27156
## directorHart Bochner                     -5.71525    7.52285  -0.760  0.44770
## directorHomi Adajania                    -8.55106    7.52306  -1.137  0.25611
## directorHoward Deutch                    -8.29275    7.52184  -1.102  0.27066
## directorHoward Hawks                      0.68973    6.03499   0.114  0.90904
## directorHugh Wilson                       3.49140    7.52862   0.464  0.64298
## directorIrving Pichel                    12.22388    7.54049   1.621  0.10549
## directorIsabel Coixet                    -3.03355    6.60900  -0.459  0.64639
## directorIvan Reitman                     -5.79940    5.92503  -0.979  0.32805
## directorJ.C. Chandor                    -10.43123    7.52097  -1.387  0.16594
## directorJ.J. Abrams                      -7.74109    6.56504  -1.179  0.23878
## directorJack Clayton                     -3.22092    7.52544  -0.428  0.66879
## directorJacob Aaron Estes                -4.83067    6.56785  -0.736  0.46230
## directorJake Kasdan                      -8.13776    7.52448  -1.082  0.27988
## directorJames Cameron                    -7.12856    7.52480  -0.947  0.34382
## directorJames Foley                      -6.81858    7.52164  -0.907  0.36500
## directorJames Franco                     -8.48289    7.51997  -1.128  0.25972
## directorJames Gray                       -9.77612    7.54049  -1.296  0.19528
## directorJames Gunn                      -10.95706    7.52044  -1.457  0.14561
## directorJames L. Brooks                  -4.93303    6.21383  -0.794  0.42756
## directorJames Mangold                    -5.80941    6.02340  -0.964  0.33517
## directorJames Marsh                     -11.39607    7.52148  -1.515  0.13023
## directorJames McTeigue                   -0.29735    6.57049  -0.045  0.96392
## directorJames Wan                       -11.70977    6.57540  -1.781  0.07541
## directorJan de Bont                      -9.11205    7.51872  -1.212  0.22599
## directorJason Moore                      -5.68954    7.51881  -0.757  0.44950
## directorJason Reitman                    -7.53085    5.91366  -1.273  0.20331
## directorJay Roach                        -6.54275    6.02886  -1.085  0.27822
## directorJean-Jacques Annaud              -2.96531    6.55656  -0.452  0.65123
## directorJean-Marc Vallée                 -8.49940    7.52225  -1.130  0.25894
## directorJean-Pierre Jeunet               -3.93362    6.20544  -0.634  0.52637
## directorJean Negulesco                    8.22388    7.54049   1.091  0.27585
## directorJeff Franklin                    -3.57141    6.56399  -0.544  0.58657
## directorJeff Tomsic                     -10.44609    6.04237  -1.729  0.08433
## directorJeffrey Nachmanoff               -4.82778    7.53736  -0.641  0.52207
## directorJerry Zucker                      0.56701    6.22502   0.091  0.92745
## directorJim Field Smith                  -8.16371    7.51871  -1.086  0.27798
## directorJim Gillespie                    -3.14431    6.56715  -0.479  0.63225
## directorJoan Chen                         0.59472    7.53320   0.079  0.93710
## directorJoe & Anthony Russo              -5.16359    6.56668  -0.786  0.43196
## directorJoe Johnston                    -10.44774    7.52173  -1.389  0.16531
## directorJoe Wright                       -2.29506    5.90681  -0.389  0.69774
## directorJoel Coen                         1.22641    5.91894   0.207  0.83592
## directorJoel Schumacher                  -6.29275    7.52184  -0.837  0.40313
## directorJoel Zwick                      -15.66359    7.52387  -2.082  0.03775
## directorJohn Carney                       3.23308    7.52210   0.430  0.66748
## directorJohn Cassavetes                  -5.73554    6.21810  -0.922  0.35667
## directorJohn Crowley                     -5.07690    7.52357  -0.675  0.50005
## directorJohn Curran                      -5.51360    6.21849  -0.887  0.37560
## directorJohn Fortenberry                 -7.16371    7.51871  -0.953  0.34106
## directorJohn Glen                         2.68621    5.62683   0.477  0.63325
## directorJohn Hamburg                    -10.04922    5.91876  -1.698  0.09002
## directorJohn Herzfeld                    -0.72446    7.54389  -0.096  0.92353
## directorJohn Huston                      -3.66636    5.85920  -0.626  0.53171
## directorJohn Krasinski                   -8.76692    7.52210  -1.165  0.24426
## directorJohn M. Chu                      -4.25866    6.09818  -0.698  0.48521
## directorJohn Madden                      -8.49940    7.52225  -1.130  0.25894
## directorJohn McNaughton                  -3.83433    6.56387  -0.584  0.55932
## directorJohn McTiernan                  -10.93400    6.56285  -1.666  0.09619
## directorJohn Patrick Shanley            -14.24109    7.52244  -1.893  0.05879
## directorJohn Stockwell                   -3.60273    7.52415  -0.479  0.63223
## directorJon Amiel                         9.05969    7.56760   1.197  0.23168
## directorJon Avnet                        -3.67279    7.54758  -0.487  0.62669
## directorJon Favreau                      -8.62915    6.21596  -1.388  0.16555
## directorJon M. Chu                       -6.74858    6.56038  -1.029  0.30401
## directorJon Turteltaub                   -5.16359    6.56668  -0.786  0.43196
## directorJon Watts                        -8.58806    6.20450  -1.384  0.16679
## directorJonas Åkerlund                    4.06889    7.53195   0.540  0.58923
## directorJonathan Levine                  -8.09907    6.55798  -1.235  0.21728
## directorJonathan Lynn                     0.73352    6.03700   0.122  0.90333
## directorJonathan Mostow                   1.17222    7.53736   0.156  0.87646
## directorJordan Mechner                   -5.44774    7.52173  -0.724  0.46917
## directorJordan Peele                     -8.29747    6.56125  -1.265  0.20647
## directorJoseph Gordon-Levitt             -2.69691    6.56232  -0.411  0.68123
## directorJoseph Kosinski                 -11.03903    6.58479  -1.676  0.09414
## directorJoseph L. Mankiewicz             12.08906    7.53722   1.604  0.10923
## directorJosh Boone                       -2.79287    7.51992  -0.371  0.71047
## directorJosh Radnor                      -0.24109    7.52244  -0.032  0.97444
## directorJoss Whedon                      -7.02435    6.57220  -1.069  0.28556
## directorJudd Apatow                      -7.47939    5.73884  -1.303  0.19294
## directorJudy Greer                      -14.94685    6.57610  -2.273  0.02336
## directorJulian Farino                     4.64639    7.53590   0.617  0.53774
## directorJulian Jarrold                   -7.49940    7.52225  -0.997  0.31916
## directorJustin Chadwick                  -0.17934    6.56659  -0.027  0.97822
## directorKatt Shea                        16.80138    7.54570   2.227  0.02632
## directorKelly Makin                     -12.71525    7.52285  -1.690  0.09147
## directorKen Kwapis                       -4.57713    5.85116  -0.782  0.43435
## directorKen Scott                        -5.61193    7.52517  -0.746  0.45609
## directorKenneth Branagh                  -7.54281    6.55652  -1.150  0.25040
## directorKevin Bray                       -3.32424    6.21482  -0.535  0.59291
## directorKevin Lima                       -7.80024    6.55876  -1.189  0.23477
## directorKevin Reynolds                   -6.73374    6.02791  -1.117  0.26437
## directorKevin Rodney Sullivan            -0.85373    7.52299  -0.113  0.90968
## directorKevin Smith                      -6.01698    6.55645  -0.918  0.35911
## directorKevin Spacey                      5.43973    7.52676   0.723  0.47012
## directorKing Vidor                       -2.50689    6.55553  -0.382  0.70228
## directorLana Wachowski, Lilly Wachowski -10.81858    7.52164  -1.438  0.15083
## directorLarry Charles                   -11.66359    7.52387  -1.550  0.12158
## directorLasse Hallström                  -7.30336    6.02856  -1.211  0.22617
## directorLawrence Kasdan                  -7.89059    6.56772  -1.201  0.23003
## directorLee H. Katzin                   -11.66359    7.52387  -1.550  0.12158
## directorLee Tamahori                      0.55315    6.57610   0.084  0.93299
## directorLee Toland Krieger               -4.74398    6.55558  -0.724  0.46954
## directorLeo McCarey                      -5.35361    7.53590  -0.710  0.47771
## directorLewis Gilbert                     0.89298    5.79502   0.154  0.87758
## directorLisa Cholodenko                 -12.97765    6.43485  -2.017  0.04414
## directorLone Scherfig                    -1.24109    7.52244  -0.165  0.86901
## directorLorene Scafaria                   2.06889    7.53195   0.275  0.78365
## directorLouis Leterrier                  -5.37484    6.56777  -0.818  0.41345
## directorLouis Malle                      -2.08610    7.52593  -0.277  0.78173
## directorLuc Besson                        2.86224    7.52448   0.380  0.70378
## directorLuca Guadagnino                  -3.08562    8.00333  -0.386  0.69996
## directorLuis Mandoki                     -9.73248    6.21337  -1.566  0.11775
## directorLynn Shelton                     -3.67934    6.56659  -0.560  0.57546
## directorM. Night Shyamalan               -5.42651    6.56636  -0.826  0.40888
## directorMalcolm Venville                 -8.03443    7.52765  -1.067  0.28623
## directorMarc Forster                     -4.57060    5.92176  -0.772  0.44050
## directorMarc Klein                       -1.45694    7.53077  -0.193  0.84666
## directorMarc Lawrence                    -8.82318    6.56951  -1.343  0.17973
## directorMarc Webb                        -3.57921    5.91065  -0.606  0.54503
## directorMarielle Heller                   0.28475    7.52285   0.038  0.96982
## directorMark Mylod                       -6.48289    7.51997  -0.862  0.38896
## directorMark Neveldine, Brian Taylor     -6.71525    7.52285  -0.893  0.37238
## directorMark Pellington                  -3.35361    7.53590  -0.445  0.65646
## directorMark Piznarski                   -1.40722    6.56754  -0.214  0.83041
## directorMark Steven Johnson              -7.61193    7.52517  -1.012  0.31215
## directorMark Waters                      -5.17657    6.55685  -0.789  0.43012
## directorMartin Brest                     -6.91365    6.55699  -1.054  0.29210
## directorMartin Campbell                  -3.20664    6.21389  -0.516  0.60600
## directorMartin Scorsese                  -3.21322    5.62528  -0.571  0.56806
## directorMassy Tadjedin                   -2.66929    6.20864  -0.430  0.66739
## directorMatthew Ross                    -18.82778    7.53736  -2.498  0.01274
## directorMatthew Vaughn                   -4.37994    5.91639  -0.740  0.45939
## directorMax Joseph                       -6.49940    7.52225  -0.864  0.38790
## directorMaya Forbes                      -7.45694    7.53077  -0.990  0.32245
## directorMcG                              -7.94697    6.56199  -1.211  0.22632
## directorMel Gibson                       -7.79275    6.56436  -1.187  0.23562
## directorMelville Shavelson                7.17222    7.53736   0.952  0.34168
## directorMichael Apted                    -3.01426    6.22499  -0.484  0.62840
## directorMichael Bay                      -5.99761    5.83208  -1.028  0.30416
## directorMichael Curtiz                   -2.08150    6.56405  -0.317  0.75127
## directorMichael Gracey                   -3.94225    6.56625  -0.600  0.54846
## directorMichael Hoffman                 -11.78449    6.55948  -1.797  0.07288
## directorMichael Lehmann                  -5.44542    6.21693  -0.876  0.38141
## directorMichael Mann                     -5.30805    6.03728  -0.879  0.37962
## directorMichael Patrick King             -7.46130    6.04958  -1.233  0.21789
## directorMichael Rymer                    -6.44774    7.52173  -0.857  0.39165
## directorMichael Showalter               -10.71525    7.52285  -1.424  0.15483
## directorMichael Sucsy                    -8.87773    6.55694  -1.354  0.17623
## directorMichael Tollin                   -3.07690    7.52357  -0.409  0.68270
## directorMichel Gondry                     5.12657    6.22368   0.824  0.41040
## directorMichel Hazanavicius             -11.71525    7.52285  -1.557  0.11990
## directorMichelangelo Antonioni           -3.70240    6.55663  -0.565  0.57249
## directorMick Jackson                     -5.60520    6.21680  -0.902  0.36760
## directorMiguel Arteta                    -3.64065    6.55671  -0.555  0.57891
## directorMike Judge                      -10.39607    7.52148  -1.382  0.16740
## directorMike Mills                        3.25544    6.82452   0.477  0.63351
## directorMike Newell                      -1.44335    5.68685  -0.254  0.79973
## directorMike Nichols                     -2.48866    5.70959  -0.436  0.66308
## directorMimi Leder                       -8.48289    7.51997  -1.128  0.25972
## directorMira Nair                        -4.94685    6.57610  -0.752  0.45218
## directorMorten Tyldum                    -3.76692    7.52210  -0.501  0.61670
## directorNahnatchka Khan                  -4.73566    6.23167  -0.760  0.44757
## directorNancy Meyers                     -7.22029    5.72829  -1.260  0.20796
## directorNeil Burger                      -3.10733    6.56395  -0.473  0.63609
## directorNicholas Jarecki                 -9.12862    6.60478  -1.382  0.16742
## directorNicholas Ray                      2.59472    7.53320   0.344  0.73063
## directorNicholas Stoller                 -7.55711    6.02204  -1.255  0.20997
## directorNick Cassavetes                  -4.57703    5.78413  -0.791  0.42906
## directorNick Hurran                      -4.76692    7.52210  -0.634  0.52649
## directorNicolas Winding Refn             -2.92191    7.52157  -0.388  0.69780
## directorNiels Arden Oplev                -1.45694    7.53077  -0.193  0.84666
## directorNikolaj Arcel                     3.49140    7.52862   0.464  0.64298
## directorNoah Baumbach                    -3.61193    6.56817  -0.550  0.58257
## directorNoam Murro                      -11.82778    7.53736  -1.569  0.11709
## directorNora Ephron                      -9.76692    7.52210  -1.298  0.19461
## directorNorman Jewison                   -4.24109    7.52244  -0.564  0.57309
## directorOl Parker                        -5.25719    6.41183  -0.820  0.41257
## directorOliver Stone                     -4.95942    6.21249  -0.798  0.42499
## directorOtto Bathurst                    -8.97357    7.52195  -1.193  0.23332
## directorP.J. Hogan                       -5.33433    6.56387  -0.813  0.41670
## directorPaco Cabezas                     -2.50860    7.52862  -0.333  0.73909
## directorPark Chan-wook                   -2.81858    7.52164  -0.375  0.70799
## directorPat O'Connor                     -4.94963    6.21169  -0.797  0.42585
## directorPatty Jenkins                    -6.38346    6.41250  -0.995  0.31988
## directorPaul Brickman                    -3.26704    7.51954  -0.434  0.66409
## directorPaul Feig                        -8.87773    6.02079  -1.475  0.14083
## directorPaul Haggis                      -2.78222    6.03853  -0.461  0.64514
## directorPaul Mazursky                    -6.51149    6.55994  -0.993  0.32127
## directorPaul McGuigan                    -5.49940    7.52225  -0.731  0.46499
## directorPaul Thomas Anderson             -2.99001    5.80372  -0.515  0.60660
## directorPaul Verhoeven                   -5.98277    7.52966  -0.795  0.42716
## directorPaul Weiland                     -7.46809    6.56564  -1.137  0.25578
## directorPaul Weitz                       -3.55106    7.52306  -0.472  0.63707
## directorPaul Weitz, Chris Weitz           1.61402    5.91009   0.273  0.78487
## directorPenelope Spheeris                -7.44774    7.52173  -0.990  0.32247
## directorPeter Berg                      -10.56027    7.52676  -1.403  0.16109
## directorPeter Chelsom                    -6.81858    7.52164  -0.907  0.36500
## directorPeter Farrelly                   -8.67279    7.54758  -1.149  0.25095
## directorPeter Hedges                    -10.40817    6.56398  -1.586  0.11331
## directorPeter Howitt                    -14.40528    7.53320  -1.912  0.05629
## directorPeter Jackson                    -3.02158    6.55983  -0.461  0.64523
## directorPeter Landesman                  -4.50860    7.52862  -0.599  0.54948
## directorPeter R. Hunt                    -3.80706    6.20672  -0.613  0.53984
## directorPeter Segal                      -5.02439    5.83710  -0.861  0.38969
## directorPeter Sollett                     6.19745    7.37123   0.841  0.40079
## directorPeter Webber                     -3.30850    6.56412  -0.504  0.61442
## directorPeyton Reed                      -7.16670    6.21105  -1.154  0.24899
## directorPhil Alden Robinson              -8.58622    7.51883  -1.142  0.25390
## directorPhillip Noyce                    12.87781    6.58447   1.956  0.05092
## directorPhyllida Lloyd                  -10.14525    6.56458  -1.545  0.12273
## directorPierre Morel                    -11.77612    7.54049  -1.562  0.11885
## directorQuentin Tarantino                -5.94526    6.21652  -0.956  0.33925
## directorQuinn Shephard                    3.38807    7.52517   0.450  0.65270
## directorRaja Gosnell                     -4.92191    7.52157  -0.654  0.51311
## directorRand Ravich                      -2.29275    7.52184  -0.305  0.76061
## directorRandall Wallace                 -17.03443    7.52765  -2.263  0.02397
## directorRawson Marshall Thurber         -12.61193    6.21652  -2.029  0.04289
## directorRebecca Miller                   -7.16271    6.59653  -1.086  0.27796
## directorRené Clair                        6.43973    7.52676   0.856  0.39255
## directorRenny Harlin                     -0.25029    7.54216  -0.033  0.97354
## directorRichard Brooks                   -5.87024    7.52147  -0.780  0.43541
## directorRichard Curtis                    4.23619    5.77892   0.733  0.46380
## directorRichard Eyre                      7.56877    7.52097   1.006  0.31462
## directorRichard LaGravenese              -7.94225    6.56625  -1.210  0.22689
## directorRichard Linklater                -6.21537    7.51898  -0.827  0.40876
## directorRichard Loncraine                -4.40528    6.22623  -0.708  0.47949
## directorRichard Rush                      2.28475    7.52285   0.304  0.76145
## directorRick Famuyiwa                    -4.33905    6.55948  -0.661  0.50853
## directorRicky Gervais, Matthew Robinson  -8.26143    6.57280  -1.257  0.20924
## directorRidley Scott                     -3.97909    5.91809  -0.672  0.50160
## directorRob Cohen                        -1.41182    6.56360  -0.215  0.82976
## directorRob Marshall                     -9.14065    6.55671  -1.394  0.16377
## directorRob Reiner                       -8.31984    5.71719  -1.455  0.14609
## directorRobert De Niro                   -6.58319    6.21107  -1.060  0.28958
## directorRobert Eggers                     0.96557    7.52765   0.128  0.89798
## directorRobert Iscove                    -5.12856    7.52480  -0.682  0.49577
## directorRobert Luketic                   -1.53866    5.90774  -0.260  0.79460
## directorRobert Redford                   -2.62113    7.55154  -0.347  0.72863
## directorRobert Rodriguez                 -7.81858    7.52164  -1.039  0.29897
## directorRobert Rossen                    -7.29275    7.52184  -0.970  0.33264
## directorRobert Schwentke                -10.48277    6.57332  -1.595  0.11126
## directorRobert Wise                      -3.29275    6.56436  -0.502  0.61611
## directorRobert Zemeckis                  -6.93543    5.84568  -1.186  0.23590
## directorRodman Flender                   -4.18022    7.52630  -0.555  0.57880
## directorRoger Avary                      -4.87024    7.52147  -0.648  0.51753
## directorRoger Michell                     4.94772    6.24081   0.793  0.42819
## directorRoger Spottiswoode                0.23291    6.04838   0.039  0.96930
## directorRoland Emmerich                  -6.55106    7.52306  -0.871  0.38419
## directorRoland Joffé                    -10.76692    7.52210  -1.431  0.15281
## directorRoman Polanski                  -10.76692    7.52210  -1.431  0.15281
## directorRon Howard                       -8.91688    5.74255  -1.553  0.12097
## directorRon Shelton                      -7.36199    6.55774  -1.123  0.26201
## directorRowdy Herrington                 -7.76692    7.52210  -1.033  0.30221
## directorRuben Fleischer                  -1.83082    5.92049  -0.309  0.75724
## directorRyan Coogler                     -4.98566    6.56083  -0.760  0.44759
## directorRyan Murphy                      -8.11263    6.82297  -1.189  0.23487
## directorSam Levinson                     -2.76692    7.52210  -0.368  0.71312
## directorSam Mendes                       -3.56706    5.74100  -0.621  0.53460
## directorSam Raimi                        -1.88065    5.91645  -0.318  0.75069
## directorSam Taylor-Johnson               -6.38599    6.56361  -0.973  0.33095
## directorSanaa Hamri                     -12.76692    7.52210  -1.697  0.09013
## directorSaul Dibb                         3.18130    6.21896   0.512  0.60914
## directorScott Cooper                      3.22388    6.58572   0.490  0.62464
## directorScott Derrickson                -14.18942    7.52332  -1.886  0.05974
## directorScott Hicks                      -2.91365    6.55699  -0.444  0.65693
## directorSean Anders                      -8.52435    6.57220  -1.297  0.19509
## directorSeth Gordon                      -8.91365    6.55699  -1.359  0.17449
## directorSeth MacFarlane                  -4.37484    6.56777  -0.666  0.50558
## directorSharon Maguire                  -10.49852    6.03873  -1.739  0.08260
## directorShawn Levy                       -1.56027    7.52676  -0.207  0.83584
## directorSheree Folkson                   -6.67934    6.56659  -1.017  0.30946
## directorSidney Lumet                     -3.25029    7.54216  -0.431  0.66665
## directorSimon West                       -5.87024    7.52147  -0.780  0.43541
## directorSofia Coppola                    11.64639    7.53590   1.545  0.12273
## directorSpike Lee                        -6.29275    7.52184  -0.837  0.40313
## directorStanley Donen                     2.53846    6.59064   0.385  0.70025
## directorStanley Donen, Gene Kelly         0.82066    6.56659   0.125  0.90058
## directorStephen Chbosky                 -17.59542    7.53428  -2.335  0.01983
## directorStephen Daldry                    4.46545    7.51926   0.594  0.55281
## directorStephen Roberts                   1.38807    7.52517   0.184  0.85371
## directorStephen Sommers                  -6.90174    7.52325  -0.917  0.35928
## directorStephen T. Kay                   -8.49940    7.52225  -1.130  0.25894
## directorSteve Buscemi                     1.28475    7.52285   0.171  0.86445
## directorSteve Kloves                     -7.18942    7.52332  -0.956  0.33963
## directorSteve McQueen                    -6.81626    6.22461  -1.095  0.27391
## directorSteve Pink                       -1.49940    7.52225  -0.199  0.84207
## directorSteven Baigelman                 -1.57141    6.56399  -0.239  0.81087
## directorSteven Brill                    -10.31858    6.56413  -1.572  0.11645
## directorSteven Shainberg                 -0.13776    7.52448  -0.018  0.98540
## directorSteven Soderbergh                -6.66130    6.00976  -1.108  0.26810
## directorSteven Spielberg                 -2.42434    5.68208  -0.427  0.66977
## directorSusanna Fogel                    -8.36476    6.56858  -1.273  0.20332
## directorSusanne Bier                     -0.71525    7.52285  -0.095  0.92428
## directorSydney Pollack                   -4.47773    6.03899  -0.741  0.45868
## directorSylvain White                    -6.21537    7.51898  -0.827  0.40876
## directorTamra Davis                      -3.97357    7.52195  -0.528  0.59750
## directorTarsem Singh                     -6.55106    7.52306  -0.871  0.38419
## directorTate Taylor                      -0.58167    6.04498  -0.096  0.92337
## directorTaylor Hackford                  -6.74970    6.21307  -1.086  0.27772
## directorTed Demme                        -4.24109    7.52244  -0.564  0.57309
## directorTerence Young                    -0.93639    5.70929  -0.164  0.86977
## directorTerry George                     -8.09907    6.55798  -1.235  0.21728
## directorTerry Zwigoff                    -7.98277    7.52966  -1.060  0.28946
## directorThea Sharrock                    -7.26981    6.55549  -1.109  0.26786
## directorTheodore Melfi                  -11.13410    6.57997  -1.692  0.09111
## directorThomas Bezucha                   -4.15646    5.95104  -0.698  0.48515
## directorThomas Carter                    -0.92191    7.52157  -0.123  0.90249
## directorTim Burton                       -2.72050    5.84036  -0.466  0.64151
## directorTim Miller                      -13.18942    7.52332  -1.753  0.08006
## directorTim Story                        -9.34441    6.56399  -1.424  0.15505
## directorTimur Bekmambetov                -9.95706    7.52044  -1.324  0.18597
## directorTodd Haynes                      -0.53503    7.35668  -0.073  0.94205
## directorTodd Phillips                    -3.14204    6.02573  -0.521  0.60224
## directorTom Ford                          4.38943    7.11805   0.617  0.53768
## directorTom Hanks                        -4.61936    6.21223  -0.744  0.45740
## directorTom Hooper                      -10.68581    6.21011  -1.721  0.08579
## directorTom Shadyac                      -7.96095    5.84085  -1.363  0.17337
## directorTommy Lee Wallace                 4.49140    7.52862   0.597  0.55100
## directorTony Goldwyn                     -7.82607    6.55808  -1.193  0.23317
## directorTony Scott                       -2.22342    5.91310  -0.376  0.70703
## directorTyler Perry                     -13.81858    7.52164  -1.837  0.06665
## directorundefined                        -0.44087    6.02328  -0.073  0.94167
## directorValerio Zurlini                  -2.79287    7.51992  -0.371  0.71047
## directorVictor Fleming                   -3.24109    7.52244  -0.431  0.66672
## directorVictor Levin                    -15.82778    7.53736  -2.100  0.03613
## directorVincent Gallo                     4.23308    7.52210   0.563  0.57380
## directorVincente Minnelli                 3.28475    7.52285   0.437  0.66252
## directorWally Pfister                    -2.40528    7.53320  -0.319  0.74961
## directorWarren Beatty                     2.85304    7.54953   0.378  0.70562
## directorWayne Kramer                     -5.35361    7.53590  -0.710  0.47771
## directorWayne Wang                      -11.21525    6.56551  -1.708  0.08808
## directorWes Anderson                     -5.13637    5.92848  -0.866  0.38660
## directorWill Gluck                       -8.47668    6.20539  -1.366  0.17241
## directorWilliam A. Wellman               -1.14908    7.53987  -0.152  0.87892
## directorWilliam Friedkin                  2.86224    7.52448   0.380  0.70378
## directorWilliam Wyler                    -1.76692    7.52210  -0.235  0.81436
## directorWolfgang Petersen                -2.40357    6.55650  -0.367  0.71404
## directorWoody Allen                       1.61751    5.57965   0.290  0.77199
## directorYann Samuell                     -9.44774    7.52173  -1.256  0.20955
## directorYorgos Lanthimos                 -5.23513    5.88519  -0.890  0.37404
## directorZach Braff                       -4.97357    7.52195  -0.661  0.50872
## directorZack Snyder                      -9.10831    6.21342  -1.466  0.14316
## character_1_genderwoman                  -2.49940    1.62329  -1.540  0.12412
## character_2_genderwoman                  -0.16371    1.60680  -0.102  0.91888
## couple_number                            -3.02017    0.27151 -11.123  < 2e-16
##                                            
## (Intercept)                                
## actor_1_age                             ***
## directorAdam McKay                         
## directorAdam Nee, Aaron Nee                
## directorAdam Shankman                      
## directorAdrian Lyne                        
## directorAlan Parker                        
## directorAlan Shapiro                       
## directorAlejandro Agresti               *  
## directorAlejandro González Iñárritu        
## directorAlex Garland                       
## directorAlex Kurtzman                      
## directorAlfonso Arau                       
## directorAlfonso Cuarón                     
## directorAlfred Hitchcock                   
## directorAmy Heckerling                     
## directorAnand Tucker                       
## directorAndrew Davis                       
## directorAndrew Niccol                      
## directorAndy Cadiff                        
## directorAndy Serkis                        
## directorAndy Tennant                       
## directorAng Lee                            
## directorAngela Robinson                    
## directorAnne Fletcher                      
## directorAnthony Minghella                  
## directorAntoine Fuqua                      
## directorAnton Corbijn                      
## directorAntony Hoffman                     
## directorAri Aster                          
## directorArthur Hiller                      
## directorAtom Egoyan                        
## directorAutumn de Wilde                    
## directorAva DuVernay                       
## directorBaltasar Kormákur                  
## directorBarbet Schroeder                   
## directorBarry Levinson                     
## directorBarry Sonnenfeld                   
## directorBaz Luhrmann                       
## directorBen Stiller                        
## directorBen Younger                        
## directorBernardo Bertolucci                
## directorBernie Goldmann, Melisa Wallack    
## directorBetty Thomas                       
## directorBill Condon                        
## directorBill Purple                        
## directorBille Woodruff                     
## directorBilly Bob Thornton                 
## directorBilly Crystal                   .  
## directorBilly Wilder                       
## directorBlake Edwards                      
## directorBoaz Yakin                         
## directorBobby Farrelly, Peter Farrelly     
## directorBobcat Goldthwait                  
## directorBonnie Hunt                        
## directorBoots Riley                        
## directorBrad Silberling                    
## directorBradley Cooper                     
## directorBrian De Palma                     
## directorBrian Helgeland                    
## directorBrian Levant                       
## directorBrian Robbins                      
## directorBruce Joel Rubin                   
## directorBruce Robinson                     
## directorBryan Singer                       
## directorCameron Crowe                      
## directorCarl Rinsch                        
## directorCary Fukunaga                      
## directorCatherine Hardwicke                
## directorChad Stahelski                  .  
## directorCharles Shyer                      
## directorCharles Walters                    
## directorCharlie Chaplin                    
## directorChen Kaige                         
## directorChris Columbus                     
## directorChris Rock                         
## directorChris Wedge                        
## directorChris Weitz                        
## directorChristopher Nolan                  
## directorChuck Russell                      
## directorClint Eastwood                     
## directorColin Higgins                      
## directorColin Trevorrow                    
## directorCourtney Hunt                   .  
## directorCraig Brewer                    .  
## directorCraig Gillespie                    
## directorCurtis Hanson                      
## directorDagen Merrill                      
## directorDamien Chazelle                    
## directorDan Kwan, Daniel Scheinert      .  
## directorDaniel Petrie                      
## directorDanny Boyle                        
## directorDanny DeVito                       
## directorDarren Aronofsky                   
## directorDavid Ayer                         
## directorDavid Cronenberg                   
## directorDavid Dobkin                       
## directorDavid Fincher                      
## directorDavid Frankel                      
## directorDavid Koepp                        
## directorDavid Leitch                       
## directorDavid Lowery                       
## directorDavid Mamet                        
## directorDavid McNally                      
## directorDavid Mirkin                       
## directorDavid O. Russell                   
## directorDavid Yates                        
## directorDavid Zucker                       
## directorDax Shepard                        
## directorDelmer Daves                       
## directorDemian Lichtenstein                
## directorDenise Di Novi                  *  
## directorDennis Dugan                       
## directorDerek Cianfrance                   
## directorDewey Nicks                        
## directorDome Karukoski                     
## directorDon Michael Paul                   
## directorDonald Petrie                      
## directorDoug Liman                         
## directorDouglas McGrath                    
## directorDuncan Jones                       
## directorDustin Lance Black                 
## directorEdgar Wright                       
## directorEdward Zwick                       
## directorEli Roth                           
## directorElio Petri                         
## directorEmile Ardolino                     
## directorEric Bress, J. Mackye Gruber       
## directorEric Brevig                        
## directorEricson Core                       
## directorF. Gary Gray                       
## directorFederico Fellini                   
## directorFernando Meirelles                 
## directorFranc. Reyes                       
## directorFrancis Ford Coppola               
## directorFrancis Lawrence                   
## directorFrank Capra                        
## directorFrank Coraci                       
## directorFrank Pierson                      
## directorFred Zinnemann                     
## directorGabriele Muccino                   
## directorGarry Marshall                     
## directorGary Ross                          
## directorGary Winick                        
## directorGavin Hood                         
## directorGeorge Armitage                    
## directorGeorge C. Wolfe                    
## directorGeorge Clooney                     
## directorGeorge Cukor                       
## directorGeorge Lucas                       
## directorGeorge Nolfi                       
## directorGeorge Roy Hill                 .  
## directorGeorge Seaton                      
## directorGeorge Tillman Jr.                 
## directorGia Coppola                        
## directorGil Junger                         
## directorGina Prince-Bythewood              
## directorGlenn Ficarra, John Requa          
## directorGore Verbinski                     
## directorGreg Mottola                       
## directorGreta Gerwig                       
## directorGuillermo del Toro                 
## directorGus Van Sant                       
## directorGuy Hamilton                       
## directorGuy Ritchie                        
## directorHal Ashby                       ** 
## directorHal Needham                        
## directorHallie Meyers-Shyer                
## directorHarold Ramis                       
## directorHart Bochner                       
## directorHomi Adajania                      
## directorHoward Deutch                      
## directorHoward Hawks                       
## directorHugh Wilson                        
## directorIrving Pichel                      
## directorIsabel Coixet                      
## directorIvan Reitman                       
## directorJ.C. Chandor                       
## directorJ.J. Abrams                        
## directorJack Clayton                       
## directorJacob Aaron Estes                  
## directorJake Kasdan                        
## directorJames Cameron                      
## directorJames Foley                        
## directorJames Franco                       
## directorJames Gray                         
## directorJames Gunn                         
## directorJames L. Brooks                    
## directorJames Mangold                      
## directorJames Marsh                        
## directorJames McTeigue                     
## directorJames Wan                       .  
## directorJan de Bont                        
## directorJason Moore                        
## directorJason Reitman                      
## directorJay Roach                          
## directorJean-Jacques Annaud                
## directorJean-Marc Vallée                   
## directorJean-Pierre Jeunet                 
## directorJean Negulesco                     
## directorJeff Franklin                      
## directorJeff Tomsic                     .  
## directorJeffrey Nachmanoff                 
## directorJerry Zucker                       
## directorJim Field Smith                    
## directorJim Gillespie                      
## directorJoan Chen                          
## directorJoe & Anthony Russo                
## directorJoe Johnston                       
## directorJoe Wright                         
## directorJoel Coen                          
## directorJoel Schumacher                    
## directorJoel Zwick                      *  
## directorJohn Carney                        
## directorJohn Cassavetes                    
## directorJohn Crowley                       
## directorJohn Curran                        
## directorJohn Fortenberry                   
## directorJohn Glen                          
## directorJohn Hamburg                    .  
## directorJohn Herzfeld                      
## directorJohn Huston                        
## directorJohn Krasinski                     
## directorJohn M. Chu                        
## directorJohn Madden                        
## directorJohn McNaughton                    
## directorJohn McTiernan                  .  
## directorJohn Patrick Shanley            .  
## directorJohn Stockwell                     
## directorJon Amiel                          
## directorJon Avnet                          
## directorJon Favreau                        
## directorJon M. Chu                         
## directorJon Turteltaub                     
## directorJon Watts                          
## directorJonas Åkerlund                     
## directorJonathan Levine                    
## directorJonathan Lynn                      
## directorJonathan Mostow                    
## directorJordan Mechner                     
## directorJordan Peele                       
## directorJoseph Gordon-Levitt               
## directorJoseph Kosinski                 .  
## directorJoseph L. Mankiewicz               
## directorJosh Boone                         
## directorJosh Radnor                        
## directorJoss Whedon                        
## directorJudd Apatow                        
## directorJudy Greer                      *  
## directorJulian Farino                      
## directorJulian Jarrold                     
## directorJustin Chadwick                    
## directorKatt Shea                       *  
## directorKelly Makin                     .  
## directorKen Kwapis                         
## directorKen Scott                          
## directorKenneth Branagh                    
## directorKevin Bray                         
## directorKevin Lima                         
## directorKevin Reynolds                     
## directorKevin Rodney Sullivan              
## directorKevin Smith                        
## directorKevin Spacey                       
## directorKing Vidor                         
## directorLana Wachowski, Lilly Wachowski    
## directorLarry Charles                      
## directorLasse Hallström                    
## directorLawrence Kasdan                    
## directorLee H. Katzin                      
## directorLee Tamahori                       
## directorLee Toland Krieger                 
## directorLeo McCarey                        
## directorLewis Gilbert                      
## directorLisa Cholodenko                 *  
## directorLone Scherfig                      
## directorLorene Scafaria                    
## directorLouis Leterrier                    
## directorLouis Malle                        
## directorLuc Besson                         
## directorLuca Guadagnino                    
## directorLuis Mandoki                       
## directorLynn Shelton                       
## directorM. Night Shyamalan                 
## directorMalcolm Venville                   
## directorMarc Forster                       
## directorMarc Klein                         
## directorMarc Lawrence                      
## directorMarc Webb                          
## directorMarielle Heller                    
## directorMark Mylod                         
## directorMark Neveldine, Brian Taylor       
## directorMark Pellington                    
## directorMark Piznarski                     
## directorMark Steven Johnson                
## directorMark Waters                        
## directorMartin Brest                       
## directorMartin Campbell                    
## directorMartin Scorsese                    
## directorMassy Tadjedin                     
## directorMatthew Ross                    *  
## directorMatthew Vaughn                     
## directorMax Joseph                         
## directorMaya Forbes                        
## directorMcG                                
## directorMel Gibson                         
## directorMelville Shavelson                 
## directorMichael Apted                      
## directorMichael Bay                        
## directorMichael Curtiz                     
## directorMichael Gracey                     
## directorMichael Hoffman                 .  
## directorMichael Lehmann                    
## directorMichael Mann                       
## directorMichael Patrick King               
## directorMichael Rymer                      
## directorMichael Showalter                  
## directorMichael Sucsy                      
## directorMichael Tollin                     
## directorMichel Gondry                      
## directorMichel Hazanavicius                
## directorMichelangelo Antonioni             
## directorMick Jackson                       
## directorMiguel Arteta                      
## directorMike Judge                         
## directorMike Mills                         
## directorMike Newell                        
## directorMike Nichols                       
## directorMimi Leder                         
## directorMira Nair                          
## directorMorten Tyldum                      
## directorNahnatchka Khan                    
## directorNancy Meyers                       
## directorNeil Burger                        
## directorNicholas Jarecki                   
## directorNicholas Ray                       
## directorNicholas Stoller                   
## directorNick Cassavetes                    
## directorNick Hurran                        
## directorNicolas Winding Refn               
## directorNiels Arden Oplev                  
## directorNikolaj Arcel                      
## directorNoah Baumbach                      
## directorNoam Murro                         
## directorNora Ephron                        
## directorNorman Jewison                     
## directorOl Parker                          
## directorOliver Stone                       
## directorOtto Bathurst                      
## directorP.J. Hogan                         
## directorPaco Cabezas                       
## directorPark Chan-wook                     
## directorPat O'Connor                       
## directorPatty Jenkins                      
## directorPaul Brickman                      
## directorPaul Feig                          
## directorPaul Haggis                        
## directorPaul Mazursky                      
## directorPaul McGuigan                      
## directorPaul Thomas Anderson               
## directorPaul Verhoeven                     
## directorPaul Weiland                       
## directorPaul Weitz                         
## directorPaul Weitz, Chris Weitz            
## directorPenelope Spheeris                  
## directorPeter Berg                         
## directorPeter Chelsom                      
## directorPeter Farrelly                     
## directorPeter Hedges                       
## directorPeter Howitt                    .  
## directorPeter Jackson                      
## directorPeter Landesman                    
## directorPeter R. Hunt                      
## directorPeter Segal                        
## directorPeter Sollett                      
## directorPeter Webber                       
## directorPeyton Reed                        
## directorPhil Alden Robinson                
## directorPhillip Noyce                   .  
## directorPhyllida Lloyd                     
## directorPierre Morel                       
## directorQuentin Tarantino                  
## directorQuinn Shephard                     
## directorRaja Gosnell                       
## directorRand Ravich                        
## directorRandall Wallace                 *  
## directorRawson Marshall Thurber         *  
## directorRebecca Miller                     
## directorRené Clair                         
## directorRenny Harlin                       
## directorRichard Brooks                     
## directorRichard Curtis                     
## directorRichard Eyre                       
## directorRichard LaGravenese                
## directorRichard Linklater                  
## directorRichard Loncraine                  
## directorRichard Rush                       
## directorRick Famuyiwa                      
## directorRicky Gervais, Matthew Robinson    
## directorRidley Scott                       
## directorRob Cohen                          
## directorRob Marshall                       
## directorRob Reiner                         
## directorRobert De Niro                     
## directorRobert Eggers                      
## directorRobert Iscove                      
## directorRobert Luketic                     
## directorRobert Redford                     
## directorRobert Rodriguez                   
## directorRobert Rossen                      
## directorRobert Schwentke                   
## directorRobert Wise                        
## directorRobert Zemeckis                    
## directorRodman Flender                     
## directorRoger Avary                        
## directorRoger Michell                      
## directorRoger Spottiswoode                 
## directorRoland Emmerich                    
## directorRoland Joffé                       
## directorRoman Polanski                     
## directorRon Howard                         
## directorRon Shelton                        
## directorRowdy Herrington                   
## directorRuben Fleischer                    
## directorRyan Coogler                       
## directorRyan Murphy                        
## directorSam Levinson                       
## directorSam Mendes                         
## directorSam Raimi                          
## directorSam Taylor-Johnson                 
## directorSanaa Hamri                     .  
## directorSaul Dibb                          
## directorScott Cooper                       
## directorScott Derrickson                .  
## directorScott Hicks                        
## directorSean Anders                        
## directorSeth Gordon                        
## directorSeth MacFarlane                    
## directorSharon Maguire                  .  
## directorShawn Levy                         
## directorSheree Folkson                     
## directorSidney Lumet                       
## directorSimon West                         
## directorSofia Coppola                      
## directorSpike Lee                          
## directorStanley Donen                      
## directorStanley Donen, Gene Kelly          
## directorStephen Chbosky                 *  
## directorStephen Daldry                     
## directorStephen Roberts                    
## directorStephen Sommers                    
## directorStephen T. Kay                     
## directorSteve Buscemi                      
## directorSteve Kloves                       
## directorSteve McQueen                      
## directorSteve Pink                         
## directorSteven Baigelman                   
## directorSteven Brill                       
## directorSteven Shainberg                   
## directorSteven Soderbergh                  
## directorSteven Spielberg                   
## directorSusanna Fogel                      
## directorSusanne Bier                       
## directorSydney Pollack                     
## directorSylvain White                      
## directorTamra Davis                        
## directorTarsem Singh                       
## directorTate Taylor                        
## directorTaylor Hackford                    
## directorTed Demme                          
## directorTerence Young                      
## directorTerry George                       
## directorTerry Zwigoff                      
## directorThea Sharrock                      
## directorTheodore Melfi                  .  
## directorThomas Bezucha                     
## directorThomas Carter                      
## directorTim Burton                         
## directorTim Miller                      .  
## directorTim Story                          
## directorTimur Bekmambetov                  
## directorTodd Haynes                        
## directorTodd Phillips                      
## directorTom Ford                           
## directorTom Hanks                          
## directorTom Hooper                      .  
## directorTom Shadyac                        
## directorTommy Lee Wallace                  
## directorTony Goldwyn                       
## directorTony Scott                         
## directorTyler Perry                     .  
## directorundefined                          
## directorValerio Zurlini                    
## directorVictor Fleming                     
## directorVictor Levin                    *  
## directorVincent Gallo                      
## directorVincente Minnelli                  
## directorWally Pfister                      
## directorWarren Beatty                      
## directorWayne Kramer                       
## directorWayne Wang                      .  
## directorWes Anderson                       
## directorWill Gluck                         
## directorWilliam A. Wellman                 
## directorWilliam Friedkin                   
## directorWilliam Wyler                      
## directorWolfgang Petersen                  
## directorWoody Allen                        
## directorYann Samuell                       
## directorYorgos Lanthimos                   
## directorZach Braff                         
## directorZack Snyder                        
## character_1_genderwoman                    
## character_2_genderwoman                    
## couple_number                           ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 5.194 on 641 degrees of freedom
## Multiple R-squared:  0.7932, Adjusted R-squared:  0.6276 
## F-statistic: 4.791 on 513 and 641 DF,  p-value: < 2.2e-16

Inferences:

  • This model is the best model out of all the others above.
  • This model has an adjusted R-Squared score of 0.62 which is the best out of all the above ones.

I have chosen actor_1_age, director , character_1_gender, character_2_gender, couple_number as my explanatory variables by applying my intuitions.

6. Model Diagnosis-

1. Residuals vs. Fitted Values

gg_resfitted(model) +
  geom_smooth(se=FALSE)
## `geom_smooth()` using method = 'gam' and formula = 'y ~ s(x, bs = "cs")'

The residual points in the graph seems to be following the line, so this is a good model.

2. Residuals vs. X Values

residual_plots <- gg_resX(model)

3. Residuals Histogram

gg_reshist(model)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

This seems to be a fairely good normalized curve. Hence we can say that this is a good model.

4. QQ-Plots

gg_qqplot(model)

As we can see, the points follow the lines path, we can say that this is a good model.

Hence, I feel like this is the correct model for my dataset.

6. Conclusion-

In conclusion, analyzing age differences in romantic couple shown in films provides useful insights on both cinematic trends and societal views of relationships. Through exploratory data analysis, we uncovered several key findings. Firstly, the age of the older actor has a considerable impact on the age gap between on-screen couples, with larger age gaps becoming more common as performers age. Secondly, certain directors show consistent trends in the age dynamics of their films, indicating a unique directing influence on onscreen relationships. Furthermore, gender combinations play an important role, showing that the portrayal of relationships is influenced by both age and gender dynamics. Model 4, which included actor_1_age, director, character_1_gender, character_2_gender, and couple_number, emerged as the best model based on adjusted R-squared.