The variables that need to change their Data Type.
Variables the must be cleaned,each part of the variable should be
separated erasing tags such as “id”:
* belongs_to_collection: Contains
“id”,“name”,“poster_part”,“backdrop_part”
* genres: Contains “id”,“name”
* production_companies: Contains “name”,“id”
* production_countries: Contains “abbreviated_name”,“name”
* spoken_languages: Contains “abbreviated_name”,“name”
# Divide string in columns delimiting by ":"
collection <- str_split_fixed(movies$belongs_to_collection, ":", n = Inf)
# Choose index 1-5
collection <- collection[,1:5]
# Choose index 2-5
collection <- collection[, c(2,3,4,5)]
summary(collection)
## V1 V2 V3 V4
## Length:45466 Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character Class :character
## Mode :character Mode :character Mode :character Mode :character
# Convert to a data frame
collection <- as.data.frame(collection)
#Eliminate punctuation signs except "." and "/"
collection <- collection %>%
mutate(id_collection = str_replace_all(collection$V1, "[[:punct:]&&[^./]]", " "))
collection <- collection %>%
mutate(name_collection = str_replace_all(collection$V2, "[[:punct:]&&[^./]]", " "))
collection <- collection %>%
mutate(poster_path_collection = str_replace_all(collection$V3, "[[:punct:]&&[^./]]", " "))
collection <- collection %>%
mutate(backdrop_path_collection = str_replace_all(collection$V4, "[[:punct:]&&[^./]]", " "))
# Remove specfic words from data frame
collection$id_collection <- str_remove(collection$id_collection,"name")
collection$name_collection <- str_remove(collection$name_collection,"poster path")
collection$poster_path_collection <- str_remove(collection$poster_path_collection,"backdrop path")
# Choose specific columns
collection <- collection[,5:8]
summary(collection)
## id_collection name_collection poster_path_collection
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
## backdrop_path_collection
## Length:45466
## Class :character
## Mode :character
# Remove whitespace
collection$id_collection <- str_trim(collection$id_collection, "right")
collection$name_collection <- str_trim(collection$name_collection, "right")
collection$poster_path_collection <- str_trim(collection$poster_path_collection, "right")
collection$backdrop_path_collection <- str_trim(collection$backdrop_path_collection, "right")
summary(collection)
## id_collection name_collection poster_path_collection
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
## backdrop_path_collection
## Length:45466
## Class :character
## Mode :character
# Add separated collection to movies data frame
movies <- cbind(movies, collection)
The same process applied in this section will be applied to the following variables with minor changes in the code to fit the different situations.
new_genres <- str_split_fixed(movies$genres, ":", n = Inf)
new_genres <- new_genres[,1:7]
new_genres <- new_genres[, c(3,5,7)]
summary(new_genres)
## V1 V2 V3
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
new_genres <- as.data.frame(new_genres)
new_genres <- new_genres %>%
mutate(genre1 = str_replace_all(new_genres$V1, "[[:punct:]]", " "))
new_genres <- new_genres %>%
mutate(genre2 = str_replace_all(new_genres$V2, "[[:punct:]]", " "))
new_genres <- new_genres %>%
mutate(genre3 = str_replace_all(new_genres$V3, "[[:punct:]]", " "))
new_genres$genre1 <- str_remove(new_genres$genre1,"id")
new_genres$genre2 <- str_remove(new_genres$genre2,"id")
new_genres$genre3 <- str_remove(new_genres$genre3,"id")
new_genres <- new_genres[,4:6]
summary(new_genres)
## genre1 genre2 genre3
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
new_genres$genre1 <- str_trim(new_genres$genre1, "right")
new_genres$genre2 <- str_trim(new_genres$genre2, "right")
new_genres$genre3 <- str_trim(new_genres$genre3, "right")
new_genres$genre1 <- as.factor(new_genres$genre1)
new_genres$genre2 <- as.factor(new_genres$genre2)
new_genres$genre3 <- as.factor(new_genres$genre3)
summary(new_genres)
## genre1 genre2 genre3
## Drama :11966 :17001 :31481
## Comedy : 8820 Drama : 6308 Thriller : 2235
## Action : 4489 Comedy : 3265 Romance : 2045
## Documentary: 3415 Romance : 2859 Drama : 1677
## Horror : 2619 Thriller: 2523 Comedy : 911
## : 2442 Action : 1546 Science Fiction: 873
## (Other) :11715 (Other) :11964 (Other) : 6244
movies <- cbind(movies, new_genres)
new_production_companies <- str_split_fixed(movies$production_companies, ":", n = Inf)
new_production_companies <- new_production_companies[,1:6]
new_production_companies <- new_production_companies[, c(2,4,6)]
summary(new_production_companies)
## V1 V2 V3
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
new_production_companies <- as.data.frame(new_production_companies)
new_production_companies <- new_production_companies %>%
mutate(company1 = str_replace_all(new_production_companies$V1, "[[:punct:]]", " "))
new_production_companies <- new_production_companies %>%
mutate(company2 = str_replace_all(new_production_companies$V2, "[[:punct:]]", " "))
new_production_companies <- new_production_companies %>%
mutate(company3 = str_replace_all(new_production_companies$V3, "[[:punct:]]", " "))
new_production_companies$company1 <- str_remove(new_production_companies$company1,"id")
new_production_companies$company2 <- str_remove(new_production_companies$company2,"id")
new_production_companies$company3 <- str_remove(new_production_companies$company3,"id")
new_production_companies <- new_production_companies[,4:6]
summary(new_production_companies)
## company1 company2 company3
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
new_production_companies$company1 <- str_trim(new_production_companies$company1, "right")
new_production_companies$company2 <- str_trim(new_production_companies$company2, "right")
new_production_companies$company3 <- str_trim(new_production_companies$company3, "right")
new_production_companies$company1 <- as.factor(new_production_companies$company1)
new_production_companies$company2 <- as.factor(new_production_companies$company2)
new_production_companies$company3 <- as.factor(new_production_companies$company3)
summary(new_production_companies)
## company1
## :11881
## Paramount Pictures : 998
## Metro Goldwyn Mayer MGM : 852
## Twentieth Century Fox Film Corporation: 780
## Warner Bros : 757
## Universal Pictures : 754
## (Other) :29444
## company2 company3
## :28458 :36419
## Warner Bros : 270 Warner Bros : 130
## Metro Goldwyn Mayer MGM: 150 Canal+ : 109
## Canal+ : 124 Metro Goldwyn Mayer MGM: 44
## Touchstone Pictures : 75 Relativity Media : 42
## Universal Pictures : 71 TF1 Films Production : 29
## (Other) :16318 (Other) : 8693
movies <- cbind(movies, new_production_companies)
new_production_countries <- str_split_fixed(movies$production_countries, ":", n = Inf)
new_production_countries <- new_production_countries[,2:7]
new_production_countries <- new_production_countries[, c(2,4,6)]
summary(new_production_countries)
## V1 V2 V3
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
new_production_countries <- as.data.frame(new_production_countries)
new_production_countries <- new_production_countries %>%
mutate(country1 = str_replace_all(new_production_countries$V1, "[[:punct:]]", " "))
new_production_countries <- new_production_countries %>%
mutate(country2 = str_replace_all(new_production_countries$V2, "[[:punct:]]", " "))
new_production_countries <- new_production_countries %>%
mutate(country3 = str_replace_all(new_production_countries$V3, "[[:punct:]]", " "))
new_production_countries$country1 <- str_remove(new_production_countries$country1,"iso 3166 1")
new_production_countries$country2 <- str_remove(new_production_countries$country2,"iso 3166 1")
new_production_countries$country3 <- str_remove(new_production_countries$country3,"iso 3166 1")
new_production_countries <- new_production_countries[,4:6]
summary(new_production_countries)
## country1 country2 country3
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
new_production_countries$country1 <- str_trim(new_production_countries$country1, "right")
new_production_countries$country2 <- str_trim(new_production_countries$country2, "right")
new_production_countries$country3 <- str_trim(new_production_countries$country3, "right")
new_production_countries$country1 <- as.factor(new_production_countries$country1)
new_production_countries$country2 <- as.factor(new_production_countries$country2)
new_production_countries$country3 <- as.factor(new_production_countries$country3)
summary(new_production_countries)
## country1 country2
## United States of America:18425 :38439
## : 6288 United States of America: 2131
## United Kingdom : 3070 France : 917
## France : 2705 United Kingdom : 659
## Canada : 1498 Germany : 528
## Japan : 1493 Italy : 482
## (Other) :11987 (Other) : 2310
## country3
## :43314
## United States of America: 410
## France : 247
## Germany : 232
## United Kingdom : 231
## Italy : 153
## (Other) : 879
movies <- cbind(movies, new_production_countries)
new_spoken_languages <- str_split_fixed(movies$spoken_languages, ":", n = Inf)
new_spoken_languages <- new_spoken_languages[,2:7]
new_spoken_languages <- new_spoken_languages[, c(2,4,6)]
summary(new_spoken_languages)
## V1 V2 V3
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
new_spoken_languages <- as.data.frame(new_spoken_languages)
new_spoken_languages <- new_spoken_languages %>%
mutate(country1_language = str_replace_all(new_spoken_languages$V1, "[[:punct:]]", " "))
new_spoken_languages <- new_spoken_languages %>%
mutate(country2_language = str_replace_all(new_spoken_languages$V2, "[[:punct:]]", " "))
new_spoken_languages <- new_spoken_languages %>%
mutate(country3_language = str_replace_all(new_spoken_languages$V3, "[[:punct:]]", " "))
new_spoken_languages$country1_language <- str_remove(new_spoken_languages$country1_language,"iso 639 1")
new_spoken_languages$country2_language <- str_remove(new_spoken_languages$country2_language,"iso 639 1")
new_spoken_languages$country3_language <- str_remove(new_spoken_languages$country3_language,"iso 639 1")
new_spoken_languages <- new_spoken_languages[,4:6]
summary(new_spoken_languages)
## country1_language country2_language country3_language
## Length:45466 Length:45466 Length:45466
## Class :character Class :character Class :character
## Mode :character Mode :character Mode :character
new_spoken_languages$country1_language <- str_trim(new_spoken_languages$country1_language, "right")
new_spoken_languages$country2_language <- str_trim(new_spoken_languages$country2_language, "right")
new_spoken_languages$country3_language <- str_trim(new_spoken_languages$country3_language, "right")
new_spoken_languages$country1_language <- as.factor(new_spoken_languages$country1_language)
new_spoken_languages$country2_language <- as.factor(new_spoken_languages$country2_language)
new_spoken_languages$country3_language <- as.factor(new_spoken_languages$country3_language)
summary(new_spoken_languages)
## country1_language country2_language country3_language
## English :26840 :37707 :43018
## : 4062 English : 1593 Deutsch : 328
## Français: 2428 Français: 1477 Español : 308
## Italiano: 1411 Deutsch : 919 Français: 234
## 日本語 : 1388 Español : 782 English : 232
## Deutsch : 1301 Italiano: 616 Italiano: 225
## (Other) : 8036 (Other) : 2372 (Other) : 1121
movies <- cbind(movies, new_spoken_languages)
For this analysis is really important to check individually the variables that can determine if a movie is successful or not. Identifying if there are values that are affecting the understanding of the data set, in this case some numeric or integer variables (budget, popularity, run time) are going to be analyzed to identify some out of range values to then correct them with an imputation method.
summary(movies$budget)
## Min. 1st Qu. Median Mean 3rd Qu. Max. NA's
## 0 0 0 4224579 0 380000000 3
ggplot(movies,aes(budget))+geom_histogram()
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## Warning: Removed 3 rows containing non-finite outside the scale range
## (`stat_bin()`).
movies %>% count(budget == 0)
## budget == 0 n
## 1 FALSE 8890
## 2 TRUE 36573
## 3 NA 3
movies %>%
filter(budget > 0 & budget < 100) %>%
summarise(count = n())
## count
## 1 138
There are a lot of values with 0, which is odd, because it is highly unlikely that a movie has 0 budget. There are 36,573 that have the value of 0, which represents the 80% of all the values in the budget, a good imputation method should be used to correct this.
# Calculate the mean excluding 0 values
mean_budgetnozero <- mean(movies$budget[movies$budget != 0])
mean_budgetnozero
## [1] NA
#Replacing values
movies <- movies %>%
mutate(budget_mean = replace(budget, budget == 0, 21604277))
summary(movies$budget)
## Min. 1st Qu. Median Mean 3rd Qu. Max. NA's
## 0 0 0 4224579 0 380000000 3
At first I thought of replacing all the 0 values with the mean that was a result of the calculation of all the values that had 0 ($4,224,579), so I looked for a more complex method to replace those 0 values. That was using the mean of all the values above 0, so the result will be more realistic when replacing the values.
summary(movies$popularity)
## Min. 1st Qu. Median Mean 3rd Qu. Max. NA's
## 0.0000 0.3859 1.1277 2.9215 3.6789 547.4883 6
ggplot(movies,aes(popularity))+geom_histogram()
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## Warning: Removed 6 rows containing non-finite outside the scale range
## (`stat_bin()`).
# See the 10 maximum values to identify if there is any above 100
sorted_popularity <- sort(movies$popularity, decreasing = TRUE)
top_10_max_values <- head(sorted_popularity, 10)
top_10_max_values
## [1] 547.4883 294.3370 287.2537 228.0327 213.8499 187.8605 185.3310 185.0709
## [9] 183.8704 154.8010
movies %>% count(popularity == 0)
## popularity == 0 n
## 1 FALSE 45394
## 2 TRUE 66
## 3 NA 6
movies %>% count(popularity < 0)
## popularity < 0 n
## 1 FALSE 45460
## 2 NA 6
movies %>% count(popularity > 100)
## popularity > 100 n
## 1 FALSE 45444
## 2 TRUE 16
## 3 NA 6
For popularity the range is from 0 to 100, so there is no need to make an histogram to identify out of range values, just by using simple techniques I noticed there are 66 values with 0, so there is no mistake there like in the budget variable, in this case 0 is acceptable in the range. There are no values below 0, but there are 16 values above 100, so that should be corrected with an imputation method.
# Replace values higher than 100 with 100
movies <- movies %>%
mutate(popularity_max = replace(popularity, popularity > 100, 100))
summary(movies$popularity_max)
## Min. 1st Qu. Median Mean 3rd Qu. Max. NA's
## 0.000 0.386 1.128 2.884 3.679 100.000 6
For popularity I just replaced the values above 100, with a 100. Assuming that if they put a value above 100, it was because they thought the movie was great and the equivalent is 100.
summary(movies$runtime)
## Min. 1st Qu. Median Mean 3rd Qu. Max. NA's
## 0.00 85.00 95.00 94.13 107.00 1256.00 263
ggplot(movies,aes(runtime))+geom_histogram()
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## Warning: Removed 263 rows containing non-finite outside the scale range
## (`stat_bin()`).
# See the 10 maximum values to identify if there is something odd
sorted_runtime <- sort(movies$runtime, decreasing = TRUE)
top_10_max_valuesrt <- head(sorted_runtime, 10)
top_10_max_valuesrt
## [1] 1256 1140 1140 931 925 900 877 874 840 840
movies %>% count(runtime == 0)
## runtime == 0 n
## 1 FALSE 43645
## 2 TRUE 1558
## 3 NA 263
movies %>% count(runtime < 0)
## runtime < 0 n
## 1 FALSE 45203
## 2 NA 263
For the run time is rare to have 0 minutes in a movie, and there are also too many NA’S. An imputation method should be applied.
#Replace 0's
movies <- movies %>%
mutate(runtime_mean = replace(runtime, runtime == 0, 94.13))
#Replace NA's
movies <- movies %>%
mutate(runtime_mean = replace(runtime, is.na(runtime), 94.13))
I replaced the values with 0 and NA’s with the mean that is 94.13.
Checking the variables, there are not many that need to checked, first is to check if there are any rows fully duplicates, and then if there are some partially duplicated, considering the id and the imbd_id.
# Counting the total amount of full duplicates
sum(duplicated(movies))
## [1] 17
# Creating a data frame for full duplicates visualization
duplicated_rows <- movies[duplicated(movies), ]
duplicated_rows
## adult
## 1466 FALSE
## 9166 FALSE
## 9328 FALSE
## 13376 FALSE
## 16765 FALSE
## 21166 FALSE
## 21855 FALSE
## 22152 FALSE
## 23045 FALSE
## 24845 FALSE
## 28861 FALSE
## 29375 FALSE
## 35799 FALSE
## 38872 FALSE
## 40041 FALSE
## 40277 FALSE
## 45266 FALSE
## belongs_to_collection
## 1466
## 9166
## 9328
## 13376
## 16765
## 21166
## 21855
## 22152
## 23045
## 24845
## 28861
## 29375
## 35799 {'id': 158365, 'name': 'Why We Fight', 'poster_path': '/fFYBLu2Hnx27CWLOMd425ExDkgK.jpg', 'backdrop_path': None}
## 38872
## 40041
## 40277
## 45266
## budget
## 1466 0
## 9166 0
## 9328 0
## 13376 0
## 16765 0
## 21166 0
## 21855 0
## 22152 0
## 23045 0
## 24845 0
## 28861 0
## 29375 0
## 35799 0
## 38872 0
## 40041 980000
## 40277 0
## 45266 0
## genres
## 1466 [{'id': 18, 'name': 'Drama'}, {'id': 10749, 'name': 'Romance'}]
## 9166 [{'id': 80, 'name': 'Crime'}, {'id': 18, 'name': 'Drama'}, {'id': 53, 'name': 'Thriller'}]
## 9328 [{'id': 12, 'name': 'Adventure'}, {'id': 16, 'name': 'Animation'}, {'id': 18, 'name': 'Drama'}, {'id': 28, 'name': 'Action'}, {'id': 10769, 'name': 'Foreign'}]
## 13376 [{'id': 53, 'name': 'Thriller'}, {'id': 9648, 'name': 'Mystery'}]
## 16765 [{'id': 53, 'name': 'Thriller'}, {'id': 9648, 'name': 'Mystery'}]
## 21166 [{'id': 14, 'name': 'Fantasy'}, {'id': 18, 'name': 'Drama'}, {'id': 878, 'name': 'Science Fiction'}]
## 21855 [{'id': 18, 'name': 'Drama'}, {'id': 878, 'name': 'Science Fiction'}, {'id': 16, 'name': 'Animation'}]
## 22152 [{'id': 28, 'name': 'Action'}, {'id': 27, 'name': 'Horror'}, {'id': 878, 'name': 'Science Fiction'}]
## 23045 [{'id': 18, 'name': 'Drama'}]
## 24845 [{'id': 35, 'name': 'Comedy'}, {'id': 18, 'name': 'Drama'}]
## 28861 [{'id': 18, 'name': 'Drama'}, {'id': 35, 'name': 'Comedy'}]
## 29375 [{'id': 18, 'name': 'Drama'}, {'id': 10769, 'name': 'Foreign'}]
## 35799 [{'id': 99, 'name': 'Documentary'}]
## 38872 [{'id': 28, 'name': 'Action'}, {'id': 18, 'name': 'Drama'}, {'id': 10749, 'name': 'Romance'}, {'id': 12, 'name': 'Adventure'}]
## 40041 [{'id': 18, 'name': 'Drama'}, {'id': 14, 'name': 'Fantasy'}]
## 40277 [{'id': 35, 'name': 'Comedy'}]
## 45266 [{'id': 35, 'name': 'Comedy'}, {'id': 18, 'name': 'Drama'}]
## homepage id imdb_id original_language
## 1466 105045 tt0111613 de
## 9166 5511 tt0062229 fr
## 9328 23305 tt0295682 en
## 13376 141971 tt1180333 fi
## 16765 141971 tt1180333 fi
## 21166 119916 tt0080000 en
## 21855 152795 tt1821641 en
## 22152 http://www.daysofdarknessthemovie.com/ 18440 tt0499456 en
## 23045 25541 tt1327820 da
## 24845 http://www.dealthemovie.com/ 11115 tt0446676 en
## 28861 168538 tt0084387 en
## 29375 42495 tt0067306 en
## 35799 159849 tt0173769 en
## 38872 99080 tt0022537 en
## 40041 298721 tt2818654 th
## 40277 97995 tt0127834 en
## 45266 265189 tt2121382 sv
## original_title
## 1466 Das Versprechen
## 9166 Le Samouraï
## 9328 The Warrior
## 13376 Blackout
## 16765 Blackout
## 21166 The Tempest
## 21855 The Congress
## 22152 Days of Darkness
## 23045 Broderskab
## 24845 Deal
## 28861 Nana
## 29375 King Lear
## 35799 Why We Fight: Divide and Conquer
## 38872 The Viking
## 40041 รักที่ขอนแก่น
## 40277 Seven Years Bad Luck
## 45266 Turist
## overview
## 1466 East-Berlin, 1961, shortly after the erection of the Wall. Konrad, Sophie and three of their friends plan a daring escape to Western Germany. The attempt is successful, except for Konrad, who remains behind. From then on, and for the next 28 years, Konrad and Sophie will attempt to meet again, in spite of the Iron Curtain. Konrad, who has become a reputed Astrophysicist, tries to take advantage of scientific congresses outside Eastern Germany to arrange encounters with Sophie. But in a country where the political police, the Stasi, monitors the moves of all suspicious people (such as Konrad's sister Barbara and her husband Harald), preserving one's privacy, ideals and self-respect becomes an exhausting fight, even as the Eastern block begins its long process of disintegration.
## 9166 Hitman Jef Costello is a perfectionist who always carefully plans his murders and who never gets caught.
## 9328 In feudal India, a warrior (Khan) who renounces his role as the longtime enforcer to a local lord becomes the prey in a murderous hunt through the Himalayan mountains.
## 13376 Recovering from a nail gun shot to the head and 13 months of coma, doctor Pekka Valinta starts to unravel the mystery of his past, still suffering from total amnesia.
## 16765 Recovering from a nail gun shot to the head and 13 months of coma, doctor Pekka Valinta starts to unravel the mystery of his past, still suffering from total amnesia.
## 21166 Prospero, the true Duke of Milan is now living on an enchanted island with his daughter Miranda, the savage Caliban and Ariel, a spirit of the air. Raising a sorm to bring his brother - the usurper of his dukedom - along with his royal entourage. to the island. Prospero contrives his revenge.
## 21855 More than two decades after catapulting to stardom with The Princess Bride, an aging actress (Robin Wright, playing a version of herself) decides to take her final job: preserving her digital likeness for a future Hollywood. Through a deal brokered by her loyal, longtime agent and the head of Miramount Studios, her alias will be controlled by the studio, and will star in any film they want with no restrictions. In return, she receives healthy compensation so she can care for her ailing son and her digitized character will stay forever young. Twenty years later, under the creative vision of the studio’s head animator, Wright’s digital double rises to immortal stardom. With her contract expiring, she is invited to take part in “The Congress” convention as she makes her comeback straight into the world of future fantasy cinema.
## 22152 When a comet strikes Earth and kicks up a cloud of toxic dust, hundreds of humans join the ranks of the living dead. But there's bad news for the survivors: The newly minted zombies are hell-bent on eradicating every last person from the planet. For the few human beings who remain, going head to head with the flesh-eating fiends is their only chance for long-term survival. Yet their battle will be dark and cold, with overwhelming odds.
## 23045 Former Danish servicemen Lars and Jimmy are thrown together while training in a neo-Nazi group. Moving from hostility through grudging admiration to friendship and finally passion, events take a darker turn when their illicit relationship is uncovered.
## 24845 As an ex-gambler teaches a hot-shot college kid some things about playing cards, he finds himself pulled into the world series of poker, where his protégé is his toughest competition.
## 28861 In Zola's Paris, an ingenue arrives at a tony bordello: she's Nana, guileless, but quickly learning to use her erotic innocence to get what she wants. She's an actress for a soft-core filmmaker and soon is the most popular courtesan in Paris, parlaying this into a house, bought for her by a wealthy banker. She tosses him and takes up with her neighbor, a count of impeccable rectitude, and with the count's impressionable son. The count is soon fetching sticks like a dog and mortgaging his lands to satisfy her whims.
## 29375 King Lear, old and tired, divides his kingdom among his daughters, giving great importance to their protestations of love for him. When Cordelia, youngest and most honest, refuses to idly flatter the old man in return for favor, he banishes her and turns for support to his remaining daughters. But Goneril and Regan have no love for him and instead plot to take all his power from him. In a parallel, Lear's loyal courtier Gloucester favors his illegitimate son Edmund after being told lies about his faithful son Edgar. Madness and tragedy befall both ill-starred fathers.
## 35799 The third film of Frank Capra's 'Why We Fight" propaganda film series, dealing with the Nazi conquest of Western Europe in 1940.
## 38872 Originally called White Thunder, American producer Varick Frissell's 1931 film was inspired by his love for the Canadian Arctic Circle. Set in a beautifully black-and-white filmed Newfoundland, it is the story of a rivalry between two seal hunters that plays out on the ice floes during a hunt. Unsatisfied with the first cut, Frissell arranged for the crew to accompany an actual Newfoundland seal hunt on The SS Viking, on which an explosion of dynamite (carried regularly at the time on Arctic ships to combat ice jams) killed many members of the crew, including Frissell. The film was renamed in honor of the dead.
## 40041 In a hospital, ten soldiers are being treated for a mysterious sleeping sickness. In a story in which dreams can be experienced by others, and in which goddesses can sit casually with mortals, a nurse learns the reason why the patients will never be cured, and forms a telepathic bond with one of them.
## 40277 After breaking a mirror in his home, superstitious Max tries to avoid situations which could bring bad luck but in doing so, causes himself the worst luck imaginable.
## 45266 While holidaying in the French Alps, a Swedish family deals with acts of cowardliness as an avalanche breaks out.
## popularity poster_path
## 1466 0.122178 /5WFIrBhOOgc0jGmoLxMZwWqCctO.jpg
## 9166 9.091288 /cvNW8IXigbaMNo4gKEIps0NGnhA.jpg
## 9328 1.967992 /9GlrmbZO7VGyqhaSR1utinRJz3L.jpg
## 13376 0.411949 /8VSZ9coCzxOCW2wE2Qene1H1fKO.jpg
## 16765 0.411949 /8VSZ9coCzxOCW2wE2Qene1H1fKO.jpg
## 21166 0.000018 /gLVRTxaLtUDkfscFKPyYrCtRnTk.jpg
## 21855 8.534039 /nnKX3ahYoT7P3au92dNgLf4pKwA.jpg
## 22152 1.436085 /tWCyKXHuSrQdLAvNeeVJBnhf1Yv.jpg
## 23045 2.587911 /q19Q5BRZpMXoNCA4OYodVozfjUh.jpg
## 24845 6.880365 /kHaBqrrozaG7rj6GJg3sUCiM29B.jpg
## 28861 1.276602 /pg4PUHRFrgNfACHSh5MITQ2gYch.jpg
## 29375 0.187901 /xuE1IlUCohbxMY0fiqKTT6d013n.jpg
## 35799 0.473322 /g21ruZZ3BZeUDuKMb82kejjtufk.jpg
## 38872 0.002362 /qenjwRvW9itR5pVp4CBkYfhVAOp.jpg
## 40041 2.535419 /5GasjPRAy5rlEyDOH7MeOyxyQGX.jpg
## 40277 0.141558 /4J6Ai4C5YRgfRUTlirrJ7QsmJKU.jpg
## 45266 12.165685 /rGMtc9AtZsnWSSL5VnLaGvx1PI6.jpg
## production_companies
## 1466 [{'name': 'Studio Babelsberg', 'id': 264}, {'name': 'Centre National de la Cinématographie', 'id': 310}, {'name': 'Odessa Films', 'id': 1712}, {'name': 'Canal+', 'id': 5358}, {'name': 'Bioskop Film', 'id': 5982}, {'name': 'Westdeutscher Rundfunk (WDR)', 'id': 7025}]
## 9166 [{'name': 'Fida cinematografica', 'id': 73}, {'name': 'Compagnie Industrielle et Commerciale Cinématographique (CICC)', 'id': 11788}, {'name': 'TC Productions', 'id': 21777}, {'name': 'Filmel', 'id': 42182}]
## 9328 [{'name': 'Filmfour', 'id': 6705}]
## 13376 [{'name': 'Filmiteollisuus Fine', 'id': 5166}]
## 16765 [{'name': 'Filmiteollisuus Fine', 'id': 5166}]
## 21166 []
## 21855 [{'name': 'Pandora Filmproduktion', 'id': 254}, {'name': 'Entre Chien et Loup', 'id': 3984}, {'name': 'Opus Film', 'id': 6477}, {'name': 'Bridgit Folman Film Gang', 'id': 17931}, {'name': 'Paul Thiltges Distributions', 'id': 19437}, {'name': 'Liverpool', 'id': 60111}]
## 22152 []
## 23045 []
## 24845 [{'name': 'Andertainment Group', 'id': 2634}, {'name': 'Crescent City Pictures', 'id': 2635}, {'name': 'Tag Entertainment', 'id': 2636}]
## 28861 [{'name': 'Cannon Group', 'id': 1444}, {'name': 'Metro-Goldwyn-Mayer (MGM)', 'id': 8411}]
## 29375 [{'name': 'Royal Shakespeare Company', 'id': 5845}, {'name': 'Laterna Film', 'id': 24737}, {'name': 'Athena Film A/S', 'id': 51549}]
## 35799 []
## 38872 []
## 40041 [{'name': 'Match Factory, The', 'id': 7306}, {'name': 'Louverture Films', 'id': 8469}, {'name': 'Tordenfilm AS', 'id': 11034}, {'name': 'ZDF/Arte', 'id': 11237}, {'name': 'Geißendörfer Film- und Fernsehproduktion (GFF)', 'id': 13537}, {'name': 'Illumination Films', 'id': 15010}, {'name': 'Detalle Films', 'id': 15507}, {'name': 'Centre National de la Cinématographie (CNC)', 'id': 18367}, {'name': 'Astro Shaw', 'id': 19055}, {'name': 'Kick the Machine Films', 'id': 59665}, {'name': 'Anna Sanders Films', 'id': 61201}, {'name': 'Asia Culture Centre-Asian Arts Theatre', 'id': 76905}]
## 40277 [{'name': 'Max Linder Productions', 'id': 38162}]
## 45266 [{'name': 'Motlys', 'id': 2783}, {'name': 'Coproduction Office', 'id': 6505}, {'name': 'Film i Väst', 'id': 17513}]
## production_countries
## 1466 [{'iso_3166_1': 'DE', 'name': 'Germany'}]
## 9166 [{'iso_3166_1': 'FR', 'name': 'France'}, {'iso_3166_1': 'IT', 'name': 'Italy'}]
## 9328 [{'iso_3166_1': 'FR', 'name': 'France'}, {'iso_3166_1': 'DE', 'name': 'Germany'}, {'iso_3166_1': 'IN', 'name': 'India'}, {'iso_3166_1': 'GB', 'name': 'United Kingdom'}]
## 13376 [{'iso_3166_1': 'FI', 'name': 'Finland'}]
## 16765 [{'iso_3166_1': 'FI', 'name': 'Finland'}]
## 21166 []
## 21855 [{'iso_3166_1': 'BE', 'name': 'Belgium'}, {'iso_3166_1': 'FR', 'name': 'France'}, {'iso_3166_1': 'DE', 'name': 'Germany'}, {'iso_3166_1': 'IL', 'name': 'Israel'}, {'iso_3166_1': 'LU', 'name': 'Luxembourg'}, {'iso_3166_1': 'PL', 'name': 'Poland'}]
## 22152 [{'iso_3166_1': 'US', 'name': 'United States of America'}]
## 23045 [{'iso_3166_1': 'SE', 'name': 'Sweden'}, {'iso_3166_1': 'DK', 'name': 'Denmark'}]
## 24845 [{'iso_3166_1': 'US', 'name': 'United States of America'}]
## 28861 []
## 29375 [{'iso_3166_1': 'DK', 'name': 'Denmark'}, {'iso_3166_1': 'GB', 'name': 'United Kingdom'}]
## 35799 [{'iso_3166_1': 'US', 'name': 'United States of America'}]
## 38872 []
## 40041 [{'iso_3166_1': 'GB', 'name': 'United Kingdom'}, {'iso_3166_1': 'US', 'name': 'United States of America'}, {'iso_3166_1': 'FR', 'name': 'France'}, {'iso_3166_1': 'TH', 'name': 'Thailand'}, {'iso_3166_1': 'DE', 'name': 'Germany'}, {'iso_3166_1': 'MY', 'name': 'Malaysia'}, {'iso_3166_1': 'KR', 'name': 'South Korea'}, {'iso_3166_1': 'MX', 'name': 'Mexico'}, {'iso_3166_1': 'NO', 'name': 'Norway'}]
## 40277 [{'iso_3166_1': 'US', 'name': 'United States of America'}]
## 45266 [{'iso_3166_1': 'NO', 'name': 'Norway'}, {'iso_3166_1': 'SE', 'name': 'Sweden'}, {'iso_3166_1': 'FR', 'name': 'France'}]
## release_date revenue runtime
## 1466 1995-02-16 0 115
## 9166 1967-10-25 39481 105
## 9328 2001-09-23 0 86
## 13376 2008-12-26 0 108
## 16765 2008-12-26 0 108
## 21166 1980-02-27 0 123
## 21855 2013-05-16 455815 122
## 22152 2007-01-01 0 89
## 23045 2009-10-21 0 90
## 24845 2008-01-29 0 85
## 28861 1983-06-13 0 92
## 29375 1971-02-04 0 137
## 35799 1943-01-01 0 57
## 38872 1931-06-21 0 70
## 40041 2015-09-02 0 122
## 40277 1921-02-06 0 62
## 45266 2014-08-15 1359497 118
## spoken_languages
## 1466 [{'iso_639_1': 'de', 'name': 'Deutsch'}]
## 9166 [{'iso_639_1': 'fr', 'name': 'Français'}]
## 9328 [{'iso_639_1': 'hi', 'name': 'हिन्दी'}]
## 13376 [{'iso_639_1': 'fi', 'name': 'suomi'}]
## 16765 [{'iso_639_1': 'fi', 'name': 'suomi'}]
## 21166 []
## 21855 [{'iso_639_1': 'en', 'name': 'English'}]
## 22152 [{'iso_639_1': 'en', 'name': 'English'}]
## 23045 [{'iso_639_1': 'da', 'name': 'Dansk'}]
## 24845 [{'iso_639_1': 'en', 'name': 'English'}]
## 28861 []
## 29375 [{'iso_639_1': 'en', 'name': 'English'}]
## 35799 [{'iso_639_1': 'en', 'name': 'English'}]
## 38872 [{'iso_639_1': 'en', 'name': 'English'}]
## 40041 [{'iso_639_1': 'en', 'name': 'English'}, {'iso_639_1': 'th', 'name': 'ภาษาไทย'}]
## 40277 [{'iso_639_1': 'en', 'name': 'English'}]
## 45266 [{'iso_639_1': 'fr', 'name': 'Français'}, {'iso_639_1': 'no', 'name': 'Norsk'}, {'iso_639_1': 'sv', 'name': 'svenska'}, {'iso_639_1': 'en', 'name': 'English'}]
## status
## 1466 Released
## 9166 Released
## 9328 Released
## 13376 Released
## 16765 Released
## 21166 Released
## 21855 Released
## 22152 Released
## 23045 Released
## 24845 Released
## 28861 Released
## 29375 Rumored
## 35799 Released
## 38872 Released
## 40041 Released
## 40277 Released
## 45266 Released
## tagline
## 1466 A love, a hope, a wall.
## 9166 There is no solitude greater than that of the Samurai
## 9328
## 13376 Which one is the first to return - memory or the murderer?
## 16765 Which one is the first to return - memory or the murderer?
## 21166
## 21855
## 22152
## 23045
## 24845
## 28861
## 29375
## 35799
## 38872 Actually produced during the Great Newfoundland Seal Hunt and You see the REAL thing
## 40041
## 40277
## 45266
## title video vote_average vote_count
## 1466 The Promise FALSE 5.0 1
## 9166 Le Samouraï FALSE 7.9 187
## 9328 The Warrior FALSE 6.3 15
## 13376 Blackout FALSE 6.7 3
## 16765 Blackout FALSE 6.7 3
## 21166 The Tempest FALSE 0.0 0
## 21855 The Congress FALSE 6.4 165
## 22152 Days of Darkness FALSE 5.0 5
## 23045 Brotherhood FALSE 7.1 21
## 24845 Deal FALSE 5.2 22
## 28861 Nana, the True Key of Pleasure FALSE 4.7 3
## 29375 King Lear FALSE 8.0 3
## 35799 Why We Fight: Divide and Conquer FALSE 5.0 1
## 38872 The Viking FALSE 0.0 0
## 40041 Cemetery of Splendour FALSE 4.4 50
## 40277 Seven Years Bad Luck FALSE 5.6 4
## 45266 Force Majeure FALSE 6.8 255
## id_collection name_collection poster_path_collection
## 1466
## 9166
## 9328
## 13376
## 16765
## 21166
## 21855
## 22152
## 23045
## 24845
## 28861
## 29375
## 35799 158365 Why We Fight /fFYBLu2Hnx27CWLOMd425ExDkgK.jpg
## 38872
## 40041
## 40277
## 45266
## backdrop_path_collection genre1 genre2
## 1466 Drama Romance
## 9166 Crime Drama
## 9328 Adventure Animation
## 13376 Thriller Mystery
## 16765 Thriller Mystery
## 21166 Fantasy Drama
## 21855 Drama Science Fiction
## 22152 Action Horror
## 23045 Drama
## 24845 Comedy Drama
## 28861 Drama Comedy
## 29375 Drama Foreign
## 35799 None Documentary
## 38872 Action Drama
## 40041 Drama Fantasy
## 40277 Comedy
## 45266 Comedy Drama
## genre3 company1
## 1466 Studio Babelsberg
## 9166 Thriller Fa cinematografica id
## 9328 Drama Filmfour
## 13376 Filmiteollisuus Fine
## 16765 Filmiteollisuus Fine
## 21166 Science Fiction
## 21855 Animation Pandora Filmproduktion
## 22152 Science Fiction
## 23045
## 24845 Andertainment Group
## 28861 Cannon Group
## 29375 Royal Shakespeare Company
## 35799
## 38872 Romance
## 40041 Match Factory The
## 40277 Max Linder Productions
## 45266 Motlys
## company2
## 1466 Centre National de la Cinématographie
## 9166 Compagnie Industrielle et Commerciale Cinématographique CICC
## 9328
## 13376
## 16765
## 21166
## 21855 Entre Chien et Loup
## 22152
## 23045
## 24845 Crescent City Pictures
## 28861 Metro Goldwyn Mayer MGM
## 29375 Laterna Film
## 35799
## 38872
## 40041 Louverture Films
## 40277
## 45266 Coproduction Office
## company3 country1 country2
## 1466 Odessa Films Germany
## 9166 TC Productions France Italy
## 9328 France Germany
## 13376 Finland
## 16765 Finland
## 21166
## 21855 Opus Film Belgium France
## 22152 United States of America
## 23045 Sweden Denmark
## 24845 Tag Entertainment United States of America
## 28861
## 29375 Athena Film A S Denmark United Kingdom
## 35799 United States of America
## 38872
## 40041 Tordenfilm AS United Kingdom United States of America
## 40277 United States of America
## 45266 Film i Väst Norway Sweden
## country3 country1_language country2_language country3_language
## 1466 Deutsch
## 9166 Français
## 9328 India हिन्दी
## 13376 suomi
## 16765 suomi
## 21166
## 21855 Germany English
## 22152 English
## 23045 Dansk
## 24845 English
## 28861
## 29375 English
## 35799 English
## 38872 English
## 40041 France English ภาษาไทย
## 40277 English
## 45266 France Français Norsk svenska
## budget_mean popularity_max runtime_mean
## 1466 21604277 0.122178 115
## 9166 21604277 9.091288 105
## 9328 21604277 1.967992 86
## 13376 21604277 0.411949 108
## 16765 21604277 0.411949 108
## 21166 21604277 0.000018 123
## 21855 21604277 8.534039 122
## 22152 21604277 1.436085 89
## 23045 21604277 2.587911 90
## 24845 21604277 6.880365 85
## 28861 21604277 1.276602 92
## 29375 21604277 0.187901 137
## 35799 21604277 0.473322 57
## 38872 21604277 0.002362 70
## 40041 980000 2.535419 122
## 40277 21604277 0.141558 62
## 45266 21604277 12.165685 118
# Remove full duplicates
movies <- distinct(movies)
After doing this we make sure there are no longer any full duplicates in the dataset.
movies %>%
count(id) %>%
filter(n > 1)
## id n
## 1 10991 2
## 2 109962 2
## 3 110428 2
## 4 12600 2
## 5 13209 2
## 6 132641 2
## 7 14788 2
## 8 15028 2
## 9 22649 2
## 10 4912 2
## 11 69234 2
## 12 77221 2
## 13 84198 2
movies %>%
count(imdb_id) %>%
filter(n > 1)
## imdb_id n
## 1 17
## 2 0 3
## 3 tt0022879 2
## 4 tt0046468 2
## 5 tt0082992 2
## 6 tt0100361 2
## 7 tt0157472 2
## 8 tt0235679 2
## 9 tt0270288 2
## 10 tt0287635 2
## 11 tt0454792 2
## 12 tt0499537 2
## 13 tt1701210 2
## 14 tt1736049 2
## 15 tt2018086 2
movies <- movies %>% group_by(imdb_id) %>% slice_max(popularity_max) %>% ungroup()
# Check how many partial duplicates remain on the dataset.
movies %>%
count(id) %>%
filter(n > 1)
## # A tibble: 0 × 2
## # ℹ 2 variables: id <chr>, n <int>
movies %>%
count(imdb_id) %>%
filter(n > 1)
## # A tibble: 1 × 2
## imdb_id n
## <chr> <int>
## 1 0 3
# See remaining partial imdb_id duplicates
movies %>% filter(imdb_id %in% c("0"))
## # A tibble: 3 × 43
## adult belongs_to_collection budget genres homepage id imdb_id
## <lgl> <chr> <dbl> <chr> <chr> <chr> <chr>
## 1 NA 0.065736 NA [{'name': 'Carousel… [{'iso_… 1997… 0
## 2 NA 1.931659 NA [{'name': 'Aniplex'… [{'iso_… 2012… 0
## 3 NA 2.185485 NA [{'name': 'Odyssey … [{'iso_… 2014… 0
## # ℹ 36 more variables: original_language <fct>, original_title <chr>,
## # overview <chr>, popularity <dbl>, poster_path <chr>,
## # production_companies <chr>, production_countries <chr>,
## # release_date <date>, revenue <dbl>, runtime <dbl>, spoken_languages <chr>,
## # status <fct>, tagline <chr>, title <chr>, video <lgl>, vote_average <dbl>,
## # vote_count <int>, id_collection <chr>, name_collection <chr>,
## # poster_path_collection <chr>, backdrop_path_collection <chr>, …
# Remove rows with an imdb_id of 0
movies <- filter(movies,imdb_id != 0)
What I did was to identify if there were partial duplicates of the imbd_id variable, and there were some, so I used the function slice to eliminate them.
In this particular case, since we’ve already converted some variables into factors, we can analyze some of them in order to see which ones can be included as the same, or just have the overview of the data we want to analyze.
levels(droplevels(movies$original_language))
## [1] "" "ab" "af" "am" "ar" "ay" "bg" "bm" "bn" "bo" "bs" "ca" "cn" "cs" "cy"
## [16] "da" "de" "el" "en" "eo" "es" "et" "eu" "fa" "fi" "fr" "fy" "gl" "he" "hi"
## [31] "hr" "hu" "hy" "id" "is" "it" "iu" "ja" "jv" "ka" "kk" "kn" "ko" "ku" "ky"
## [46] "la" "lb" "lo" "lt" "lv" "mk" "ml" "mn" "mr" "ms" "mt" "nb" "ne" "nl" "no"
## [61] "pa" "pl" "ps" "pt" "qu" "ro" "ru" "rw" "sh" "si" "sk" "sl" "sm" "sq" "sr"
## [76] "sv" "ta" "te" "tg" "th" "tl" "tr" "uk" "ur" "uz" "vi" "wo" "xx" "zh" "zu"
movies %>% count(original_language)
## # A tibble: 90 × 2
## original_language n
## <fct> <int>
## 1 "" 11
## 2 "ab" 10
## 3 "af" 2
## 4 "am" 2
## 5 "ar" 39
## 6 "ay" 1
## 7 "bg" 10
## 8 "bm" 3
## 9 "bn" 29
## 10 "bo" 2
## # ℹ 80 more rows
movies %>% filter(original_language == "")
## # A tibble: 11 × 43
## adult belongs_to_collection budget genres homepage id imdb_id
## <lgl> <chr> <dbl> <chr> <chr> <chr> <chr>
## 1 FALSE "" 0 [{'id': 10752, 'na… "" 3591… tt0053…
## 2 FALSE "" 0 [{'id': 35, 'name'… "" 1470… tt0122…
## 3 FALSE "" 0 [{'id': 99, 'name'… "" 1444… tt0154…
## 4 FALSE "" 0 [{'id': 28, 'name'… "" 1044… tt0223…
## 5 FALSE "" 0 [{'id': 16, 'name'… "" 2570… tt0225…
## 6 FALSE "" 0 [{'id': 18, 'name'… "" 3804… tt0298…
## 7 FALSE "" 0 [{'id': 99, 'name'… "" 2831… tt0429…
## 8 FALSE "" 0 [{'id': 10749, 'na… "" 1039… tt0838…
## 9 FALSE "" 0 [{'id': 99, 'name'… "" 3327… tt4432…
## 10 FALSE "" 0 [{'id': 16, 'name'… "" 3810… tt5333…
## 11 FALSE "" 0 [] "" 3815… tt5376…
## # ℹ 36 more variables: original_language <fct>, original_title <chr>,
## # overview <chr>, popularity <dbl>, poster_path <chr>,
## # production_companies <chr>, production_countries <chr>,
## # release_date <date>, revenue <dbl>, runtime <dbl>, spoken_languages <chr>,
## # status <fct>, tagline <chr>, title <chr>, video <lgl>, vote_average <dbl>,
## # vote_count <int>, id_collection <chr>, name_collection <chr>,
## # poster_path_collection <chr>, backdrop_path_collection <chr>, …
There are many with blank space so it needs to be fixed.
levels(droplevels(movies$original_language))
## [1] "" "ab" "af" "am" "ar" "ay" "bg" "bm" "bn" "bo" "bs" "ca" "cn" "cs" "cy"
## [16] "da" "de" "el" "en" "eo" "es" "et" "eu" "fa" "fi" "fr" "fy" "gl" "he" "hi"
## [31] "hr" "hu" "hy" "id" "is" "it" "iu" "ja" "jv" "ka" "kk" "kn" "ko" "ku" "ky"
## [46] "la" "lb" "lo" "lt" "lv" "mk" "ml" "mn" "mr" "ms" "mt" "nb" "ne" "nl" "no"
## [61] "pa" "pl" "ps" "pt" "qu" "ro" "ru" "rw" "sh" "si" "sk" "sl" "sm" "sq" "sr"
## [76] "sv" "ta" "te" "tg" "th" "tl" "tr" "uk" "ur" "uz" "vi" "wo" "xx" "zh" "zu"
movies %>% filter(original_language == "")
## # A tibble: 11 × 43
## adult belongs_to_collection budget genres homepage id imdb_id
## <lgl> <chr> <dbl> <chr> <chr> <chr> <chr>
## 1 FALSE "" 0 [{'id': 10752, 'na… "" 3591… tt0053…
## 2 FALSE "" 0 [{'id': 35, 'name'… "" 1470… tt0122…
## 3 FALSE "" 0 [{'id': 99, 'name'… "" 1444… tt0154…
## 4 FALSE "" 0 [{'id': 28, 'name'… "" 1044… tt0223…
## 5 FALSE "" 0 [{'id': 16, 'name'… "" 2570… tt0225…
## 6 FALSE "" 0 [{'id': 18, 'name'… "" 3804… tt0298…
## 7 FALSE "" 0 [{'id': 99, 'name'… "" 2831… tt0429…
## 8 FALSE "" 0 [{'id': 10749, 'na… "" 1039… tt0838…
## 9 FALSE "" 0 [{'id': 99, 'name'… "" 3327… tt4432…
## 10 FALSE "" 0 [{'id': 16, 'name'… "" 3810… tt5333…
## 11 FALSE "" 0 [] "" 3815… tt5376…
## # ℹ 36 more variables: original_language <fct>, original_title <chr>,
## # overview <chr>, popularity <dbl>, poster_path <chr>,
## # production_companies <chr>, production_countries <chr>,
## # release_date <date>, revenue <dbl>, runtime <dbl>, spoken_languages <chr>,
## # status <fct>, tagline <chr>, title <chr>, video <lgl>, vote_average <dbl>,
## # vote_count <int>, id_collection <chr>, name_collection <chr>,
## # poster_path_collection <chr>, backdrop_path_collection <chr>, …
# Add rows without original language to the category "xx"
movies <- movies %>% mutate(original_language = fct_collapse(original_language, xx = c("xx","")))# See movies if changes were applied
movies %>% filter(original_language == "")
## # A tibble: 0 × 43
## # ℹ 43 variables: adult <lgl>, belongs_to_collection <chr>, budget <dbl>,
## # genres <chr>, homepage <chr>, id <chr>, imdb_id <chr>,
## # original_language <fct>, original_title <chr>, overview <chr>,
## # popularity <dbl>, poster_path <chr>, production_companies <chr>,
## # production_countries <chr>, release_date <date>, revenue <dbl>,
## # runtime <dbl>, spoken_languages <chr>, status <fct>, tagline <chr>,
## # title <chr>, video <lgl>, vote_average <dbl>, vote_count <int>, …
With an imputation method, the blank spaces were replaced into the category “xx”.
levels(droplevels(movies$status))
## [1] "" "Canceled" "In Production" "Planned"
## [5] "Post Production" "Released" "Rumored"
movies %>% count(status)
## # A tibble: 7 × 2
## status n
## <fct> <int>
## 1 "" 84
## 2 "Canceled" 2
## 3 "In Production" 20
## 4 "Planned" 15
## 5 "Post Production" 98
## 6 "Released" 44971
## 7 "Rumored" 227
movies %>% filter(status == "")
## # A tibble: 84 × 43
## adult belongs_to_collection budget genres homepage id imdb_id
## <lgl> <chr> <dbl> <chr> <chr> <chr> <chr>
## 1 FALSE "" 0 [] "" 42496 tt0067…
## 2 FALSE "" 0 [{'id': 18, 'name'… "" 57868 tt0071…
## 3 FALSE "" 0 [] "" 46770 tt0094…
## 4 FALSE "" 0 [{'id': 99, 'name'… "" 41934 tt0095…
## 5 FALSE "" 0 [{'id': 28, 'name'… "" 41932 tt0097…
## 6 FALSE "" 0 [] "" 41811 tt0099…
## 7 FALSE "" 0 [] "" 77314 tt0101…
## 8 FALSE "" 0 [] "" 1236… tt0104…
## 9 FALSE "" 0 [] "" 1242… tt0106…
## 10 FALSE "" 0 [] "" 71687 tt0107…
## # ℹ 74 more rows
## # ℹ 36 more variables: original_language <fct>, original_title <chr>,
## # overview <chr>, popularity <dbl>, poster_path <chr>,
## # production_companies <chr>, production_countries <chr>,
## # release_date <date>, revenue <dbl>, runtime <dbl>, spoken_languages <chr>,
## # status <fct>, tagline <chr>, title <chr>, video <lgl>, vote_average <dbl>,
## # vote_count <int>, id_collection <chr>, name_collection <chr>, …
84 blank spaces, it needs to be corrected.
levels(movies$status)
## [1] "" "Canceled" "In Production" "Planned"
## [5] "Post Production" "Released" "Rumored"
movies %>% filter(status == "")
## # A tibble: 84 × 43
## adult belongs_to_collection budget genres homepage id imdb_id
## <lgl> <chr> <dbl> <chr> <chr> <chr> <chr>
## 1 FALSE "" 0 [] "" 42496 tt0067…
## 2 FALSE "" 0 [{'id': 18, 'name'… "" 57868 tt0071…
## 3 FALSE "" 0 [] "" 46770 tt0094…
## 4 FALSE "" 0 [{'id': 99, 'name'… "" 41934 tt0095…
## 5 FALSE "" 0 [{'id': 28, 'name'… "" 41932 tt0097…
## 6 FALSE "" 0 [] "" 41811 tt0099…
## 7 FALSE "" 0 [] "" 77314 tt0101…
## 8 FALSE "" 0 [] "" 1236… tt0104…
## 9 FALSE "" 0 [] "" 1242… tt0106…
## 10 FALSE "" 0 [] "" 71687 tt0107…
## # ℹ 74 more rows
## # ℹ 36 more variables: original_language <fct>, original_title <chr>,
## # overview <chr>, popularity <dbl>, poster_path <chr>,
## # production_companies <chr>, production_countries <chr>,
## # release_date <date>, revenue <dbl>, runtime <dbl>, spoken_languages <chr>,
## # status <fct>, tagline <chr>, title <chr>, video <lgl>, vote_average <dbl>,
## # vote_count <int>, id_collection <chr>, name_collection <chr>, …
movies <- movies %>%
mutate(status = if_else(!is.na(release_date),fct_collapse(status, Released = c("Released","")),status))
movies %>% count(status)
## # A tibble: 7 × 2
## status n
## <fct> <int>
## 1 "Released" 45051
## 2 "Canceled" 2
## 3 "In Production" 20
## 4 "Planned" 15
## 5 "Post Production" 98
## 6 "Rumored" 227
## 7 "" 4
movies %>% filter(status == "")
## # A tibble: 4 × 43
## adult belongs_to_collection budget genres homepage id imdb_id
## <lgl> <chr> <dbl> <chr> <chr> <chr> <chr>
## 1 FALSE "" 0 [{'id… "" 82663 tt0113…
## 2 FALSE "" 0 [{'id… "" 94214 tt0210…
## 3 FALSE "{'id': 122661, 'name': 'Mardock S… 0 [{'id… "http:/… 1226… tt2423…
## 4 FALSE "" 0 [{'id… "" 2492… tt2622…
## # ℹ 36 more variables: original_language <fct>, original_title <chr>,
## # overview <chr>, popularity <dbl>, poster_path <chr>,
## # production_companies <chr>, production_countries <chr>,
## # release_date <date>, revenue <dbl>, runtime <dbl>, spoken_languages <chr>,
## # status <fct>, tagline <chr>, title <chr>, video <lgl>, vote_average <dbl>,
## # vote_count <int>, id_collection <chr>, name_collection <chr>,
## # poster_path_collection <chr>, backdrop_path_collection <chr>, …
movies <- movies %>% mutate(status = fct_collapse(status, Released = c("Released","")))
movies %>% count(status)
## # A tibble: 6 × 2
## status n
## <fct> <int>
## 1 Released 45055
## 2 Canceled 2
## 3 In Production 20
## 4 Planned 15
## 5 Post Production 98
## 6 Rumored 227
Blank spaces were replaced in the category released.
levels(droplevels(movies$genre1))
## [1] "" " Action" " Adventure"
## [4] " Animation" " Comedy" " Crime"
## [7] " Documentary" " Drama" " Family"
## [10] " Fantasy" " Foreign" " History"
## [13] " Horror" " Music" " Mystery"
## [16] " Romance" " Science Fiction" " Thriller"
## [19] " TV Movie" " War" " Western"
levels(droplevels(movies$genre2))
## [1] "" " Action" " Adventure"
## [4] " Animation" " Comedy" " Crime"
## [7] " Documentary" " Drama" " Family"
## [10] " Fantasy" " Foreign" " History"
## [13] " Horror" " Music" " Mystery"
## [16] " Romance" " Science Fiction" " Thriller"
## [19] " TV Movie" " War" " Western"
levels(droplevels(movies$genre3))
## [1] "" " Action" " Adventure"
## [4] " Animation" " Comedy" " Crime"
## [7] " Documentary" " Drama" " Family"
## [10] " Fantasy" " Foreign" " History"
## [13] " Horror" " Music" " Mystery"
## [16] " Romance" " Science Fiction" " Thriller"
## [19] " TV Movie" " War" " Western"
movies %>% count(genre1)
## # A tibble: 21 × 2
## genre1 n
## <fct> <int>
## 1 "" 2437
## 2 " Action" 4487
## 3 " Adventure" 1508
## 4 " Animation" 1123
## 5 " Comedy" 8815
## 6 " Crime" 1683
## 7 " Documentary" 3412
## 8 " Drama" 11952
## 9 " Family" 524
## 10 " Fantasy" 702
## # ℹ 11 more rows
movies %>% count(genre2)
## # A tibble: 21 × 2
## genre2 n
## <fct> <int>
## 1 "" 16988
## 2 " Action" 1544
## 3 " Adventure" 1412
## 4 " Animation" 617
## 5 " Comedy" 3262
## 6 " Crime" 1428
## 7 " Documentary" 469
## 8 " Drama" 6301
## 9 " Family" 1109
## 10 " Fantasy" 764
## # ℹ 11 more rows
movies %>% count(genre3)
## # A tibble: 21 × 2
## genre3 n
## <fct> <int>
## 1 "" 31454
## 2 " Action" 451
## 3 " Adventure" 422
## 4 " Animation" 171
## 5 " Comedy" 911
## 6 " Crime" 852
## 7 " Documentary" 38
## 8 " Drama" 1673
## 9 " Family" 756
## 10 " Fantasy" 538
## # ℹ 11 more rows
Blank values, 2437 with no genre, it needs to be fixed.
levels(droplevels(movies$genre1))
## [1] "" " Action" " Adventure"
## [4] " Animation" " Comedy" " Crime"
## [7] " Documentary" " Drama" " Family"
## [10] " Fantasy" " Foreign" " History"
## [13] " Horror" " Music" " Mystery"
## [16] " Romance" " Science Fiction" " Thriller"
## [19] " TV Movie" " War" " Western"
levels(droplevels(movies$genre2))
## [1] "" " Action" " Adventure"
## [4] " Animation" " Comedy" " Crime"
## [7] " Documentary" " Drama" " Family"
## [10] " Fantasy" " Foreign" " History"
## [13] " Horror" " Music" " Mystery"
## [16] " Romance" " Science Fiction" " Thriller"
## [19] " TV Movie" " War" " Western"
levels(droplevels(movies$genre3))
## [1] "" " Action" " Adventure"
## [4] " Animation" " Comedy" " Crime"
## [7] " Documentary" " Drama" " Family"
## [10] " Fantasy" " Foreign" " History"
## [13] " Horror" " Music" " Mystery"
## [16] " Romance" " Science Fiction" " Thriller"
## [19] " TV Movie" " War" " Western"
movies %>% count(genre1)
## # A tibble: 21 × 2
## genre1 n
## <fct> <int>
## 1 "" 2437
## 2 " Action" 4487
## 3 " Adventure" 1508
## 4 " Animation" 1123
## 5 " Comedy" 8815
## 6 " Crime" 1683
## 7 " Documentary" 3412
## 8 " Drama" 11952
## 9 " Family" 524
## 10 " Fantasy" 702
## # ℹ 11 more rows
movies <- movies %>% mutate(genre1 = fct_collapse(genre1, Unspecified = ""))
levels(droplevels(movies$genre1))
## [1] "Unspecified" " Action" " Adventure"
## [4] " Animation" " Comedy" " Crime"
## [7] " Documentary" " Drama" " Family"
## [10] " Fantasy" " Foreign" " History"
## [13] " Horror" " Music" " Mystery"
## [16] " Romance" " Science Fiction" " Thriller"
## [19] " TV Movie" " War" " Western"
movies %>% count(genre1)
## # A tibble: 21 × 2
## genre1 n
## <fct> <int>
## 1 "Unspecified" 2437
## 2 " Action" 4487
## 3 " Adventure" 1508
## 4 " Animation" 1123
## 5 " Comedy" 8815
## 6 " Crime" 1683
## 7 " Documentary" 3412
## 8 " Drama" 11952
## 9 " Family" 524
## 10 " Fantasy" 702
## # ℹ 11 more rows
movies <- movies %>% mutate(genre2 = fct_collapse(genre2, "NA" = ""))
movies <- movies %>% mutate(genre3 = fct_collapse(genre3, "NA" = ""))
levels(droplevels(movies$genre2))
## [1] "NA" " Action" " Adventure"
## [4] " Animation" " Comedy" " Crime"
## [7] " Documentary" " Drama" " Family"
## [10] " Fantasy" " Foreign" " History"
## [13] " Horror" " Music" " Mystery"
## [16] " Romance" " Science Fiction" " Thriller"
## [19] " TV Movie" " War" " Western"
movies %>% count(genre2)
## # A tibble: 21 × 2
## genre2 n
## <fct> <int>
## 1 "NA" 16988
## 2 " Action" 1544
## 3 " Adventure" 1412
## 4 " Animation" 617
## 5 " Comedy" 3262
## 6 " Crime" 1428
## 7 " Documentary" 469
## 8 " Drama" 6301
## 9 " Family" 1109
## 10 " Fantasy" 764
## # ℹ 11 more rows
levels(droplevels(movies$genre3))
## [1] "NA" " Action" " Adventure"
## [4] " Animation" " Comedy" " Crime"
## [7] " Documentary" " Drama" " Family"
## [10] " Fantasy" " Foreign" " History"
## [13] " Horror" " Music" " Mystery"
## [16] " Romance" " Science Fiction" " Thriller"
## [19] " TV Movie" " War" " Western"
movies %>% count(genre3)
## # A tibble: 21 × 2
## genre3 n
## <fct> <int>
## 1 "NA" 31454
## 2 " Action" 451
## 3 " Adventure" 422
## 4 " Animation" 171
## 5 " Comedy" 911
## 6 " Crime" 852
## 7 " Documentary" 38
## 8 " Drama" 1673
## 9 " Family" 756
## 10 " Fantasy" 538
## # ℹ 11 more rows
# Eliminate white space inconsistency
movies <- movies %>% mutate(genre1 = str_trim(genre1))
movies <- movies %>% mutate(genre2 = str_trim(genre2))
movies <- movies %>% mutate(genre3 = str_trim(genre3))
# Reconvert variables to factor data type
movies <- movies %>% mutate(genre1 = as.factor(movies$genre1))
movies <- movies %>% mutate(genre2 = as.factor(movies$genre2))
movies <- movies %>% mutate(genre3 = as.factor(movies$genre3))
Replaced blank values in a new category named NA.
levels(droplevels(movies$company1))
## [1] ""
## [2] " 406 Production"
## [3] " A Production Committee"
## [4] " Athénaïse"
## [5] " films id"
## [6] " xa0Braeburn Entertainment"
## [7] " 주 로드픽쳐스"
## [8] " 주 로제타시네마"
## [9] " 주 비에이엔터테인먼트"
## [10] " 01 Distribution"
## [11] " 1 85 Films"
## [12] " 100 Halal"
## [13] " 100 Bares"
## [14] " 101st Street Films"
## [15] " 10dB Inc"
## [16] " 10th Hole Productions"
## [17] " 11"
## [18] " 1201"
## [19] " 120dB Films"
## [20] " 13 All Stars LLC"
## [21] " 14 Luglio Cinematografica"
## [22] " 14 Reels Entertainment"
## [23] " 1492 Pictures"
## [24] " 1818"
## [25] " 1821 Pictures"
## [26] " 185 Trax"
## [27] " 185º Equator"
## [28] " 19 Entertainment"
## [29] " 1984 Private Defense Contractors"
## [30] " 2 4 7 Films"
## [31] " 2 Man Production"
## [32] " 2 Player Productions"
## [33] " 2 Smooth Film Productions"
## [34] " 2 Team Productions"
## [35] " 20 Steps Productions"
## [36] " 20ten Media"
## [37] " 20th Century Fox"
## [38] " 20th Century Fox Film Corporation"
## [39] " 20th Century Fox Home Entertainment"
## [40] " 20th Century Fox Russia"
## [41] " 20th Century Fox Television"
## [42] " 20th Century Pictures"
## [43] " 21 Laps Entertainment"
## [44] " 21 One Productions"
## [45] " 21st Century Film Corporation"
## [46] " 22 Dicembre"
## [47] " 23 5 Filmproduktion"
## [48] " 23 Giugno"
## [49] " 24 7 Films"
## [50] " 2425 PRODUCTION"
## [51] " 26 Films"
## [52] " 27 Films Production"
## [53] " 27 Productions"
## [54] " 29 fevralya"
## [55] " 2929 Productions"
## [56] " 2afilm"
## [57] " 2B Films"
## [58] " 2DS Productions"
## [59] " 2Pilots Filmproduction"
## [60] " 2Plan2"
## [61] " 2T Produzione Film"
## [62] " 3 4 Women Productions"
## [63] " 3 Arts Entertainment"
## [64] " 3 Sat"
## [65] " 3311 Productions"
## [66] " 343 Industries"
## [67] " 34th Street Films"
## [68] " 360 Pictures"
## [69] " 38 Pictures Films"
## [70] " 3b productions"
## [71] " 3B Productions"
## [72] " 3D Content Hub"
## [73] " 3D Entertainment"
## [74] " 3L Filmproduktion GmbH"
## [75] " 3L Productions"
## [76] " 3Mark Entertainment"
## [77] " 3rd Street Pictures"
## [78] " 3rd Vision Films"
## [79] " 3sat"
## [80] " 4 1 2"
## [81] " 4 1 2 Film"
## [82] " 4 Film"
## [83] " 4 Ks Entertainment id"
## [84] " 40 Acres A Mule Filmworks"
## [85] " 42 Km Film"
## [86] " 42 Productions"
## [87] " 4321 Productions"
## [88] " 44th Floor Productions"
## [89] " 455 Films"
## [90] " 47 Entertainment"
## [91] " 4dvd"
## [92] " 4Ks Entertainment id"
## [93] " 4th Row Films"
## [94] " 5 States"
## [95] " 50 Eggs"
## [96] " 5060 Productions"
## [97] " 512K Entertainment"
## [98] " 54 Days Productions"
## [99] " 59 Films"
## [100] " 61 Productions Inc"
## [101] " 7 Network"
## [102] " 7 Pictures"
## [103] " 700 Pictures"
## [104] " 717 Productions"
## [105] " 72 Productions"
## [106] " 72nd Street Productions"
## [107] " 75 Films"
## [108] " 777 Films Corporation"
## [109] " 8180 Films"
## [110] " 852 Films"
## [111] " 8750 Films"
## [112] " 9 14 Pictures"
## [113] " 9ers Entertainment"
## [114] " A A Release"
## [115] " A D Studios"
## [116] " A S Productions"
## [117] " A C I Films"
## [118] " A Film"
## [119] " A Ninety Three Productions"
## [120] " A + C Reuter New Cinema"
## [121] " A 1 Kino Veo id"
## [122] " A 1 Pictures"
## [123] " A B Corp"
## [124] " A Bad Way Ltd"
## [125] " A Band Apart"
## [126] " A Bigger Boat"
## [127] " A Company Filmproduktionsgesellschaft"
## [128] " A Contracorriente Films"
## [129] " A Contraluz Films"
## [130] " A E IndieFilms"
## [131] " A E Television Networks"
## [132] " A F Cinema e Vídeo"
## [133] " A Farewell to Kings Entertainment Company"
## [134] " A Film Monkey Production"
## [135] " A G Films"
## [136] " A I P Productions"
## [137] " A J Films"
## [138] " A L Production"
## [139] " A Loopy Production LLC"
## [140] " A M A Film"
## [141] " A M Films"
## [142] " A M Sound Pictures"
## [143] " A Major Films"
## [144] " A Mark Entertainment"
## [145] " A Million Monkeys"
## [146] " A Pix Entertainment"
## [147] " A Private View"
## [148] " A Ronald Neame Production"
## [149] " A Small Production Company"
## [150] " A Space Between"
## [151] " A T P I P Producciones"
## [152] " A Team"
## [153] " A+E Studios"
## [154] " A24"
## [155] " A71 Productions"
## [156] " Aa United id"
## [157] " AAA Productions"
## [158] " Aamir Khan Productions"
## [159] " Aamu Filmcompany"
## [160] " Aardman Animations"
## [161] " Aaron Russo Productions"
## [162] " Aaron Spelling Productions"
## [163] " AARU Productions"
## [164] " Aascar Films"
## [165] " Aashirvad Cinemas"
## [166] " AB PT Pictures Corp"
## [167] " AB Publikfilm"
## [168] " AB Svensk Filmindustri"
## [169] " AB Svenska Ord"
## [170] " Abandon Pictures"
## [171] " Abba Movies Co Ltd"
## [172] " Abbas Kiarostami Productions"
## [173] " Abbolita Productions"
## [174] " Abbott Vision"
## [175] " Abbout Productions"
## [176] " ABC Circle Films"
## [177] " ABC Family"
## [178] " ABC Film A S"
## [179] " ABC Motion Pictures"
## [180] " ABC Pictures"
## [181] " ABC Productions"
## [182] " ABC TV"
## [183] " Aberration Films"
## [184] " Abilene"
## [185] " ABKCO Music and Records"
## [186] " Abominable Pictures"
## [187] " Abra Films"
## [188] " Abra Producciones"
## [189] " abramoff Production"
## [190] " ABS CBN Film Productions"
## [191] " Ac Bath Productions id"
## [192] " Academy Photoplays"
## [193] " Academy Pictures"
## [194] " Acajou Films"
## [195] " Accelerator Films"
## [196] " Access Motion Picture Group"
## [197] " Access Motion Pictures"
## [198] " Access Pictures"
## [199] " Accomplice Films"
## [200] " Ace Deuce Entertainment"
## [201] " Ace Productions"
## [202] " ACH"
## [203] " Acheron Films"
## [204] " Acme Date"
## [205] " Acne Film"
## [206] " Acolyte Films"
## [207] " Acorn Pictures"
## [208] " Acre Enterprises"
## [209] " Acrobatic Motion Works West"
## [210] " Acrolight Pictures"
## [211] " Act III Communications"
## [212] " Acteurs Auteurs Associés AAA"
## [213] " Action concept fims"
## [214] " Action Concept Film und Stuntproduktion"
## [215] " Action Features"
## [216] " Action House"
## [217] " Action Images"
## [218] " Action International Pictures"
## [219] " Actium Pictures"
## [220] " Active Entertainment"
## [221] " ActorieDeFilm"
## [222] " Actual Films"
## [223] " Acuarius Films"
## [224] " Ad Hominem Enterprises"
## [225] " Ada Films"
## [226] " Adam Packer Film Productions"
## [227] " Adams Apple Film Company"
## [228] " Adaptive Studios"
## [229] " Addict Films"
## [230] " Adel Productions"
## [231] " Adela Pictures"
## [232] " Adelae Film Festival id"
## [233] " Adelson Entertainment"
## [234] " Adi Shankar Production"
## [235] " Adivina Producciones S L"
## [236] " Adlabs Films Ltd"
## [237] " Admire Productions Ltd"
## [238] " Adoor Gopalakrishnan Productions"
## [239] " ADPProductions"
## [240] " ADR Productions"
## [241] " Adrian Țofei"
## [242] " AdScott Pictures"
## [243] " Adullam Films LLC"
## [244] " Adult Swim"
## [245] " ADV Films"
## [246] " Advance Productions"
## [247] " Aegis Film Fund"
## [248] " Aeteas Filmproduktions"
## [249] " Aetios Production"
## [250] " Aetos Produzioni Cinematografiche"
## [251] " AFC"
## [252] " Affinity Entertainment"
## [253] " Affirm Films"
## [254] " Afghan Luke Productions"
## [255] " After Dark Films"
## [256] " Afton Linebrook"
## [257] " Agamemnon Films"
## [258] " Agat Films"
## [259] " Agat Films Cie"
## [260] " Ágata Films S A"
## [261] " Agav Films"
## [262] " Agencja Produkcji Filmowej"
## [263] " AGGK Films"
## [264] " Agi Orsi Productions"
## [265] " Agnès b Productions"
## [266] " Agnes Delahaie Productions"
## [267] " Agora Entertainment"
## [268] " Agora Films"
## [269] " AGS Entertainment"
## [270] " Agua Films"
## [271] " Aho Soldan"
## [272] " AIC"
## [273] " Aica Cinematografica S R L"
## [274] " Aichi Arts Center"
## [275] " Aimimage Productions"
## [276] " Air Bud Entertainment"
## [277] " AireCine"
## [278] " Ajay Devgn Films"
## [279] " Ajay Film Company"
## [280] " Ajym Films"
## [281] " AJYM Films"
## [282] " AkamPuram"
## [283] " Åke Lindman Film Productions"
## [284] " Akkord Film Produktion GmbH"
## [285] " Akson Studio"
## [286] " Aksoy Film Production"
## [287] " Aktualnyy Film"
## [288] " Akün Film"
## [289] " Al Ahramm Studios"
## [290] " Al Shorouk for Media Productions"
## [291] " Alabama Moon Entertainment"
## [292] " Alamdary"
## [293] " Alameda Films"
## [294] " Alamode Film"
## [295] " Alan C Fox"
## [296] " Alan Landsburg Productions"
## [297] " Alan Sacks Productions"
## [298] " Alarahastatud Filmikompanii"
## [299] " Alazraki Films"
## [300] " Alba Cinematografica"
## [301] " Alba Produzioni"
## [302] " Albany Productions"
## [303] " Albatros Filmproduktion"
## [304] " Albatros Produktion"
## [305] " Albemarle Films"
## [306] " Albert Band International Productions Inc"
## [307] " Albert Zugsmith Productions"
## [308] " Alberta Film Development Program of the Alberta Foundation for the Arts The"
## [309] " Alberta Film Entertainment"
## [310] " Alberta Filmworks"
## [311] " Albertine Production"
## [312] " Albfilm Tirana"
## [313] " Albina Productions S a r l"
## [314] " Albion Film Corp I"
## [315] " Albione Cinematografica"
## [316] " Alce Producciones LTDA"
## [317] " Alcina"
## [318] " Alcina Pictures"
## [319] " Alcon Entertainment"
## [320] " Alcor Films"
## [321] " Alcove Entertainment"
## [322] " Aldan Company"
## [323] " Alebrije Cine y Veo id"
## [324] " Aleph Media"
## [325] " Alert Film"
## [326] " Alex Cinematografica"
## [327] " Alex Jones Productions"
## [328] " Alexander Groupe"
## [329] " Alexander Korda Films"
## [330] " Alexander Stern Productions"
## [331] " Alexandersson De Geer Bildproduktion"
## [332] " Alexandra Films"
## [333] " Alexandre Films"
## [334] " Alexandros Film"
## [335] " Alfa Cinematografica"
## [336] " Alfama Films"
## [337] " Alfred Image Works"
## [338] " Alfred J Hitchcock Productions"
## [339] " Algemene Vereniging Radio Omroep AVRO"
## [340] " Algonquin"
## [341] " Alhena Films"
## [342] " Ali n Productions"
## [343] " Alia Films"
## [344] " Alianza Cinematográfica Española"
## [345] " Alice Productions"
## [346] " Alicéléo"
## [347] " Alicia Produce"
## [348] " Alicia Produce S L"
## [349] " Aligator Producciones"
## [350] " Alimar Productions"
## [351] " Alive Films"
## [352] " Alive Productions"
## [353] " Alka Film Zagreb"
## [354] " All American"
## [355] " All American Pictures"
## [356] " All At Once"
## [357] " All Girl Productions"
## [358] " All India Film Corporation"
## [359] " All Media Inc"
## [360] " Alla Prima Productions"
## [361] " Allagash Films"
## [362] " Allan King Associates"
## [363] " Allarts"
## [364] " Allegro Film"
## [365] " Allegro Films"
## [366] " Alleycat Studios"
## [367] " Allfilm"
## [368] " Allfin A G"
## [369] " Alliance"
## [370] " Alliance Atlantis Communications"
## [371] " Alliance Communications Corporation"
## [372] " Alliance Films"
## [373] " Alliance Productions"
## [374] " Alliance Vivafilm"
## [375] " Allianz"
## [376] " Allied Artists"
## [377] " Allied Artists Pictures"
## [378] " Allied Entertainments Group PLC"
## [379] " Allied Film Makers"
## [380] " Allied Filmmakers"
## [381] " Allied Films"
## [382] " Allied Pictures Corporation"
## [383] " Allied Stars"
## [384] " Allied Vision"
## [385] " allien"
## [386] " Alligator Inc"
## [387] " Alloy Entertainment"
## [388] " AllyCat Entertainment"
## [389] " Alma Films"
## [390] " Almena Films"
## [391] " Almighty Dog Productions"
## [392] " Almond Tree Films"
## [393] " Almost Mnight Productions id"
## [394] " Aloupis Productions"
## [395] " Alpha Cinematografica"
## [396] " Alpha Film II"
## [397] " Alpha TV"
## [398] " Alphaville Films"
## [399] " AlphaVille Pictures Copenhagen"
## [400] " Alpine Pictures"
## [401] " Alpine Productions"
## [402] " Alquimia Cinema"
## [403] " Als Productions id"
## [404] " Also Known As Pictures"
## [405] " Alta Definicion"
## [406] " Alta Films"
## [407] " Alta Films S A"
## [408] " Alta Producción"
## [409] " Alta Vista"
## [410] " Alta Vista Film Production"
## [411] " Alta Vista Films"
## [412] " alta vista productions"
## [413] " Alta Vista Productions"
## [414] " Altamira Pictures Inc"
## [415] " Altar Identity Studios"
## [416] " Altavista Films"
## [417] " Alter Ego Cinema"
## [418] " Alterian"
## [419] " Alternate Current"
## [420] " Alternate Ending Studios"
## [421] " Altimeter Films"
## [422] " Altitude Film Entertainment"
## [423] " Alumbra Films"
## [424] " Alumbramento"
## [425] " Álvaro Agustín"
## [426] " Amagram"
## [427] " Amalgamated Film Enterprises"
## [428] " Amalgamated Productions"
## [429] " Amalia Film GmbH"
## [430] " Amaru Films"
## [431] " Amasia Entertainment"
## [432] " Amazing Film Productions"
## [433] " Amazon Studios"
## [434] " Ambassador Productions"
## [435] " Amber Entertainment"
## [436] " Amber Entertainment Drive Thru Pictures"
## [437] " Amber Lamps"
## [438] " Amber Pictures"
## [439] " Ambi Pictures"
## [440] " Ambience Entertainment"
## [441] " Ambient Entertainment GmbH"
## [442] " Amblin Entertainment"
## [443] " Amblin Television"
## [444] " Amboto Producciones Cinematográficas"
## [445] " Ambrosia Pictures"
## [446] " Ambrosino Delmenico"
## [447] " Ambush Entertainment"
## [448] " Ameland Films"
## [449] " Amen Ra Films"
## [450] " Ameran Films"
## [451] " American Academy Productions"
## [452] " American Artists"
## [453] " American Broadcasting Company ABC"
## [454] " American Cinema International"
## [455] " American Cinema Productions"
## [456] " American Cinema Releasing"
## [457] " American Eagle"
## [458] " American Film Institute AFI"
## [459] " American Film Productions"
## [460] " American Filmworks"
## [461] " American First Run Studios"
## [462] " American General Pictures"
## [463] " American Independent Productions"
## [464] " American International Pictures AIP"
## [465] " American International Productions"
## [466] " American International Television AIP TV"
## [467] " American Media Group"
## [468] " American Mutoscope Biograph"
## [469] " American National Films"
## [470] " American Ninth Art Studios"
## [471] " American Pictures"
## [472] " American Playhouse"
## [473] " American Playhouse Theatrical Films"
## [474] " American Screen Productions"
## [475] " American World Pictures"
## [476] " American Zoetrope"
## [477] " Americas Film Conservancy"
## [478] " Amerinda Est"
## [479] " Amex Productions"
## [480] " Amicus Productions"
## [481] " Amigos Creations"
## [482] " Amiguetes Entertainment"
## [483] " Amiguetes Entertainment S L"
## [484] " Amka Films"
## [485] " AMKO Productions Inc"
## [486] " AMLF"
## [487] " Amour Fou Filmproduktion"
## [488] " Amrion"
## [489] " Amritraj Stevens Entertainment"
## [490] " Amulet Pictures"
## [491] " Amuse Pictures"
## [492] " Amuse Soft Entertainment"
## [493] " Amusement Park Films"
## [494] " AMV Production"
## [495] " An Indigo Dog Rescue"
## [496] " An Olive Branch Productions"
## [497] " ANA Media"
## [498] " Anabel Films S A"
## [499] " Anagram Films"
## [500] " Anagram Produktion"
## [501] " Ananã Produções"
## [502] " Ananya Films"
## [503] " Anarchist s Convention Films"
## [504] " Anarchos Productions"
## [505] " Anasazi Productions"
## [506] " Anchor Bay"
## [507] " Anchor Bay Entertainment"
## [508] " Anchor Bay Films"
## [509] " Ancla Century Films"
## [510] " And Maps and Plans"
## [511] " Andergraun Films"
## [512] " Andertainment Group"
## [513] " Andrea Leone Films"
## [514] " Andrea Sperling Productions"
## [515] " Andreevsky Flag Film Company"
## [516] " Andrew L Stone Productions"
## [517] " Andrew Lauren Productions ALP"
## [518] " Andrew Stevens Entertainment"
## [519] " Andy Saris Company id"
## [520] " Andy Warhol Films"
## [521] " Andy Warhol Productions"
## [522] " ANG Film"
## [523] " Ang Lee Productions"
## [524] " Angel City"
## [525] " Angel Devil Productions"
## [526] " Angel Entertainment"
## [527] " Angel Film"
## [528] " Angel films"
## [529] " Angel Productions"
## [530] " Angels Airwaves"
## [531] " Angels Productions"
## [532] " Angelus Productions"
## [533] " Anglia Television"
## [534] " Anglo Allied"
## [535] " Anglo Amalgamated Film Distributors"
## [536] " Anglo EMI"
## [537] " Anglo Enterprises"
## [538] " Angoa Agicoa"
## [539] " Angry Adam Productions"
## [540] " Angry Film"
## [541] " Angry Monkey Entertainment"
## [542] " Anima Istanbul"
## [543] " Anima Vitae"
## [544] " ANIMAL DE LUZ FILMS"
## [545] " Animal Kingdom"
## [546] " ANIMATE"
## [547] " Animate Film"
## [548] " Animatógrafo II"
## [549] " Anime International Company"
## [550] " Anime International Company AIC"
## [551] " Animus Films"
## [552] " Aniplex"
## [553] " Anit Film"
## [554] " Ankatt Produktion"
## [555] " Anker Productions Inc"
## [556] " Ann and Phelim Media"
## [557] " Anna Biller Productions"
## [558] " Anna Lena Films"
## [559] " Anna Sanders Films"
## [560] " Annapurna Pictures"
## [561] " Annapurna Productions"
## [562] " Annapurna Studios"
## [563] " Annazan"
## [564] " Annuit Coeptis Entertainment Inc"
## [565] " ANOC Productions"
## [566] " Anonymous Content"
## [567] " Anouchka Films"
## [568] " ANS Production"
## [569] " Ansor International"
## [570] " Antarctic Pictures"
## [571] " Antares Produzione Cinematografica"
## [572] " Antena 3 Films"
## [573] " Antena 3 Films Cangrejo Films"
## [574] " Antena 3 Televisión"
## [575] " Antena Latina Films"
## [576] " Antenne 2"
## [577] " Anthem Pictures"
## [578] " Anthill Productions"
## [579] " Anthony Buckley Films"
## [580] " Anthos Media"
## [581] " Antibes Inc"
## [582] " Antiteater X Film"
## [583] " Antoinine Green Brge id"
## [584] " ANTORCHA FILMS"
## [585] " Antote Films id"
## [586] " Antote Films I id"
## [587] " Antron Media Production"
## [588] " Antzworks"
## [589] " Anugraha Cine Arts"
## [590] " Anurag Kashyap Films"
## [591] " Anvil Films"
## [592] " Anwar Rasheed Entertainment"
## [593] " Anxiety Island Entertainment"
## [594] " Anzervos"
## [595] " Aoi Promotion"
## [596] " Aparte Film"
## [597] " Aparte Producciones"
## [598] " Apatow Productions"
## [599] " Apipoulaï"
## [600] " APJAC Productions"
## [601] " Apollo Associates"
## [602] " Apollo Films"
## [603] " Apollo Pictures"
## [604] " ApolloMedia Distribution"
## [605] " ApolloMovie Beteiligungs"
## [606] " ApolloProMovie"
## [607] " ApolloProMovie Co 1 Filmproduktion"
## [608] " ApolloProScreen"
## [609] " ApolloProScreen Filmproduktion"
## [610] " Apostle"
## [611] " Apostle Productions"
## [612] " Appa Productions"
## [613] " Appaloosa Pictures"
## [614] " Appian Way"
## [615] " Applause Pictures"
## [616] " Apple Corps"
## [617] " Apple Creek Productions"
## [618] " Apple Films"
## [619] " Applecreek Productions"
## [620] " April Films"
## [621] " April Productions"
## [622] " April Showers"
## [623] " APT Entertainment"
## [624] " APT Films"
## [625] " Apulia Film Commission"
## [626] " Aquarius Audiovisual"
## [627] " Aquarius Films"
## [628] " Aquifilm"
## [629] " Aquila Cinematografica"
## [630] " Aquila Film Enterprises"
## [631] " AR Films"
## [632] " Arachn Productions Ltd id"
## [633] " Aram Entertainment Fund id"
## [634] " Araucaria Cine"
## [635] " Arc Entertainment"
## [636] " Arc Light Films"
## [637] " Arca Filmproduktion GmbH"
## [638] " Arca Studio"
## [639] " Arcade Films"
## [640] " Arcade Pictures"
## [641] " Arcadia Motion Pictures"
## [642] " Arcady Bay Entertainment"
## [643] " Arcani Pictures"
## [644] " Archer Gray"
## [645] " Archer s Mark"
## [646] " Archer Street Productions"
## [647] " Archimede"
## [648] " Archipel 35"
## [649] " Archstone Pictures"
## [650] " Arclight Films"
## [651] " Arco Film"
## [652] " Arco Films"
## [653] " Arcola Pictures"
## [654] " Arctic Filmi"
## [655] " Arcturus Entertainment"
## [656] " Arcview Entertainment"
## [657] " ARD"
## [658] " ARD Degeto Film"
## [659] " Arden Films"
## [660] " Ardent Films"
## [661] " area japan"
## [662] " arena Films"
## [663] " Arena Films"
## [664] " Arena Productions"
## [665] " Arenafilm"
## [666] " Arenamedia"
## [667] " Argo Film Festival"
## [668] " Argomedia Productions"
## [669] " Argonaut Film"
## [670] " Argonauts Productions S A"
## [671] " Argos Films"
## [672] " Argosy Pictures"
## [673] " Argus Film"
## [674] " Argus Film Produktie"
## [675] " Argyle Enterprises"
## [676] " Argyle Productions"
## [677] " Argyll Film Partners"
## [678] " Aria Productions"
## [679] " Ariane Films"
## [680] " Ariel Film"
## [681] " Aries jp"
## [682] " Aries Cinematográfica Argentina"
## [683] " Aries Film International"
## [684] " ArieScope Pictures"
## [685] " Ariola Productions Inc"
## [686] " Aristarain P C"
## [687] " Arizona Films"
## [688] " Ariztical Entertainment"
## [689] " Ark Angel Productions"
## [690] " Arka Media Works"
## [691] " Arkoff International"
## [692] " Armada Films"
## [693] " Armenfilm"
## [694] " Armenfilm Studios"
## [695] " Armor Films Inc"
## [696] " Armory Films"
## [697] " Arnold and Gregor Production"
## [698] " Arnold Pressburger Films"
## [699] " ARO Entertainment"
## [700] " Aro Productions Inc"
## [701] " Aron Govil Productions"
## [702] " ARP Sélection"
## [703] " Arramis Films"
## [704] " Arrete Ton Cinema"
## [705] " Arrival Pictures"
## [706] " Arrowstorm Entertainment"
## [707] " ARS Film Production"
## [708] " Arsam International"
## [709] " Arsénico Producciones"
## [710] " Art Industry"
## [711] " Art Fest"
## [712] " Art Linson Productions"
## [713] " Art of War Films"
## [714] " Art Pictures Studio"
## [715] " Art Port"
## [716] " Art Theatre Guild"
## [717] " Art4noise"
## [718] " Artangel Media"
## [719] " Artanis Productions Inc"
## [720] " Artaxerxes Productions"
## [721] " Artcam International"
## [722] " Artco Films"
## [723] " Artcraft Pictures Corporation"
## [724] " Arte"
## [725] " ARTE"
## [726] " arte Cinéma"
## [727] " Arte Deutschland TV GmbH"
## [728] " Arte France"
## [729] " Arte France Cinéma"
## [730] " ARTE France Cinéma"
## [731] " Artemis Film"
## [732] " Artémis Productions"
## [733] " Artes Productions"
## [734] " Artfilm"
## [735] " Artfire Films"
## [736] " Artificial Eye"
## [737] " Artikulo Uno Productions"
## [738] " Artina Films"
## [739] " Artis Film"
## [740] " Artisan Entertainment"
## [741] " Artista Filmi"
## [742] " Artista Filmi Oy"
## [743] " Artistes Alliance Ltd"
## [744] " Artists Alliance"
## [745] " Artists Entertainment Complex"
## [746] " Artists Public Domain"
## [747] " Artoc Films"
## [748] " Arts Council of England"
## [749] " Arts Council of Great Britain"
## [750] " Arts+Labor"
## [751] " Artsploitation Films"
## [752] " Arturo González Producciones Cinematográficas S A"
## [753] " Arwin Productions"
## [754] " Arzu Film"
## [755] " AS Productions"
## [756] " ASA"
## [757] " ASA Film"
## [758] " ASA Film Produktion ApS"
## [759] " ASA Film Pvt Ltd"
## [760] " ASA Productions and Enterprises Pvt Ltd"
## [761] " Asahi Broadcasting"
## [762] " Asahi Shimbun"
## [763] " Ascendant Pictures"
## [764] " Ascension Pictures"
## [765] " Ascot"
## [766] " Ascot Elite Home Entertainment"
## [767] " Ascot Film"
## [768] " Asgaard Entertainment"
## [769] " Asgard Entertainment"
## [770] " Asghar Farhadi Productions"
## [771] " Ashok Kumar Productions"
## [772] " Ashton Productions"
## [773] " Ashutosh Gowariker Productions"
## [774] " Asia Do"
## [775] " Asia Tropical Films"
## [776] " Asmik Ace Entertainment"
## [777] " Aspa Producciones Cinematográficas"
## [778] " Aspen Film Society"
## [779] " Aspen Productions"
## [780] " Aspen Productions I"
## [781] " Aspiration Films"
## [782] " Assassin Films"
## [783] " Associated British Pathé"
## [784] " Associated British Picture Corporation"
## [785] " Associated British Picture Corporation ABPC"
## [786] " Associated Dragon"
## [787] " Associated Film Releasing Corporation AFRC"
## [788] " Associated General Films"
## [789] " Associated London Films"
## [790] " Associated Players Producers"
## [791] " Associated Producers API"
## [792] " Associated Talking Pictures ATP"
## [793] " Association coopérative des productions audio visuelles ACPAV"
## [794] " AST Studios"
## [795] " Astor Pictures Corp"
## [796] " Astrakan Films"
## [797] " Astral Bellevue Pathé"
## [798] " Astral Films"
## [799] " Astral Films Australian Film Commission The"
## [800] " Astral Productions"
## [801] " Astro Shaw"
## [802] " Astron 6 Veo International id"
## [803] " Asylum"
## [804] " Asylum The"
## [805] " Asylum Entertainment"
## [806] " Asylum Films"
## [807] " Asymmetrical Productions"
## [808] " At Group"
## [809] " AT Production"
## [810] " At Productions"
## [811] " AT T"
## [812] " Atchafalaya"
## [813] " Atelier Koninck"
## [814] " Atenea Films"
## [815] " Athanor"
## [816] " Athena Productions"
## [817] " Athens Film Company"
## [818] " Atípica Films"
## [819] " Atitude Produções e Empreendimentos"
## [820] " Atlánta Films id"
## [821] " Atlanta Productions"
## [822] " Atlantic Entertainment Group"
## [823] " Atlantic Pictures"
## [824] " Atlantic Releasing Corporation"
## [825] " Atlantic Streamline"
## [826] " Atlantica Cinematografica Produzione Films"
## [827] " Atlantik Film"
## [828] " Atlantis Film"
## [829] " Atlantis Films"
## [830] " Atlas 3 Productions"
## [831] " Atlas Entertainment"
## [832] " Atlas Film"
## [833] " Atlas Films"
## [834] " Atlas Independent"
## [835] " Atlas International Film"
## [836] " Atlas Productions"
## [837] " ATM Motionwe id"
## [838] " Atmo Media Network"
## [839] " Atmosphere Entertainment MM"
## [840] " ATO Pictures"
## [841] " Atom Cinema"
## [842] " Atom Factory"
## [843] " Atom Films"
## [844] " Atossa Film Produktion GmbH"
## [845] " Atresmedia Cine"
## [846] " Attention Era Media"
## [847] " Attercorp Productions"
## [848] " Aubrey Schenck Productions"
## [849] " Audax Films"
## [850] " Audley Films LLP"
## [851] " Augenschein Filmproduktion"
## [852] " August Entertainment"
## [853] " August Heart Entertainment"
## [854] " Aunt Max Entertainment"
## [855] " Aura Films"
## [856] " Auro Cinematografica"
## [857] " Aurora Filmes"
## [858] " Aurora Films"
## [859] " Aurora Productions"
## [860] " Aurora Productions LLC"
## [861] " Aurum Film"
## [862] " Australian Broadcasting Corporation"
## [863] " Australian Film Commission"
## [864] " Australian Film Finance Corporation"
## [865] " Australian Film Finance Corporation AFFC"
## [866] " Auswärtiges Amt"
## [867] " Auteur Entertainment"
## [868] " Authentic Films"
## [869] " Authorized Pictures"
## [870] " Autochenille Production"
## [871] " Automat Pictures"
## [872] " Automatic Media"
## [873] " Automatik Entertainment"
## [874] " Autonomous"
## [875] " Autumn Productions"
## [876] " AV Films"
## [877] " AV Pictures"
## [878] " Available Light Productions"
## [879] " Avala Film"
## [880] " Avalanche Productions"
## [881] " Avalon"
## [882] " Avalon Films"
## [883] " Avalon P C"
## [884] " Avalon Productions"
## [885] " Avalon Studios"
## [886] " Avalon Television Ltd"
## [887] " Avante Filmes"
## [888] " Avantmark Picture"
## [889] " Avanton Productions"
## [890] " Avatar Media"
## [891] " Avatar Productions"
## [892] " AVCO Embassy Pictures"
## [893] " AVEK"
## [894] " Avenging Conscience"
## [895] " Avenue B Productions"
## [896] " Avenue Picture"
## [897] " Avenue Pictures Productions"
## [898] " Avery Pix"
## [899] " Avex Entertainment"
## [900] " Aviacsa"
## [901] " Aviator Films"
## [902] " Aviva Entertainment"
## [903] " AVM Productions"
## [904] " Avon Production"
## [905] " Avon Productions II"
## [906] " Avrio Filmworks"
## [907] " AVRO Television"
## [908] " Avşar Film"
## [909] " Avton Films"
## [910] " Avventura Films"
## [911] " Awesomeness Films"
## [912] " Axman Productions"
## [913] " AXN"
## [914] " Ayngaran International"
## [915] " Azalea Pictures"
## [916] " Azor Film"
## [917] " Azure Productions"
## [918] " B C Filmproduktion"
## [919] " B A Produktion"
## [920] " B E Productions"
## [921] " B I L Releasing Corp"
## [922] " B J Films"
## [923] " B N Roy Productions"
## [924] " B O B and Partners"
## [925] " B O M Film Productions Co"
## [926] " B P A Productions"
## [927] " B R Films"
## [928] " B R C Produzione S r l"
## [929] " B R C Produzione S r l"
## [930] " B Reel Feature Films"
## [931] " B T Film"
## [932] " B2FX"
## [933] " Baa Ram Ewe"
## [934] " Baba Arts Limited Productions"
## [935] " Babaloo Studios"
## [936] " Babe Film"
## [937] " Babe Films"
## [938] " Babelsberg Film GmbH"
## [939] " Babibutafilm"
## [940] " Babieka"
## [941] " Baby Cow Productions"
## [942] " Babylone Films"
## [943] " Babylonian Productions"
## [944] " Bac Films"
## [945] " BAC Films"
## [946] " Bach Productions"
## [947] " Bachelor Party Productions"
## [948] " Bachrach Gottlieb Productions"
## [949] " Back Allie Productions"
## [950] " Back Lot Pictures"
## [951] " Backrow Studios"
## [952] " Backstage Productions"
## [953] " Backup Films"
## [954] " Backup Media"
## [955] " Bad Aaas Cinema"
## [956] " Bad Angels Productions Ltd"
## [957] " Bad Biology"
## [958] " Bad Hat Harry Productions"
## [959] " Bad Lt Productions"
## [960] " Bad Monkey Productions"
## [961] " Bad Robot"
## [962] " Bad Theology"
## [963] " Badbird"
## [964] " Badlands Company"
## [965] " Badlands Features"
## [966] " Bae Yong kyun Productions"
## [967] " Bagboy Productions"
## [968] " Bahr Productions Inc"
## [969] " Bakshi Productions"
## [970] " Balaji Motion Pictures"
## [971] " Balaka Movies"
## [972] " Balapolis"
## [973] " Balázs Béla Stúdió"
## [974] " Balboa Entertainment"
## [975] " Balcázar Producciones Cinematográficas"
## [976] " Balcor Film Investors"
## [977] " Baldini Pictures"
## [978] " BALDR"
## [979] " Baleuko S L"
## [980] " Balkan Film"
## [981] " Ball Chain Productions"
## [982] " Ballinran Productions"
## [983] " Ballpark Productions Partnership"
## [984] " Baltic Film Group"
## [985] " Baltimore Pictures"
## [986] " Baltimore Spring Creek Productions"
## [987] " Bam Ram Ewe"
## [988] " Bambú"
## [989] " Banana Moon Sky Films"
## [990] " Banana Split Polska"
## [991] " Bananeira Filmes"
## [992] " Bandai Entertainment Inc"
## [993] " Bandai Films"
## [994] " Bandaï Media Department"
## [995] " Bandai Visual"
## [996] " Bandai Visual Company"
## [997] " Bandai Visual Company JAPAN"
## [998] " Bandeira Entertainment"
## [999] " Bandito Brothers"
## [1000] " Bando a parte"
## [1001] " Bandonéon"
## [1002] " Bandora"
## [1003] " Bandos Films id"
## [1004] " Banger Films"
## [1005] " Banger Productions"
## [1006] " Bangil Pictures id"
## [1007] " Banner Films Ltd"
## [1008] " Banque Populaire Images 6"
## [1009] " bantam street"
## [1010] " Barbara Moorse Workshop"
## [1011] " Barclays Mercantile Industrial Finance"
## [1012] " Bare Bones Productions"
## [1013] " barefoot films"
## [1014] " Barna Alper Productions"
## [1015] " Barnesology Pictures"
## [1016] " Barnet Bain Films"
## [1017] " Barnholtz Entertainment"
## [1018] " Baroda"
## [1019] " Barok Film A S"
## [1020] " Barrandov Studios"
## [1021] " Barrister Productions Inc"
## [1022] " Barry Katz Entertainment"
## [1023] " Barton Films"
## [1024] " Barunson Film Division"
## [1025] " Barwood Films"
## [1026] " BAS Film Productions Inc"
## [1027] " Basara Pictures"
## [1028] " Base Industries Group"
## [1029] " Basket Case Productions"
## [1030] " Bass Entertainment Pictures"
## [1031] " Bastard Film"
## [1032] " Bathysphère Productions"
## [1033] " Batjac Productions"
## [1034] " Battleplan Productions"
## [1035] " Battletruck Films Ltd"
## [1036] " Baum Dantine Productions"
## [1037] " Bauman Entertainment"
## [1038] " Bautafilm"
## [1039] " BAV Film"
## [1040] " Bavaria Atelier"
## [1041] " Bavaria Film"
## [1042] " Bavaria Film and Television Fund"
## [1043] " Bavaria Filmverleih und Produktions GmbH"
## [1044] " Bavaria Pictures"
## [1045] " Bawalco Picture Company"
## [1046] " Baweja Movies"
## [1047] " Bay Brge Productions Inc id"
## [1048] " Bay Rge Films id"
## [1049] " Bayerischer Rundfunk"
## [1050] " Bayerischer Rundfunk BR"
## [1051] " Bayonne Entertainment"
## [1052] " Bayou Film Inc"
## [1053] " Bayou Pictures"
## [1054] " Bazelevs Production"
## [1055] " Bazmark Films"
## [1056] " BBC"
## [1057] " BBC Arena"
## [1058] " BBC Comedy"
## [1059] " BBC Cymru Wales"
## [1060] " BBC Drama Productions"
## [1061] " BBC Earth"
## [1062] " BBC Entertainment"
## [1063] " BBC Films"
## [1064] " BBC Four"
## [1065] " BBC Home Veo id"
## [1066] " BBC Manchester"
## [1067] " BBC Natural History Unit"
## [1068] " BBC Northern Ireland"
## [1069] " BBC One"
## [1070] " BBC Productions"
## [1071] " BBC Scotland"
## [1072] " BBC Three"
## [1073] " BBC Two"
## [1074] " BBC Wales"
## [1075] " BBC Worldwe id"
## [1076] " BBC Worldwe France id"
## [1077] " BBS Productions"
## [1078] " BBV Productions"
## [1079] " BCDF Pictures"
## [1080] " BD Cine"
## [1081] " BDI Films Inc"
## [1082] " BE Films"
## [1083] " Be Good Productions"
## [1084] " Beachfront Films"
## [1085] " Beachse Films id"
## [1086] " Beacon Communications"
## [1087] " Beacon Films Inc"
## [1088] " Beacon Pictures"
## [1089] " Beaconsfield Productions"
## [1090] " Beam Entertainment"
## [1091] " Bear Creek"
## [1092] " Beard Collins Shores Productions"
## [1093] " Bearing Fruit Entertainment"
## [1094] " Beat Pirate Films"
## [1095] " Beatrice Film"
## [1096] " Beautiful Kate Productions"
## [1097] " Beautiful Lie Pictures"
## [1098] " Beaver Champion Attractions"
## [1099] " Beaver Films"
## [1100] " Becker Häberle Filmproduktion GmbH"
## [1101] " Becker International"
## [1102] " Beco Films"
## [1103] " Bedford Falls Company The"
## [1104] " Bedford Falls Productions"
## [1105] " Bedford Pictures Inc"
## [1106] " Bedlam Productions"
## [1107] " Bee Holder Productions"
## [1108] " Bee Movies"
## [1109] " Beech Hill Films"
## [1110] " Before the Door Pictures"
## [1111] " Behind the wall Productions"
## [1112] " BehindTheLine Productions"
## [1113] " Beijing Dengfeng International Culture"
## [1114] " Beijing EE Media Co"
## [1115] " Beijing Enlight"
## [1116] " Beijing Enlight Pictures"
## [1117] " Beijing Film Studio"
## [1118] " Beijing Gallop Horse Film TV Production"
## [1119] " Beijing Mahua Funage Company"
## [1120] " Beijing New Picture Film Co Ltd"
## [1121] " Beijing Poly bona Film Distribution Company"
## [1122] " Beijing Starlit Movie and TV Culture"
## [1123] " Bel Air Entertainment"
## [1124] " Bel Air Gradison Productions"
## [1125] " Bel Air Productions"
## [1126] " Bel Air Productions Inc"
## [1127] " Belafonte Enterprises"
## [1128] " Belarusfilm"
## [1129] " Belgische Radio en Televisie BRT"
## [1130] " Belgrave"
## [1131] " Believe Entertainment"
## [1132] " Believerville Productions"
## [1133] " Belladonna Productions"
## [1134] " Belle Epoque Films"
## [1135] " Belstar Productions"
## [1136] " Belstone Pictures"
## [1137] " Belvision"
## [1138] " Bemybaby Films"
## [1139] " Ben Katz Productions"
## [1140] " Ben Stoloff Productions"
## [1141] " Benagoss Productions"
## [1142] " Benaroya Pictures"
## [1143] " Bender Spink Inc"
## [1144] " BenderSpink"
## [1145] " Benedek Films"
## [1146] " Benedict Bogeaus Production"
## [1147] " Benedict Pictures Corp"
## [1148] " Benetone Films"
## [1149] " Benjamin Productions"
## [1150] " Benmar Productions"
## [1151] " Bennett Robbins Productions"
## [1152] " Bent Christensen Filmproduktion"
## [1153] " Bentley Filmgroup"
## [1154] " Bentley Productions"
## [1155] " Benton Film Productions"
## [1156] " Beofilm"
## [1157] " Beograd Film"
## [1158] " Bergen Film"
## [1159] " Bergman Lustig productions"
## [1160] " Berkshire Axis Media"
## [1161] " Bernard Woolner Productions"
## [1162] " Bernhard Brandt Productions"
## [1163] " Bernhard Vor Productions Inc id"
## [1164] " Berns Brothers Productions"
## [1165] " Bernsen Ludwig Bercovici Production"
## [1166] " Bert E Friedlob Productions"
## [1167] " Bert I Gordon Productions"
## [1168] " Bert Marcus Productions"
## [1169] " Berton Films"
## [1170] " Berwick Street Productions"
## [1171] " Bésame Mucho Pictures"
## [1172] " Besiktas Kültür Merkezi BKM"
## [1173] " Bess Movie"
## [1174] " Bestia Films"
## [1175] " BET Pictures"
## [1176] " Beta Film"
## [1177] " Beth Harrington Productions"
## [1178] " Bethsabée Mucho"
## [1179] " Better Than"
## [1180] " Beverly Detroit"
## [1181] " Beware Doll Films"
## [1182] " Bewlay Bros"
## [1183] " Beyond Films"
## [1184] " Beyond Infinity"
## [1185] " Beyond Productions"
## [1186] " BFI"
## [1187] " BFI Film Fund"
## [1188] " BGOI Films"
## [1189] " Bhansali Films"
## [1190] " Bharath Pictures"
## [1191] " BHE Films"
## [1192] " BiBi Film"
## [1193] " Bifrost Pictures"
## [1194] " Big Arty Productions"
## [1195] " Big Beach Films"
## [1196] " Big Biting Pig Productions"
## [1197] " Big City"
## [1198] " Big Deal Pictures"
## [1199] " Big Easy Pictures"
## [1200] " Big Eye"
## [1201] " Big Fan Productions"
## [1202] " Big Finish Media"
## [1203] " Big Focus Television"
## [1204] " Big Idea Entertainment"
## [1205] " Big Idea Productions"
## [1206] " Big Indie Pictures"
## [1207] " Big Island Productions"
## [1208] " Big Picture Media Corporation"
## [1209] " BIG Pictures"
## [1210] " Big Screen Entertainment"
## [1211] " Big Screen Entertainment Group"
## [1212] " Big Sister Production"
## [1213] " Big Talk Productions"
## [1214] " Big Up Productions"
## [1215] " Big West"
## [1216] " Big World Pictures"
## [1217] " BigBen Films"
## [1218] " Bigel Mailer Films"
## [1219] " Bigel Entertainment"
## [1220] " Bigelow Productions"
## [1221] " Bigfoot Entertainment"
## [1222] " Bigscope Films"
## [1223] " Bijker Film TV"
## [1224] " Bill McCutchen Productions"
## [1225] " Bill Plympton Studios"
## [1226] " Billy Goat Pictures"
## [1227] " Billy Jack Enterprises"
## [1228] " BIM Distribuzione"
## [1229] " Bimal Roy Productions"
## [1230] " Bing Crosby Productions"
## [1231] " Biograf Jan Svěrák"
## [1232] " Biograph Company"
## [1233] " Bioscope"
## [1234] " Bioskop Film"
## [1235] " Bioskop Film GmbH"
## [1236] " Bipolar Films"
## [1237] " Birdsong Pictures"
## [1238] " Birnbaum Barber Productions"
## [1239] " Bischoff Diamond Corporation"
## [1240] " Bishop Studios LLC"
## [1241] " Bisojo Media Producciones S L"
## [1242] " Bitter Films"
## [1243] " Bitters End"
## [1244] " Bizarre Productions"
## [1245] " Bizibi"
## [1246] " BK Pictures"
## [1247] " BKG2H Productions"
## [1248] " BKM Film"
## [1249] " Black Blue Films"
## [1250] " Black White Productions"
## [1251] " Black Balloon Productions"
## [1252] " Black Bear Pictures"
## [1253] " Black Camel Pictures"
## [1254] " Black Chalk Productions"
## [1255] " Black Chrome Productions"
## [1256] " Black Creek Billie"
## [1257] " Black Dynamite Films"
## [1258] " Black Fawn Films"
## [1259] " Black Flag"
## [1260] " Black Flint Productions"
## [1261] " Black Forest Films"
## [1262] " Black Gold Films II"
## [1263] " Black Hat Films"
## [1264] " Black Hawk Entertainment"
## [1265] " Black House Capital"
## [1266] " Black Lion Films"
## [1267] " Black Marble Productions"
## [1268] " Black Orange"
## [1269] " Black Owl Productions"
## [1270] " Black Sand Pictures"
## [1271] " Black Sheep Film Productions"
## [1272] " Black Sheep Films"
## [1273] " Black Valley Films"
## [1274] " Black walk Productions"
## [1275] " Blackbird Production"
## [1276] " BlackBox TV"
## [1277] " Blackfern"
## [1278] " Blake Edwards"
## [1279] " Blast Films"
## [1280] " Blaustein Baroda"
## [1281] " Blaze Film Enterprises"
## [1282] " Blazer Films"
## [1283] " Bleiberg Entertainment"
## [1284] " Blender Foundation"
## [1285] " Blenkov Schønnemann Pictures"
## [1286] " Blind Spot Pictures Oy"
## [1287] " Blinder Films"
## [1288] " Blink Industries"
## [1289] " BlinkWorks Media"
## [1290] " Blitz Welch"
## [1291] " Bloch Woodfield Productions"
## [1292] " Block 2 Pictures"
## [1293] " Blockbuster Movie Entertainers"
## [1294] " Blondie Girl Productions"
## [1295] " Blood Bullets Productions"
## [1296] " Blood Money Partners LP"
## [1297] " Blood Relations Co"
## [1298] " Bloodline Pictures"
## [1299] " Bloody Disgusting"
## [1300] " Blossom Films"
## [1301] " BLT Productions"
## [1302] " Blu Cinematografica"
## [1303] " Blue + Green Communication"
## [1304] " Blue Angels Films"
## [1305] " Blue Askew"
## [1306] " Blue Bandana Productions"
## [1307] " Blue Dolphin Film Distributors"
## [1308] " Blue Dot Productions"
## [1309] " Blue Eyes Fiction"
## [1310] " Blue Films"
## [1311] " Blue Gardenia Productions"
## [1312] " Blue Goggles Films"
## [1313] " blue ic"
## [1314] " Blue Omega Entertainment"
## [1315] " Blue Parrot Productions"
## [1316] " Blue Pen Ltd"
## [1317] " Blue Rer Pictures id"
## [1318] " Blue Ribbon Digital Media"
## [1319] " Blue Sky Studios"
## [1320] " Blue Snow Productions"
## [1321] " Blue Star Pictures"
## [1322] " Blue Waters Motion Pictures"
## [1323] " Blueeyes Productions"
## [1324] " Blueline Films"
## [1325] " BluePrint Content"
## [1326] " Blueprint Pictures"
## [1327] " Blueshift Entertainment"
## [1328] " Blueskin Films Ltd"
## [1329] " Bluetree Pictures"
## [1330] " Bluff Road Productions"
## [1331] " Blumhouse Productions"
## [1332] " Blumhouse Television"
## [1333] " Blurco"
## [1334] " BMG Independents"
## [1335] " BMore Pictures"
## [1336] " BN Films"
## [1337] " BNN TV"
## [1338] " Bo Films"
## [1339] " Bo Ho Film Company Ltd"
## [1340] " BOB Film Sweden AB"
## [1341] " Bob Swerer Productions"
## [1342] " Boca Boca Producciones S L"
## [1343] " Bocaboca Producciones S A"
## [1344] " Böcek Yapım"
## [1345] " Bodega Films"
## [1346] " Boje Buck Produktion"
## [1347] " Bojon Films Company Ltd"
## [1348] " Bokari"
## [1349] " Boku Films"
## [1350] " Bold Films"
## [1351] " Bolex Brothers"
## [1352] " Boll KG"
## [1353] " Boll Kino Beteiligungs GmbH Co KG"
## [1354] " Bollywood Hollywood Production"
## [1355] " Bona Entertainment"
## [1356] " Bona Fe Productions id"
## [1357] " Bona Film Group"
## [1358] " Bona International Film Group"
## [1359] " Bones Studio"
## [1360] " Bonne Pioche Productions"
## [1361] " Bonneville Entertainment"
## [1362] " Bonneville Producers Group"
## [1363] " Bonsai Films"
## [1364] " Boogiefilm"
## [1365] " Boogui Cinema"
## [1366] " Bookshop Productions"
## [1367] " Boom Pictures Inc"
## [1368] " Boram Entertainment Inc"
## [1369] " Bórd Scannán na hÉireann"
## [1370] " Bord Scannan na hEireann Irish Film Board"
## [1371] " BorderLine Films"
## [1372] " Borderline Productions Ltd"
## [1373] " Boris Films"
## [1374] " BosBros"
## [1375] " BoSD Films LLC"
## [1376] " Boshra Film"
## [1377] " Bosna Film"
## [1378] " BoulderLight Pictures"
## [1379] " Boulting Brothers"
## [1380] " Bouncing Betty Productions"
## [1381] " Boundless Pictures"
## [1382] " Bow and Arrow Entertainment"
## [1383] " Bowden Productions Limited"
## [1384] " box Film Hamburg"
## [1385] " Box Office Spectaculars"
## [1386] " Box Productions"
## [1387] " Box TV"
## [1388] " Boxoffice International Pictures BIP"
## [1389] " Boy Wonder Films"
## [1390] " Boya Films"
## [1391] " Boyana Film"
## [1392] " Boyd s Company"
## [1393] " Boyut Film"
## [1394] " BR"
## [1395] " BR Petrobrás"
## [1396] " Brad Grey Pictures"
## [1397] " Brad Krevoy Television"
## [1398] " Braeburn Entertainment"
## [1399] " Brainfeeder"
## [1400] " Brains Base"
## [1401] " Brainstorm Media"
## [1402] " Branbomm"
## [1403] " Brand Mason"
## [1404] " Brandenberg"
## [1405] " Brandes Films International"
## [1406] " Brandman Productions"
## [1407] " Brandywine Productions"
## [1408] " Brandywine Productions Ltd"
## [1409] " Brasfilmes"
## [1410] " Braun Entertainment Group"
## [1411] " Braunsberg Productions"
## [1412] " Brave New Films"
## [1413] " Brave River Films"
## [1414] " Braveart Films"
## [1415] " BraxtanFILM"
## [1416] " Breablick Film AB id"
## [1417] " Break Thru Films"
## [1418] " Breakdown Productions"
## [1419] " Breaking Glass Pictures"
## [1420] " Breakthrough Entertainment"
## [1421] " Breakthru Films"
## [1422] " BrennFilm"
## [1423] " Breton Film Productions"
## [1424] " Brge Entertainment Group id"
## [1425] " Brge Films id"
## [1426] " Brigada"
## [1427] " Brigand Films"
## [1428] " Bright Cold Day Films"
## [1429] " Bright Eye Pictures"
## [1430] " Brighthelm Films"
## [1431] " Brightlight Pictures"
## [1432] " Brightlight Pictures Inc"
## [1433] " Brightstar Films"
## [1434] " Brillstein Entertainment Partners"
## [1435] " Brillstein Grey Entertainment"
## [1436] " Brink Productions"
## [1437] " Bristol Bay Productions"
## [1438] " Bristol Films"
## [1439] " British Aviation Pictures"
## [1440] " British Broadcasting Corporation BBC"
## [1441] " British Columbia Film"
## [1442] " British Film Institute BFI"
## [1443] " British Film Institute Production Board"
## [1444] " British Film Makers"
## [1445] " British Instructional Films BIF"
## [1446] " British International Pictures BIP"
## [1447] " British Lion Film Corporation"
## [1448] " British Lion Films"
## [1449] " British National Films"
## [1450] " British Screen"
## [1451] " Britpack Film Company"
## [1452] " Broad Appeal Productions"
## [1453] " Broad Green Pictures"
## [1454] " Broad Street Pictures"
## [1455] " Broadview Pictures"
## [1456] " Broadway Veo id"
## [1457] " Brocken Spectre Jockey Mutch"
## [1458] " Broken Films"
## [1459] " Broken Lizard Industries"
## [1460] " Broken Sky Films"
## [1461] " Bron Studios"
## [1462] " Bronson Avenue"
## [1463] " Bronson Club"
## [1464] " Bronson Club Oy"
## [1465] " Brookdale Productions"
## [1466] " Brooklyn Underground Films"
## [1467] " Brooksfilms"
## [1468] " Brooksfilms Ltd"
## [1469] " Brookstreet Pictures"
## [1470] " Brookwell McNamara Entertainment"
## [1471] " Brookwood Entertainment"
## [1472] " Brothers K Productions"
## [1473] " Brouwersgracht Investments"
## [1474] " BrownBag Productions II"
## [1475] " Brownstone Productions"
## [1476] " Bruce Brown Films"
## [1477] " Bruce Cohn Productions"
## [1478] " bruguglio films"
## [1479] " Bruin Grip Services"
## [1480] " Brut Productions"
## [1481] " Bruton Film Productions"
## [1482] " Bryan Foy Productions"
## [1483] " Bryna Productions"
## [1484] " BSDS Productions"
## [1485] " Bseenmedia"
## [1486] " BSF Film"
## [1487] " BSK Network and Entertainment"
## [1488] " BTA Films Veo id"
## [1489] " BTV Kaku Children s Satellite TV"
## [1490] " BUBBLE Studios"
## [1491] " BUCK Productions"
## [1492] " Bud Yorkin Productions"
## [1493] " Budapest Film"
## [1494] " Buena Vista"
## [1495] " Buena Vista Distribution Company"
## [1496] " Buena Vista International"
## [1497] " Buena Vista Pictures"
## [1498] " Buenaventura"
## [1499] " Bueprint Pictures"
## [1500] " Buffalo 8 Productions"
## [1501] " Buffalo Gal Pictures"
## [1502] " Bulbul Films"
## [1503] " Bulgarian National Television"
## [1504] " Bull Market Entertainment"
## [1505] " Bulldozerfilms"
## [1506] " Bullet Films"
## [1507] " Bullet Pictures"
## [1508] " Bulletproof Productions"
## [1509] " Bunbury Films"
## [1510] " Bungakuza"
## [1511] " Bungalow Productions"
## [1512] " Bungei Production Ninjin Club"
## [1513] " Bunk 11 Pictures"
## [1514] " Bunker Features"
## [1515] " Bunya Productions"
## [1516] " Burgundy Films"
## [1517] " Burn Later Productions"
## [1518] " Burning Blue"
## [1519] " Burning Myth Productions"
## [1520] " Burning Ships Productions"
## [1521] " Burning Sky Films"
## [1522] " Burns Family Studios"
## [1523] " Burns Film Ltd"
## [1524] " Burnse Entertainment id"
## [1525] " Burrowes Film Group"
## [1526] " Burrundi Productions"
## [1527] " Busboy Productions"
## [1528] " Buster Keaton Productions"
## [1529] " Busterburger Limited Partnership"
## [1530] " Butcher s Run Films"
## [1531] " Butcher s Run Productions"
## [1532] " Butimar Productions"
## [1533] " Buzz Kill"
## [1534] " BV Entertainment Inc"
## [1535] " Bwark Productions"
## [1536] " BXR Productions"
## [1537] " Byronic Pose Productions"
## [1538] " Bystorm Films"
## [1539] " C C Brown Production"
## [1540] " C 2 Pictures"
## [1541] " C A P A C"
## [1542] " C B DeMille Productions"
## [1543] " C B Films S A"
## [1544] " C E O Films"
## [1545] " C E R"
## [1546] " C Films AG"
## [1547] " C FILMS AG"
## [1548] " C G Silver Film"
## [1549] " C G K Productions"
## [1550] " C O F C I"
## [1551] " C P Productions"
## [1552] " C R I M Produções"
## [1553] " C V Whitney Pictures"
## [1554] " CAAMA Productions"
## [1555] " Caballo Films"
## [1556] " Cabezahueca"
## [1557] " Cabin Creek Films"
## [1558] " Cable Stuff Productions"
## [1559] " Cactus Films"
## [1560] " Cactus Three"
## [1561] " Cadillac Hash"
## [1562] " Cady"
## [1563] " Cady Film"
## [1564] " Café Film"
## [1565] " Cagney Montgomery Productions"
## [1566] " Cal Cine"
## [1567] " Calamity Films"
## [1568] " Calder Road Film"
## [1569] " Caledonia Pictures"
## [1570] " Caliber Media Company"
## [1571] " California Film"
## [1572] " California Pictures"
## [1573] " CALT Productions"
## [1574] " Çamaşırhane"
## [1575] " Cambrge Productions id"
## [1576] " Camden Productions Inc"
## [1577] " Camellia Entertainment"
## [1578] " Camelot Productions"
## [1579] " Cameo Film und Fernsehproduktion"
## [1580] " Camera"
## [1581] " Camera 2 Productions"
## [1582] " Camera Magica"
## [1583] " Caméra One"
## [1584] " Camisa Listrada"
## [1585] " Camp Hill"
## [1586] " Campbell Grobman Films"
## [1587] " Campfire"
## [1588] " Campfire LLC"
## [1589] " Canadian Broadcasting Corporation CBC"
## [1590] " Canadian Film Centre CFC"
## [1591] " Canadian Film Development Corporation CFDC"
## [1592] " Canadian Film or Veo Production Tax Credit CPTC id"
## [1593] " Canal Brasil"
## [1594] " Canal Cat Films"
## [1595] " Canal Horizons"
## [1596] " Canal Plus"
## [1597] " Canal Plus Group"
## [1598] " Canal Street Communications"
## [1599] " Canal Street Films"
## [1600] " Canal Sur Televisión"
## [1601] " Canal+"
## [1602] " Canal+ Espana"
## [1603] " Canal+ España"
## [1604] " Canal+ Horizons"
## [1605] " Canal+ Polska"
## [1606] " Canal+Polska"
## [1607] " Canana Films"
## [1608] " Candlelight Pictures"
## [1609] " Cangrejo Films"
## [1610] " Cannes Film Festival"
## [1611] " Cannon and Morley Productions"
## [1612] " Cannon Films"
## [1613] " Cannon Group"
## [1614] " Cannon International"
## [1615] " Cannon Italia Srl"
## [1616] " Cannon Pictures"
## [1617] " Cannon Productions"
## [1618] " Cannonball Productions"
## [1619] " Canonigo Films"
## [1620] " Canterbury Productions"
## [1621] " Cantinflas Films"
## [1622] " Canvas Pictures"
## [1623] " CanWest Global Communications Corporationt"
## [1624] " CanWest MediaWorks"
## [1625] " CAOH Enterprises"
## [1626] " CAPAC"
## [1627] " Capacity Pictures"
## [1628] " Capcom"
## [1629] " Capelight Pictures"
## [1630] " Capella International"
## [1631] " Capi Holland"
## [1632] " Capital Arts Entertainment"
## [1633] " Capital Cities ABC Veo Enterprises Inc id"
## [1634] " Capital Film"
## [1635] " Capital Films"
## [1636] " Capital Productions"
## [1637] " Capitol Films"
## [1638] " capitol international"
## [1639] " Capitole Films"
## [1640] " Capitolina Produzioni Cinematografiche"
## [1641] " Capitolium"
## [1642] " Cappa Productions"
## [1643] " Cappricielli"
## [1644] " Capricci Films"
## [1645] " Caprino Filmcenter a s"
## [1646] " Capstone Entertainment Group"
## [1647] " Capture Film Internatrional"
## [1648] " Capture The Flag Films"
## [1649] " Car Re Home Productions id"
## [1650] " Carac Films"
## [1651] " Caracol Televisión"
## [1652] " Caramel Film"
## [1653] " Caramel Films"
## [1654] " CARAVAN CINEMA LTD"
## [1655] " Caravan Pictures"
## [1656] " Cardinal Pictures"
## [1657] " Cardinal Pictures II"
## [1658] " Career Brge id"
## [1659] " Cargo Films"
## [1660] " Carl Froelich Film GmbH"
## [1661] " Carlin Company Productions"
## [1662] " Carlmar Film"
## [1663] " Carlo Ponti Cinematografica"
## [1664] " Carlton America"
## [1665] " Carlton Film Export"
## [1666] " Carlton Television"
## [1667] " Carlyle Blackwell Productions"
## [1668] " Carlyle Production"
## [1669] " Carlyle Productions"
## [1670] " Carmel Creek Productions"
## [1671] " Carmel Entertainment"
## [1672] " Carmel Productions"
## [1673] " Carmen Cobos"
## [1674] " Carnaby International"
## [1675] " Carnival Films Television"
## [1676] " Caro Line Production"
## [1677] " Carolco Entertainment"
## [1678] " Carolco Pictures"
## [1679] " Carousel Films"
## [1680] " Carousel Picture Company"
## [1681] " Carousel Picture Company The"
## [1682] " Carousel Productions II"
## [1683] " CarpeDiem Film TV"
## [1684] " Carr Santelli"
## [1685] " Cartel Pictures"
## [1686] " CARTEL S A"
## [1687] " Carter Seagrove Project"
## [1688] " Carthago Films S a r l"
## [1689] " Carthay Continental"
## [1690] " Cartoon Network Studios"
## [1691] " Cartoon Saloon"
## [1692] " Caruso Mendelsohn Productions"
## [1693] " Casa de Cinema de Porto Alegre"
## [1694] " Casa de Filme 1"
## [1695] " Casa de Filme 4"
## [1696] " Casa de Filme 5"
## [1697] " Casa de Filme Trei"
## [1698] " Casa de Filme Unu"
## [1699] " Casablanca Filmworks"
## [1700] " Cascade Films"
## [1701] " Casé Filmes"
## [1702] " Casey Productions"
## [1703] " Casey Silver Productions"
## [1704] " Cass Films"
## [1705] " Cassadaga Film Production"
## [1706] " Cassel Productions"
## [1707] " Cast Iron Picture Co The"
## [1708] " Cast N Crew"
## [1709] " Castel Film Romania"
## [1710] " Castel Film Studio"
## [1711] " Castel Films"
## [1712] " Castelao Pictures"
## [1713] " Castelao Producciones"
## [1714] " Castle Hill Productions"
## [1715] " Castle Rock Entertainment"
## [1716] " Castleberg Productions"
## [1717] " Castlight Pictures"
## [1718] " Castor Films"
## [1719] " Casual Productions"
## [1720] " CAT Films"
## [1721] " Catalyst"
## [1722] " Catalyst Films International"
## [1723] " Catchlight Films"
## [1724] " CatchPlay"
## [1725] " Catfish Productions"
## [1726] " cattleya"
## [1727] " Cattleya"
## [1728] " Cave Pictures"
## [1729] " Caviar Content Pupkin Film"
## [1730] " Caviar Films"
## [1731] " CB Films"
## [1732] " CB Films North"
## [1733] " CBS Entertainment Productions"
## [1734] " CBS Films"
## [1735] " CBS Fox Veo id"
## [1736] " CBS Productions"
## [1737] " CBS Theatrical Films"
## [1738] " CC Capital Arts Entertainment SRL"
## [1739] " CCC Filmkunst GmbH"
## [1740] " CCCP"
## [1741] " CCFBR Produções"
## [1742] " CD Films"
## [1743] " Ce Qui Me Meut"
## [1744] " Cecchi Gori Group"
## [1745] " Cecchi Gori Group Tiger Cinematografica"
## [1746] " Cecile Company"
## [1747] " CED Productions"
## [1748] " Cee Note"
## [1749] " Celador Films"
## [1750] " Celebrated Productions"
## [1751] " Cell"
## [1752] " Cellulo Dreams id"
## [1753] " Celtic Films Entertainment"
## [1754] " Cemo Film"
## [1755] " Ceneca Producciones"
## [1756] " Centar Film"
## [1757] " Centaur Pictures Inc"
## [1758] " Centauro Films"
## [1759] " Center for the Study of Filmed History"
## [1760] " Centerpoint"
## [1761] " Centerstage Productions"
## [1762] " Central"
## [1763] " Central Cinema Company Film"
## [1764] " Central Film Office of the Iranian Ministry of Culture"
## [1765] " Central Films Limited"
## [1766] " Central Independent Television"
## [1767] " Central Motion Pictures"
## [1768] " Central Motion Pictures Corporation"
## [1769] " Central Partnership"
## [1770] " Centrale Sanitaire Internationale"
## [1771] " Centre National de la Cinématographie"
## [1772] " Centre National de la Cinématographie CNC"
## [1773] " Centre Street Productions"
## [1774] " Centro de Capacitación Cinematográfica CCC"
## [1775] " Centro Digital Pictures Ltd"
## [1776] " Centro Film"
## [1777] " Centro Nacional Autónomo de Cinematografía"
## [1778] " Centro Português de Cinema CPC"
## [1779] " Centro Produzioni Cinematografiche Città di Milano"
## [1780] " Centron Pictures"
## [1781] " Centropolis Entertainment"
## [1782] " Centropolis Film Productions"
## [1783] " Centrul de Productie Cinematografica Bucuresti"
## [1784] " Century 21 Television"
## [1785] " Century Films"
## [1786] " Century Hero Film Investment"
## [1787] " Century Motion Picture Dist Co Ltd"
## [1788] " Cerito Films"
## [1789] " Ceská Televize"
## [1790] " Česká televize"
## [1791] " Ceskoslovenská Televize"
## [1792] " Ceskoslovenský armádní film"
## [1793] " Ceskoslovenský Filmexport"
## [1794] " Ceskoslovenský Státní Film"
## [1795] " Československý státní film"
## [1796] " CFI Investments"
## [1797] " CG Productions"
## [1798] " Chad Troutwine Films"
## [1799] " Chadwick Pictures Corporation"
## [1800] " Chaiken Films"
## [1801] " Chain Camera Pictures"
## [1802] " CHANCE iN"
## [1803] " Chanford"
## [1804] " Change Focus Media"
## [1805] " Chanh Phuong Phim"
## [1806] " Channel 101"
## [1807] " Channel 4"
## [1808] " Channel 4 Television"
## [1809] " Channel 4 Television Corporation"
## [1810] " Channel Awesome"
## [1811] " Channel Four Films"
## [1812] " Channel One Russia"
## [1813] " ChannelFlip"
## [1814] " Chanticleer Films"
## [1815] " Chaos a Film Company"
## [1816] " Chaotic Rampage American Pictures"
## [1817] " Chapman Filmed Entertainment"
## [1818] " Chapman Leonard Studio Equipment"
## [1819] " Chapter 2"
## [1820] " Charivari Films"
## [1821] " Charlemagne Productions"
## [1822] " Charlermthai Studio"
## [1823] " Charles B Pierce Film Productions"
## [1824] " Charles Band Productions"
## [1825] " Charles Chaplin Productions"
## [1826] " Charles Chauvel Productions"
## [1827] " Charles Fries Productions"
## [1828] " Charles K Feldman Group"
## [1829] " Charles M Schulz Creative Associates"
## [1830] " Charles Martin Productions"
## [1831] " Charlie Guance id"
## [1832] " Charlie Productions"
## [1833] " Charm City Productions"
## [1834] " Charmed Apocalypse Pictures"
## [1835] " Charter Entertainment"
## [1836] " Charter Film Productions"
## [1837] " Charter Films Inc"
## [1838] " Chartoff Productions"
## [1839] " Chartoff Winkler Productions"
## [1840] " Chartwell"
## [1841] " Chase Regency"
## [1842] " Chassy Media"
## [1843] " Chata Pictures"
## [1844] " Chateau Wally Films"
## [1845] " Cheap and Dirty Productions Inc"
## [1846] " Check Entertainment"
## [1847] " Check Productions"
## [1848] " Cheetah Vision"
## [1849] " Chenault Productions"
## [1850] " Cheongeoram"
## [1851] " Chernin Entertainment"
## [1852] " Cherokee Productions"
## [1853] " Cherry On Top"
## [1854] " Cherry Sky Films"
## [1855] " Chesler Perlmutter Productions"
## [1856] " Chessman Park Productions"
## [1857] " Cheung Ming Film"
## [1858] " Cheyenne Enterprises"
## [1859] " Chezville"
## [1860] " Chhibber Mann Productions"
## [1861] " Chic Films"
## [1862] " Chicago Overcoat Productions"
## [1863] " Chicago Pictures"
## [1864] " Chicken And Egg Pictures"
## [1865] " Children of the Corn Productions"
## [1866] " Children s Television Workshop"
## [1867] " Chili Film"
## [1868] " Chiller Films"
## [1869] " Chimichanga Productions"
## [1870] " China 3D Digital Entertainment"
## [1871] " China Entertainment Films Production"
## [1872] " China Film Co Production Corporation"
## [1873] " China Film Company"
## [1874] " China Film Group"
## [1875] " China Film Group Corporation"
## [1876] " China Film Group Corporation CFGC"
## [1877] " China Movie Channel"
## [1878] " China Star Entertainment"
## [1879] " Chinese Bookie Pictures"
## [1880] " Chiodo Brothers Productions"
## [1881] " Chiragdeep International"
## [1882] " Chitrakalpa"
## [1883] " Chitralekha Film Co operative"
## [1884] " Chiwake Films"
## [1885] " Chloe Productions"
## [1886] " Choice Films Inc"
## [1887] " Choila Producciones Cinematográficas"
## [1888] " Chop Shop Entertainment"
## [1889] " Chosen Film Company"
## [1890] " Chretien"
## [1891] " Chris Brinker Productions"
## [1892] " Chris Kasick Company"
## [1893] " Chris Lee Productions"
## [1894] " Chris Rose Productions"
## [1895] " Chris Sievernich Filmproduktion"
## [1896] " Chrislaw Productions"
## [1897] " Christal Films"
## [1898] " Christian Frei Films"
## [1899] " Christian Wagner Film"
## [1900] " Christiano Film Group"
## [1901] " Christopher Films"
## [1902] " Chromewood Productions"
## [1903] " Chronicle Pictures"
## [1904] " Chrysalis Films"
## [1905] " Chu Media"
## [1906] " ChubbCo Film"
## [1907] " Chubu nippon Broadcasting Company"
## [1908] " Chugoku Broadcasting RCC"
## [1909] " Chunichi Eigasha"
## [1910] " Churchill Toledo"
## [1911] " Ciby 2000"
## [1912] " CiBy 2000"
## [1913] " Cicatrice Film inc"
## [1914] " Cicrus King Productions"
## [1915] " Ciesla Foundation"
## [1916] " Cigua Films"
## [1917] " Cimarron Productions"
## [1918] " Cimate Film"
## [1919] " Cinak Compagnie Cinématographique"
## [1920] " Cinamour Entertainment"
## [1921] " Cinco da Norte"
## [1922] " Ciné"
## [1923] " Cine 2000"
## [1924] " Cine 2000 Film Production"
## [1925] " Cine 3 S r l"
## [1926] " Ciné Alliance"
## [1927] " Ciné Arys"
## [1928] " Cine Bazar"
## [1929] " Cine Canibal"
## [1930] " Ciné Cinq"
## [1931] " Ciné Cri De Coeur"
## [1932] " Cine del Caribe S A"
## [1933] " Cine Duck"
## [1934] " Cine Electra"
## [1935] " Cine Excel Entertainment"
## [1936] " Cine Films"
## [1937] " Cine Films Inc"
## [1938] " Cine Lu Ce"
## [1939] " Cine Nomine"
## [1940] " Cine Pantera"
## [1941] " cine partners"
## [1942] " Ciné Sud Promotion"
## [1943] " Ciné Tamaris"
## [1944] " Ciné Valse"
## [1945] " Ciné Vog Films"
## [1946] " Cine2000"
## [1947] " Cinéa"
## [1948] " Cineart Production"
## [1949] " Cinéas"
## [1950] " cineBLAST Productions"
## [1951] " Cineci id"
## [1952] " CinéCinéma"
## [1953] " Cinecittà"
## [1954] " Cineclick Asia"
## [1955] " Cinecompany"
## [1956] " Cinédia"
## [1957] " Cinedigm"
## [1958] " Cinédis"
## [1959] " Cinedistri"
## [1960] " CineEvelyn"
## [1961] " Cinéfilm AG"
## [1962] " Cinegai S p A"
## [1963] " cinegrafik"
## [1964] " Cinégraphic"
## [1965] " CinéGroupe"
## [1966] " Cineguild"
## [1967] " Cinehaus"
## [1968] " Cinekap"
## [1969] " Cinekip"
## [1970] " Cineline"
## [1971] " Cinema Cinem"
## [1972] " Cinema 175"
## [1973] " Cinema 23 Film"
## [1974] " CINEMA 6K"
## [1975] " Cinema 7"
## [1976] " Cinema 77"
## [1977] " Cinema Artists"
## [1978] " Cinema Arts Productions"
## [1979] " Cinema Brasil Digital"
## [1980] " Cinema Brasil Digitital"
## [1981] " Cinema Center 100 Productions"
## [1982] " Cinema Center Films"
## [1983] " Cinema City"
## [1984] " Cinema City Company Limited"
## [1985] " Cinema City Film Productions"
## [1986] " Cinema Corporation of America"
## [1987] " Cinéma Defacto"
## [1988] " Cinema Design"
## [1989] " Cinema Entertainment"
## [1990] " Cinema Epoch"
## [1991] " Cinema Group"
## [1992] " Cinema Group 75"
## [1993] " Cinema Group Ventures"
## [1994] " Cinema Gypsy Productions"
## [1995] " Cinema Home Veo Productions id"
## [1996] " Cinema Iris"
## [1997] " Cinema Libre Studio"
## [1998] " Cinema One Originals"
## [1999] " Cinema Organization"
## [2000] " Cinema Prime Film"
## [2001] " Cinema Service"
## [2002] " Cinema Vehicle Services"
## [2003] " Cinema Venture"
## [2004] " Cinema VII"
## [2005] " Cinema Vu"
## [2006] " Cinema West Productions"
## [2007] " Cinema X"
## [2008] " Cinemabrain"
## [2009] " Cinemagic Inc"
## [2010] " Cinemagic Pictures"
## [2011] " Cinémaginaire Inc"
## [2012] " CinemaLab"
## [2013] " Cineman Productions"
## [2014] " Cinemancer Pte Ltd"
## [2015] " Cinemanila"
## [2016] " Cinemanovel Films"
## [2017] " Cinemar"
## [2018] " Cinemarte"
## [2019] " CinemaScópio"
## [2020] " Cinemasia"
## [2021] " Cinemassacre"
## [2022] " Cinemaster S r l"
## [2023] " Cinematic Vision"
## [2024] " Cinémation"
## [2025] " Cinematográfica ABSA"
## [2026] " Cinematográfica Calderón S A"
## [2027] " Cinematografica Cervi"
## [2028] " Cinematografica Emmeci"
## [2029] " Cinematográfica Filmex S A"
## [2030] " Cinematográfica Pelimex"
## [2031] " Cinematograph AB"
## [2032] " Cinemaundici"
## [2033] " Cinemec Produzione"
## [2034] " Cinemedia Films Inc"
## [2035] " Cinemilagroso"
## [2036] " Cinepantera"
## [2037] " Cinephil"
## [2038] " Cinephile"
## [2039] " Cinépix"
## [2040] " Cinépix Film Properties CFP"
## [2041] " Cineplex"
## [2042] " Cineplex Odeon Films"
## [2043] " Cinepost Studios"
## [2044] " Cinepro"
## [2045] " Cineproduzioni Daunia 70"
## [2046] " Cinequanon"
## [2047] " Cinerama Productions Corp"
## [2048] " Cinerenta Medienbeteiligungs KG"
## [2049] " Cinergi Pictures Entertainment"
## [2050] " Cineriz"
## [2051] " CineRocket"
## [2052] " Cineropa Film"
## [2053] " CineSon Entertainment"
## [2054] " Cinesthesia Productions"
## [2055] " Cinesud"
## [2056] " Cinesur"
## [2057] " CinéTé Filmproductie BV"
## [2058] " Cinetel"
## [2059] " Cinetel Films"
## [2060] " Cinetel S A"
## [2061] " Cinétéléfilms"
## [2062] " Cinétévé"
## [2063] " Cinética Filmes e Produções"
## [2064] " Cinevent"
## [2065] " Cinévéo id"
## [2066] " Cineveo 80 id"
## [2067] " Cineville"
## [2068] " Cinevita Film Company"
## [2069] " Cinevox Filmproduktion GmbH"
## [2070] " Cinex Films"
## [2071] " Cinexus Capital Corporation"
## [2072] " Cineye Films"
## [2073] " Cineyugg Entertainment Pvt Ltd"
## [2074] " Cino del Duca"
## [2075] " Cipango Productions Audiovisuelles"
## [2076] " Cipher Films"
## [2077] " Circa 1888"
## [2078] " Circe Films"
## [2079] " Circle Films"
## [2080] " Circle Productions"
## [2081] " Circle Productions Inc"
## [2082] " Cirrus Communications"
## [2083] " CITA Films"
## [2084] " Cité Amérique"
## [2085] " Cité Films"
## [2086] " Citel Films"
## [2087] " Citizen Films"
## [2088] " Citizen Skull Productions"
## [2089] " City Film"
## [2090] " City Films"
## [2091] " City Heat Productions"
## [2092] " City Light Films"
## [2093] " City of Peace Films"
## [2094] " City on a Hill Productions"
## [2095] " Civic Bakery"
## [2096] " civilhand"
## [2097] " Civilian Pictures"
## [2098] " CJ Capital Investment"
## [2099] " CJ Entertainment"
## [2100] " CL Productions"
## [2101] " Clan Celentano"
## [2102] " Clap Filmes"
## [2103] " Clarion Films"
## [2104] " Clarity Productions"
## [2105] " Clarke King Enterprises"
## [2106] " Clasa Films Mundiales"
## [2107] " Clasart Film"
## [2108] " Class 5 Films"
## [2109] " Class of 85"
## [2110] " Class of 85 LLC"
## [2111] " Classic Films"
## [2112] " Classic Films International"
## [2113] " Claudia Cinematografica"
## [2114] " Claussen + Wöbke Filmproduktion GmbH"
## [2115] " Claussen Wöbke Putz Filmproduktion"
## [2116] " Clay Bros Motion Pictures"
## [2117] " CLC"
## [2118] " Clean Socks"
## [2119] " Clear Blue Sky Productions"
## [2120] " Clear Focus Movies"
## [2121] " Clemi Cinematografica"
## [2122] " Cleopatra"
## [2123] " Clerkenwell Films"
## [2124] " Clesi Cinematografica"
## [2125] " Cliffjack Motion Pictures"
## [2126] " Climax Fables"
## [2127] " Climax Films"
## [2128] " Clinica Estetico"
## [2129] " Clodio Cinematografica"
## [2130] " Clonus Associates"
## [2131] " Closer Productions"
## [2132] " Cloud Eight Films"
## [2133] " Cloud Nine Movies"
## [2134] " Cloud Ten Pictures"
## [2135] " Cloudcover Films"
## [2136] " Clover Productions"
## [2137] " CLT UFA International"
## [2138] " Club des Produceteurs"
## [2139] " Clubdeal"
## [2140] " Clubhouse Pictures"
## [2141] " CMC Entertainment"
## [2142] " CMC Producciones"
## [2143] " CML Films"
## [2144] " CMO Producciones"
## [2145] " CMYLMZ Fikirsanat"
## [2146] " CN Film"
## [2147] " CNC"
## [2148] " CNCAIMC"
## [2149] " Coalitions Films"
## [2150] " Coatwolf Productions"
## [2151] " Cobalt Media Group"
## [2152] " CoBo Fonds"
## [2153] " CoBo Fund"
## [2154] " Cobra Film Department"
## [2155] " Cobra Films"
## [2156] " Cocinex"
## [2157] " Cocinor"
## [2158] " Code"
## [2159] " Code Entertainment"
## [2160] " Code Productions"
## [2161] " Codeblack Entertainment"
## [2162] " Cofimage 12"
## [2163] " Cofimage 2"
## [2164] " Cofimage 5"
## [2165] " Cofinova 3"
## [2166] " Cofinova 4"
## [2167] " Cofinova 6"
## [2168] " Cofinova 7"
## [2169] " Cognetti Films"
## [2170] " Cohen Media Group"
## [2171] " Cold Arrow Productions"
## [2172] " Cold Beer Fray id"
## [2173] " Cold Iron Pictures"
## [2174] " Coldwater"
## [2175] " Coleytown"
## [2176] " Collective Eye Films"
## [2177] " Collective Minds Media Company"
## [2178] " Collective Pictures"
## [2179] " Collier Young Associates"
## [2180] " Collina Film"
## [2181] " Colling Pictures id"
## [2182] " Collision Entertainment"
## [2183] " Colonia Media"
## [2184] " Colonial Productions"
## [2185] " Colony Pictures"
## [2186] " Color Green Films"
## [2187] " Colorado Film Production"
## [2188] " Colorfast Pictures"
## [2189] " Colosseo Artistica"
## [2190] " Colt Produzioni Cinematografiche"
## [2191] " Columbia British Productions"
## [2192] " Columbia Broadcasting System CBS"
## [2193] " Columbia Films Productions"
## [2194] " Columbia Films S A"
## [2195] " Columbia Pictures"
## [2196] " Columbia Pictures Corporation"
## [2197] " Columbia Pictures Corporation Rastar Pictures"
## [2198] " Columbia Pictures Film Production Asia"
## [2199] " Columbia Pictures Industries"
## [2200] " Columbia Pictures Producciones Mexico"
## [2201] " Columbia Pictures Television"
## [2202] " Columbia Tristar"
## [2203] " Columbia TriStar"
## [2204] " Columbia TriStar Home Entertainment"
## [2205] " Columbia TriStar Home Veo id"
## [2206] " Columbia TriStar Nordisk Film Distributors A S"
## [2207] " Column Film"
## [2208] " Column Productions"
## [2209] " Comacico"
## [2210] " Combustion Studios"
## [2211] " Come On Sweet Film"
## [2212] " Comedian International"
## [2213] " Comedian Intl Enterprise Productions C I E"
## [2214] " Comedy Central"
## [2215] " Comedy Central Films"
## [2216] " Comedy Dynamics"
## [2217] " Comedy Partners"
## [2218] " Comenius Film GmbH"
## [2219] " Comet"
## [2220] " Comet Film"
## [2221] " Comet Film Produktion GmbH"
## [2222] " Coming Home Studios"
## [2223] " Comique Film Company"
## [2224] " CoMix Wave"
## [2225] " CoMix Wave Films"
## [2226] " Comma 9"
## [2227] " Commercial Pictures"
## [2228] " Commies From Mars Corporation"
## [2229] " Common People Productions"
## [2230] " Commonwealth United Entertainment"
## [2231] " Commotion Pictures"
## [2232] " Como Film"
## [2233] " Como Films"
## [2234] " Compact Yellowbill"
## [2235] " Compagnia Cinematografica Champion"
## [2236] " Compagnia Cinematografica Mondiale CCM"
## [2237] " Compagnie Cinématographique de France"
## [2238] " Compagnie Commerciale Française Cinématographique CCFC"
## [2239] " Compagnie Eric Rohmer"
## [2240] " Compagnie Eric Rohmer CER"
## [2241] " Compagnie Jean Renoir"
## [2242] " Compagnie Nouvelle Commerciale"
## [2243] " Companhia Cinematográfica Serrador"
## [2244] " Compañía Iberoamericana de TV"
## [2245] " Company Films"
## [2246] " Company Name"
## [2247] " Company Pictures"
## [2248] " Company Productions"
## [2249] " Compass Entertainment"
## [2250] " Compass International Pictures"
## [2251] " Compass Zenith International"
## [2252] " Compound B"
## [2253] " Comptoir Français du Film Production CFFP"
## [2254] " Compton Films"
## [2255] " Computer Chess"
## [2256] " Comunicación Fractal"
## [2257] " Conacite Dos"
## [2258] " Conacite Uno"
## [2259] " Concepts Unlimited"
## [2260] " Concert Promotion International"
## [2261] " Concord Productions Inc"
## [2262] " Concorde New Horizons"
## [2263] " Concorde Pictures"
## [2264] " Condemned Productions"
## [2265] " Condor International Productions"
## [2266] " Conduit"
## [2267] " Cone Arts"
## [2268] " Confessions Productions II"
## [2269] " Connell Creations"
## [2270] " Conquering Lion Pictures"
## [2271] " Conquest Productions"
## [2272] " Consejo Nacional para la Cultura y las Artes CONACULTA"
## [2273] " consolated documentaries id"
## [2274] " Conspicuous Pictures"
## [2275] " Conspiração Filmes"
## [2276] " Constance Media"
## [2277] " Constantin Film"
## [2278] " Constantin Film Produktion"
## [2279] " Constellation Films"
## [2280] " Contact Films"
## [2281] " Contemporary Historians Inc"
## [2282] " Contemporary Productions"
## [2283] " Content Media Corp"
## [2284] " ContentFilm"
## [2285] " ContentFilm International"
## [2286] " Contento Films"
## [2287] " Contest LLC"
## [2288] " Continental Film"
## [2289] " Continental Films"
## [2290] " Continental Motion Pictures"
## [2291] " Continental Producciones"
## [2292] " Contra Film"
## [2293] " Contracuadro"
## [2294] " Contradiction Films"
## [2295] " Contrafilm"
## [2296] " Conundrum Entertainment"
## [2297] " Cookout Productions"
## [2298] " Cool Cat Productions"
## [2299] " Coop 99"
## [2300] " Coop99 Filmproduktion"
## [2301] " Cooper s Town Productions"
## [2302] " Cooperativa 15 Maggio"
## [2303] " Cooperativa Jean Vigò"
## [2304] " Cooperativa Spettatori Produttori Cinematografici"
## [2305] " Copa del Oro"
## [2306] " Copa Productions"
## [2307] " Copacabana Filmes"
## [2308] " Copacetic Pictures"
## [2309] " Copercines Cooperativa Cinematográfica"
## [2310] " CoPilot Pictures"
## [2311] " Copperheart Entertainment"
## [2312] " Copro Films"
## [2313] " Coproducción GB USA Francia Alemania Italia Rumanía"
## [2314] " Coproducción Hong Kong Tailandia Singapur"
## [2315] " Coproduction Office"
## [2316] " Coquette Productions"
## [2317] " Coração da Selva"
## [2318] " Coral Producciones Cinematográficas"
## [2319] " Coralta Cinematografica"
## [2320] " Coram Deo Studios"
## [2321] " Corazón International"
## [2322] " Core Contents Media"
## [2323] " Corey Marr Productions Inc"
## [2324] " Corn Cobb Productions"
## [2325] " Corner Store Entertainment"
## [2326] " Corona Cinematografica"
## [2327] " Corona Filmproduktion"
## [2328] " Corona Pictures"
## [2329] " Coronado Productions"
## [2330] " Coronet Film"
## [2331] " Coronet Films"
## [2332] " Corporación Nacional Cinematográfica CONACINE"
## [2333] " Corporation for Public Broadcasting CPB"
## [2334] " Corporation Image M M"
## [2335] " Corps à corps"
## [2336] " Corrado Schoner Productions"
## [2337] " Corrino Media Corporation"
## [2338] " Corror Digital id"
## [2339] " Corsair Pictures"
## [2340] " Corsan"
## [2341] " Corsan Productions"
## [2342] " Corus Entertainment"
## [2343] " Cosa Nueva"
## [2344] " Cosefa"
## [2345] " Cosgrove Hall Films"
## [2346] " Cosmic Entertainment II"
## [2347] " Cosmic Pictures"
## [2348] " Cosmo Films"
## [2349] " Cosmopolitan Film Productions Co Ltd"
## [2350] " Cosmopolitan Productions"
## [2351] " Costa Films Barter"
## [2352] " Cote Blanche Productions"
## [2353] " Couch Potatoe Productions"
## [2354] " COUNTERFORCE FILM PRODUCTIONS INC"
## [2355] " Counterpoint Films"
## [2356] " Country Music Television CMT"
## [2357] " Country Road Productions"
## [2358] " Court 13 Pictures"
## [2359] " Covenant Communications"
## [2360] " Cowboy Films"
## [2361] " Cowell"
## [2362] " Coyote Productions"
## [2363] " CP Medien AG"
## [2364] " Cracking the Earth Films"
## [2365] " Crackle"
## [2366] " Craig Anderson Productions"
## [2367] " Cranium Entertainment"
## [2368] " Craven Maddalena Films"
## [2369] " Crawford Productions"
## [2370] " Crazy Wheels Film Corporation"
## [2371] " Cream Productions"
## [2372] " Create Entertainment"
## [2373] " creative differences"
## [2374] " Creative Differences"
## [2375] " Creative Entertainment Group"
## [2376] " Creative Light Entertainment"
## [2377] " Creative Scotland"
## [2378] " Creative Thinking International Ltd"
## [2379] " Creativity Media"
## [2380] " Creavi id"
## [2381] " Credo Entertainment Group"
## [2382] " Creepy Film Productions"
## [2383] " Crescendo Productions"
## [2384] " Crime Scene Pictures"
## [2385] " Crimson Productions"
## [2386] " Critérion Film"
## [2387] " Criterion Films"
## [2388] " Croatia Film"
## [2389] " Cromosoma TV produccions"
## [2390] " Crone Film Produktion A S"
## [2391] " Crook Brothers Productions"
## [2392] " Cross Creek Pictures"
## [2393] " Crossbow Productions"
## [2394] " CrossDay Productions Ltd"
## [2395] " CrossFit Inc"
## [2396] " Crossing the Line Productions"
## [2397] " Crossroads Films"
## [2398] " Crotalus Productions"
## [2399] " Crown Film Unit"
## [2400] " Crown Hausman"
## [2401] " Crown International Pictures"
## [2402] " Crown Media Productions"
## [2403] " Crudofilms"
## [2404] " Cruise Wagner Productions"
## [2405] " Crusader Entertainment"
## [2406] " Crux Pictures"
## [2407] " Cruze Company"
## [2408] " Crystal City Entertainment"
## [2409] " Crystal Clear Pictures"
## [2410] " Crystal Film Productions"
## [2411] " Crystal Sky Pictures"
## [2412] " Crystal Sky Worldwe id"
## [2413] " CTB Film Company"
## [2414] " CTR"
## [2415] " Ctrl Z Films"
## [2416] " CTV International"
## [2417] " Cube Vision"
## [2418] " Cue the Dog Productions"
## [2419] " Culver Entertainment"
## [2420] " Cunningham Maybach Films"
## [2421] " Cup Productions id"
## [2422] " Curb Entertainment"
## [2423] " Curb Entertainment International"
## [2424] " Current Entertainment"
## [2425] " Curtwel Productions"
## [2426] " Cusicanqui Films"
## [2427] " Cusick International Films Inc"
## [2428] " Cut Above Productions"
## [2429] " Cut Glass Productions LLC"
## [2430] " Cutting Edge Entertainment"
## [2431] " CVD Studios"
## [2432] " Cyan Films"
## [2433] " Cyclops"
## [2434] " Cyclops Vision"
## [2435] " Cyprus Films"
## [2436] " Czar"
## [2437] " Czech Television"
## [2438] " D B Films Co Ltd"
## [2439] " D P Productions"
## [2440] " D M S Films"
## [2441] " D A Films"
## [2442] " D Antoni Weitz Productions"
## [2443] " D C 7 Produzione"
## [2444] " D D L"
## [2445] " d i e film"
## [2446] " D I G Films"
## [2447] " D R"
## [2448] " D R Comunicazioni di massa"
## [2449] " D W Griffith Productions"
## [2450] " Da Huang Pictures"
## [2451] " Da Ma Produzione"
## [2452] " DACFILM Rome"
## [2453] " Dacia Films"
## [2454] " Dada Filmi Oy"
## [2455] " Dadaş Film"
## [2456] " Daft Life Ltd Co"
## [2457] " Dago Productions"
## [2458] " Dagonet"
## [2459] " Daiei Kyoto"
## [2460] " Daiei Motion Picture Company"
## [2461] " Daiei Studios"
## [2462] " Daiei Tokyo Daini"
## [2463] " Daiichi Eiga"
## [2464] " Daiwa Building"
## [2465] " DaKINO Production"
## [2466] " Dakota Pictures"
## [2467] " Dalia Films"
## [2468] " Dalia Productions"
## [2469] " Daly Harris Productions"
## [2470] " Dan Curtis Productions"
## [2471] " Dan Films"
## [2472] " Dan Wigutow Productions"
## [2473] " Dana Lustig Productions"
## [2474] " Dancing Girl"
## [2475] " Danforth Studios"
## [2476] " Danger Filmworks"
## [2477] " Dangerous Films"
## [2478] " Dania Cinematografica"
## [2479] " Dania Film"
## [2480] " Daniel H Blatt Productions"
## [2481] " Daniel L Paulson Productions"
## [2482] " Daniel Scharf Productions"
## [2483] " Daniel Sladek Entertainment"
## [2484] " Danish Film Institute"
## [2485] " Danmarks Radio DR"
## [2486] " Dansk Biograf Compagni"
## [2487] " Dante s Inferno Animation"
## [2488] " Dany Film"
## [2489] " Danziger Productions Ltd"
## [2490] " DAR Motion Pictures"
## [2491] " Darbor Films"
## [2492] " Darclight"
## [2493] " Darclight Films"
## [2494] " Dargaud Films"
## [2495] " Darius Films"
## [2496] " Dark Art Films Ltd"
## [2497] " Dark Castle Entertainment"
## [2498] " Dark Coast Pictures"
## [2499] " Dark Dunes Productions"
## [2500] " Dark Factory Entertainment"
## [2501] " Dark Horse Entertainment"
## [2502] " Dark Horse Indie"
## [2503] " Dark Maze Studios"
## [2504] " Dark Portal LLC"
## [2505] " Dark Program Productions"
## [2506] " Dark Sky Films"
## [2507] " Darkan Entertainment"
## [2508] " Darknight Pictures"
## [2509] " Darko Entertainment"
## [2510] " Darkstone Entertainment"
## [2511] " Darkwoods Productions"
## [2512] " Darlow Smithson Productions"
## [2513] " Daronimax Media"
## [2514] " Darryl F Zanuck Productions"
## [2515] " Das Films"
## [2516] " Das Kleine Fernsehspiel ZDF"
## [2517] " Dasepo Club"
## [2518] " Dauntless Productions"
## [2519] " Dav Brown Productions id"
## [2520] " Dav Eick Productions id"
## [2521] " Dav Foster Productions id"
## [2522] " Dav Grubin Productions id"
## [2523] " Dav Hamilton Productions id"
## [2524] " Dav Hannay Productions id"
## [2525] " Dav L Loew Albert Lewin id"
## [2526] " Dav L Wolper Productions id"
## [2527] " Dav LaChapelle Studios id"
## [2528] " Dav Susskind Productions id"
## [2529] " Dav V Picker Productions id"
## [2530] " Dave Edwards Studio"
## [2531] " DAVED Productions"
## [2532] " Davis Entertainment"
## [2533] " Davis Entertainment Classics"
## [2534] " Davis Films"
## [2535] " Davis Panzer Productions"
## [2536] " Day 1 Films"
## [2537] " Day Twenty Eight Films"
## [2538] " Daybreak Pictures"
## [2539] " Daystar Productions"
## [2540] " DC Comics"
## [2541] " DC Medias"
## [2542] " DCG Plus"
## [2543] " DD Productions"
## [2544] " DDG"
## [2545] " DDM Film Corporation"
## [2546] " De Angelis Group"
## [2547] " De Fina Cappa"
## [2548] " De Grunwald Productions"
## [2549] " De Laurentiis"
## [2550] " De Laurentiis Entertainment Group"
## [2551] " De Laurentiis Entertainment Group DEG"
## [2552] " De Laurentiis Intermarco S p A"
## [2553] " De Line Pictures"
## [2554] " De Productie"
## [2555] " Dea Film"
## [2556] " DeA Planeta Home Entertainment"
## [2557] " Dead Films"
## [2558] " Dead Gentlemen Productions"
## [2559] " Dead Old Man Productions"
## [2560] " Dead Sea Films"
## [2561] " Dead Wait Productons"
## [2562] " Deaf Internacional Film SrL"
## [2563] " Dean Film"
## [2564] " Dean Hargrove Productions"
## [2565] " Dean River Productions"
## [2566] " Dear America"
## [2567] " Death Awaits Cinema"
## [2568] " Death Ltd"
## [2569] " Deathbeast Productions"
## [2570] " Deborah Perkin Media Ltd"
## [2571] " Decipher Entertainment"
## [2572] " Decla Bioscop AG"
## [2573] " Decla Film Gesellschaft Holz Co"
## [2574] " Deco Entertainment"
## [2575] " Decoys Production"
## [2576] " DeCubellis Films"
## [2577] " Deed Films"
## [2578] " Deep Blue Pictures"
## [2579] " DeepStudios"
## [2580] " DEFA"
## [2581] " Defender Films"
## [2582] " Defender Production"
## [2583] " Defilm"
## [2584] " Defining"
## [2585] " Degeto Film"
## [2586] " Dehlavi Films"
## [2587] " Del Duca Films"
## [2588] " Del Toro Films"
## [2589] " Delacheroy Films"
## [2590] " Delante Films"
## [2591] " Delfino Film"
## [2592] " Délia Film"
## [2593] " Delirio Films"
## [2594] " Delphi II Productions"
## [2595] " Delphi V Productions"
## [2596] " Delux Productions"
## [2597] " DEM Film"
## [2598] " Demarest Films"
## [2599] " Demi Monde Productions"
## [2600] " DeMille Pictures Corporation"
## [2601] " Dentsu"
## [2602] " Dentsu Inc"
## [2603] " DENTSU Music And Entertainment"
## [2604] " Denver and Delilah Productions"
## [2605] " Denver Film Productions"
## [2606] " Departure Entertainment"
## [2607] " Departures Film"
## [2608] " DePatie Freleng Enterprises DFE"
## [2609] " Depth of Field"
## [2610] " Deputy Corporation"
## [2611] " Derf Films"
## [2612] " Derio"
## [2613] " Derrick Comedy Productions"
## [2614] " Desert Flower Filmproductions"
## [2615] " Desert Flower Filmproduktion"
## [2616] " Desert Moon Pictures"
## [2617] " Desert Productions"
## [2618] " Desert Skye Entertainment"
## [2619] " Desert Wolf Productions"
## [2620] " Desilu Productions"
## [2621] " DesperaDo"
## [2622] " Desperado Film"
## [2623] " Desperate Pictures"
## [2624] " Destination Films"
## [2625] " Destiny Films"
## [2626] " Destro Films"
## [2627] " Det Danske Filminstitut"
## [2628] " Detalle Films"
## [2629] " Detention Films"
## [2630] " Detour Film Production"
## [2631] " Detour Filmproduction"
## [2632] " Detroit Riot Productions"
## [2633] " Deuce of Spades Productions"
## [2634] " Deutsche Film DEFA"
## [2635] " Deutsche Film und Fernsehakademie Berlin DFFB"
## [2636] " Deutsche Film Gemeinschaft"
## [2637] " Deutsche Film Gesellschaft DFG"
## [2638] " Deutsche Filmvertriebs GmbH"
## [2639] " Deutsche Universal Film"
## [2640] " Deutsche Vereinsfilm AG"
## [2641] " Devar Films"
## [2642] " Deviant Films"
## [2643] " Deviant Pictures"
## [2644] " Devisha Films"
## [2645] " Devki Chitra"
## [2646] " Devon Film"
## [2647] " Devonshire Productions"
## [2648] " Devotion Films"
## [2649] " Dewey Decimal Productions"
## [2650] " Dezenove Som e Imagens Produções"
## [2651] " DH Films"
## [2652] " Dharamsala"
## [2653] " Dharma Productions"
## [2654] " Dharma Productions Dillywood"
## [2655] " DHE Corporation"
## [2656] " DHX Media"
## [2657] " Di Bonaventura Pictures"
## [2658] " DI Love"
## [2659] " Di San Luca Films"
## [2660] " Diablo Entertainment"
## [2661] " Diablo Films"
## [2662] " Diagonal Pictures"
## [2663] " Dialchi Film"
## [2664] " Diamond Docs"
## [2665] " Diamond Films"
## [2666] " Diamonds International Film"
## [2667] " Diana Productions Inc"
## [2668] " Diaphana Films"
## [2669] " Diaphana Productions"
## [2670] " DiC Enterprises"
## [2671] " DiC Entertainment"
## [2672] " dick clark productions"
## [2673] " Dickhouse Productions"
## [2674] " Dieter Geissler Filmproduktion"
## [2675] " Different Tree Same Wood Productions"
## [2676] " Digiart Productions"
## [2677] " Digital Forces"
## [2678] " Digital Frontier"
## [2679] " Digital Interference Productions"
## [2680] " Dimeco Productions"
## [2681] " Dimension Extreme"
## [2682] " Dimension Films"
## [2683] " Dimension Pictures"
## [2684] " Dimeworth Films"
## [2685] " Dimitri De Grunwald Production"
## [2686] " Dingsheng Cultural Industry Investment"
## [2687] " Dino de Laurentiis Cinematografica"
## [2688] " Dino De Laurentiis Company"
## [2689] " Dino Publishing JW"
## [2690] " DiNovi Pictures"
## [2691] " Dionysos Films Oy"
## [2692] " Diorama Films"
## [2693] " Diplomat Pictures Millco"
## [2694] " DIPPER FILMS"
## [2695] " Dire Wolf"
## [2696] " Direction de la Cinematographie Nationale"
## [2697] " Direction du Cinema Haute Volta"
## [2698] " Directions Inc"
## [2699] " Directors Company"
## [2700] " Dirk Productions Ltd"
## [2701] " Dirty Martini Productions"
## [2702] " Disarming Films"
## [2703] " Dischord"
## [2704] " Discina"
## [2705] " Discovery Channel"
## [2706] " Discovery Channel Pictures"
## [2707] " Discovery Channel Productions"
## [2708] " Discovery Docs"
## [2709] " Discovery Films"
## [2710] " Discovery Productions"
## [2711] " Discovery Studios"
## [2712] " Disney Channel"
## [2713] " Disneynature"
## [2714] " DisneyToon Studios"
## [2715] " Dispat Films"
## [2716] " Distant Dreams Filmproduktion"
## [2717] " Distant Horizons"
## [2718] " Distant Thunder Films"
## [2719] " Dister Group"
## [2720] " Distracted Media"
## [2721] " Distribution Workshop"
## [2722] " District"
## [2723] " Diversa Audiovisual"
## [2724] " Divina Film"
## [2725] " Divina Film GmbH Co KG München"
## [2726] " Divisadero Pictures"
## [2727] " Dixie Theatrical Corporation"
## [2728] " Dizzy Giant"
## [2729] " DJ Films"
## [2730] " Django Film"
## [2731] " DMG Entertainment"
## [2732] " DMS Films Limited"
## [2733] " DMS Films Private Limited"
## [2734] " DMV Distribuzione"
## [2735] " DNA Films"
## [2736] " Documentary Experimental Film Center"
## [2737] " Documento Film"
## [2738] " Documento Films"
## [2739] " Docurama"
## [2740] " Dog Day Films"
## [2741] " Dog Eat Dog Films"
## [2742] " Dog Pond Productions"
## [2743] " Dogs Of Annwn"
## [2744] " dogwoof films"
## [2745] " Dolby"
## [2746] " Dolger Films"
## [2747] " Dolly Hall Productions"
## [2748] " Dolores Pictures S L"
## [2749] " Domestic Productions"
## [2750] " Dominion Entertainment"
## [2751] " Domino Films"
## [2752] " Don Carmody Productions"
## [2753] " Don Ferguson Productions"
## [2754] " Don Films"
## [2755] " Don Hartman Productions"
## [2756] " Donau Filmproduktion"
## [2757] " Dong a Exports Co Ltd"
## [2758] " Dong Woo Animation"
## [2759] " Dongoong Arts Center"
## [2760] " Donner Shuler Donner Productions"
## [2761] " Donners Company"
## [2762] " Doors Veo Company id"
## [2763] " Doosaboo Film"
## [2764] " Doperfilme"
## [2765] " Dor Film Produktionsgesellschaft GmbH"
## [2766] " Dore Schary Productions"
## [2767] " Doria"
## [2768] " Dorian Films"
## [2769] " Dos Corazones"
## [2770] " Doty Dayton Production"
## [2771] " Double Band films"
## [2772] " Double Dutch Films"
## [2773] " Double Edge Films"
## [2774] " Double Feature Films"
## [2775] " Double Helix Films"
## [2776] " Double M Films"
## [2777] " Double Nickel Entertainment"
## [2778] " Double Play"
## [2779] " Double R Films"
## [2780] " Double Windsor Films"
## [2781] " Doubleday Productions"
## [2782] " DoubleSee Productions"
## [2783] " Doublesteen Productions"
## [2784] " Douek Productions"
## [2785] " Douglas Fairbanks Pictures"
## [2786] " Dovzhenko Film Studios"
## [2787] " Dowling Productions"
## [2788] " Down to the Bone Productions"
## [2789] " Downstream Productions"
## [2790] " Downtown Filmes"
## [2791] " Doxa Producciones"
## [2792] " DPPLR"
## [2793] " DR TV"
## [2794] " Drafthouse Films"
## [2795] " Drag City"
## [2796] " Dragon Pictures"
## [2797] " Draw and Shoot Flims"
## [2798] " Dream Cinema"
## [2799] " Dream Company"
## [2800] " Dream Entertainment"
## [2801] " Dream Guy Productions"
## [2802] " Dream Rock"
## [2803] " dreamFly Productions"
## [2804] " Dreaming Tree Productions"
## [2805] " Dreamlab"
## [2806] " Dreamland"
## [2807] " Dreamland Productions"
## [2808] " Dreamland Studios"
## [2809] " Dreampixies"
## [2810] " Dreams N Beyond"
## [2811] " DreamWorks"
## [2812] " DreamWorks Animation"
## [2813] " DreamWorks Home Entertainment"
## [2814] " DreamWorks Pictures"
## [2815] " DreamWorks SKG"
## [2816] " Dreamz Unlimited"
## [2817] " Drew Associates"
## [2818] " Drexel Productions"
## [2819] " Dribbling Pictures"
## [2820] " Drimtim Entertainment"
## [2821] " Drishyam Films"
## [2822] " DRO Entertainment"
## [2823] " Drotcroft Limited"
## [2824] " Drugaya Kul tura DK Produkt"
## [2825] " Dry County Films"
## [2826] " Dschoint Ventschr Filmproduktion AG"
## [2827] " DSM III"
## [2828] " Dual Power Productions"
## [2829] " Dualstar Entertainment Group"
## [2830] " Dualstar Productions"
## [2831] " Dubai Media and Entertainment Organisation in association with Dubai Film Market Enjaaz"
## [2832] " Duck Farm Films"
## [2833] " Duckling A S"
## [2834] " Dudez Productions"
## [2835] " Dudley Pictures Corporation"
## [2836] " Duea Film"
## [2837] " Dull Boy Pictures"
## [2838] " Dummy Productions LLC"
## [2839] " Dundee Entertainment"
## [2840] " DUNE Canal+"
## [2841] " Dune Entertainment"
## [2842] " Duo Art Productions"
## [2843] " Duplass Brothers Productions"
## [2844] " Dussault"
## [2845] " Dutch Independent"
## [2846] " Dutch Oven"
## [2847] " Duty Productions"
## [2848] " DViant Films"
## [2849] " Dwango"
## [2850] " Dylan Sellers Productions"
## [2851] " Dynamic Entertainment DEH"
## [2852] " Dynamo"
## [2853] " E H Filmes"
## [2854] " E Wolf"
## [2855] " E1 Entertainment"
## [2856] " E3W Productions"
## [2857] " E4 Entertainments"
## [2858] " Eagle Beach Productions"
## [2859] " Eagle Lion Films"
## [2860] " Eagle One Media"
## [2861] " Eagle Pictures"
## [2862] " Eagle Rock Entertainment"
## [2863] " Eagle Rock Film TV Productions"
## [2864] " Eagle Vision Inc"
## [2865] " EagleVision Inc"
## [2866] " Ealing Studios"
## [2867] " Earthbound Human Productions Inc"
## [2868] " Earthlight White Castle Productions"
## [2869] " Earthome Productions"
## [2870] " East Asia Film Company"
## [2871] " East of L A Productions"
## [2872] " East West Film Partners"
## [2873] " East Wing Holdings"
## [2874] " Eastern Counties Newspapers Ltd"
## [2875] " Eastern Film Management Corporation"
## [2876] " Eastern Films"
## [2877] " Eastern Productions"
## [2878] " Eastern Sunrise Films"
## [2879] " Eastse Films id"
## [2880] " Easy Open Productions"
## [2881] " EasyE Films"
## [2882] " EBF Productions"
## [2883] " Ecaveo Capital Partners"
## [2884] " Ecce Films"
## [2885] " Echelon Studios"
## [2886] " Echo Brge Entertainment id"
## [2887] " Echo Brge Home Entertainment id"
## [2888] " Echo Films"
## [2889] " Echo Lake Entertainment"
## [2890] " Echo Lake Productions"
## [2891] " Echo Lake Productions I"
## [2892] " Echolands Creative Group"
## [2893] " EchoLight Studios"
## [2894] " Eclectic pictures"
## [2895] " Ecole Nationale Supérieure des Arts Décoratifs"
## [2896] " Ecosse Films"
## [2897] " Ed Adlum and Mike Findlay Productions"
## [2898] " Ed Ancoats Inc"
## [2899] " Eddie Murphy Productions"
## [2900] " Eddie Saeta"
## [2901] " Eddie Saeta S A"
## [2902] " Eddie Wong Films"
## [2903] " Eden Productions"
## [2904] " Eden Productions Inc"
## [2905] " Eden Rock Media"
## [2906] " Edgar J Scherick Associates"
## [2907] " Edge City"
## [2908] " Edgewood Entertainment"
## [2909] " Edison Company"
## [2910] " Edison Manufacturing Company"
## [2911] " Edith Film Oy"
## [2912] " Edition Salzgeber Co Medien GmbH"
## [2913] " EDKO Film"
## [2914] " Edko Films"
## [2915] " Edmund Grainger Productions"
## [2916] " Edward Dryhurst Productions"
## [2917] " Edward Halperin Productions"
## [2918] " Edward L Alperson Productions"
## [2919] " Edward R Pressman Film"
## [2920] " Edward small Production"
## [2921] " Edward Small Productions"
## [2922] " Eén"
## [2923] " Eenie Ienie Over Productions"
## [2924] " Eesti Joonisfilm"
## [2925] " Eesti Telefilm"
## [2926] " Eetriüksus"
## [2927] " Effigy Films"
## [2928] " Eficine 226"
## [2929] " Efish Entertainment"
## [2930] " EFLATUN FILM"
## [2931] " EFTI"
## [2932] " EGBA Entertainment"
## [2933] " Egg Films"
## [2934] " Egg Pictures"
## [2935] " EGM Film International"
## [2936] " Egmond Film Television"
## [2937] " Ego Film Arts"
## [2938] " EGO Production"
## [2939] " Egoli Tossell Film"
## [2940] " Egoli Tossell Film AG"
## [2941] " Eichberg Film"
## [2942] " Eikon Film"
## [2943] " Eivissa Productions"
## [2944] " Ejve Film"
## [2945] " Ekran"
## [2946] " El Azar"
## [2947] " El Caiman"
## [2948] " El Campo Cine"
## [2949] " El Deseo"
## [2950] " El Deseo S A"
## [2951] " El Mall"
## [2952] " El Mar Pictures"
## [2953] " El Pampero Cine"
## [2954] " El Pico S A"
## [2955] " El Remanso"
## [2956] " El Terrat"
## [2957] " Elbow Grease Pictures"
## [2958] " Electrascope"
## [2959] " Electric City Entertainment"
## [2960] " Electric Entertainment"
## [2961] " Electric Pictures"
## [2962] " Electric Rainbow"
## [2963] " Electric Shadow Company"
## [2964] " Elektra Film"
## [2965] " Element e Filmproduktion"
## [2966] " Element Films"
## [2967] " Element Pictures"
## [2968] " Elemental Media"
## [2969] " Elena Films"
## [2970] " Elephant Eye Films"
## [2971] " Elephant Films"
## [2972] " Elevation Filmworks"
## [2973] " Elevative Entertainment"
## [2974] " eleven 55 Films"
## [2975] " Eleven Arts"
## [2976] " Eleven Eleven Films"
## [2977] " Elevenmedia"
## [2978] " Elia Films"
## [2979] " Elías Querejeta P C"
## [2980] " Elías Querejeta Producciones Cinematográficas S L"
## [2981] " Elis Cinematografica"
## [2982] " Elisabeth Müller Filmproduktion"
## [2983] " Elite Film"
## [2984] " Elite Tonfilm Produktion GmbH"
## [2985] " Elixir Films"
## [2986] " Elkcreek Cinema"
## [2987] " Elkins Entertainment"
## [2988] " Ella Communications"
## [2989] " Ellanby Films"
## [2990] " Elle Driver"
## [2991] " Ellepi Films"
## [2992] " Elliott Kastner Productions"
## [2993] " Elmalma Marka Iletisim"
## [2994] " Elokuvayhtiö Oy Aamu"
## [2995] " Eloseppo"
## [2996] " Elsani Film"
## [2997] " Elsboy Entertainment"
## [2998] " Elsevira"
## [2999] " Elstree Studio Productions"
## [3000] " Elton Corporation"
## [3001] " Elton Productions"
## [3002] " Elzévir Films"
## [3003] " EM Media"
## [3004] " Embark Production"
## [3005] " Embark Productions"
## [3006] " Embassy Film Associates"
## [3007] " Embassy Films"
## [3008] " Embassy International Pictures"
## [3009] " Embassy Pictures"
## [3010] " Embassy Pictures Corporation"
## [3011] " Embassy Productions S p A"
## [3012] " Embrafilme"
## [3013] " Embrem Entertainment"
## [3014] " Emcee Films"
## [3015] " EMERALD GATE INDUSTRIES OY LTD"
## [3016] " Emerald Productions Inc"
## [3017] " Emergent Films Ltd"
## [3018] " EMI Films"
## [3019] " EMI Films Ltd"
## [3020] " EMI Television"
## [3021] " Emiliano Piedra P C"
## [3022] " Eminence Productions"
## [3023] " Emmepi Cinematografica"
## [3024] " Emmett Furla Films"
## [3025] " Emmett Furla Oasis Films EFO Films"
## [3026] " Emote Productions"
## [3027] " Emotion Pictures"
## [3028] " Emperor Motion Pictures"
## [3029] " Emperor Multimedia Group EMG"
## [3030] " Empire Films"
## [3031] " Empire Motion Pictures"
## [3032] " Empire Pictures"
## [3033] " Empire Ward"
## [3034] " Empty Box Productions"
## [3035] " Emshell Producers"
## [3036] " Enaproc"
## [3037] " Encanto Enterprises"
## [3038] " Enchantment Films Inc"
## [3039] " End Cue"
## [3040] " Endemol Entertainment"
## [3041] " Endemol India"
## [3042] " Enderby Entertainment"
## [3043] " Endgame Entertainment"
## [3044] " Endless Entertainment"
## [3045] " Endlight Entertainment"
## [3046] " Energia Productions"
## [3047] " Engelberg Sumner Cheikes"
## [3048] " Engine Films"
## [3049] " Enigma Productions"
## [3050] " Enjoy Movies"
## [3051] " Enlight Pictures"
## [3052] " Enlightenment Productions"
## [3053] " Enliven Entertainment"
## [3054] " Ennet Co"
## [3055] " Enrique Cerezo Producciones Cinematográficas S A"
## [3056] " Enso Entertainment"
## [3057] " Ensueño Films"
## [3058] " Entcorp Communications"
## [3059] " Enterprise Productions"
## [3060] " Entertainment"
## [3061] " Entertainment Factory"
## [3062] " Entertainment Farm"
## [3063] " Entertainment Films"
## [3064] " Entertainment One"
## [3065] " Entertainment One Television"
## [3066] " Entertainment Partners Ltd"
## [3067] " Entertainment Securities"
## [3068] " Enthuse Entertainment"
## [3069] " Entre Chien et Loup"
## [3070] " Envie de tempête Productions"
## [3071] " Envision Films"
## [3072] " Envision Media Arts"
## [3073] " Eola Pictures"
## [3074] " Eon Productions"
## [3075] " eOne Entertainment"
## [3076] " eOne Television"
## [3077] " EOS Entertainment"
## [3078] " Epem id"
## [3079] " Epemic Films id"
## [3080] " Epemic Pictures id"
## [3081] " Epic Pictures Group"
## [3082] " Epic Productions"
## [3083] " Epic Records"
## [3084] " Epithète Films"
## [3085] " Epix"
## [3086] " Época Films S A"
## [3087] " Epoch Film Co"
## [3088] " Epoch Films"
## [3089] " Epsilon Motion Pictures"
## [3090] " Equinoxe Productions"
## [3091] " Equipe Moacyr Fenelon"
## [3092] " ERA"
## [3093] " ERA FILM"
## [3094] " ERA International"
## [3095] " Eran Riklis Productions Ltd"
## [3096] " Erato Films"
## [3097] " Erber Koch"
## [3098] " erbp"
## [3099] " Erfttal Film"
## [3100] " Erica Productions Inc"
## [3101] " Erik Blomberg"
## [3102] " Erma Film"
## [3103] " Ernst Marischka Co"
## [3104] " Eros Entertainment"
## [3105] " Eros International"
## [3106] " Erre Cinematograsica S r l"
## [3107] " Escandalo Films"
## [3108] " Escándalo Films"
## [3109] " Escape Artists"
## [3110] " Escapology"
## [3111] " Eskoria Films"
## [3112] " Eskwad"
## [3113] " ESMA"
## [3114] " ESPN films"
## [3115] " ESPN Films"
## [3116] " Essaness Productions"
## [3117] " Essanjay Films"
## [3118] " Essex Productions"
## [3119] " Estela Films"
## [3120] " Estrella Productions"
## [3121] " Estudios Churubusco Azteca"
## [3122] " Estudios Churubusco Azteca S A"
## [3123] " Estudios Cruz Delgado"
## [3124] " Estúdios Mega"
## [3125] " Estudios Picasso"
## [3126] " ESX Productions"
## [3127] " Et Cetera Films"
## [3128] " ETA films"
## [3129] " Etalon film"
## [3130] " Etb Euskal Telebista"
## [3131] " Ether Films"
## [3132] " Eton"
## [3133] " EUE Screen Gems Studios"
## [3134] " Euforia Film"
## [3135] " Eurasia Investments"
## [3136] " Eureka Pictures"
## [3137] " Eurimages"
## [3138] " Euro Images"
## [3139] " Euro International Film"
## [3140] " Euro International Film EIA"
## [3141] " Euro International Films"
## [3142] " Euro Space"
## [3143] " Euro Veo id"
## [3144] " Euroatlantica"
## [3145] " Eurociné"
## [3146] " Euroimages Fund of the Council of Europe"
## [3147] " Europa Corp"
## [3148] " Europa Film"
## [3149] " Europa Filmes"
## [3150] " Europa Films"
## [3151] " EuropaCorp"
## [3152] " Europäische Film Allianz"
## [3153] " European Inc"
## [3154] " European Incorporation"
## [3155] " Eurowe Film Production id"
## [3156] " Euston Films"
## [3157] " Euterpe"
## [3158] " Evan"
## [3159] " Evdon Films"
## [3160] " Eve Productions"
## [3161] " Eve Productions Inc"
## [3162] " Evenstar Films"
## [3163] " Event Film Distribution"
## [3164] " Everest Entertainment"
## [3165] " Evergreen"
## [3166] " evergreen movies international"
## [3167] " Evershine Release"
## [3168] " Every Guy Productions"
## [3169] " Every New Day Prictures"
## [3170] " Everyman Pictures"
## [3171] " Evil Twins"
## [3172] " Evolution Film Tape"
## [3173] " Evolution Films"
## [3174] " Evolution Pictures"
## [3175] " Evolving Productions"
## [3176] " Ex Nihilo"
## [3177] " Excalibur Films"
## [3178] " Excel Entertainment"
## [3179] " Excellent Film"
## [3180] " Exclusive Media Group"
## [3181] " Executive Cine TV"
## [3182] " Executive Productions"
## [3183] " Exhibit A Pictures"
## [3184] " Existential Films"
## [3185] " Exodus Film Group"
## [3186] " experiences films"
## [3187] " Experimental Film Studio Moscow"
## [3188] " Explorer Film 58"
## [3189] " Exposed Film Productions AS"
## [3190] " Exposure Labs"
## [3191] " Expressive Artists"
## [3192] " Extension 765"
## [3193] " Extinct Production"
## [3194] " Extra Large Productions"
## [3195] " Extrafilm"
## [3196] " Extraordinary Films Ltd"
## [3197] " Extreme Veo Snc id"
## [3198] " Exxodus Pictures"
## [3199] " Eye Entertainment"
## [3200] " Eye to Eye"
## [3201] " Eyecatcher"
## [3202] " Eyeline Productions"
## [3203] " Eyeworks"
## [3204] " Eyeworks Film"
## [3205] " Eyeworks Film TV Drama"
## [3206] " Eyeworks Touchdown"
## [3207] " EZ Films"
## [3208] " F Comme Film"
## [3209] " F D Cinematografica"
## [3210] " F G Film Productions"
## [3211] " F G Film Productions"
## [3212] " F O D Productions"
## [3213] " F Seitse"
## [3214] " F24 Film"
## [3215] " Fa cinematografica id"
## [3216] " Fa Film id"
## [3217] " Fábrica de Cine"
## [3218] " Fabula"
## [3219] " Fábula"
## [3220] " Fábulas Negras"
## [3221] " Face Films"
## [3222] " Faces Distribution"
## [3223] " Faces International Films"
## [3224] " Faces Music"
## [3225] " Facet Productions"
## [3226] " Fact Not Fiction Films"
## [3227] " Factor 30 Films"
## [3228] " Factor RH Producciones"
## [3229] " Factory Films"
## [3230] " Fadak Film"
## [3231] " Fading of the Cries"
## [3232] " Fado Filmes"
## [3233] " Fair Film"
## [3234] " Fairplay Pictures"
## [3235] " Fairview Productions"
## [3236] " Fairway International Pictures"
## [3237] " Falco"
## [3238] " Falcon International Productions"
## [3239] " Falcon Media Limited"
## [3240] " Falcon Pictures"
## [3241] " Faliro House Productions"
## [3242] " Fallen Films"
## [3243] " Falling Sky Entertainment"
## [3244] " FallsApart Productions"
## [3245] " Famartists Productions S A"
## [3246] " Famous Artists Productions"
## [3247] " Famous Films II"
## [3248] " Famous Players Lasky Corporation"
## [3249] " Famous Players Limited"
## [3250] " Famous Studios"
## [3251] " FAMU"
## [3252] " Fandango"
## [3253] " Fandor"
## [3254] " Fanes Film"
## [3255] " Fanfare Films"
## [3256] " Fangoria Films"
## [3257] " Fantale Films"
## [3258] " Fantasiafilmi Oy"
## [3259] " Fantefilm"
## [3260] " Far Hills Pictures"
## [3261] " Farabi Cinema Foundation"
## [3262] " Farmhouse Film"
## [3263] " Farmhouse Film TV"
## [3264] " Faro Film"
## [3265] " Fasad"
## [3266] " Faso Film"
## [3267] " Fastnet Films"
## [3268] " FatFree Films"
## [3269] " Fathom Studios"
## [3270] " Fatorville Films"
## [3271] " Favorit Film"
## [3272] " Favorite Films"
## [3273] " Favourite Films NV"
## [3274] " Fawcett Majors Productions"
## [3275] " Fawzi Vision"
## [3276] " FBN Productions"
## [3277] " FCCE"
## [3278] " Feature Film Project"
## [3279] " Feature Productions"
## [3280] " February Films"
## [3281] " Fechner Audiovisuel"
## [3282] " Federal Films II"
## [3283] " Federighi Films"
## [3284] " Federiz"
## [3285] " Feel Films"
## [3286] " Feelgood Fiction"
## [3287] " Feelgood Films"
## [3288] " Feelgood Pictures"
## [3289] " Feifer Worldwe id"
## [3290] " Félité Films id"
## [3291] " Félité Productions id"
## [3292] " Felity Films id"
## [3293] " Felity Pictures Corporation id"
## [3294] " Felity Productions id"
## [3295] " Felity Vogue Pictures Inc id"
## [3296] " Felix Media"
## [3297] " Fellah Pictures"
## [3298] " Fénix Cooperativa Cinematográfica"
## [3299] " Fennada Film"
## [3300] " Fennada Filmi"
## [3301] " Fennada Filmi Oy"
## [3302] " Fennica filmi"
## [3303] " Fern Gully Tales"
## [3304] " Fernando Trueba Producciones Cinematográficas S A"
## [3305] " Ferndale Films"
## [3306] " Fernwood Productions Inc"
## [3307] " Fernwood Reynard"
## [3308] " Ferris Brockman"
## [3309] " Fes Films id"
## [3310] " Festival Film Productions"
## [3311] " Fetch Boy Films Ltd"
## [3312] " Fett Film"
## [3313] " Fever Dreams"
## [3314] " Fewdio Entertainment"
## [3315] " Fewlas Entertainment"
## [3316] " FGH"
## [3317] " FGM Entertainment"
## [3318] " Fickle Fish Films"
## [3319] " Fiction Cinematografica S p a"
## [3320] " Fiction Films"
## [3321] " Field Gue Media id"
## [3322] " Field Productions"
## [3323] " Fifth Avenue Entertainment"
## [3324] " fiftyfilms"
## [3325] " FiGa Films"
## [3326] " Figaro"
## [3327] " Figaro Film Production Ltd"
## [3328] " Figaro Films"
## [3329] " Fígaro Films"
## [3330] " Fightin Family Productions"
## [3331] " Figment Films"
## [3332] " Filbert Steps Productions"
## [3333] " Filbox Producoes"
## [3334] " Fildebroc"
## [3335] " Film 1"
## [3336] " Film 4"
## [3337] " Film 70"
## [3338] " Film Afrika"
## [3339] " Film Afrika Worldwe id"
## [3340] " Film Agency for Wales"
## [3341] " Film and Co"
## [3342] " Film and Music Entertainment F ME"
## [3343] " Film Art Association"
## [3344] " Film Bangkok"
## [3345] " Film Base"
## [3346] " Film Boris von Borrisholm"
## [3347] " Film Brigade"
## [3348] " Film Cellar"
## [3349] " Film Colony"
## [3350] " Film Columbus"
## [3351] " Film Communications Inc"
## [3352] " Film Concorde"
## [3353] " Film Costellazione Produzione"
## [3354] " Film Council"
## [3355] " Film Department The"
## [3356] " Film Development Corporation"
## [3357] " Film Direction"
## [3358] " Film Division of General Teleradio"
## [3359] " Film Duemila"
## [3360] " Film Finance Corporation FFC"
## [3361] " Film Finance Group"
## [3362] " Film Folks"
## [3363] " Film Forge Productions"
## [3364] " Film Foundry Partners"
## [3365] " Film Four International"
## [3366] " Film Fund FUZZ"
## [3367] " Film Funding Ltd of Canada"
## [3368] " Film Group"
## [3369] " Film Group Feature"
## [3370] " Film Group One"
## [3371] " Film Guarantors"
## [3372] " Film Holland"
## [3373] " Film Horizon"
## [3374] " Film House Bas Celik"
## [3375] " Film i Väst"
## [3376] " Film International Rotterdam"
## [3377] " Film It Suda"
## [3378] " Film Kairòs"
## [3379] " Film Kartell Weltfilm GmbH"
## [3380] " Film Kraft"
## [3381] " Film Limited Partnership"
## [3382] " Film Maker Aps"
## [3383] " Film Master"
## [3384] " Film Movement"
## [3385] " Film Oblige"
## [3386] " Film One Productions"
## [3387] " Film Par Film"
## [3388] " Film Polski"
## [3389] " Film Polski Film Agency"
## [3390] " Film Publishers"
## [3391] " Film Rites"
## [3392] " Film Rock"
## [3393] " Film Roman"
## [3394] " Film Roman Productions"
## [3395] " Film Science"
## [3396] " Film Studio Tanka"
## [3397] " Film Tank"
## [3398] " Film Threat DVD"
## [3399] " Film Tiger"
## [3400] " Film Trust S A"
## [3401] " Film Trustees Ltd"
## [3402] " Film Ventures International FVI"
## [3403] " Film Victoria"
## [3404] " Film Workshop"
## [3405] " Film1"
## [3406] " Film4"
## [3407] " Filma Cass"
## [3408] " Filma Pictures"
## [3409] " Filmacres"
## [3410] " Filmadora Nacional"
## [3411] " Filmadora Panamericana"
## [3412] " Filmakademie Baden Württemberg"
## [3413] " Filmakers S r l"
## [3414] " Filmanova Invest"
## [3415] " Filmanthrope"
## [3416] " Filmaor"
## [3417] " Filmar Compagnia Cinematografica"
## [3418] " Filmark International Ltd"
## [3419] " Filmaster Incorporated"
## [3420] " Filmatics"
## [3421] " Filmation Associates"
## [3422] " Filmation Productions"
## [3423] " Filmauro"
## [3424] " Filmax"
## [3425] " Filmax Entertainment"
## [3426] " Filmax Group"
## [3427] " Filmayer"
## [3428] " Filmazure"
## [3429] " Filmboard Berlin Brandenburg FBB"
## [3430] " FilmBros"
## [3431] " FilmBuff"
## [3432] " Filmco International Productions"
## [3433] " FilmColony"
## [3434] " FilmDallas Pictures"
## [3435] " FilmDistrict"
## [3436] " Filme de Papel"
## [3437] " Filmed Imagination"
## [3438] " Filmena"
## [3439] " FilmEngine"
## [3440] " Filmes"
## [3441] " Filmes Cinematografica"
## [3442] " Filmes do Tejo"
## [3443] " Filmes International"
## [3444] " Filmesdamente"
## [3445] " Filmex"
## [3446] " Filmfabriken Baltic Sea AB"
## [3447] " Filmfactory"
## [3448] " Filmfair Communications"
## [3449] " FilmFernsehFonds Bayern"
## [3450] " Filmförderung Hamburg"
## [3451] " Filmförderungsanstalt FFA"
## [3452] " Filmfour"
## [3453] " Filmgraphics Entertainment"
## [3454] " Filmgroup Productions"
## [3455] " Filmhaus"
## [3456] " FilmHaven Entertainment"
## [3457] " Filmhuset Gruppen"
## [3458] " Filmi Domireew"
## [3459] " Filmi Domirev"
## [3460] " Filmicon"
## [3461] " Filmimaa"
## [3462] " Filminor"
## [3463] " Filmirage"
## [3464] " Filmirage S r l"
## [3465] " Filmiran"
## [3466] " Filmiteollisuus Fine"
## [3467] " Filmituotanto Spede Pasanen"
## [3468] " Filmityö"
## [3469] " Filmivabrik"
## [3470] " Filmkameratene A S"
## [3471] " Filmkameratene AS"
## [3472] " filmkombinat Nordost GmbH Co KG"
## [3473] " Filmkompaniet MadMonkey"
## [3474] " Filmkraft Productions Pvt Ltd"
## [3475] " Filmlance International AB"
## [3476] " Filmline International"
## [3477] " Filmline International Inc"
## [3478] " Filmmakers"
## [3479] " Filmmuse Productions"
## [3480] " FilmNation Entertainment"
## [3481] " Filmo"
## [3482] " Filmograph S A"
## [3483] " Filmova Společnost Praha"
## [3484] " Filmové studio Barrandov"
## [3485] " Filmové Studio Barrandov"
## [3486] " Filmpartners"
## [3487] " filmpool"
## [3488] " Filmpool Nord"
## [3489] " Filmquadrat"
## [3490] " Filmquest Pictures"
## [3491] " Films Casting Temple"
## [3492] " Films 21"
## [3493] " Films 59"
## [3494] " Films 66"
## [3495] " Films 7"
## [3496] " Films A B C"
## [3497] " Films A2"
## [3498] " Films Abel Gance"
## [3499] " Films Albatros"
## [3500] " Films André Paulvé"
## [3501] " Films Dara"
## [3502] " Films de L Alma"
## [3503] " Films de l Archer"
## [3504] " Films de la Pleiade"
## [3505] " Films Domireew"
## [3506] " Films du Cyclope"
## [3507] " Films du Palais Royal"
## [3508] " Films du Rond Point"
## [3509] " Films In Motion"
## [3510] " Films Jean Epstein"
## [3511] " Films Metzger et Woog"
## [3512] " Films Montana"
## [3513] " Films Montsouris"
## [3514] " Films Mundiales"
## [3515] " Films Sacha Gordine"
## [3516] " Films Sonores Tobis"
## [3517] " Films Triunfo S A"
## [3518] " Films Vérité Productions"
## [3519] " Films Zodíaco"
## [3520] " Filmscope Entertainment"
## [3521] " Filmsonor"
## [3522] " Filmstiftung Nordrhein Westfalen"
## [3523] " Filmstiftung NRW"
## [3524] " Filmstudio"
## [3525] " Filmstudio Berlin"
## [3526] " Filmstudio Bucuresti"
## [3527] " Filmstudio Demarsh"
## [3528] " Filmswell International Ltd"
## [3529] " Filmteknik"
## [3530] " FilmTeknik"
## [3531] " Filmtown Productions"
## [3532] " Filmtre"
## [3533] " Filmula"
## [3534] " Filmverlag der Autoren"
## [3535] " Filmways Australasian"
## [3536] " Filmways Pictures"
## [3537] " Filmways Television"
## [3538] " Filmwerks"
## [3539] " Filmwerx77"
## [3540] " Filmworks"
## [3541] " Filmworks FX"
## [3542] " Fin Août Productions"
## [3543] " Final Cut for Real"
## [3544] " Final Cut Productions"
## [3545] " Final Frame"
## [3546] " Finding Cinema"
## [3547] " Fine Mellow Productions"
## [3548] " Fine Arts Film Company"
## [3549] " Fine Line Features"
## [3550] " Fine Lookin Productions"
## [3551] " Fine Point Films"
## [3552] " Finecut"
## [3553] " Finer Films"
## [3554] " Finesse Films"
## [3555] " Finite Films"
## [3556] " Finition Productions"
## [3557] " Finnegan Pinchuk Productions"
## [3558] " Finnegan Associates"
## [3559] " Finney Thompson Entertainment"
## [3560] " Finnish Film Foundation"
## [3561] " Finnkino Oy"
## [3562] " Finos Film"
## [3563] " Finos Films"
## [3564] " Fipco Productions"
## [3565] " Fire Island Films"
## [3566] " Firecracker Films"
## [3567] " Firese Film id"
## [3568] " Fireworks Pictures"
## [3569] " Firm Films"
## [3570] " First American Films"
## [3571] " First Artists"
## [3572] " First Choice Films"
## [3573] " First Cut Studios Inc"
## [3574] " First Film Company"
## [3575] " First Films"
## [3576] " First Floor Features"
## [3577] " First Floor Features co production"
## [3578] " First Floor Productions"
## [3579] " First Generation Films"
## [3580] " First Independent Pictures"
## [3581] " First Line Entertainment"
## [3582] " First Look International"
## [3583] " First Look Pictures"
## [3584] " First Movie Companie"
## [3585] " First National Bank of Chicago London Branch"
## [3586] " First National Pictures"
## [3587] " First National Productions"
## [3588] " First Point Entertainment"
## [3589] " First Position Films"
## [3590] " First Run Features"
## [3591] " First Spark Media"
## [3592] " First Sun"
## [3593] " First Thought Films"
## [3594] " Fischer Film"
## [3595] " FishCorb Films"
## [3596] " Fisher King Production"
## [3597] " Fisheye Pictures"
## [3598] " Five Two Pictures"
## [3599] " Five Mile River Films"
## [3600] " Five More Minutes Productions"
## [3601] " Five Sisters Productions"
## [3602] " Five Star Entertainment"
## [3603] " Five Star Production"
## [3604] " Five Stars Production Company"
## [3605] " FJ Filmi"
## [3606] " FJ Productions"
## [3607] " Flach Film"
## [3608] " Flach Film Production"
## [3609] " Flamarion Ferreira Films"
## [3610] " Flame Ventures"
## [3611] " Flaminia Produzioni Cinematografiche"
## [3612] " Flashback Entertainment"
## [3613] " Flashback Films"
## [3614] " Flashback Television"
## [3615] " Flashpoint I"
## [3616] " Flat World Productions"
## [3617] " Flatbush Pictures"
## [3618] " Flatland Pictures"
## [3619] " Flatland Productions"
## [3620] " Flavor Unit Entertainment"
## [3621] " Fleischer Studios"
## [3622] " FLF Films"
## [3623] " Flick Flingr"
## [3624] " Flick Productions"
## [3625] " Flickerpix Animations"
## [3626] " Flicks Motion Pictures"
## [3627] " Flies"
## [3628] " Flight 33 Productions"
## [3629] " FlipZe Pictures id"
## [3630] " Floodland Pictures"
## [3631] " Flor de Loto Pictures"
## [3632] " Flora Film"
## [3633] " Floren Shieh Productions"
## [3634] " Florentine Films"
## [3635] " Florin Productions"
## [3636] " Floris Films"
## [3637] " Flower Films"
## [3638] " Flowerse Creations id"
## [3639] " FLX Comedy AB"
## [3640] " Flying Dutchman Productions Ltd"
## [3641] " Flying Eye Productions"
## [3642] " Flying Moon Filmproduktion GmbH"
## [3643] " Flynn Daines"
## [3644] " FM Entertainment"
## [3645] " FM Entertainment International N V"
## [3646] " FM Productions"
## [3647] " FN Crazy Film LLC"
## [3648] " FND Films"
## [3649] " FNM Films"
## [3650] " Fobic Films"
## [3651] " Focus Features"
## [3652] " Focus Films"
## [3653] " Focus Fox Studio"
## [3654] " Focus Plus Cinema"
## [3655] " Foe Killer Films"
## [3656] " Fog City Pictures"
## [3657] " Fogbound Inc"
## [3658] " FokusFilm"
## [3659] " Folimage"
## [3660] " Fondo de Fomento a la Calad Cinematográfica id"
## [3661] " Fondo para la Producción Cinematográfica de Calad FOPROCINE id"
## [3662] " Fono Film"
## [3663] " Fono Roma"
## [3664] " Fons Rademakers Produktie"
## [3665] " Fontana Productions"
## [3666] " Fool s Film"
## [3667] " Footage Films"
## [3668] " Footprint Entertainment"
## [3669] " Footprint Features"
## [3670] " Forager Film Company"
## [3671] " Forbden Films id"
## [3672] " Force 10 Productions"
## [3673] " Force Majeure Productions"
## [3674] " Forces et voix de la France"
## [3675] " Forecast Features"
## [3676] " Forecast Pictures"
## [3677] " Foreign Film Productions"
## [3678] " Forensic Films"
## [3679] " Foresight Features"
## [3680] " Foresight Unlimited"
## [3681] " Forest Brothers"
## [3682] " Forest Whitaker s Significant Productions"
## [3683] " Foreverland Productions"
## [3684] " Forgotten Man Films"
## [3685] " Fork Films"
## [3686] " Formosa Productions"
## [3687] " Formula Features"
## [3688] " Foro Film"
## [3689] " Forte Andrzej Celinski Hanna Polak"
## [3690] " Fortissimo Films"
## [3691] " Fortress Features"
## [3692] " Fortuna Films Co"
## [3693] " Forum Ljubljana"
## [3694] " Forum Sarajevo"
## [3695] " Forward Pass"
## [3696] " Fotocomics Productions"
## [3697] " FOTP Productions"
## [3698] " Fouad Nahas"
## [3699] " Foundation Entertainment"
## [3700] " Foundation Features"
## [3701] " Foundation for Filmakers"
## [3702] " Fountainbrge Films id"
## [3703] " Four Act Films"
## [3704] " Four Brothers Pictures"
## [3705] " Four Crown Productions"
## [3706] " Four Knights Film"
## [3707] " Four Leaf Productions"
## [3708] " FOUR Productions"
## [3709] " Four Provinces Films"
## [3710] " Four Square Productions"
## [3711] " Fourth Line Films"
## [3712] " Fox"
## [3713] " Fox 2000 Pictures"
## [3714] " Fox Atomic"
## [3715] " Fox Digital Studios"
## [3716] " Fox Entertainment Group"
## [3717] " Fox Europa Produktion"
## [3718] " Fox Family Channel"
## [3719] " Fox Film Corporation"
## [3720] " Fox Filmes do Brasil"
## [3721] " Fox Hill Productions"
## [3722] " Fox International Productions"
## [3723] " Fox Searchlight Pictures"
## [3724] " Fox Star Studios"
## [3725] " Fox Television Studios"
## [3726] " Fox West Pictures"
## [3727] " FoxTelecolombia"
## [3728] " FOZ"
## [3729] " Fragile Films"
## [3730] " Fragmighty"
## [3731] " Fraia Film"
## [3732] " Fraiha Produções"
## [3733] " Frakas Productions"
## [3734] " Fral Spa"
## [3735] " Frame 29 Films"
## [3736] " Frame Of Mind Entertainment"
## [3737] " Franca Films"
## [3738] " France 2 FR2"
## [3739] " France 2 Cinéma"
## [3740] " France 3 FR 3"
## [3741] " France 3 Cinema"
## [3742] " France 3 Cinéma"
## [3743] " France Cinéma Productions"
## [3744] " France Film"
## [3745] " France Télévision"
## [3746] " France Télévision Images"
## [3747] " Franchise Pictures"
## [3748] " Francia Túnez Dovis Satpec id"
## [3749] " Francinex"
## [3750] " Francinor"
## [3751] " Franco London Films"
## [3752] " Francoriz Production"
## [3753] " Franfilmdis"
## [3754] " Frank Capra Productions"
## [3755] " Frank Perry Films Inc"
## [3756] " Frank Ross Norma Krasna Inc"
## [3757] " Frank Seltzer Productions"
## [3758] " Frank Yablans Presentations"
## [3759] " Frankestein Entertainment"
## [3760] " Frankovich Productions"
## [3761] " Franton Production"
## [3762] " Franz Seitz Filmproduktion"
## [3763] " Fray Films id"
## [3764] " Fray Filmworks id"
## [3765] " Fray Night Productions id"
## [3766] " Freak Show Entertainment"
## [3767] " Fred Berner Films"
## [3768] " Fred F Finklehoffe Productions"
## [3769] " Fred M Wilcox Enterprises Inc"
## [3770] " Fred Silverman Productions"
## [3771] " Frederick Productions"
## [3772] " Frederick Zollo Productions"
## [3773] " Free Dream Pictures"
## [3774] " Free Lunch Productions"
## [3775] " Freedom Films"
## [3776] " Freefall Films"
## [3777] " Freere Entertainment id"
## [3778] " Freestyle Releasing"
## [3779] " Freewill Films"
## [3780] " Freibeuter Films"
## [3781] " French Quarter Film"
## [3782] " Frenetic Arts"
## [3783] " Frenzy Productions"
## [3784] " Fresh Smoked"
## [3785] " Fresh Film"
## [3786] " Fresh One Productions"
## [3787] " Fresh TV"
## [3788] " Freshwater Films"
## [3789] " Fretboard Pictures"
## [3790] " Freyda Rothstein Productions"
## [3791] " Fribergs Filmbyrå AB"
## [3792] " Friedman Lewis Productions"
## [3793] " Friend of a Friend Films"
## [3794] " Fries Entertainment Films"
## [3795] " Frisbeefilms"
## [3796] " Frisco Productions Limited"
## [3797] " Fritz Genschow Films"
## [3798] " From the Head"
## [3799] " Front Films"
## [3800] " Front Street Pictures"
## [3801] " Front Street Productions"
## [3802] " Front Street Studios"
## [3803] " Frontera Films S A"
## [3804] " Frontier Films"
## [3805] " Frontier Studios"
## [3806] " FROST Pictures"
## [3807] " frthjof film id"
## [3808] " Frthjof Film id"
## [3809] " Fryman Enterprises"
## [3810] " FSC Productions"
## [3811] " Fu Works"
## [3812] " FU2 Productions"
## [3813] " Fuel Entertainment"
## [3814] " Fugitive Features"
## [3815] " Fuglene AS"
## [3816] " Fuji Television Network"
## [3817] " Fuji TV"
## [3818] " Fukasaku gumi"
## [3819] " FUL Films"
## [3820] " Full Blitz Entertainment"
## [3821] " Full Glass Films"
## [3822] " Full Moon Entertainment"
## [3823] " Full Moon Features"
## [3824] " Full Moon Pictures"
## [3825] " Full On Studios"
## [3826] " Full Stealth Films"
## [3827] " Full Twisting Double Back"
## [3828] " Fuller Films"
## [3829] " Fulvia Film"
## [3830] " Fulwell 73"
## [3831] " Fun and Happiness"
## [3832] " FunDeMental Studios"
## [3833] " FunHouse Features"
## [3834] " FUNimation Entertainment"
## [3835] " Funny Business Productions"
## [3836] " Funny Films Oy"
## [3837] " Funny or Die"
## [3838] " Funnyman Inc"
## [3839] " Fuqua Films"
## [3840] " Fur Boat Films"
## [3841] " Furst Films"
## [3842] " Furthur Films"
## [3843] " Fury Productions"
## [3844] " Future Film Group"
## [3845] " Future Films"
## [3846] " Futurikon"
## [3847] " Fuzzy Logic Pictures"
## [3848] " G Mahesh Babu Entertainment Pvt Ltd"
## [3849] " G V Films"
## [3850] " G P F I"
## [3851] " G R P Cinematografica"
## [3852] " G S Entertainment"
## [3853] " G W Films"
## [3854] " Gabriel Pascal Productions"
## [3855] " gadd productions corp"
## [3856] " Gaeta Rosenzweig Films"
## [3857] " Gafer Producciones"
## [3858] " GAGA"
## [3859] " Gaia Media"
## [3860] " Gaijin Entertainment"
## [3861] " Gainax"
## [3862] " Gainsborough Pictures"
## [3863] " Gala Film"
## [3864] " Galassia Cinematografica"
## [3865] " Galatea Film"
## [3866] " Galatée Films"
## [3867] " Galaworldfilm Productions"
## [3868] " Galaxy Films"
## [3869] " Galaxy Pictures Inc"
## [3870] " Galaxy Pictures Limited"
## [3871] " Galliano Iuso per Digital Film"
## [3872] " Galvinized Films"
## [3873] " Game 7 Films"
## [3874] " Gamechanger Films"
## [3875] " Gamma Film"
## [3876] " Gangani Multimedia"
## [3877] " Gar Bo Films Company"
## [3878] " Garagefilm International"
## [3879] " Gare Farrand Entertainment"
## [3880] " Garrett Klement Pictures"
## [3881] " Gary Sanchez Productions"
## [3882] " Gatacine"
## [3883] " Gates of Heaven"
## [3884] " Gateway Films"
## [3885] " Gather Films"
## [3886] " Gatlin Pictures"
## [3887] " Gato Negro Films"
## [3888] " Gaumont"
## [3889] " Gaumont British Picture Corporation"
## [3890] " Gaumont Franco Film Aubert G F F A"
## [3891] " Gaumont International"
## [3892] " Gaylord Films"
## [3893] " GBM Productions"
## [3894] " GBVI"
## [3895] " GEA Cinematográfica"
## [3896] " Gearhead Pictures"
## [3897] " Gearshift Films"
## [3898] " Gébéka Films"
## [3899] " Gee Films International"
## [3900] " Geetha Arts"
## [3901] " Geffen Company The"
## [3902] " Geffen Pictures"
## [3903] " Geiselgasteig Film"
## [3904] " Geißendörfer Film und Fernsehproduktion GFF"
## [3905] " Gekko Film"
## [3906] " Gekko Film Corp"
## [3907] " Geller Goldfine Productions"
## [3908] " Gelma Films"
## [3909] " Gem Film"
## [3910] " Gemini American"
## [3911] " Gemini American Productions"
## [3912] " Gemini Films"
## [3913] " Gen Productions"
## [3914] " GENCO"
## [3915] " Gendai Eigasha"
## [3916] " Gene Corman Productions"
## [3917] " Geneni Film Distributors"
## [3918] " Geneon Entertainment"
## [3919] " Gener8Xion Entertainment"
## [3920] " General Entertainment Co LTD"
## [3921] " General Film Corporation"
## [3922] " General Film Distributors"
## [3923] " General Pictures"
## [3924] " General Productions Inc"
## [3925] " Generate"
## [3926] " Generation Blue Films"
## [3927] " Generation International"
## [3928] " Generation Iron Fitness Network"
## [3929] " Generator Entertainment"
## [3930] " Genie Productions Inc"
## [3931] " Gentle Machine Productions LLC"
## [3932] " Geordie Sabbagh Productions"
## [3933] " George A Hirliman Productions"
## [3934] " George Albert Smith Films"
## [3935] " George Axelrod Productions"
## [3936] " George King Productions"
## [3937] " George Minter Productions"
## [3938] " George Pal Productions"
## [3939] " George Stevens Productions"
## [3940] " George Street Pictures"
## [3941] " Georges Loureau"
## [3942] " Georges Méliès"
## [3943] " Georgetown Productions Inc"
## [3944] " Gerald Kargl"
## [3945] " Gerber Pictures"
## [3946] " Gervais Merchant"
## [3947] " Gesellschaft für bildende Filme"
## [3948] " Getaway Films"
## [3949] " Gettin It The Movie LLC"
## [3950] " Getty Fromkess Corporation"
## [3951] " GF Studios AB"
## [3952] " GFP Medienfonds"
## [3953] " GFT Action Films Inc"
## [3954] " GFT Entertainment"
## [3955] " GFT Paquin Entertainment"
## [3956] " GG Studio"
## [3957] " Ghost House Pictures"
## [3958] " Ghost Orch Films id"
## [3959] " Ghost Pictures"
## [3960] " Ghost Robot"
## [3961] " Ghosts Media"
## [3962] " Ghoulardi Film Company"
## [3963] " Giant Ape Media"
## [3964] " Giant Film Production"
## [3965] " Giant Films"
## [3966] " Giant Flick Films"
## [3967] " Giant Screen Films"
## [3968] " Gico Cinematografica S r L"
## [3969] " Gigantic Movie"
## [3970] " Gigantic Pictures"
## [3971] " GigaPix Studios"
## [3972] " Gigi Productions"
## [3973] " Gilbert Films"
## [3974] " Gilded Halfwing"
## [3975] " Gimages"
## [3976] " Gimages Développement"
## [3977] " Gimme Five Films"
## [3978] " Ginso Investment Corp"
## [3979] " Giorgos Papalios Productions"
## [3980] " Giovanni Addessi Produzione Cinematografica"
## [3981] " Giovine"
## [3982] " Girafa Filmes"
## [3983] " Giraff Film AB"
## [3984] " Girl Chocolate Skateboards"
## [3985] " GIW"
## [3986] " GK Film"
## [3987] " GK Films"
## [3988] " Gladden Entertainment"
## [3989] " Glass Eye Pix"
## [3990] " Glass Key"
## [3991] " głębokiOFF"
## [3992] " Glendale"
## [3993] " Glenville"
## [3994] " Global Creative Studios"
## [3995] " Global Emerging Markets GEM"
## [3996] " Global Pictures"
## [3997] " Global Productions"
## [3998] " Global Universal Pictures"
## [3999] " Globe Enterprises"
## [4000] " Globe Films"
## [4001] " Globe Pictures Corp"
## [4002] " Globo Filme"
## [4003] " Globo filmes"
## [4004] " Globo Filmes"
## [4005] " Globomedia Antena 3 Films Cangrejo Films"
## [4006] " Globus Film Studio"
## [4007] " Gloria Film GmbH"
## [4008] " Gloria Films"
## [4009] " Gloria Productions"
## [4010] " Gloria Productions Inc"
## [4011] " Gloria Swanson Pictures"
## [4012] " Glorieta Films"
## [4013] " GMA Films"
## [4014] " GMM Pictures Co"
## [4015] " GMM Tai Hub GTH"
## [4016] " GMT Productions"
## [4017] " GNK Productions"
## [4018] " Gnu Films"
## [4019] " GNUFilms Oy"
## [4020] " Go Faster Stripe"
## [4021] " Go Films"
## [4022] " Go Go Film Productions"
## [4023] " GO Productions"
## [4024] " Go2sho"
## [4025] " Goalpost Pictures"
## [4026] " Goat Man s Hill"
## [4027] " Goatworks Films"
## [4028] " Godfather Entertainment"
## [4029] " Godspeed Pictures"
## [4030] " Goff Kellam Productions"
## [4031] " Golan Globus"
## [4032] " Golan Globus Productions"
## [4033] " Gold Circle Films"
## [4034] " Gold Gems Ltd"
## [4035] " Gold Lion Films"
## [4036] " Gold Miller Productions"
## [4037] " Goldcrest Films International"
## [4038] " Goldcrest Pictures"
## [4039] " Golden Circle Productions"
## [4040] " Golden Effects Pictures"
## [4041] " Golden Gate Pictures"
## [4042] " Golden Harvest Company"
## [4043] " Golden Harvest Company Ltd"
## [4044] " Golden Harvest Pictures"
## [4045] " Golden Harvest Productions"
## [4046] " Golden Horse Productions"
## [4047] " Golden Mean"
## [4048] " Golden Princess Film Production Limited"
## [4049] " Golden Square Pictures"
## [4050] " Golden State Productions"
## [4051] " Golden Sun Films"
## [4052] " Golden Tripod Film Co Hong Kong"
## [4053] " Golden Village"
## [4054] " Golden Way Films Ltd"
## [4055] " Goldfish Pictures"
## [4056] " Goldig Film Company"
## [4057] " Goldkind Filmproduktion"
## [4058] " Goldmine Pictures"
## [4059] " Goldmine Productions"
## [4060] " Goldrush Entertainment"
## [4061] " Goldstreet Films"
## [4062] " Goldwyn Films"
## [4063] " Goldwyn Pictures Corporation"
## [4064] " Goliath Film and Media Holdings"
## [4065] " Gonella Productions"
## [4066] " Gonzo"
## [4067] " Good Credit Productions"
## [4068] " Good Dick"
## [4069] " Good Film Company"
## [4070] " Good Films"
## [4071] " Good Machine"
## [4072] " Good News"
## [4073] " Good Note Productions"
## [4074] " Good Story Productions"
## [4075] " Good Universe"
## [4076] " Goodmark Productions Inc"
## [4077] " Goods film"
## [4078] " Goodtimes Enterprises"
## [4079] " GoodTimes Entertainment"
## [4080] " Gorad"
## [4081] " Gordon Bijelonic Datari Turner Films"
## [4082] " Gordon Company"
## [4083] " Gordon Films"
## [4084] " Gordonstreet Pictures"
## [4085] " Gorgon Veo id"
## [4086] " Gorham Productions"
## [4087] " Goriz Film"
## [4088] " Gorky Film Studio"
## [4089] " Gorky Film Studios"
## [4090] " Gosfilmofond"
## [4091] " Goskino"
## [4092] " Goskino Productions"
## [4093] " Gospel of John Ltd"
## [4094] " GötaFilm AB"
## [4095] " Gotham Group"
## [4096] " Gothic Pictures International"
## [4097] " Government of West Bengal"
## [4098] " Gower Street Pictures"
## [4099] " Gowrimeenakshi Movies"
## [4100] " Goya Producciones Cinematográficas S A"
## [4101] " GP Pictures"
## [4102] " GPS"
## [4103] " GR Films"
## [4104] " Graal"
## [4105] " Gracie Films"
## [4106] " Grack Films"
## [4107] " Grading Dimension Pictures"
## [4108] " Gradual Elevate Media"
## [4109] " Graduation"
## [4110] " Graeme Ferguson Productions"
## [4111] " Graffiti Productions"
## [4112] " Graffon Film H K Co"
## [4113] " Grafton Films"
## [4114] " Grain Media"
## [4115] " GRAiNEY Pictures"
## [4116] " Gramercy Pictures"
## [4117] " Gran Via Productions"
## [4118] " Granada Entertainment"
## [4119] " Granada Film Productions"
## [4120] " Granada Films"
## [4121] " Granada Television"
## [4122] " Grand Allure Entertainment"
## [4123] " Grand Army Entertainment"
## [4124] " Grand March Movie Production Company Ltd"
## [4125] " Grand National Pictures"
## [4126] " Grand Peaks Entertainment"
## [4127] " Grand Productions I"
## [4128] " Grandon Productions"
## [4129] " Graniet Film BV"
## [4130] " Granit Films"
## [4131] " Granox Productions"
## [4132] " Graphic Films"
## [4133] " Grasshoppa"
## [4134] " Gravier Productions"
## [4135] " Gravitas Docufilms"
## [4136] " Gravitas Ventures"
## [4137] " Graviton Entertainment"
## [4138] " Gray Film"
## [4139] " GRB Entertainment"
## [4140] " Greaser s Palace Ltd"
## [4141] " Great American Films Limited Partnership"
## [4142] " Great Earth Film Company"
## [4143] " Great Highway Company"
## [4144] " Great Maratha Entertainment Company India"
## [4145] " Great Scott Productions Pty Ltd"
## [4146] " Great Western Productions"
## [4147] " Greater China Media Entertainment"
## [4148] " Greater Films Ltd"
## [4149] " Greek Film Center"
## [4150] " Greek Television ET 1"
## [4151] " Greeks Productions"
## [4152] " Green Communications"
## [4153] " Green Day"
## [4154] " Green Dragon Movies"
## [4155] " Green Epstein Productions"
## [4156] " Green Film Company"
## [4157] " Green Film House"
## [4158] " Green Fish Pictures"
## [4159] " Green Jacket Productions"
## [4160] " Green Lake Films"
## [4161] " Green Light Media"
## [4162] " Green Lions"
## [4163] " Green Moon Productions"
## [4164] " Green Parrot"
## [4165] " Green Star Films"
## [4166] " Greendale Productions"
## [4167] " Greenestreet Films"
## [4168] " GreeneStreet Films"
## [4169] " Greenfox"
## [4170] " Greengrass Productions"
## [4171] " greenskyFILMS"
## [4172] " Greentrees Films"
## [4173] " Greenway Productions"
## [4174] " Greenwich Film Productions"
## [4175] " Grenadier Films"
## [4176] " Greydon Clark Productions"
## [4177] " Greyshack Films"
## [4178] " Grindfest"
## [4179] " Grindfist"
## [4180] " Grindstone Entertainment Group"
## [4181] " Gristmill"
## [4182] " Grizly Films"
## [4183] " Gross Krasne Productions"
## [4184] " Gross Weston Productions"
## [4185] " Grossbart Barnett Productions"
## [4186] " Grosvenor Park Films LLP"
## [4187] " Grosvenor Park Media Ltd"
## [4188] " Grosvenor Park Productions"
## [4189] " Groundswell Productions"
## [4190] " Group 3"
## [4191] " Group Film Productions"
## [4192] " Group TAC"
## [4193] " Group W"
## [4194] " Groupe Dziga Vertov"
## [4195] " Grovas Oro Films"
## [4196] " Growing Pains"
## [4197] " Grupa Filmowa"
## [4198] " Grupo Cine Liberación"
## [4199] " Grupo de Estudos e Realizações GER"
## [4200] " Grupo Novo de Cinema e TV"
## [4201] " Gruppo Minerva International"
## [4202] " Gruskoff Venture Linson"
## [4203] " Gruzia Film"
## [4204] " GS Films"
## [4205] " Guacamole Films"
## [4206] " Guangxi Film Studio"
## [4207] " Guarango"
## [4208] " Guarav Arts"
## [4209] " Guardian Trust Company"
## [4210] " Guber Peters Company"
## [4211] " Gue Company Films Inc id"
## [4212] " Guerilla Films"
## [4213] " Guerilla High Productions"
## [4214] " Guest House Films"
## [4215] " Guing Star Productions id"
## [4216] " Guión Producciones Cinematográficas"
## [4217] " Gulfstream Pictures"
## [4218] " Gullane Entretenimento S A"
## [4219] " Gullane Filmes"
## [4220] " Gun for Hire Films"
## [4221] " Güney Film"
## [4222] " Gunslinger"
## [4223] " Guru Dutt Films Pvt Ltd"
## [4224] " Gus Productions"
## [4225] " Guy DVD Films"
## [4226] " Gwenaud Productions"
## [4227] " H L S Ltd"
## [4228] " H5"
## [4229] " Habbekrats"
## [4230] " Hachette Fox Productions"
## [4231] " Hachette Première"
## [4232] " Hacker Productions"
## [4233] " Haddock Films S R L"
## [4234] " Haft Entertainment"
## [4235] " Hahn Film AG"
## [4236] " Haile Addis Pictures"
## [4237] " Haile Gerima"
## [4238] " Hairy Productions"
## [4239] " Hakalax Productions"
## [4240] " Hakuhodo Inc"
## [4241] " HAL Films"
## [4242] " Hal Roach Studios"
## [4243] " Hal Wallis Productions"
## [4244] " Halas and Batchelor Cartoon Films"
## [4245] " Halcyon International Pictures"
## [4246] " Halestorm entertainment"
## [4247] " Halicki Productions"
## [4248] " Hall Bartlett Productions"
## [4249] " Hallelujah Film GmbH"
## [4250] " Hallmark"
## [4251] " Hallmark Entertainment"
## [4252] " Hallmark Hall of Fame"
## [4253] " Hallmark Hall of Fame Productions"
## [4254] " Hallmark Productions"
## [4255] " Halomedia Oy"
## [4256] " Hammer Film Productions"
## [4257] " Hammer Films"
## [4258] " Hanauma Bay"
## [4259] " Hand Made Films"
## [4260] " Handbook Productions"
## [4261] " Handistom Investment"
## [4262] " Handle Productions"
## [4263] " HandMade Films"
## [4264] " Handmade Films Ltd"
## [4265] " Handshake Productions"
## [4266] " Handsomecharlie Films"
## [4267] " Hangman Film Company"
## [4268] " Hanmac Films"
## [4269] " Hanna Barbera"
## [4270] " Hanna Barbera Productions"
## [4271] " Hannibal Pictures"
## [4272] " Hanns Eckelkamp Filmproduktion"
## [4273] " Hans Domnick Filmproduktion"
## [4274] " HanWay Films"
## [4275] " Haos Film"
## [4276] " Hape Film Company GmbH"
## [4277] " Happinet Pictures"
## [4278] " Happy End Filmproductions AB"
## [4279] " Happy Endings A S"
## [4280] " Happy Fiction"
## [4281] " Happy Madison Productions"
## [4282] " Happy Pictures Culture Communication Co Ltd"
## [4283] " HarBel Productions"
## [4284] " Harbinger Media Partners"
## [4285] " Harbor Productions"
## [4286] " Harbor Ventures"
## [4287] " Harbour Pictures"
## [4288] " Harcourt Productions"
## [4289] " Hardy Pictures"
## [4290] " HareBrained Pictures"
## [4291] " Hark Film"
## [4292] " Harlequin Pictures"
## [4293] " Harlequin Productions Ltd"
## [4294] " Harlin Selin Productions Oy"
## [4295] " Harmony Gold"
## [4296] " Harold Hecht Productions"
## [4297] " Harpo Films"
## [4298] " Harpo Productions"
## [4299] " Harrell"
## [4300] " Harris Fox Production"
## [4301] " Harristown Funding"
## [4302] " Harry Langdon Corporation"
## [4303] " Hart Sharp Veo id"
## [4304] " Hartbeat Productions"
## [4305] " Hartbreak Films"
## [4306] " Harun Farocki Filmproduktion"
## [4307] " Harvard Sensory Ethnography Lab"
## [4308] " Harvard University"
## [4309] " Harvey Mason Media"
## [4310] " Hasbro"
## [4311] " Hasbro Studios"
## [4312] " Hat Trick Productions"
## [4313] " Haunted Mirror"
## [4314] " Haut et Court"
## [4315] " Have another Cherry"
## [4316] " Haven Entertainment"
## [4317] " Havenwood Media"
## [4318] " Havoc"
## [4319] " Hawk Films"
## [4320] " Hawthorn Productions"
## [4321] " Haxan Films"
## [4322] " Hazeldine Films"
## [4323] " HB Filmes"
## [4324] " HBO"
## [4325] " HBO Cinemax Documentary"
## [4326] " HBO Documentary"
## [4327] " HBO Documentary Films"
## [4328] " HBO Films"
## [4329] " HBO Independent Productions"
## [4330] " HBO Pictures"
## [4331] " HBO Polska"
## [4332] " HBO Romania"
## [4333] " HBO Sports"
## [4334] " HDNet Films"
## [4335] " HDNM Entertainment"
## [4336] " Head Games the Film"
## [4337] " Head Gear Films"
## [4338] " Head On Productions"
## [4339] " Headline Pictures"
## [4340] " Headliner Productions"
## [4341] " Heads Up Film"
## [4342] " Hearst Entertainment Productions"
## [4343] " Heaven Pictures Beijing The Movies Co"
## [4344] " Heavy Duty Entertainment"
## [4345] " Heavy Productions"
## [4346] " Heaway Pictures id"
## [4347] " Hecht Co"
## [4348] " Hecht Hill Lancaster Productions"
## [4349] " Hecht Lancaster Productions"
## [4350] " Heco Produções"
## [4351] " Hedayat Film"
## [4352] " Heimatfilm"
## [4353] " Heimatfilm GbR"
## [4354] " Helen Gardner Picture Players"
## [4355] " Hélicotronc"
## [4356] " Heliopolis"
## [4357] " Helios Filmproduktion"
## [4358] " Helios Productions"
## [4359] " Helkon Media AG"
## [4360] " Hell s Kitchen Films"
## [4361] " Hellbound Productions"
## [4362] " Hellenic Radio Television ERT"
## [4363] " Hello Please"
## [4364] " Helsinki Filmi Oy"
## [4365] " Helvey Pray Production"
## [4366] " Hemdale"
## [4367] " Hemdale Film"
## [4368] " Hemdale Film Corporation"
## [4369] " Hemisphere Entertainment"
## [4370] " Hemisphere Pictures"
## [4371] " Hengdian Chinese Film Production Co"
## [4372] " Hennepin Studios"
## [4373] " Henry Halstead Productions"
## [4374] " Hepp Film"
## [4375] " Hepworth"
## [4376] " Herald Pictures"
## [4377] " Herald Productions II"
## [4378] " Herbert Wilcox Productions"
## [4379] " herbX film GmbH"
## [4380] " Hercules Cinematografica"
## [4381] " Here Films"
## [4382] " Here Studios"
## [4383] " Heretic Films"
## [4384] " Heritage Enterprises Inc"
## [4385] " Heritage Films"
## [4386] " Herman Cohen Productions"
## [4387] " Herman Wobber"
## [4388] " Hermic Films"
## [4389] " Hernany Perla Films"
## [4390] " Hérodiade"
## [4391] " Herold and Family"
## [4392] " Herrick Entertainment"
## [4393] " Hersua Interfilms"
## [4394] " Herzog"
## [4395] " Hesperia Films S A"
## [4396] " Hessischer Rundfunk HR"
## [4397] " Hex Media"
## [4398] " Heyday films"
## [4399] " Heyday Films"
## [4400] " HFD Productions"
## [4401] " HI FI Motion Pictures"
## [4402] " HI Film Productions"
## [4403] " Hi Rez Films"
## [4404] " Hibiscus Films"
## [4405] " Hickmar Productions"
## [4406] " HIFI Stereo 70 Kg"
## [4407] " High Delft Pictures"
## [4408] " High Road"
## [4409] " High Speed Productions"
## [4410] " High Star Entertainment"
## [4411] " High Top Releasing"
## [4412] " High Treason Productions"
## [4413] " Highland Film Group"
## [4414] " Highland Park Classics"
## [4415] " Highlight"
## [4416] " Highroad"
## [4417] " HighRoad Entertainment"
## [4418] " Highway One Pictures"
## [4419] " Hill Hecht Lancaster Productions"
## [4420] " Hill Mandelker Films"
## [4421] " HILT Productions"
## [4422] " Himenóptero"
## [4423] " Hing in the Attic id"
## [4424] " hiq productions"
## [4425] " Hisa Film"
## [4426] " Hispamer Films"
## [4427] " Historia Films"
## [4428] " Hit Entertainment"
## [4429] " Hit the Ground Running Films"
## [4430] " Hitit"
## [4431] " Hitman s Run Productions"
## [4432] " HJB Filmproduktion"
## [4433] " HK Film Corporation"
## [4434] " HLP"
## [4435] " HMS Projects"
## [4436] " Ho Hi Pictures"
## [4437] " Hobart Bosworth Productions"
## [4438] " Hobby Films"
## [4439] " Hoche Productions"
## [4440] " Hochschule für Bildende Künste Hamburg"
## [4441] " Hochschule für Fernsehen und Film HFF"
## [4442] " Hochschule für Fernsehen und Film München"
## [4443] " Hochschule für Film und Fernsehen Konrad Wolf"
## [4444] " Hodcarrier Films"
## [4445] " Hodgee Films"
## [4446] " Hofflund Polone"
## [4447] " Hofmann Voges Entertainment"
## [4448] " Holay Cinematografica id"
## [4449] " Hold It Now Films"
## [4450] " Holdean"
## [4451] " Holedigger Films"
## [4452] " Holland Harbour Productions"
## [4453] " Hollandia Filmproductions"
## [4454] " Holly Hill Productions"
## [4455] " Hollytubs"
## [4456] " Hollywood House of Horror"
## [4457] " Hollywood International Pictures"
## [4458] " Hollywood Media Brge id"
## [4459] " Hollywood Partners"
## [4460] " Hollywood Pictures"
## [4461] " Hollywood Pictures Corporation"
## [4462] " Hollywood Pictures Corporation II"
## [4463] " Hollywood Royal Pictures"
## [4464] " Hollywood Star Pictures"
## [4465] " Hollywood Storm"
## [4466] " Hollywood Treasures"
## [4467] " Hollywoodmade"
## [4468] " Holowach Films"
## [4469] " Hom AG für Filmfabrikation"
## [4470] " Home Box Office"
## [4471] " Home Box Office HBO"
## [4472] " Home Box Office Home Veo HBO id"
## [4473] " Home Free"
## [4474] " Home Theater Films"
## [4475] " HomeComing RC"
## [4476] " Homegreen Films"
## [4477] " Homegrown Pictures"
## [4478] " Homeless Bob Production"
## [4479] " HOMEMADE FILMS"
## [4480] " Homeroom LLC"
## [4481] " Hong Hwa Motion Picture Company"
## [4482] " Hong Kong Alpha Motion Pictures Co"
## [4483] " Hong Kong Kai Fa Film Co"
## [4484] " Hong Kong Pineast Pictures"
## [4485] " Honora Productions"
## [4486] " Hooks and Taylor Entertainment"
## [4487] " Hope Enterprises"
## [4488] " Hopscotch Features"
## [4489] " Hopscotch Films"
## [4490] " Horizon Pictures"
## [4491] " Horizon Pictures II"
## [4492] " Horizonte Films"
## [4493] " Horosho Production"
## [4494] " Horse Head Pictures"
## [4495] " HorseHead Pictures"
## [4496] " Horseshoe Films"
## [4497] " Horsethief Pictures"
## [4498] " Hot Property Films"
## [4499] " Hotshot Films"
## [4500] " Houtsnede Maatschappij N V"
## [4501] " How To Be Films"
## [4502] " Howard Hughes Productions"
## [4503] " Howard Productions"
## [4504] " Howco Productions Inc"
## [4505] " HPLHS"
## [4506] " Hrvatska Radiotelevizija HRT"
## [4507] " HSI Productions"
## [4508] " HSX Films"
## [4509] " Hu Tong Communications"
## [4510] " Huaxia Film Distribution Company"
## [4511] " Huayi Brothers"
## [4512] " Huayi Brothers Taihe Film Investment"
## [4513] " Huayi Brothers Media"
## [4514] " Huayi Brothers Media Corporation"
## [4515] " Hubert Bals Fund"
## [4516] " Hudson Hawk Films Ltd"
## [4517] " Huffington Pictures"
## [4518] " Hughes Capital Entertainment"
## [4519] " Hughes Entertainment"
## [4520] " Hugo Films"
## [4521] " Hugo Films S A"
## [4522] " Hugo Haas Productions"
## [4523] " Huh huh Filmi Oy"
## [4524] " Hulu"
## [4525] " Humankind Production"
## [4526] " Hungarian Film Institute"
## [4527] " Hungaro"
## [4528] " Hunnia Filmgyár"
## [4529] " Hunnia Filmstúdió"
## [4530] " Hunnia Játékfilmstúdió"
## [4531] " Hunt Stromberg Productions"
## [4532] " Hunting Lane Films"
## [4533] " Hutch Films LLC"
## [4534] " Hutson Ranch Media"
## [4535] " HW Two"
## [4536] " Hybr id"
## [4537] " Hybr Productions Inc id"
## [4538] " Hyde Park Entertainment"
## [4539] " Hyde Park Films"
## [4540] " Hydra Corporation"
## [4541] " Hydraulx"
## [4542] " Hyogensha Mako International"
## [4543] " Hype Film"
## [4544] " Hyperion Pictures"
## [4545] " Hyperion Productions"
## [4546] " Hypnopolis"
## [4547] " I Got a Fish Productions"
## [4548] " I Hate Vday Productions"
## [4549] " I Lied About Everything Picture"
## [4550] " I m Filming Productions"
## [4551] " I N C A A"
## [4552] " i o post"
## [4553] " I R I B Channel 2"
## [4554] " I R M I Films Corporation"
## [4555] " i2i Productions"
## [4556] " i5 Films"
## [4557] " IAC Film"
## [4558] " Ibérica Filmes"
## [4559] " Ibermedia"
## [4560] " Iblis Films"
## [4561] " Ice Cold Productions"
## [4562] " ICE3"
## [4563] " Iced Tea Productions"
## [4564] " Icelandic Film"
## [4565] " Icicle"
## [4566] " icon"
## [4567] " Icon Entertainment International"
## [4568] " ICON production"
## [4569] " Icon Productions"
## [4570] " Idea Factory"
## [4571] " iDeal Partners Film Fund"
## [4572] " Idéale Audience"
## [4573] " Identity Films"
## [4574] " IDG China Media"
## [4575] " IDI Cinematografica"
## [4576] " iDiC Entertainment"
## [4577] " Idol Company"
## [4578] " iDream Productions"
## [4579] " IDT Entertainment"
## [4580] " IDTV Film"
## [4581] " IdtV Film Veo Productions id"
## [4582] " Iduna Film Produktiongesellschaft"
## [4583] " Iéna Productions"
## [4584] " Iervolino Entertainment"
## [4585] " IFC Films"
## [4586] " IFC Mnight id"
## [4587] " IFC Productions"
## [4588] " IFI Producción S A"
## [4589] " IFMD Ltd"
## [4590] " Igloolik Isuma Productions Inc"
## [4591] " Ignite Entertainment"
## [4592] " Ignite Productions"
## [4593] " Ignition Pictures"
## [4594] " Igor Film"
## [4595] " III Lions"
## [4596] " Ikiru Films"
## [4597] " Ilag Film"
## [4598] " Illuminati Films"
## [4599] " Illuminati Films Pvt Ltd"
## [4600] " Illumination Entertainment"
## [4601] " Illumination Films"
## [4602] " Illuminations Films"
## [4603] " Illusion Entertainment Group"
## [4604] " Illusion Studios"
## [4605] " Illusions Entertainment Corporation"
## [4606] " Illustrated Films LLC"
## [4607] " iLoveCinema"
## [4608] " Iluminura Filmes"
## [4609] " IM Global"
## [4610] " IMA Productions"
## [4611] " Image Entertainment"
## [4612] " image now films"
## [4613] " Image Ten"
## [4614] " Imagenation Abu Dhabi FZ"
## [4615] " Imagi Animation Studios"
## [4616] " Imagica Corp"
## [4617] " Imagine Entertainment"
## [4618] " Imagine Television"
## [4619] " Imagos Films"
## [4620] " Imaj Entertainment"
## [4621] " Imamura Productions"
## [4622] " Imar Film Co Ltd"
## [4623] " IMAS Filmproduktion"
## [4624] " IMAX"
## [4625] " Imax Film Entertainment"
## [4626] " IMCINE"
## [4627] " Immigrant Productions"
## [4628] " Immortal Entertainment"
## [4629] " Immortal Thoughts"
## [4630] " Impact"
## [4631] " Impact Films"
## [4632] " Impact Pictures"
## [4633] " Impact Productions LLC"
## [4634] " Impala"
## [4635] " Impéria"
## [4636] " Imperial PolyFarm Productions"
## [4637] " Impics Productions"
## [4638] " Imprint Entertainment"
## [4639] " Imprint Pictures"
## [4640] " IMS 3 LLP"
## [4641] " Imus Productions"
## [4642] " In Cine Compania Industrial Cinematografica"
## [4643] " In Extremis Images"
## [4644] " In Gear Film Production Co Ltd"
## [4645] " Inca Films S A"
## [4646] " InCA Productions"
## [4647] " INCAA"
## [4648] " Incendiary Features"
## [4649] " Incendo Productions"
## [4650] " Incentive Filmed Entertainment"
## [4651] " Incessant Barking Productions Inc"
## [4652] " Incorporated Television Company"
## [4653] " Incorporated Television Company ITC"
## [4654] " Indecom Cinema"
## [4655] " Indelible Productions"
## [4656] " Independent"
## [4657] " Independent Artists"
## [4658] " Independent Digital Entertainment"
## [4659] " Independent Edge FIlms"
## [4660] " Independent Film"
## [4661] " Independent Film Channel"
## [4662] " Independent Film Channel IFC"
## [4663] " Independent Films"
## [4664] " Independent International Pictures I I"
## [4665] " Independent Moving Productions Inc IMPinc"
## [4666] " Independent Partners"
## [4667] " Independent Pictures II"
## [4668] " Independent Producers"
## [4669] " Independent Productions"
## [4670] " Independent Sovereign Films"
## [4671] " Independent Television Service"
## [4672] " Independent Television Service ITVS"
## [4673] " Index Films"
## [4674] " INDI Film GmbH"
## [4675] " Indian Paintbrush"
## [4676] " Indiana Production Company"
## [4677] " IndiePix Studios"
## [4678] " IndieProd Company Productions"
## [4679] " Indigo Film"
## [4680] " Indigo Pictures"
## [4681] " Indion Entertainment Group"
## [4682] " Indivual Pictures id"
## [4683] " Indochina Peace Committee IPC Films"
## [4684] " Indomina Productions"
## [4685] " Indomitable Entertainment"
## [4686] " Industria Cinematografica Italiana INCINE"
## [4687] " Industrial Development Corporation of South Africa"
## [4688] " Industrie Cinematografiche Italiane"
## [4689] " Industry Entertainment"
## [4690] " IndustryWorks Distribution"
## [4691] " Indy Entertainment"
## [4692] " Inecom Entertainment Company"
## [4693] " Infinite Enterprises"
## [4694] " Infinite Frameworks Pte Ltd"
## [4695] " Infinite Lives Entertainment"
## [4696] " Infinitum Nihil"
## [4697] " Infinity Features Entertainment"
## [4698] " Infinity Films"
## [4699] " Infinity Omnimedia"
## [4700] " Infinity Prague"
## [4701] " Inforg M M Film Kft"
## [4702] " Inforg Stúdió"
## [4703] " InformAction Films"
## [4704] " Informant Media"
## [4705] " Infowar Productions"
## [4706] " Infra Red Pictures"
## [4707] " Ingenious Film Partners"
## [4708] " Ingenious Media"
## [4709] " Ingram"
## [4710] " Inimitable Pictures"
## [4711] " Initial Entertainment Group IEG"
## [4712] " Initial Productions"
## [4713] " Initiate Productions"
## [4714] " Initiation Associates"
## [4715] " Inland Film Company"
## [4716] " Inosan Productions"
## [4717] " Inscription Films"
## [4718] " Insight Film Studios"
## [4719] " Insight Productions"
## [4720] " Insignia Films"
## [4721] " Insignia Productions"
## [4722] " Insomnia Entertainment"
## [4723] " Inspiration Pictures"
## [4724] " Inspirational Films"
## [4725] " Inspired Minority Pictures"
## [4726] " Instinct Entertainment"
## [4727] " Instinctive Film"
## [4728] " Institut del Cinema Català ICC"
## [4729] " Institut National de l Audiovisuel INA"
## [4730] " Institution The"
## [4731] " Instituto Cubano del Arte e Industrias Cinematográficos ICAIC"
## [4732] " Instituto de la Cinematografía y de las Artes Audiovisuales ICAA"
## [4733] " Instituto do Cinema e do Audiovisual ICA"
## [4734] " Instituto Mexicano de Cinematografía"
## [4735] " Instituto Mexicano de Cinematografía IMCINE"
## [4736] " Instituto Nacional de Cine y Artes Audiovisuales INCAA"
## [4737] " Instituto Português da Arte Cinematográfica e Audiovisual IPACA"
## [4738] " Instituto Português de Cinema IPC"
## [4739] " Insurge Pictures"
## [4740] " Insurgent Media"
## [4741] " Intandem Films"
## [4742] " Integral Film"
## [4743] " Intellectual Reserve Inc"
## [4744] " Interamericana Films"
## [4745] " Intercapital"
## [4746] " Interchange Productions"
## [4747] " Intercontinental"
## [4748] " Intercontinental Productions"
## [4749] " Interlagar Films"
## [4750] " Interlight"
## [4751] " Interloper Films"
## [4752] " InterMedia Entertainment Company"
## [4753] " Intermedia Films"
## [4754] " Intermedia Network"
## [4755] " Intermondia Films"
## [4756] " Internacional Cinematográfica"
## [4757] " Internacional Films Espagnol"
## [4758] " International Apollo Films"
## [4759] " International Cine Film Corp"
## [4760] " International Cinema Inc"
## [4761] " International Daunia Film"
## [4762] " International Digital Artist IDA"
## [4763] " International Entertainment"
## [4764] " International Film Consortium"
## [4765] " International Film Exchange"
## [4766] " International Film Management"
## [4767] " International Harmony"
## [4768] " International Media Films"
## [4769] " International Pictures"
## [4770] " International Pictures I"
## [4771] " International Production Company"
## [4772] " International Traders"
## [4773] " International WOW Company"
## [4774] " InterPositive Media"
## [4775] " Interscope Communications"
## [4776] " Interstate 5 Productions"
## [4777] " Intertamar"
## [4778] " InterTitle Films"
## [4779] " Intl Union of Mine Mill Smelter Workers"
## [4780] " Intrep Films id"
## [4781] " Intrep Pictures id"
## [4782] " Intrinsic Value Films"
## [4783] " Invicta Filmes"
## [4784] " Invincible Pictures Corp"
## [4785] " Invisible Children"
## [4786] " Inwood Street Productions"
## [4787] " Inzert44"
## [4788] " Ion de Sosa Filmproduktion"
## [4789] " iProductions"
## [4790] " IPSO Facto Films"
## [4791] " IRE Productions"
## [4792] " IRIS Films"
## [4793] " Iris productions"
## [4794] " Irish Dreamtime"
## [4795] " Irish Film Board"
## [4796] " Irish Screen"
## [4797] " Iron Bull Films"
## [4798] " Iron Ocean Films"
## [4799] " Ironwood Gang Productions"
## [4800] " IRS Media"
## [4801] " Irusoin"
## [4802] " Irving Allen Productions"
## [4803] " Irving Asher Productions"
## [4804] " Irwin Allen Productions"
## [4805] " Irwin Entertainment"
## [4806] " Isaac Hernández Poncela"
## [4807] " Isabelle Films"
## [4808] " Isberget produktion"
## [4809] " Iselin Tenney Productions"
## [4810] " Iselin Tenney Productions Inc"
## [4811] " Ishan Talkies"
## [4812] " Ishinomori Productions"
## [4813] " Isis Productions"
## [4814] " Iskra"
## [4815] " Island Film Group"
## [4816] " Island Pictures"
## [4817] " Island World"
## [4818] " Isle of Man Film"
## [4819] " Isle of Man Film Commission"
## [4820] " Isolar"
## [4821] " isotopefilms"
## [4822] " Israel Film Fund"
## [4823] " Istiqlal Films"
## [4824] " Istisnai Filmler ve Reklamlar IFR"
## [4825] " Istituto Luce"
## [4826] " IT Media Films"
## [4827] " It s Alive Films"
## [4828] " Itaca Films"
## [4829] " Ital Noleggio Cinematografico"
## [4830] " Italfrance Films"
## [4831] " Italia Film"
## [4832] " Italian International Film"
## [4833] " Itami Productions"
## [4834] " ITC Entertainment"
## [4835] " ITC Entertainment Group"
## [4836] " ITC Films"
## [4837] " ITC Movie"
## [4838] " Itchy Fish Film"
## [4839] " Item 7"
## [4840] " Ithaca Pictures"
## [4841] " ITI Cinema"
## [4842] " Ito Productions"
## [4843] " Itsy Bitsy Film"
## [4844] " ITV"
## [4845] " ITV Studios"
## [4846] " ITV Studios America"
## [4847] " ITVS"
## [4848] " Ivan Foxwell Productions"
## [4849] " Ivan Tors Productions"
## [4850] " IW Wrecker Productions"
## [4851] " Iwerks Entertainment"
## [4852] " Ixtlan"
## [4853] " Ixtlan Productions"
## [4854] " Iyara Films"
## [4855] " Ízaro Films"
## [4856] " J Arthur Rank Organisation"
## [4857] " J Barry Kulick Production"
## [4858] " J B J Film"
## [4859] " J C Staff"
## [4860] " J E M Productions"
## [4861] " J H Films"
## [4862] " j j films"
## [4863] " J J Parker Productions"
## [4864] " J M Entertainment"
## [4865] " J Plan"
## [4866] " J storm"
## [4867] " J Team"
## [4868] " JA Digital"
## [4869] " JA Entertainment"
## [4870] " Jack Broder Productions Inc"
## [4871] " Jack Giarraputo Productions"
## [4872] " Jack H Harris Enterprises"
## [4873] " Jack M Warner Productions"
## [4874] " Jack Schwarz Productions"
## [4875] " Jackpot Films Oy"
## [4876] " Jackson Income Fund"
## [4877] " Jacques à Bâle Pictures"
## [4878] " Jad Films"
## [4879] " Jadran Film"
## [4880] " Jafar Panahi Film Productions"
## [4881] " Jaffe Braunstein Enterprise"
## [4882] " Jaffe Braunstein Films"
## [4883] " Jaguar Entertainment"
## [4884] " Jaguar Films"
## [4885] " Jaguar Productions"
## [4886] " Jalem Productions"
## [4887] " Jaleo Films"
## [4888] " JAM Films"
## [4889] " Jam Handy Organization JHO"
## [4890] " Jambox"
## [4891] " James B Harris Productions"
## [4892] " James Cruze Productions"
## [4893] " James Productions"
## [4894] " Jan Ken Po Pictures"
## [4895] " January Films"
## [4896] " Janus Film und Fernsehen"
## [4897] " Janus Films"
## [4898] " Japan America Picture Company"
## [4899] " Japan Sky Way"
## [4900] " Jash Pictures"
## [4901] " Javelin Films"
## [4902] " Jax Media"
## [4903] " Jay Dee Kay Productions"
## [4904] " Jay Lewis Productions"
## [4905] " Jay Silverman Productions"
## [4906] " Jay X Entertainment"
## [4907] " Jaya International"
## [4908] " Jaye Bird Productions"
## [4909] " Jayvijay Enterprises"
## [4910] " Jazz Pictures"
## [4911] " JBA Productions"
## [4912] " JBF"
## [4913] " JCE Entertainment Ltd"
## [4914] " JCE Movies"
## [4915] " JD Productions"
## [4916] " JDI productions"
## [4917] " Jean Doumanian Productions"
## [4918] " Jean Louis Nounez"
## [4919] " Jean Renoir Productions"
## [4920] " Jed Harris"
## [4921] " Jeff Most Productions"
## [4922] " Jenkins Entertainment"
## [4923] " Jensen Farley Pictures"
## [4924] " Jeonju Film Festival"
## [4925] " Jeonwonsa Film"
## [4926] " Jeonwonsa Film Co"
## [4927] " Jeremy Coon Productions"
## [4928] " Jerico"
## [4929] " Jerkschool Productions"
## [4930] " Jeroo Productions id"
## [4931] " Jerry Bick"
## [4932] " Jerry Bruckheimer Films"
## [4933] " Jerry Gershwin Elliott Kastner"
## [4934] " Jerry Leer Productions id"
## [4935] " Jerry Lewis Productions"
## [4936] " Jerry Wald Productions"
## [4937] " Jerry Weintraub Productions"
## [4938] " Jersey Films"
## [4939] " Jesse L Lasky Feature Play Company"
## [4940] " Jet Films"
## [4941] " Jet Tone Production"
## [4942] " Jetfilm"
## [4943] " Jetlag Productions"
## [4944] " JF Productions"
## [4945] " Jhamu Sughand Productions"
## [4946] " Jigsaw Productions"
## [4947] " Jim Henson Company The"
## [4948] " Jim Henson Pictures"
## [4949] " Jim Henson Productions"
## [4950] " Jim McCullough Productions"
## [4951] " Jimmy Lee"
## [4952] " Jinriki Hikoki Sha"
## [4953] " Jirafa"
## [4954] " Jiveass Veo id"
## [4955] " JJS Films"
## [4956] " JLG Films"
## [4957] " JLM Productions"
## [4958] " JO Entertainment"
## [4959] " Joanna Productions"
## [4960] " Joaquin Associates"
## [4961] " JoBro Productions Film Finance"
## [4962] " Jode Productions"
## [4963] " Joe Rock Productions"
## [4964] " Joe s Daughter"
## [4965] " Joe Siu International Film"
## [4966] " Joel Castleberg Productions"
## [4967] " Joel Productions"
## [4968] " Jofa Atelier"
## [4969] " John Farrow Productions"
## [4970] " John Frankenheimer Productions Inc"
## [4971] " John Heyman Peter Watkins Production"
## [4972] " John Houseman Productions"
## [4973] " John Krimsky and Gifford Cochran Inc"
## [4974] " John Lamond Motion Picture Enterprises"
## [4975] " John Magnuson Associates"
## [4976] " John McCormick Productions"
## [4977] " John Proffitt Films"
## [4978] " John Schneer s Fairlight Films id"
## [4979] " John Sexton Productions"
## [4980] " John Wells Productions"
## [4981] " John Woolf Productions"
## [4982] " Johnson and Gibson"
## [4983] " Johnson Production Group"
## [4984] " Jolly Film"
## [4985] " Jolly Roger"
## [4986] " JollyRoger"
## [4987] " Joma Films"
## [4988] " Jomami Filmproduktion"
## [4989] " Jon Shestack Productions"
## [4990] " Jonai Productions"
## [4991] " Jones Entertainment Group"
## [4992] " Jones Programming Partners"
## [4993] " Jonia Film"
## [4994] " Jörn Donner Productions"
## [4995] " Joroni Film"
## [4996] " Jos To Productions"
## [4997] " José Frade Producciones Cinematográficas S A"
## [4998] " Joseph E Levine Productions"
## [4999] " Joseph F Robertson Productions"
## [5000] " Joseph Hamilton International Productions"
## [5001] " Joseph L Schenck Enterprises"
## [5002] " Joseph M Schenck Production"
## [5003] " Joseph M Schenck Productions"
## [5004] " Joseph Shaftel Productions"
## [5005] " Josephson Entertainment"
## [5006] " Joswend"
## [5007] " Jour2Fête"
## [5008] " Journeyman Pictures"
## [5009] " Jowoo Entertainment"
## [5010] " Joyoung Films"
## [5011] " JP Entertainment"
## [5012] " JRSM Films"
## [5013] " JTP Productions"
## [5014] " Jubilee Pictures Corporation"
## [5015] " Judica Productions"
## [5016] " Juicy Planet Pictures"
## [5017] " Jules Verne Aventures Expeditions"
## [5018] " Jules Verne Films Ltd"
## [5019] " Juli Entertainment Media"
## [5020] " Julian Blaustein Productions"
## [5021] " Julian Blaustein Productions Ltd"
## [5022] " Julian Wintle Leslie Parkyn Productions"
## [5023] " Julijette"
## [5024] " Julius Hagen Productions"
## [5025] " July August Productions"
## [5026] " Jump the Fence Productions"
## [5027] " Jumping Horse Film"
## [5028] " Jungle Book Entertainment"
## [5029] " Junifilm"
## [5030] " Junior Film"
## [5031] " Junior Filmi"
## [5032] " Juniper Films"
## [5033] " JuntoBox Films"
## [5034] " Juonifilmi"
## [5035] " Jupiter Film Productions"
## [5036] " Jupiter Generale Cinematografica"
## [5037] " Jürgen Brüning Filmproduktion"
## [5038] " Juri Productions"
## [5039] " Just A Moment"
## [5040] " Just Singer Entertainment"
## [5041] " Just Vision Films"
## [5042] " Juventus Film"
## [5043] " JVC Entertainment"
## [5044] " JVC Entertainment Networks"
## [5045] " JW Films"
## [5046] " K H Productions"
## [5047] " K JAM Media"
## [5048] " K B S Productions Inc"
## [5049] " K Love Productions id"
## [5050] " K Sera Sera"
## [5051] " K2 Communications"
## [5052] " K2 SA"
## [5053] " K2K Pictures"
## [5054] " K5 Film"
## [5055] " K5 International"
## [5056] " Kaap Holland Film"
## [5057] " Kabir Khan Films"
## [5058] " Kabuli Film"
## [5059] " Kadokawa"
## [5060] " Kadokawa Eiga K K"
## [5061] " Kadokawa Haruki Jimusho"
## [5062] " Kadokawa Pictures"
## [5063] " Kadokawa Shoten Publishing Co"
## [5064] " Kadokawa Shoten Publishing Co Ltd"
## [5065] " KAFA Films"
## [5066] " Kaijyu Theater"
## [5067] " Kaikai Kiki Co"
## [5068] " Kairos Film"
## [5069] " Kaktus Producciones Cinematográficas"
## [5070] " Kaleoscope Entertainment id"
## [5071] " Kaleoscope Entertainment Pvt Ltd id"
## [5072] " Kaleoscope Films id"
## [5073] " Kali Films"
## [5074] " Kalkaska Productions"
## [5075] " Kalyana Shira Film"
## [5076] " Kamala Films"
## [5077] " Kamel Films"
## [5078] " Kamera Film Unit"
## [5079] " Kamikaze"
## [5080] " Kaminski Stiehm Film GmbH"
## [5081] " Kamoli Films"
## [5082] " Kanakna Productions"
## [5083] " Kandor Productions"
## [5084] " Kangoo Films"
## [5085] " Kanoon"
## [5086] " Kantana Animation Studios"
## [5087] " Kanzaman"
## [5088] " Kanzaman S A"
## [5089] " Kaos Cinematografica"
## [5090] " Kaos Entertainment"
## [5091] " Kapara Pictures"
## [5092] " Kaplan Film"
## [5093] " Karagiannis Karatzopoulos"
## [5094] " Karat Film"
## [5095] " Karbonshark"
## [5096] " Karé Productions"
## [5097] " Karma Films"
## [5098] " Kartemquin Films"
## [5099] " Karuna Pictures"
## [5100] " Karz Entertainment"
## [5101] " Kasander Wigman Productions"
## [5102] " Kasander Film Company"
## [5103] " Kasbah Film Tanger"
## [5104] " Kasdan Pictures"
## [5105] " Kastle Films"
## [5106] " Kastner Ladd Kanter"
## [5107] " Katakuri ke no Kôfuku Seisaku Iinkai"
## [5108] " Katalyst Films"
## [5109] " Katapult Film"
## [5110] " Kathbur Pictures"
## [5111] " Katholieke Radio Omroep KRO"
## [5112] " Katsu Production Co Ltd"
## [5113] " Katzka"
## [5114] " Katzka Jaffe"
## [5115] " Katzka Loeb"
## [5116] " Katzman Corporation"
## [5117] " Kavithalayaa Productions"
## [5118] " Kay Bee Pictures"
## [5119] " Kayos Productions"
## [5120] " Kazakhfilm Studios"
## [5121] " KBS Films"
## [5122] " Keep Films"
## [5123] " Keep Movieng"
## [5124] " Keep Your Head Productions"
## [5125] " Keith Barish Productions"
## [5126] " Keli Herd Film Company Inc"
## [5127] " Kemp Company"
## [5128] " Ken Kragen Productions"
## [5129] " Ken Lipper June Beallor Production"
## [5130] " Kennedy Marshall Company The"
## [5131] " Kennedy Miller"
## [5132] " Kennedy Miller Productions"
## [5133] " Kennesset Productions"
## [5134] " Kentucky Fried Theatre"
## [5135] " Kenwood Productions"
## [5136] " Ketchum Labs"
## [5137] " Key Entertainment"
## [5138] " Key Pix Productions"
## [5139] " Key Plus Pictures"
## [5140] " KeyAtomics"
## [5141] " keyfilm"
## [5142] " KeyFilm"
## [5143] " Keystone Entertainment"
## [5144] " Keystone Film Company"
## [5145] " Keystone Pictures"
## [5146] " KF Praha Studio kresleného a loutkového filmu"
## [5147] " KGB Films"
## [5148] " KGP Kranzelbinder Gabriele Production"
## [5149] " Khanzhonkov"
## [5150] " Khoury A Marriot Production"
## [5151] " Kibble Productions"
## [5152] " Kick Ass Pictures"
## [5153] " Kickstart Productions"
## [5154] " kickstarter"
## [5155] " Kievnauchfilm"
## [5156] " Kievskaya Kinostudiya"
## [5157] " Kihwik Cine"
## [5158] " Kiki Goshay Productions"
## [5159] " Kilburn Media"
## [5160] " Killer Films"
## [5161] " KillerWolf Films"
## [5162] " Killion Street"
## [5163] " Kim and Jim Productions"
## [5164] " Kim Ki Duk Film"
## [5165] " Kim Ki Young Production"
## [5166] " Kimera Film"
## [5167] " Kimura Productions"
## [5168] " Kindai Eiga Kyokai"
## [5169] " Kindle Entertainment"
## [5170] " Kindred Limited Partnership"
## [5171] " King Brothers Productions"
## [5172] " King Record Co"
## [5173] " King Records"
## [5174] " Kingdom of Light Entertainment"
## [5175] " Kings Road Entertainment"
## [5176] " Kingsgate Films"
## [5177] " Kingsize Entertainment"
## [5178] " Kingsway Films"
## [5179] " Kingulliit Productions"
## [5180] " Kino Kombat"
## [5181] " Kino Korsakoff"
## [5182] " Kino Link Company"
## [5183] " Kino Lorber"
## [5184] " Kino Swiat"
## [5185] " Kino veo id"
## [5186] " KinoAtis"
## [5187] " Kinodanz"
## [5188] " Kinodel"
## [5189] " Kinofirma"
## [5190] " Kinokater"
## [5191] " Kinokompaniya Kvadrat"
## [5192] " Kinokompaniya Tsar"
## [5193] " Kinokompaniya Carmen"
## [5194] " Kinokompaniya CTB"
## [5195] " Kinokultas"
## [5196] " Kinology"
## [5197] " KinoMost"
## [5198] " Kinoproduction"
## [5199] " Kinoproduction Oy"
## [5200] " Kinorama"
## [5201] " Kinos Seqtsia"
## [5202] " Kinosaurus"
## [5203] " Kinoshita Management"
## [5204] " Kinosmith"
## [5205] " Kinosto Oy"
## [5206] " Kinotar"
## [5207] " Kinowelt Filmproduktion"
## [5208] " KinoweltTV"
## [5209] " Kintop Pictures"
## [5210] " Kirghizfilm"
## [5211] " Kiryûkan"
## [5212] " Kismet Film Company"
## [5213] " Kissaki Films"
## [5214] " Kitty Films"
## [5215] " Klas Film"
## [5216] " KM Culture Co"
## [5217] " KMBO"
## [5218] " KMG Cinema"
## [5219] " KMH Film"
## [5220] " KMH One"
## [5221] " Kmunications"
## [5222] " KnightMarcher"
## [5223] " Knightsbrge Films id"
## [5224] " KNM Home Entertainment GmbH"
## [5225] " Koala Cinematografica"
## [5226] " Koan Films"
## [5227] " Koch Media"
## [5228] " KODA Entertainment"
## [5229] " Kodansha"
## [5230] " Kôdansha"
## [5231] " Kojo Pictures"
## [5232] " Kôkaku Kôtai Seisaku Iinkai id"
## [5233] " Koktebel Film Company"
## [5234] " Kokuei Company"
## [5235] " Komplizen Film"
## [5236] " Komuna"
## [5237] " Koncern TV og Filmproduktion"
## [5238] " Konigsberg Sanitsky Company"
## [5239] " Koninck Studios"
## [5240] " Konrad Pictures"
## [5241] " Kontraproduktion AG"
## [5242] " Konwiser Brothers"
## [5243] " Koo Cee Film"
## [5244] " Koo Koo Banana"
## [5245] " Kopelson Entertainment"
## [5246] " Kopli Kinokompanii"
## [5247] " Korchula Productions"
## [5248] " Korea Films"
## [5249] " Korea Pictures"
## [5250] " Korean Film"
## [5251] " Korsa Film"
## [5252] " Kosakowski Films"
## [5253] " Kosmorama"
## [5254] " Kosmos Film"
## [5255] " Kovno Communications"
## [5256] " Kowalski Films"
## [5257] " Krabat Filmproduktion"
## [5258] " Kramer Sigman Films"
## [5259] " Krasnaya Strela"
## [5260] " Krasnoff Foster Productions"
## [5261] " Krátký film Praha"
## [5262] " Krátký Film Praha"
## [5263] " Kraun"
## [5264] " Kreative Film Empire"
## [5265] " Krejaren Dramaproduktion"
## [5266] " Kremlin Films"
## [5267] " KriArj Entertainment"
## [5268] " Kristal Film"
## [5269] " Krsna Films Unit"
## [5270] " Krypton Productions"
## [5271] " Krystal Motion Picture Productions"
## [5272] " Ks in America LLC id"
## [5273] " Kshitij Production Combines"
## [5274] " KSM"
## [5275] " KSM Film"
## [5276] " KSS"
## [5277] " KTEH"
## [5278] " KTF Films"
## [5279] " Kudos Film and Television"
## [5280] " Kudos Pictures"
## [5281] " Kudos Productions Ltd"
## [5282] " Kukumajsa Productions"
## [5283] " Kultkino"
## [5284] " Kumie"
## [5285] " Kunst en Kino"
## [5286] " Kunsthochschule Kassel"
## [5287] " Künstlerische Arbeitsgruppe Babelsberg"
## [5288] " Kurata Film Company"
## [5289] " Kurier"
## [5290] " Kurîmu remon Seisaku Iinkai"
## [5291] " Kurosawa Production Co"
## [5292] " Kuukulgur Film"
## [5293] " Kuzui Enterprises"
## [5294] " Kvartal 95 Studio"
## [5295] " Kwai River"
## [5296] " Kyoto Animation"
## [5297] " L A Film Partners"
## [5298] " L A Films"
## [5299] " L C Borden Productions"
## [5300] " L espace Vision"
## [5301] " L I F T Production"
## [5302] " La Banda Films"
## [5303] " La Caméra Deluxe"
## [5304] " La Canica Films"
## [5305] " La Casa de Cine"
## [5306] " La Deantir"
## [5307] " La Fabrique"
## [5308] " La Fabrique 2"
## [5309] " La Fabrique de Films"
## [5310] " La Générale d Images"
## [5311] " La Huit Production"
## [5312] " La Jolla Productions"
## [5313] " La Lanterne"
## [5314] " La Luna Entertainment"
## [5315] " La Lune Entertainment"
## [5316] " La Maquinita CORPMAQ"
## [5317] " La Mouche du Coche Films"
## [5318] " La Nouvelle Edition Francaise"
## [5319] " La Parti Production"
## [5320] " La Parti Productions"
## [5321] " La Perla Nera"
## [5322] " La Petite Reine"
## [5323] " La Pistola"
## [5324] " La Presenza del Consiglio dei Ministri id"
## [5325] " La Sept"
## [5326] " La Sept Arte"
## [5327] " La Sept Cinéma"
## [5328] " La Société des Films Sirius"
## [5329] " La Sorcière Rouge"
## [5330] " La Unión de los Ríos"
## [5331] " La Ventura"
## [5332] " La Volpe"
## [5333] " Lab4 Productions"
## [5334] " Labo Cine do Brasil Ltda"
## [5335] " Labrador Films"
## [5336] " Labyrinthe Films"
## [5337] " Lacuna Filmes"
## [5338] " Ladd Enterprises"
## [5339] " LadobleA"
## [5340] " Lafalot"
## [5341] " Lagarto Cine"
## [5342] " Lagniappe Films"
## [5343] " Lähikuva Oy"
## [5344] " Lai Wah Film Company"
## [5345] " Laika Entertainment"
## [5346] " Lailaps Pictures"
## [5347] " Lake Films"
## [5348] " Lakeshore Drive Entertainment"
## [5349] " Lakeshore Entertainment"
## [5350] " Lakeview Productions"
## [5351] " Lakshmi Movie Makers"
## [5352] " LaLoggia Productions"
## [5353] " Lama Films"
## [5354] " Lamb Bear Entertainment"
## [5355] " Lambor Films"
## [5356] " Lamitas"
## [5357] " Lamplight Films"
## [5358] " Lance Entertainment"
## [5359] " Landers Roberts Productions"
## [5360] " Landing Patch Productions"
## [5361] " Landroval Studios"
## [5362] " Landscape Entertainment"
## [5363] " Lane Street Pictures"
## [5364] " Langfilm"
## [5365] " Långfilm Productions Finland Oy"
## [5366] " Lantana"
## [5367] " Lantis"
## [5368] " Lanzadera Films"
## [5369] " Laokoon Filmgroup"
## [5370] " Larande Productions"
## [5371] " Larco Productions"
## [5372] " Large Format Cinema"
## [5373] " Larger Than Life Productions"
## [5374] " Largo Entertainment"
## [5375] " Larkin Goldstein Productions"
## [5376] " Larry Darmour Productions"
## [5377] " Larry Levinson Productions"
## [5378] " Lascaux Films"
## [5379] " Laser"
## [5380] " Laser Film Corporation"
## [5381] " Laser Films"
## [5382] " Laser Unicorns"
## [5383] " Lasihelmi Filmi"
## [5384] " Lasihelmi Filmi Oy"
## [5385] " Lasky Monka"
## [5386] " Lasse Forsberg Produktion AB"
## [5387] " Last British Dragon"
## [5388] " Last Cab Productions"
## [5389] " Last Picture Pro"
## [5390] " Last Rites of Joe May The"
## [5391] " Late Night and Weekends"
## [5392] " Latent Image"
## [5393] " Laterna Film"
## [5394] " Latex Lair Productions"
## [5395] " Latglen Ltd"
## [5396] " Laugh O Gram Films"
## [5397] " Laughlin Park Pictures"
## [5398] " Launchpad Productions"
## [5399] " Laundry Films"
## [5400] " Laura Ziskin Productions"
## [5401] " Laurel Entertainment"
## [5402] " Laurel Entertainment Inc"
## [5403] " Laurel Films"
## [5404] " Laurel Group"
## [5405] " Laurelwood Productions Inc"
## [5406] " Laurence Mark Productions"
## [5407] " Laurenfilm"
## [5408] " Laurinfilm"
## [5409] " Lava Bear Films"
## [5410] " Lavorágine Films"
## [5411] " Lawrence Bender Productions"
## [5412] " Lawrence Turman"
## [5413] " Lawrence Turman Films Inc"
## [5414] " Layton Film Productions Inc"
## [5415] " Lazennec et Associés"
## [5416] " Lazennec Films"
## [5417] " Lazer Entertainment"
## [5418] " LazyTown Entertainment"
## [5419] " LB Film Veo id"
## [5420] " LC Pictures"
## [5421] " LD Entertainment"
## [5422] " Lderdalei Productions id"
## [5423] " Le Big Boss Productions"
## [5424] " Le Bureau"
## [5425] " Le Cercle"
## [5426] " Le Film d Art"
## [5427] " Le Fresnoy Studio National des Arts Contemporains"
## [5428] " Le joy Animation Studio"
## [5429] " Le Monde Entertainment"
## [5430] " Le Pacte"
## [5431] " Le Studio Canal+"
## [5432] " Le Vision Pictures"
## [5433] " Lea Film"
## [5434] " Leach Rankin Productions"
## [5435] " League of Noble Peers"
## [5436] " Lean M"
## [5437] " Leda Films Productions S L"
## [5438] " Lee Daniels Entertainment"
## [5439] " Lee Lee Films"
## [5440] " Left Bank Pictures"
## [5441] " Left Field Ventures"
## [5442] " Left of Center Entertainment"
## [5443] " Left Right"
## [5444] " Left Turn Films"
## [5445] " Lefwander Kapitalförvaltning AB"
## [5446] " Legacy Filmworks"
## [5447] " Legendary Digital Media"
## [5448] " Legendary Pictures"
## [5449] " Légende Films"
## [5450] " Legion Entertainment"
## [5451] " LEGO"
## [5452] " Leisure Investment Company"
## [5453] " Lemming Film"
## [5454] " Lemon Films"
## [5455] " Lemon Tea Productions"
## [5456] " Len Films id"
## [5457] " Lenfilm"
## [5458] " Lenfilm Studio"
## [5459] " Leni Riefenstahl Produktion"
## [5460] " Leningrad Popular Science Film Studio"
## [5461] " Leon Fromkess Sam Firks Productions"
## [5462] " Leon Schlesinger Studios"
## [5463] " Leonard Hill Films"
## [5464] " Leonas Films id"
## [5465] " Leone Film"
## [5466] " Leone Film Roma"
## [5467] " Leonine Verse"
## [5468] " Leontine Pictures"
## [5469] " Leopard Drama"
## [5470] " Leopolis"
## [5471] " Lereby"
## [5472] " Lereby Productions"
## [5473] " Les Armateurs"
## [5474] " Les Artistes Anonymes"
## [5475] " Les Ballets Suedois"
## [5476] " Les Cinémas de la Zone"
## [5477] " Les Établissements Braunberger Richebé"
## [5478] " Les Établissements Jacques Haïk"
## [5479] " Les Films 13"
## [5480] " Les Films 21"
## [5481] " Les Films ABC"
## [5482] " Les Films Alain Sarde"
## [5483] " Les Films Alyne"
## [5484] " Les Films Ariane"
## [5485] " Les Films Christian Fechner"
## [5486] " Les Films Concordia"
## [5487] " Les Films Copernic"
## [5488] " Les Films Corona"
## [5489] " Les Films d Ici"
## [5490] " Les Films de l Ange"
## [5491] " Les Films de l Après Mi id"
## [5492] " Les Films de l Astrophore"
## [5493] " Les Films de l Atalante"
## [5494] " Les Films de L Autre"
## [5495] " Les Films de L Observatoire"
## [5496] " Les films de la butte"
## [5497] " Les Films de la Grande Ourse"
## [5498] " Les Films de la Pléiade"
## [5499] " Les Films de la Suane"
## [5500] " Les Films de Pierre"
## [5501] " Les Films des Tournelles"
## [5502] " Les films du 24"
## [5503] " Les films du Bélier"
## [5504] " Les Films du Carrosse"
## [5505] " Les Films du Diamant"
## [5506] " Les Films Du Fleuve"
## [5507] " Les Films du Griffon"
## [5508] " Les Films du Jeudi"
## [5509] " Les Films du Kiosque"
## [5510] " Les Films du Lendemain"
## [5511] " Les Films du Losange"
## [5512] " Les Films du Loup"
## [5513] " Les Films du Nouveau Monde"
## [5514] " Les Films du Paradoxe"
## [5515] " Les Films du Poisson"
## [5516] " Les Films du Requin"
## [5517] " Les Films du Siècle"
## [5518] " Les Films du Triangle"
## [5519] " Les Films du Veyrier"
## [5520] " Les films du Worso"
## [5521] " Les Films Français"
## [5522] " Les Films Galaxie"
## [5523] " Les Films Gibé"
## [5524] " Les Films Hatari"
## [5525] " Les Films Jacques Leitienne"
## [5526] " Les Films Jean Renoir"
## [5527] " Les Films Manuel Munz"
## [5528] " Les Films Marceau"
## [5529] " Les Films Marceau Cocinor"
## [5530] " Les Films Marcel Pagnol"
## [5531] " Les Films Marcel Vandal et Charles Delac"
## [5532] " Les Films Modernes"
## [5533] " Les Films Number One"
## [5534] " Les Films Pelléas"
## [5535] " Les Films Pomereu"
## [5536] " Les Films Raoul Ploquin"
## [5537] " Les films singuliers"
## [5538] " Les Films velvet"
## [5539] " Les Meutes Films"
## [5540] " Les Productions Artistes Associés"
## [5541] " Les Productions Bagheera"
## [5542] " Les Productions Belles Rives"
## [5543] " Les Productions du Champ Poirier"
## [5544] " Les Productions du Trésor"
## [5545] " Les Productions Fox Europa"
## [5546] " Les Productions Jacques Roitfeld"
## [5547] " Les Productions La Fête Inc"
## [5548] " Les Productions Mutuelles Ltée"
## [5549] " Les Productions Unité Centrale"
## [5550] " Leslie Iwerks Productions"
## [5551] " Lesson 1 Entertainment"
## [5552] " Lester Cowan Productions"
## [5553] " Leucadia Film Corporation"
## [5554] " Levantine Entertainment"
## [5555] " Level 10 Films"
## [5556] " Level Path Productions"
## [5557] " Levins Henenlotter"
## [5558] " LeVision Pictures"
## [5559] " Levity Entertainment Group"
## [5560] " Levity Productions"
## [5561] " Levy Gardner Laven"
## [5562] " Lew Seiler Productions"
## [5563] " Lewis Gilbert Productions"
## [5564] " Lewis Motion Picture Enterprisee"
## [5565] " Lewis Pictures"
## [5566] " Lexyn Productions"
## [5567] " LGM Productions"
## [5568] " Liaison Cinématographique"
## [5569] " Liaison Films"
## [5570] " Lianhua Film Company"
## [5571] " Liberal Region Productions"
## [5572] " Liberation Company"
## [5573] " Liberty Films UK"
## [5574] " Liberty Pictures"
## [5575] " Libo Cine id"
## [5576] " Libra Film"
## [5577] " Libra Pictures"
## [5578] " Libra Productions Inc"
## [5579] " Licht Mueller Film Corporation"
## [5580] " Lichthof Productions Ltd"
## [5581] " Lieblingsfilm"
## [5582] " Lietuvos Kinostudija"
## [5583] " Life Pictures"
## [5584] " Life Out Loud Films LOL"
## [5585] " Life Sentence Films"
## [5586] " Lifeboat News"
## [5587] " Lifelike Picture"
## [5588] " LifeLike Pictures"
## [5589] " Lifetime"
## [5590] " Lifetime Movie Network"
## [5591] " Lifetime Network"
## [5592] " Lifetime Television"
## [5593] " Lifetime TV"
## [5594] " Liger Films"
## [5595] " Lightbox Entertainment"
## [5596] " Lighthouse Films Pvt Ltd"
## [5597] " Lighthouse Home Entertainment"
## [5598] " Lighthouse Pictures"
## [5599] " Lightning Entertainment"
## [5600] " Lightning Pictures"
## [5601] " Lightshow Communications"
## [5602] " Lightstorm Entertainment"
## [5603] " Lightstream Pictures"
## [5604] " LightWave Entertainment"
## [5605] " Lightyear Entertainment"
## [5606] " Likely Story"
## [5607] " Lila 9th Productions"
## [5608] " Lillród Film"
## [5609] " Lima Productions"
## [5610] " Limbo Film AG"
## [5611] " Limbrge id"
## [5612] " Limelight International Media Entertainment"
## [5613] " Limelight Productions"
## [5614] " Limerent Pictures"
## [5615] " Limited Edition Productions Inc"
## [5616] " Lin Pictures"
## [5617] " Lindberg Kristensen Film"
## [5618] " Lindemann Entertainment Group"
## [5619] " Lindsay Shonteff Film Productions Limited"
## [5620] " Line by Line Productions"
## [5621] " Linebrook"
## [5622] " Linson Entertainment"
## [5623] " Lion International"
## [5624] " Lion Pictures"
## [5625] " Lion Rock Productions"
## [5626] " Lion s Gate Films"
## [5627] " Lions Gate"
## [5628] " Lions Gate Enterntainment"
## [5629] " Lions Gate Entertainments"
## [5630] " Lions Gate Family Entertainment"
## [5631] " Lions Gate Films"
## [5632] " Lions Gate Television"
## [5633] " Lionsgate"
## [5634] " LionsGate"
## [5635] " Lionsgate Television"
## [5636] " Lippert Films"
## [5637] " Lippert Pictures"
## [5638] " Lipsync Productions"
## [5639] " Liqu Films id"
## [5640] " Lira Films"
## [5641] " Lisa Film"
## [5642] " Lisa Film GmbH München"
## [5643] " Lisberger Studios"
## [5644] " Lise Lense Møller Film"
## [5645] " Little Bear"
## [5646] " Little Bird Films"
## [5647] " Little Crew Studios"
## [5648] " Little Dragon Productions"
## [5649] " Little Fugitive Production Company"
## [5650] " Little Horse Crossing the River"
## [5651] " Little More Co"
## [5652] " Little Shark Entertainment GmbH"
## [5653] " Little Stranger"
## [5654] " Little Wing Films"
## [5655] " Little Wing Productions"
## [5656] " Live Entertainment"
## [5657] " Live Wire Films"
## [5658] " Livin Man Productions"
## [5659] " Living Condition LLC"
## [5660] " Living Films"
## [5661] " Living Out Loud Films"
## [5662] " Lizard Cinema Trade"
## [5663] " Lizland Films"
## [5664] " LJ Film"
## [5665] " Ljubavny Film"
## [5666] " Llama Films"
## [5667] " Lleju Productions"
## [5668] " Lloyd Hamilton Corporation"
## [5669] " LLT Productions"
## [5670] " LMN Productions"
## [5671] " Lo Wei Motion Picture Company"
## [5672] " lobos grande"
## [5673] " Lobster Enterprises"
## [5674] " Local Films"
## [5675] " Loco Dawn Films"
## [5676] " Locomotion Films"
## [5677] " Locomotive"
## [5678] " Locomotive Productions"
## [5679] " Lodestar Entertainment"
## [5680] " Lodz Film School"
## [5681] " Loew s"
## [5682] " Loew s Incorporated"
## [5683] " logan films"
## [5684] " Loin Derrière L Oural"
## [5685] " Lois Weber Productions"
## [5686] " Loki Films"
## [5687] " LOL Comedy TV"
## [5688] " Lola Entertainment"
## [5689] " Lolafilms"
## [5690] " Lolafilms Artedis"
## [5691] " Loma Nasha"
## [5692] " Loma Nasha Films"
## [5693] " Loma Vista Productions"
## [5694] " London Cannon Films"
## [5695] " London Film Productions"
## [5696] " London Independent Producers"
## [5697] " London Weekend Television LWT"
## [5698] " Lone Star Corporation"
## [5699] " Lone Star Production"
## [5700] " Lone Star Productions"
## [5701] " Lone Wolf Productions"
## [5702] " Lonely Film Productions GmbH Co KG"
## [5703] " Long Shong Pictures"
## [5704] " Longfellow Productions"
## [5705] " Longitude Entertainment"
## [5706] " Longrge Enterprises id"
## [5707] " Longview Pictures"
## [5708] " Longway Films"
## [5709] " Look Now"
## [5710] " Lookalike Productions LLC"
## [5711] " Lookout Entertainment"
## [5712] " Lookout Films"
## [5713] " Lord of the Wind"
## [5714] " Lorimar Film Entertainment"
## [5715] " Lorimar Motion Pictures"
## [5716] " Lorimar Pictures"
## [5717] " Lorimar Productions"
## [5718] " Lorrimer Films"
## [5719] " Los Altos Productions"
## [5720] " Los Güeros Films"
## [5721] " Lost Boy Pictures"
## [5722] " Lost Rhino Films"
## [5723] " Lost Toys"
## [5724] " Lost Witness Pictures"
## [5725] " Loteria Films"
## [5726] " Lotte Entertainment"
## [5727] " Lotus Film"
## [5728] " LOTUS Film GmbH für ORF"
## [5729] " Lotus Films"
## [5730] " Lotus Production"
## [5731] " Lou Yi Inc"
## [5732] " Louisiana Media Productions"
## [5733] " Louisiana Production Consultants"
## [5734] " Louverture Films"
## [5735] " Love Finds You Productions"
## [5736] " Love Lane Pictures"
## [5737] " Love Project Films"
## [5738] " Love Streams Productions"
## [5739] " Loveless"
## [5740] " Lovina Productions"
## [5741] " Low Sky Productions"
## [5742] " Low Spark Films"
## [5743] " Lower East Se Films id"
## [5744] " Lowndes Productions Limited"
## [5745] " LQ JAF"
## [5746] " LSL Productions"
## [5747] " LTN Productions Inc"
## [5748] " Lube"
## [5749] " Luc id"
## [5750] " Lucasfilm"
## [5751] " Lucía Films"
## [5752] " Lucky Bird Pictures"
## [5753] " Lucky Coffee Productions"
## [5754] " Lucky Monkey Pictures"
## [5755] " Lucky Red"
## [5756] " Lucky UKFS"
## [5757] " Luis Buñuel"
## [5758] " Luis Trenker Film"
## [5759] " Luiz Carlos Barreto Produções Cinematográficas"
## [5760] " Lumanity Production"
## [5761] " Lumen Films"
## [5762] " Lumiere"
## [5763] " Lumière"
## [5764] " Lumiere Film Company"
## [5765] " Luminant Media"
## [5766] " Luminous Film Veo Works id"
## [5767] " Luminous Processes"
## [5768] " Luna Filmproduktion"
## [5769] " Luna Films"
## [5770] " Lunacy Unlimited Productions"
## [5771] " Lunafilms Audiovisual"
## [5772] " Lunaflux Productions"
## [5773] " Lunamine"
## [5774] " Lunanime"
## [5775] " Lunar Films"
## [5776] " Lunaris Film"
## [5777] " Lunch Box Entertainment"
## [5778] " Lunde Film"
## [5779] " Lung Cheung Company Limited"
## [5780] " Lupin Film"
## [5781] " Lupo Anthony Quintano Productions"
## [5782] " Lurco Films"
## [5783] " Lüthje Schneer Filmproduktion id"
## [5784] " Lux Digital Pictures"
## [5785] " Lux Film"
## [5786] " Lux Ve id"
## [5787] " Luxfilm"
## [5788] " LWH77 Productions"
## [5789] " Lyara Films"
## [5790] " Lyceum Films"
## [5791] " Lynch Films"
## [5792] " Lynn Peak Productions"
## [5793] " Lynn Romero Productions"
## [5794] " Lynn Shelton"
## [5795] " Lynx Films Ltd"
## [5796] " Lyuksor"
## [5797] " M R Films"
## [5798] " M O B Movies"
## [5799] " M 80 Films"
## [5800] " M America Pictures id"
## [5801] " M Atlantic Film id"
## [5802] " M Atlantic Films id"
## [5803] " M B FILM3 BV"
## [5804] " M C M"
## [5805] " M Century Film Productions Ltd id"
## [5806] " M E G A Films"
## [5807] " M K D Films Combine"
## [5808] " M Line Distribution"
## [5809] " M M Productions"
## [5810] " M3"
## [5811] " M3 Entertainment"
## [5812] " M6 Films"
## [5813] " M6 Métropole Télévision"
## [5814] " MA JA DE Fiction"
## [5815] " Ma Ja De Filmproduktion"
## [5816] " Mabel Normand Feature Film Company"
## [5817] " Mace Neufeld Productions"
## [5818] " MacGillivray Freeman Films"
## [5819] " MacGowan Films"
## [5820] " Mack Sennett Comedies"
## [5821] " MACT Productions"
## [5822] " Mad Chance"
## [5823] " Mad Circus Films"
## [5824] " Mad Dimension"
## [5825] " Mad Dog Pictures"
## [5826] " Mad Films"
## [5827] " Mad Films Mi"
## [5828] " Madcap Entertainment"
## [5829] " Made"
## [5830] " Made in Copenhagen"
## [5831] " Made In Film Land"
## [5832] " Made Oy"
## [5833] " Madeleine Films"
## [5834] " Madera Productions"
## [5835] " Madhouse"
## [5836] " Madison Road Entertainment"
## [5837] " Madisonian Films"
## [5838] " Madman Entertainment"
## [5839] " Madragoa Filmes"
## [5840] " Madras Talkies"
## [5841] " Maen Woods Films id"
## [5842] " Mafilm"
## [5843] " MAFILM 4 Játékfilmstúdió"
## [5844] " MAFILM Dialóg Filmstúdió"
## [5845] " MAFILM Hunnia Stúdió"
## [5846] " MAFILM IV Játékfilmstúdió"
## [5847] " MAFILM Stúdió 1"
## [5848] " MAFIRT"
## [5849] " Magali Films"
## [5850] " Magen Boys Entertainment"
## [5851] " Magic Elevator"
## [5852] " Magic Frames"
## [5853] " Magic Head Film Production"
## [5854] " Magic Hour Films ApS"
## [5855] " Magic Hour Pictures"
## [5856] " Magic Light Pictures"
## [5857] " Magilm Pictures"
## [5858] " Magirus Film"
## [5859] " Magla Productions"
## [5860] " Maglan"
## [5861] " Magna Global Entertainment"
## [5862] " Magnet Releasing"
## [5863] " Magnolia Filmproduktion"
## [5864] " Magnolia Mae Films"
## [5865] " Magnolia Pictures"
## [5866] " Magnum"
## [5867] " Magnum Films"
## [5868] " Magnum Motion Pictures Inc"
## [5869] " Magnus Filmes"
## [5870] " Magson Films id"
## [5871] " Maguire Entertainment"
## [5872] " Magus Productions"
## [5873] " Mahal Pictures Pvt Ltd"
## [5874] " Mahzen s Film"
## [5875] " Maïa Films"
## [5876] " Main Street Movie Company"
## [5877] " Mainframe Entertainment"
## [5878] " Mainichi Shinbunsha"
## [5879] " Mainline Pictures"
## [5880] " Mainline Releasing"
## [5881] " Mainstay Productions"
## [5882] " Mainstream Pictures Oy"
## [5883] " Mainstreet Productions"
## [5884] " Maipo"
## [5885] " Maipo Film"
## [5886] " Maipo Film og TV Produksjon"
## [5887] " Maítrise Artisanale de l Industrie Cinematographique MAIC"
## [5888] " Maj Majidi Film Production id"
## [5889] " Majestic Filmproduktion"
## [5890] " Majestic Films"
## [5891] " Majestic Films International"
## [5892] " Majestic Motion Picture Company"
## [5893] " Major Independents"
## [5894] " Makar Productions"
## [5895] " Makhmalbaf Productions"
## [5896] " Maki Production"
## [5897] " Making Movies"
## [5898] " Making Movies Oy"
## [5899] " Makmalbaf Film House"
## [5900] " Maksim Gorki Studio"
## [5901] " Makuhari Media"
## [5902] " Malay Film Productions Ltd"
## [5903] " Malibu Bay Films"
## [5904] " Malibu Productions"
## [5905] " Maljack Productions"
## [5906] " Malka Media Group"
## [5907] " Malofilm"
## [5908] " Malpaso Productions"
## [5909] " Mama Bear Studios"
## [5910] " Mammoth Screen"
## [5911] " Man s Films"
## [5912] " Management 360"
## [5913] " Management Company Entertainment Group MCEG"
## [5914] " Mancantoo Oy"
## [5915] " Mandalay Entertainment"
## [5916] " Mandalay Pictures"
## [5917] " Mandalay Sports Media MSM"
## [5918] " Mandalay Television"
## [5919] " Mandalay Vision"
## [5920] " Mandarin Cinéma"
## [5921] " Mandarin Film"
## [5922] " Mandarin Films"
## [5923] " Mandarin Films Distribution Co"
## [5924] " Mandate Pictures"
## [5925] " Mandeville"
## [5926] " Mandeville Films"
## [5927] " Mandragora"
## [5928] " Mandragora Movies"
## [5929] " Maneglia Schémbori Realizadores"
## [5930] " Manesco Films"
## [5931] " Manfred Guthe"
## [5932] " Manga"
## [5933] " Manga Films"
## [5934] " MangoFilm"
## [5935] " Mangusta Productions"
## [5936] " Manhattan Productions"
## [5937] " Manifesto Films"
## [5938] " MANIFOLD PICTURE"
## [5939] " Manigolda Film"
## [5940] " Manila Cinematografica"
## [5941] " Manis Film"
## [5942] " Mankurt Media"
## [5943] " Mann Caan Productions"
## [5944] " Mannatee Films"
## [5945] " Mannequin Films"
## [5946] " Manny O Productions"
## [5947] " Mansfield Productions"
## [5948] " Manson International"
## [5949] " Mantarraya Producciones"
## [5950] " Many Cups of Chai Films"
## [5951] " Many Rivers Film"
## [5952] " Mapa Filmes"
## [5953] " Maple Island Films"
## [5954] " Mapofilm"
## [5955] " Mar Vista Productions"
## [5956] " Maran Film"
## [5957] " Marauder Works"
## [5958] " Marble Hall"
## [5959] " Marc Platt Productions"
## [5960] " Marcel Hellman Productions"
## [5961] " Marcel Robertson Productions Limited"
## [5962] " Mare Nostrum Productions"
## [5963] " Marfa"
## [5964] " Margate House Films"
## [5965] " Margin Films"
## [5966] " Margo Films"
## [5967] " Maria Farinha Filmes"
## [5968] " Marianna Films"
## [5969] " Marianna Films Oy"
## [5970] " Marianne Productions"
## [5971] " Marimark"
## [5972] " Marimark Productions"
## [5973] " Mario e Vittorio Cecchi Gori C E I A D"
## [5974] " Mario Zampi Productions"
## [5975] " mark edwards robert production"
## [5976] " Mark Films Ltd"
## [5977] " Mark Forstater Productions Ltd"
## [5978] " Mark Hellinger Productions"
## [5979] " Mark Johnson Productions"
## [5980] " Mark Stevens Productions"
## [5981] " Mark VII Ltd"
## [5982] " Mark Williams Films"
## [5983] " Market Road Films"
## [5984] " Marlboro Road Gang Productions"
## [5985] " Marmot film"
## [5986] " Marni Film"
## [5987] " Marquette Productions Ltd"
## [5988] " Marquis Film"
## [5989] " Marquis Productions"
## [5990] " Marro Films"
## [5991] " Mars Dagitim"
## [5992] " Mars Distribution"
## [5993] " Mars Films"
## [5994] " Mars Media Entertainment"
## [5995] " Mars Production Corporation"
## [5996] " Marshall Law Entertainment"
## [5997] " Marshall Raboy Productions"
## [5998] " Marshville Productions"
## [5999] " Marta Cabrera"
## [6000] " Marten Pictures"
## [6001] " Martien Holdings A V V"
## [6002] " Martin Chase Productions"
## [6003] " Martin Mooney Productions"
## [6004] " Martin Poll Productions"
## [6005] " Marubeni"
## [6006] " Marui Kobunsha Corporation"
## [6007] " Maruti International"
## [6008] " Marvel Animation"
## [6009] " Marvel Studios"
## [6010] " Marvin Worth Productions"
## [6011] " Marvista Entertainment"
## [6012] " Marwood Pictures"
## [6013] " Mary Murphy Company"
## [6014] " Mary Pickford Company"
## [6015] " Mas Filmes id"
## [6016] " Mascaret Films"
## [6017] " Mascot Picture Corp"
## [6018] " Mascot Pictures"
## [6019] " Masnomis"
## [6020] " Maso Co Productions"
## [6021] " Mass Appeal"
## [6022] " Masses Entertainment"
## [6023] " Masthead Productions"
## [6024] " Matador Films"
## [6025] " Matador Pictures"
## [6026] " Match Factory The"
## [6027] " Matchbox Pictures"
## [6028] " Mate Producciones S A"
## [6029] " Matheus S r l"
## [6030] " Matila Röhr Productions MRP"
## [6031] " Matila Röhr Productions Oy"
## [6032] " Mattel"
## [6033] " Mattel Creations"
## [6034] " Mattel Entertainment"
## [6035] " Mattel Playground Productions"
## [6036] " Maura International Films"
## [6037] " Maurice Cowan Productions"
## [6038] " Maurice Devereaux Productions"
## [6039] " Maurice McEndree Productions"
## [6040] " Maurice Tourneur Productions"
## [6041] " Mavi Film"
## [6042] " Max Baer Productions"
## [6043] " Max Films"
## [6044] " Max Films Productions"
## [6045] " Max L Raab Productions"
## [6046] " Max Linder Productions"
## [6047] " Max TV"
## [6048] " Maxam"
## [6049] " Maxim Productions"
## [6050] " Maxima Pictures"
## [6051] " Maximage GmbH"
## [6052] " Maxper Producciones Cinematográficas Maximiliano Pérez Flórez"
## [6053] " Maya Productions"
## [6054] " Mayflower Pictures"
## [6055] " Mayflower Pictures Corporation"
## [6056] " Maymon Film Inc"
## [6057] " Mayo Productions"
## [6058] " Maysles Films"
## [6059] " MAZEfilms"
## [6060] " Mazel Productions"
## [6061] " MB Productions"
## [6062] " MBF Erste Filmproduktionsgesellschaft"
## [6063] " MC4 Productions"
## [6064] " MCA Universal Pictures"
## [6065] " McElroy McElroy"
## [6066] " MCI"
## [6067] " MCN Productions"
## [6068] " MCP Sound Media GmbH"
## [6069] " MD Pictures"
## [6070] " Mdle Child Productions id"
## [6071] " Mdle Fork Productions id"
## [6072] " Mdle Reef id"
## [6073] " Mdle Road Pictures id"
## [6074] " MDP Filmproduktion"
## [6075] " MDP Worldwe id"
## [6076] " Meadway"
## [6077] " Meadway Productions"
## [6078] " Medal Lion Entertainment"
## [6079] " Meddin Studios"
## [6080] " Media 8 Entertainment"
## [6081] " Media Asia Film"
## [6082] " Media Asia Films"
## [6083] " Media Asia Films Ltd"
## [6084] " Media Darling"
## [6085] " Media Education Foundation"
## [6086] " Media Filmes"
## [6087] " Media House Capital"
## [6088] " media in sy"
## [6089] " Media Max Productions"
## [6090] " Media Plus"
## [6091] " Media Pro Pictures"
## [6092] " MEDIA Programme of the European Union"
## [6093] " Media Rights Capital"
## [6094] " Media Talent Group"
## [6095] " Media World Television"
## [6096] " Mediacorp Raintree Pictures"
## [6097] " Mediajuice Studios"
## [6098] " MediaPark Film und Fernsehproduktions"
## [6099] " Mediapro"
## [6100] " MediaPro Pictures"
## [6101] " Mediapro Studios"
## [6102] " Mediaset"
## [6103] " MediaTrade"
## [6104] " Medienboard Berlin Brandenburg"
## [6105] " Medienproduktion GmbH"
## [6106] " Medienwerkstatt Wien"
## [6107] " Mediterranean Film Production Co Ltd"
## [6108] " Medusa Distribuzione"
## [6109] " Medusa Film"
## [6110] " Medusa Produzione"
## [6111] " Meech Grant Production"
## [6112] " Mega Film"
## [6113] " Mega Film id"
## [6114] " Mega Vision Pictures MVP"
## [6115] " Megalovision"
## [6116] " Mehboob Productions"
## [6117] " Mehmood Productions"
## [6118] " Mei Ah Entertainment"
## [6119] " Mei Ah Films Production Co Ltd"
## [6120] " Melampo Cinematografica"
## [6121] " Melee Entertainment"
## [6122] " Melenny Productions"
## [6123] " Melhores do mundo"
## [6124] " MelinaFilm"
## [6125] " Melnitsa Animation Studio"
## [6126] " Melodrama Pictures"
## [6127] " Melusine Productions"
## [6128] " Mélusine Productions"
## [6129] " Melville Productions"
## [6130] " Melville Talbot Productions"
## [6131] " Melvin Simon Productions"
## [6132] " Memento Films Distribution"
## [6133] " Memento Films Production"
## [6134] " Memfis Film"
## [6135] " Memnon Films"
## [6136] " Memorial Enterprises"
## [6137] " Memory"
## [6138] " MeniThings LLC"
## [6139] " menuet"
## [6140] " Menuet"
## [6141] " Mephisto Film"
## [6142] " Mer Film"
## [6143] " Merchant Films"
## [6144] " Merchant Ivory Productions"
## [6145] " Merchant Pacific Corporation"
## [6146] " Mercurio Domina"
## [6147] " Mercury"
## [6148] " Mercury Film International"
## [6149] " Mercury Films"
## [6150] " Mercurybar Productions"
## [6151] " Mercy Creek Entretainment"
## [6152] " Merian Broadcasting Ltd id"
## [6153] " Merlin Films"
## [6154] " Merlin Productions"
## [6155] " Merope"
## [6156] " Merry Film"
## [6157] " Merton Park Studios"
## [6158] " Messick Films"
## [6159] " Messor Films id"
## [6160] " Met Film Production"
## [6161] " Meta Film"
## [6162] " Metafilms"
## [6163] " Metakwon Filmworks"
## [6164] " Metaluna Productions"
## [6165] " Metanoia Films"
## [6166] " Metaphor Films"
## [6167] " Metaphor Production"
## [6168] " Metaxa Corporation"
## [6169] " Meteor 17"
## [6170] " Meteor Film GmbH"
## [6171] " Meteor Film Productions"
## [6172] " Metheus Film"
## [6173] " MetraFilms"
## [6174] " Metro Communications"
## [6175] " Metro Filmes"
## [6176] " Metro Films"
## [6177] " Metro Goldwyn Mayer"
## [6178] " Metro Goldwyn Mayer MGM"
## [6179] " Metro Goldwyn Mayer British Studios"
## [6180] " Metro Goldwyn Pictures Corporation"
## [6181] " Metro Pictures"
## [6182] " Metro Pictures Corporation"
## [6183] " Metrodome Distribution"
## [6184] " Metrodome Films"
## [6185] " Metromedia Producers"
## [6186] " Metromedia Producers Corporation"
## [6187] " Metromedia Producers Corporation MPC"
## [6188] " Metromedia Productions"
## [6189] " Metronome Productions"
## [6190] " Metronome Studios AB"
## [6191] " Metropolitan Filmexport"
## [6192] " Metropolitan International Pictures"
## [6193] " Mexiko Media"
## [6194] " Mezhrabpom Rus"
## [6195] " Mezhrabpomfilm"
## [6196] " MFA Filmdistribution"
## [6197] " MFG Film"
## [6198] " Mfield Films id"
## [6199] " MG Media"
## [6200] " MGM"
## [6201] " MGM Home Entertainment"
## [6202] " MGM Home Veo id"
## [6203] " MGM Television"
## [6204] " MGM UA Television"
## [6205] " MGN Filmes"
## [6206] " MGS Film"
## [6207] " Mia Cinematografica id"
## [6208] " Michael Balcon Productions"
## [6209] " Michael Cacoyannis Productions"
## [6210] " Michael Curtiz Productions"
## [6211] " Michael De Luca Productions"
## [6212] " Michael London Productions"
## [6213] " Michael Mailer Films"
## [6214] " Michael Obel Productions"
## [6215] " Michael Todd Company"
## [6216] " Michael White Productions"
## [6217] " Michaelgion"
## [6218] " Micheaux Book Film Company"
## [6219] " Micheaux Film"
## [6220] " Micott Basara K K"
## [6221] " micro scope"
## [6222] " Micro scope"
## [6223] " Microsoft"
## [6224] " Microwave Film"
## [6225] " MIG Film GmbH"
## [6226] " Migdal Filmes"
## [6227] " Miggles Corporation"
## [6228] " Mighty Cheese Productions"
## [6229] " Migma Film AB"
## [6230] " Miin Pictures"
## [6231] " Mij Film Co"
## [6232] " Mikado Film"
## [6233] " Mike Lobell Productions"
## [6234] " Mike Zoss Productions"
## [6235] " Mikona Productions GmbH Co KG"
## [6236] " Mil Nubes Cine"
## [6237] " Mila Cinematografica"
## [6238] " Milagro Films"
## [6239] " Milano Films"
## [6240] " Mile End Films West"
## [6241] " Mile High Productions"
## [6242] " Miles Films"
## [6243] " Miles Productions"
## [6244] " Milestone Film Veo id"
## [6245] " Milestone FIlms"
## [6246] " Milestone Productions"
## [6247] " Mili Pictures"
## [6248] " Mililifilms"
## [6249] " Milimetros Feature Animation"
## [6250] " Milky Way Image Company"
## [6251] " Millas Film"
## [6252] " Millbrook Farm Productions"
## [6253] " Mille et Une Productions"
## [6254] " Millenium Films"
## [6255] " Millennium Films"
## [6256] " Millennium Pictures"
## [6257] " Millennium Storm"
## [6258] " Miller Consolated Pictures MCP id"
## [6259] " Million Dollar Productions"
## [6260] " Mimosa Films"
## [6261] " Mind In Motion Productions"
## [6262] " Mindfire Entertainment"
## [6263] " Minds Eye Entertainment"
## [6264] " Minds Meet"
## [6265] " MindSmack Productions"
## [6266] " Mindwalk"
## [6267] " MindWorks Media"
## [6268] " Mine Film"
## [6269] " Minerva Film SpA"
## [6270] " Mingxing Film Company"
## [6271] " Mini Studios"
## [6272] " MiniFlix Films"
## [6273] " Ministère de la Culture"
## [6274] " Ministère de la Culture et de la Francophonie"
## [6275] " Ministère des Affaires Étrangères"
## [6276] " Ministerie van Nederlandse Kultuur"
## [6277] " Ministerio de Cultura"
## [6278] " Ministero del Turismo e dello Spettacolo"
## [6279] " Ministero per i Beni e le Attività Culturali"
## [6280] " Ministero per i Beni e le Attività Culturali MiBAC"
## [6281] " Ministry of Culture and Tourism"
## [6282] " Ministry of Culture of the Russian Federation"
## [6283] " Ministry of Information"
## [6284] " Ministry of Propaganda Films"
## [6285] " Minotaur"
## [6286] " Minotaur Productions"
## [6287] " Mint AB"
## [6288] " Minutehand Pictures"
## [6289] " Mira Filmes"
## [6290] " Mirabai Films"
## [6291] " Miracin Korea Film Company"
## [6292] " Miracle Pictures"
## [6293] " Mirage Atlantic"
## [6294] " Mirage Cinematografica"
## [6295] " Mirage Enterprises"
## [6296] " Miramax"
## [6297] " Miramax Films"
## [6298] " Mirashin Korea"
## [6299] " Miravista Films"
## [6300] " Mirco Slavco First Partizan Production"
## [6301] " Mirisch Corporation The"
## [6302] " Mirisch Films"
## [6303] " Mirofilm"
## [6304] " Miroir Magique"
## [6305] " Mirovision"
## [6306] " Mirovision Inc"
## [6307] " Mirror Images LTD"
## [6308] " Mirror Maze"
## [6309] " Mirror Releasing"
## [6310] " Mischief Films"
## [6311] " Mischief Maker Studios"
## [6312] " Miso Film"
## [6313] " MISR International Films"
## [6314] " Miss Q"
## [6315] " Mission Films"
## [6316] " Mission Pictures"
## [6317] " Mission Pictures International"
## [6318] " Mister Lister Films"
## [6319] " Mistress Inc"
## [6320] " Mitar Group"
## [6321] " Mithya Talkies"
## [6322] " Mitteldeutscher Rundfunk MDR"
## [6323] " Mixed Bag Media"
## [6324] " Mixed Greens Media"
## [6325] " Mizan Productions"
## [6326] " MJ Films"
## [6327] " Mjölk Movies"
## [6328] " MJW Films"
## [6329] " MK Film Productions S r l"
## [6330] " MK Pictures"
## [6331] " MK2 Production"
## [6332] " MK2 Productions"
## [6333] " MM Productions"
## [6334] " MM2 Entertainment"
## [6335] " MMC Independent"
## [6336] " MMG Film TV Production"
## [6337] " MMM Film Zimmermann Co"
## [6338] " Mnight Crew Studios id"
## [6339] " Mnight Friends id"
## [6340] " Mnight Road Entertainment id"
## [6341] " Mnight Sun Pictures id"
## [6342] " MNP Entreprise"
## [6343] " Mo Productions"
## [6344] " Mobilus Media"
## [6345] " Mobra Films"
## [6346] " Moby Dick Films"
## [6347] " Mockingbird Pictures"
## [6348] " Mod Producciones"
## [6349] " Modern Family Productions"
## [6350] " Modern Love"
## [6351] " Modern Screen Play"
## [6352] " Modernciné"
## [6353] " Modoc Spring"
## [6354] " Moffitt Lee Productions"
## [6355] " Mogador Film"
## [6356] " Mohana Movies"
## [6357] " Moho Films"
## [6358] " Moholy Nagy University of Art and Design"
## [6359] " Mokép"
## [6360] " Mollette"
## [6361] " Molot Entertainment"
## [6362] " Momentum"
## [6363] " Momentum Films"
## [6364] " Mon Voisin Productions"
## [6365] " Monarch Pictures"
## [6366] " Monarchy Enterprises B V"
## [6367] " Mondayitis Productions"
## [6368] " Mondex Films"
## [6369] " Mondial Televisione Film"
## [6370] " Mondo Furioso Filmproduction"
## [6371] " Moned Associated"
## [6372] " Monica Beach Media"
## [6373] " Monkey Pack Films"
## [6374] " Mono Film"
## [6375] " Monogram Pictures"
## [6376] " Monogram Pictures corporation"
## [6377] " Monsoon Pictures"
## [6378] " Mont Blanc Pictures"
## [6379] " Montecito Picture Company The"
## [6380] " Montefiore Films"
## [6381] " Monterey Films"
## [6382] " Monterey Media"
## [6383] " Montoro Productions Ltd"
## [6384] " Montrose Pictures"
## [6385] " Monument Pictures"
## [6386] " Monumental Pictures"
## [6387] " Moody Independent"
## [6388] " Moody Street Pictures"
## [6389] " Moon Productions"
## [6390] " Moonbot Studios"
## [6391] " Moonlight Productions"
## [6392] " Moonlighting Films"
## [6393] " Moonshot Pictures"
## [6394] " Moonstar Enterainment"
## [6395] " Moonstone Entertainment"
## [6396] " Moorehead Properties Films"
## [6397] " MOOVIE the art of entertainment GmbH"
## [6398] " Morbo Films id"
## [6399] " Mordicus Productions"
## [6400] " Morena Films"
## [6401] " Morgan Creek Productions"
## [6402] " Morgan Steckler Productions"
## [6403] " Morgana Films"
## [6404] " Morison Film Group"
## [6405] " Morningse Productions id"
## [6406] " Morningstar Films"
## [6407] " Morpheus"
## [6408] " Morphius Film"
## [6409] " Mosaic Media Group"
## [6410] " Mosfilm"
## [6411] " Mosfilm Children s Film Unit"
## [6412] " Moskito Film"
## [6413] " Most Production"
## [6414] " Most Wanted Films"
## [6415] " Motel Films"
## [6416] " Motel Pictures"
## [6417] " Moteur s il vous plaît"
## [6418] " Mothcatcher Films"
## [6419] " Motion 58 Entertainment"
## [6420] " Motion Investment Group"
## [6421] " Motion Picture Corporation of America"
## [6422] " Motion Picture Corporation of America MPCA"
## [6423] " Motion Picture Group The"
## [6424] " Motion Picture House"
## [6425] " Motion Picture Pro Studios"
## [6426] " Motion Pictures Inc"
## [6427] " Motion Pictures International"
## [6428] " MotionWorks"
## [6429] " Motis Productions"
## [6430] " Motlys"
## [6431] " Motown Productions"
## [6432] " Motto Pictures"
## [6433] " Mouflet et Cie"
## [6434] " Mouka Filmi Oy"
## [6435] " Mount Everest Enterprises Ltd"
## [6436] " Mount Olympus Productions"
## [6437] " Mountainbrge Films id"
## [6438] " Mouthwatering Productions"
## [6439] " Movic"
## [6440] " Movie Eye Entertainment"
## [6441] " Movie Mogul Films"
## [6442] " Movieco Australia"
## [6443] " Moviecraft Entertainment"
## [6444] " Moviehead Pictures"
## [6445] " Moviepool GmbH"
## [6446] " MovieRoom Productions"
## [6447] " Movieworld Productions"
## [6448] " Moving Pictures"
## [6449] " Moving Train Productions"
## [6450] " Moviola Film och Television AB"
## [6451] " Movision"
## [6452] " Moviworld"
## [6453] " Moxie Firecracker Films"
## [6454] " Mozark Productions"
## [6455] " MP Productions"
## [6456] " MPI Home Veo id"
## [6457] " MPI Media Group"
## [6458] " MPI Pictures"
## [6459] " Mpower Pictures"
## [6460] " Mr Brown Entertainment Filmproduction GmbH Potsdam"
## [6461] " Mr E Productions Inc"
## [6462] " Mr Kicks and Lady Megs"
## [6463] " mr kirby productions"
## [6464] " Mr Mudd Production"
## [6465] " Mr Tamborine Man"
## [6466] " MR Filmproduktion"
## [6467] " MR Films"
## [6468] " Mr Monster"
## [6469] " MR TV Film"
## [6470] " MRB Productions"
## [6471] " Mrinal Sen Productions"
## [6472] " Mrs White s Productions"
## [6473] " MS Films"
## [6474] " MSNBC Films"
## [6475] " Mt Philo Films"
## [6476] " MT2 Productions"
## [6477] " MT2 Services"
## [6478] " MTM Cineteve"
## [6479] " MTV Films"
## [6480] " MTV Studios"
## [6481] " Muck Media"
## [6482] " Mukta Arts Ltd"
## [6483] " Mukta Searchlight Films"
## [6484] " Mulberry Square Productions"
## [6485] " Mulmur Feed Co Production"
## [6486] " Mulmur Feed Company"
## [6487] " Multimedia Est"
## [6488] " Multimedia Gesellschaft für Audiovisuelle Information mbH"
## [6489] " Multiple Avenue Releasing"
## [6490] " Munal Film id"
## [6491] " Mungo Productions"
## [6492] " Murakami Wolf Productions"
## [6493] " Murali Films"
## [6494] " MURDER and murder Production"
## [6495] " Murder Inc"
## [6496] " Murlimanohar Creations"
## [6497] " Murnau Flaherty Productions"
## [6498] " Muse Entertainment"
## [6499] " Muse Entertainment Enterprises"
## [6500] " Muse Productions"
## [6501] " Musée d Orsay"
## [6502] " Museum"
## [6503] " Mushi Productions"
## [6504] " Muskat Filmed Properties"
## [6505] " Mustang Films"
## [6506] " Mustard Co"
## [6507] " Muti Films"
## [6508] " Mutressa Movies"
## [6509] " Mutual Film Company"
## [6510] " MVM Entertainment"
## [6511] " MVP Pictures"
## [6512] " Mwana Productions"
## [6513] " Mwest Films id"
## [6514] " My Hero Productions"
## [6515] " My Own Worst Enemy"
## [6516] " My Way Pictures"
## [6517] " Myriad Pictures"
## [6518] " Myriapod Productions"
## [6519] " Myrrdin"
## [6520] " MyS Producción"
## [6521] " Mystery Clock Cinema"
## [6522] " Mystery Productions"
## [6523] " Mystique Films Inc"
## [6524] " Mythberg Films"
## [6525] " Mythic International Entertainment"
## [6526] " Myung Film Company"
## [6527] " Myung Films"
## [6528] " N 7411 Trondheim"
## [6529] " N Chandra Global Infotainment Ltd"
## [6530] " Nabi Pictures"
## [6531] " Nabu Films"
## [6532] " Nada Pictures Inc"
## [6533] " Nadiadwala Grandson Entertainment"
## [6534] " Nadiadwala Grandsons"
## [6535] " Nadie es Perfecto"
## [6536] " Nadja Films"
## [6537] " Nafta"
## [6538] " Naho Productions"
## [6539] " NAIA Productions"
## [6540] " Nais Film"
## [6541] " Naked Edge Films"
## [6542] " NALA Films"
## [6543] " Nama Film"
## [6544] " Namco"
## [6545] " Namesake Entertainment"
## [6546] " Nancy Enterprises Inc I"
## [6547] " Nandar Entertainment"
## [6548] " Napalm Love Productions"
## [6549] " Napoleon Film"
## [6550] " Nariman Films"
## [6551] " Narodowy Instytut Audiowizualny koprodukcja"
## [6552] " Narrow Brge Films id"
## [6553] " Narsimha Enterprises"
## [6554] " Nashe Kino"
## [6555] " Nasir Hussain Films"
## [6556] " Nasser Entertainment"
## [6557] " Nasser Group North"
## [6558] " Nat Holt Productions"
## [6559] " Nation Earth"
## [6560] " National Broadcasting Company"
## [6561] " National Broadcasting Company NBC"
## [6562] " National Cinematografica"
## [6563] " National Educational Television Network"
## [6564] " National Film and Television School NFTS"
## [6565] " National Film Board of Canada"
## [6566] " National Film Board of Canada NFB"
## [6567] " National Film Development Corporation of India"
## [6568] " National Film Development Corporation of India NFDC"
## [6569] " National Film Finance Corporation NFFC"
## [6570] " National Film Organization"
## [6571] " National Film Trustee Company"
## [6572] " National Filmi Oy"
## [6573] " National General Pictures"
## [6574] " National General Production Inc"
## [6575] " National Geographic"
## [6576] " National Geographic Channel"
## [6577] " National Geographic Entertainment"
## [6578] " National Geographic Television"
## [6579] " National Lampoon"
## [6580] " National Lampoon Productions"
## [6581] " National Picture Show Entertainment"
## [6582] " National Wildlife Federation"
## [6583] " Natural Nylon Entertainment"
## [6584] " Natural Wipe Films"
## [6585] " Nautilus Film Company The"
## [6586] " Nautilus Productions"
## [6587] " Navalakha Arts Media Entertainment"
## [6588] " Navaron Films"
## [6589] " Navaron Productions"
## [6590] " Navarone Productions"
## [6591] " Naxos Film"
## [6592] " Naya Films S A"
## [6593] " Nazimova Productions"
## [6594] " NAZZ Productions"
## [6595] " NB Thrilling Films"
## [6596] " NBA Entertainment"
## [6597] " NBC"
## [6598] " NBC Ajans"
## [6599] " NBC Film"
## [6600] " NBC Productions"
## [6601] " NBC Studios"
## [6602] " NBC Universal Television"
## [6603] " NBTV Studios"
## [6604] " NBV Productions"
## [6605] " NCA Productions"
## [6606] " NDF International"
## [6607] " Neal Street Productions"
## [6608] " Necta"
## [6609] " Nederlander Television Film Productions"
## [6610] " Nederlands Fonds voor de Film"
## [6611] " Nederlandse Christelijke Radio Vereniging NCRV"
## [6612] " Nederlandse Programma Stichting NPS"
## [6613] " Neena Raut Films"
## [6614] " NeeNee Productions"
## [6615] " NEF Diffusion"
## [6616] " Negativ"
## [6617] " Negativ s r o"
## [6618] " Neil Breen"
## [6619] " Neil Breen Films"
## [6620] " Nelson Entertainment"
## [6621] " Nelvana"
## [6622] " Nelvana Limited"
## [6623] " Nemours Productions"
## [6624] " Neo Art Logic"
## [6625] " Neo Modern"
## [6626] " NEO Motion Pictures"
## [6627] " Neo Productions"
## [6628] " Neophyte Productions"
## [6629] " Nepenthe Film"
## [6630] " Nephilim Producciones"
## [6631] " Neptun Film"
## [6632] " Neptune Film A G"
## [6633] " Neptune Salad Entertainment"
## [6634] " Nero Film AG"
## [6635] " Nero Films"
## [6636] " Neshane"
## [6637] " NEST Family Entertainment"
## [6638] " Netflix"
## [6639] " NetFlix"
## [6640] " Netherlands Government"
## [6641] " Nettlefold Films"
## [6642] " Network Entertainment"
## [6643] " Network Releasing"
## [6644] " Neue Constantin Film"
## [6645] " Neue Delta Filmproduktion"
## [6646] " Neue Road Movies"
## [6647] " Neue Sentimental Film"
## [6648] " Neue Visionen"
## [6649] " Neue Vitaskop Film"
## [6650] " Neumann Filmproduktion"
## [6651] " Nevada International Pictures"
## [6652] " Nevermore Films"
## [6653] " NEW"
## [6654] " NEW All Rights Reserved"
## [6655] " New Amsterdam Entertainment"
## [6656] " New Artists Alliance"
## [6657] " New Breed Entertainment"
## [6658] " New Century Entertainment Corporation"
## [6659] " New Century Producers"
## [6660] " New Century Productions"
## [6661] " New Chapter Productions"
## [6662] " New City Releasing"
## [6663] " New Classics"
## [6664] " New Concorde"
## [6665] " New Deal Productions"
## [6666] " New Film Production S r l"
## [6667] " New Films International"
## [6668] " New Flesh Films"
## [6669] " New Form Digital"
## [6670] " New Holland Pictures"
## [6671] " New Horizon Corporation"
## [6672] " New Horizon Picture Corp"
## [6673] " New Horizons"
## [6674] " New Horizons Picture"
## [6675] " New Kingdom Pictures"
## [6676] " New Lavender Panthers"
## [6677] " New Legend Media"
## [6678] " New Life Cinema"
## [6679] " New Line Cinema"
## [6680] " New Line Productions"
## [6681] " New Line Television"
## [6682] " New Normal Films"
## [6683] " New Oz Productions"
## [6684] " New Real Films"
## [6685] " New Regency Pictures"
## [6686] " New Regency Productions"
## [6687] " New Rose Films"
## [6688] " New Sky Communications Inc"
## [6689] " New South Wales Film Television Office"
## [6690] " New South Wales Film Corp"
## [6691] " New Wave Entertainment"
## [6692] " New Wave Entertainment Television"
## [6693] " New Wave Productions"
## [6694] " New World Mutual"
## [6695] " New World Pictures"
## [6696] " New World Productions"
## [6697] " New World Television"
## [6698] " New York Motion Picture"
## [6699] " New Yorker Films"
## [6700] " New Zealand Film Commission"
## [6701] " Newgrange Pictures"
## [6702] " Newman Foreman Company"
## [6703] " Newmarket Capital Group"
## [6704] " Newmarket Films"
## [6705] " Newport Films"
## [6706] " Newtown Productions"
## [6707] " Next Entertainment"
## [6708] " Next Entertainment World"
## [6709] " Next Film"
## [6710] " Next Generation TV Film"
## [6711] " Next Station Productions"
## [6712] " Next Turn Productions"
## [6713] " Next Wednesday Productions"
## [6714] " Nexus 6 Films"
## [6715] " Nexus Factory"
## [6716] " Nexus Productions"
## [6717] " NFH Productions"
## [6718] " NFL Films"
## [6719] " NGN Productions"
## [6720] " NHK"
## [6721] " NHK Enterprises"
## [6722] " Niama Film"
## [6723] " Nic Arts"
## [6724] " Nice Dissolve"
## [6725] " Nice Flxpictures AB"
## [6726] " Nicetop Independent"
## [6727] " Nick Stagliano"
## [6728] " Nick Wechsler Miracle Pictures"
## [6729] " Nick Wechsler Productions"
## [6730] " Nickel Odeon"
## [6731] " Nickelodeon"
## [6732] " Nickelodeon Movies"
## [6733] " Nickelodeon Network"
## [6734] " Nickelodeon Productions"
## [6735] " Nickname Projects"
## [6736] " Nicolás Astiarraga P C"
## [6737] " Nicolas Entertainment"
## [6738] " Night and Day Pictures"
## [6739] " Night Light Films"
## [6740] " Nightcall Productions"
## [6741] " Nightmare Productions"
## [6742] " Nightstar Productions"
## [6743] " Nightwatcher Films"
## [6744] " Nihon Eiga Shinsha"
## [6745] " Nike Cinematografica"
## [6746] " Nikkatsu"
## [6747] " Nikkatsu Corporation"
## [6748] " NiKo Film"
## [6749] " Nikola Film"
## [6750] " Nikolaus Geyrhalter Filmproduktion"
## [6751] " Nile Cinema Company"
## [6752] " Nilsen Premiere"
## [6753] " Nimar Studios"
## [6754] " Nimbus Film"
## [6755] " Nimbus Film ApS"
## [6756] " Nimbus Film Productions"
## [6757] " Nina Paley"
## [6758] " Nina Saxon Film Design"
## [6759] " Ningxia Film Studio"
## [6760] " Ninth Configuration"
## [6761] " Nippon Animation"
## [6762] " Nippon Herald Films"
## [6763] " Nippon Shuppan Hanbai Nippan K K"
## [6764] " Nippon Television Network NTV"
## [6765] " Nippon Television Network Corporation NTV"
## [6766] " Nitrogen Studios Canada"
## [6767] " Njutafilms"
## [6768] " NL Film"
## [6769] " No Frills Film Production"
## [6770] " No Limit Films"
## [6771] " No Matter Pictures"
## [6772] " Noah Films"
## [6773] " Nob Hill Productions Inc"
## [6774] " Noble Entertainment Group"
## [6775] " Noble Media"
## [6776] " Noir Blanc Films"
## [6777] " Noise Light"
## [6778] " NoLITa Cinema"
## [6779] " Noma Productions"
## [6780] " Nomad Productions PLC"
## [6781] " Nomadic Pictures"
## [6782] " Nomados Film"
## [6783] " Non Linear Films"
## [6784] " Non Stop Productions"
## [6785] " Nonetheless Productions"
## [6786] " Nonpareil Feature Film Corp"
## [6787] " Nopal Army"
## [6788] " Noram Entertainment"
## [6789] " Norberfilms"
## [6790] " Norcon"
## [6791] " Nord Ouest Films"
## [6792] " Nord Ouest Production"
## [6793] " Nord Ouest Productions"
## [6794] " Norddeutscher Rundfunk NDR"
## [6795] " Nordia Films"
## [6796] " Nordic Factory Film"
## [6797] " Nordic Film"
## [6798] " Nordic Film och TV Fund"
## [6799] " Nordisk Film"
## [6800] " Nordisk Film Production"
## [6801] " Nordisk Film Production A S"
## [6802] " Nordisk Films Kompagni A S"
## [6803] " Nordisk Tonefilm"
## [6804] " Nordsjøfilm"
## [6805] " Norlan Productions"
## [6806] " Norm Iris"
## [6807] " Norma Productions"
## [6808] " Norma Talmadge Film Corporation"
## [6809] " Norman Rosemont Productions"
## [6810] " Norman Twain Productions"
## [6811] " Norris Brothers Entertainment"
## [6812] " Norsk Film"
## [6813] " Norsk Rikskringkasting NRK"
## [6814] " Norstar Entertainment"
## [6815] " Norstar Entertainment Inc"
## [6816] " North American Film Enterprises"
## [6817] " North American Star System"
## [6818] " North Bank Entertainment"
## [6819] " North by Northwest Entertainment"
## [6820] " North of Two"
## [6821] " Northcroft Films"
## [6822] " Northern Lights"
## [6823] " Northern Lights Entertainment"
## [6824] " Northern Lights Films"
## [6825] " Northwest Productions"
## [6826] " Nostromo Pictures"
## [6827] " Not a Number"
## [6828] " Noteworthy Films"
## [6829] " Nour Films"
## [6830] " Nourtaban Film Industry"
## [6831] " Nouvelles Éditions de Film"
## [6832] " Nouvelles Éditions de Films NEF"
## [6833] " Nova"
## [6834] " Nova International Films"
## [6835] " NOVA Productions"
## [6836] " Novel City Pictures"
## [6837] " Novella Film"
## [6838] " Novo Arturo Films"
## [6839] " Novotny Novotny Filmproduktion GmbH"
## [6840] " Nowhere Sp z o o"
## [6841] " NRK Drama"
## [6842] " NTR"
## [6843] " NTV PROFIT"
## [6844] " Nu Boyana Viburno"
## [6845] " Nu Image Millennium Films"
## [6846] " Nu Image Entertainment"
## [6847] " nu image films"
## [6848] " Nu Image Films"
## [6849] " Nucleo Internazionale"
## [6850] " Nucleus Films"
## [6851] " Nukleus Film"
## [6852] " Numb Gums Production Inc"
## [6853] " Numero Films Ltd"
## [6854] " Nunnally Johnson Productions"
## [6855] " Nuova Linea Cinematografica"
## [6856] " Nut Bucket Films"
## [6857] " Nuts and Lloyd Films"
## [6858] " Nuyorican Productions"
## [6859] " NW Documentary"
## [6860] " NW3 Films"
## [6861] " nWave Pictures"
## [6862] " NWR Film Productions"
## [6863] " O Groove"
## [6864] " O Hannah Films"
## [6865] " O Entertainment"
## [6866] " O N C Entertainment"
## [6867] " O N C I C"
## [6868] " O Som e a Fúria"
## [6869] " O T A Productions"
## [6870] " O2 Filmes"
## [6871] " Oakhurst Productions"
## [6872] " Oakland Productions"
## [6873] " Oakmont Productions"
## [6874] " Oakshire Productions"
## [6875] " Oats Studio"
## [6876] " Obel Film"
## [6877] " Objektif Film"
## [6878] " Objektív Film"
## [6879] " Obregon Cinematografica"
## [6880] " Occupant Films"
## [6881] " Ocean Blue Entertainment"
## [6882] " Oceana Media Finance"
## [6883] " Oceania Produzioni Internazionali Cinematografiche"
## [6884] " Océanic Films"
## [6885] " Oceanstorm Films"
## [6886] " Oceanus Pictures"
## [6887] " Octagon Films"
## [6888] " October County Films"
## [6889] " October Films"
## [6890] " Odd Lot Entertainment"
## [6891] " Odeon"
## [6892] " Odeon Film"
## [6893] " Odeon Films"
## [6894] " Odeon Rybarczyk Productions"
## [6895] " Odessa Film Studios"
## [6896] " Odessa Films"
## [6897] " Odessa Filmworks"
## [6898] " Odyssee Pictures"
## [6899] " Odyssey Entertainmant"
## [6900] " Odyssey Entertainment"
## [6901] " Odyssey Media"
## [6902] " Odyssey Motion Pictures"
## [6903] " Off Center Media"
## [6904] " Off Hollywood Pictures"
## [6905] " Off Leash Teleproductions"
## [6906] " Offhollywood Digital"
## [6907] " Office Crescendo"
## [6908] " Office de Radiodiffusion Télévision Française ORTF"
## [6909] " Office Kitano"
## [6910] " Office national du film du Canada ONF"
## [6911] " Office of the Contemporary Art and Culture OCAC"
## [6912] " Official Films"
## [6913] " Offse id"
## [6914] " OffSpring Productions"
## [6915] " Ognon Pictures"
## [6916] " Oh Show Productions"
## [6917] " Oh My Gomez Films"
## [6918] " Oh Production"
## [6919] " Ohra Sogeav"
## [6920] " Oil Factory"
## [6921] " Oko Film"
## [6922] " Okofilm Productions"
## [6923] " Oktober oy"
## [6924] " Old Jim Productions"
## [6925] " Old Street Films"
## [6926] " Olga Film GmbH"
## [6927] " Olga Film GmbH München"
## [6928] " Oliane Productions"
## [6929] " Oliwood Productions"
## [6930] " Olympia Film GmbH"
## [6931] " Olympic Film"
## [6932] " Olympus Pictures"
## [6933] " Om Film id"
## [6934] " Ombra Films"
## [6935] " Omega Cyrano Productions"
## [6936] " Omega Entertainment"
## [6937] " Omega Film AB"
## [6938] " Omega Micott Inc"
## [6939] " Omega Pictures"
## [6940] " Omega Project"
## [6941] " Ominous Productions"
## [6942] " OmniaTV"
## [6943] " Omnilab Media"
## [6944] " On The Corner Films"
## [6945] " Once Bitten Films"
## [6946] " Once Upon A Story"
## [6947] " Once Upon a Time Films"
## [6948] " One Alliance SRL"
## [6949] " One Chance Productions Inc"
## [6950] " One Dollar Production Limited"
## [6951] " One Eyed"
## [6952] " One Hundred Years of Film Company"
## [6953] " One More Pictures"
## [6954] " One More Thought Entertainment"
## [6955] " One Of Those Productions"
## [6956] " One Race Films"
## [6957] " One Race Productions"
## [6958] " One Small Instrument Pictures"
## [6959] " One Square Mile Management Company"
## [6960] " One Tu Three Productions Inc"
## [6961] " ONE TWO Films"
## [6962] " OneZero Productions"
## [6963] " Onion Films"
## [6964] " Onset Films"
## [6965] " Onyx Films"
## [6966] " OOO Films"
## [6967] " Oops Doughnuts Productions"
## [6968] " op docs"
## [6969] " Opala Productions"
## [6970] " Ópalo Films"
## [6971] " Open City Films"
## [6972] " Open Doors Films"
## [6973] " Open Eye Pictures"
## [6974] " Open Pictures"
## [6975] " Open Road Films"
## [6976] " Open Road Films II"
## [6977] " Open Sky Entertainment"
## [6978] " Opening Night Productions"
## [6979] " Opera Film Produzione"
## [6980] " OPM Dream Mill Cinemas"
## [6981] " Optic Nerve Films"
## [6982] " Optimism Entertainment"
## [6983] " Optimum Productions"
## [6984] " Optipari Oy"
## [6985] " Optix Digital Pictures"
## [6986] " Opus Film"
## [6987] " Opus Pictures"
## [6988] " Oracle Film Group"
## [6989] " Orange Dot Entertainment"
## [6990] " Orange Pictures"
## [6991] " Orange Sky"
## [6992] " Orbis Film"
## [6993] " Orbit Productions"
## [6994] " Orenda Films"
## [6995] " Orex Films"
## [6996] " Orgolini Nelson Productions"
## [6997] " Orgon Films"
## [6998] " Oriental International Films"
## [6999] " Oriental Light and Magic"
## [7000] " Origami Films"
## [7001] " Origen P C"
## [7002] " Origin Films"
## [7003] " Origin8 Media"
## [7004] " Original Film"
## [7005] " Original Media"
## [7006] " Original Pictures"
## [7007] " Origo Film Group"
## [7008] " Orion Pictures"
## [7009] " Orion Pictures Corporation"
## [7010] " Orizzonte 2000"
## [7011] " Orly Films"
## [7012] " Oro Films"
## [7013] " Orofino"
## [7014] " Orphan Eyes"
## [7015] " Orsay Films"
## [7016] " Ortus Films"
## [7017] " Oscar Kramer S A"
## [7018] " Oscar Lewenstein Productions"
## [7019] " Óscar Producciones Cinematográficas S A"
## [7020] " Oscilloscope Laboratories"
## [7021] " Osiris Films"
## [7022] " Osmond Productions"
## [7023] " Osmosis"
## [7024] " Ostar Productions"
## [7025] " Österreichischer Rundfunk ORF"
## [7026] " Other Cinema"
## [7027] " Otmoor Productions Limited"
## [7028] " Otto Preminger Films"
## [7029] " Oudine Productions"
## [7030] " Our Time Projects"
## [7031] " Out of Africa Entertainment"
## [7032] " Out of Towners Productions"
## [7033] " Outpost Entertainment"
## [7034] " Outpost Productions"
## [7035] " Outpost Studios"
## [7036] " Outrage Productions 5 S V"
## [7037] " Ovation Entertainment"
## [7038] " Over 9000 Pictures"
## [7039] " Overbrook Entertainment"
## [7040] " Overdose Joint"
## [7041] " Overseas FilmGroup"
## [7042] " Overture Films"
## [7043] " Ovídeo TV S A"
## [7044] " Ovnellfilm"
## [7045] " Oxymoron Entertainment"
## [7046] " Oxymoron Films"
## [7047] " Oy Bufo Ab"
## [7048] " Oy Future Film Ab"
## [7049] " Oy Rabbit Films Ltd"
## [7050] " Oz Company"
## [7051] " Oz One Film"
## [7052] " Ozla Productions"
## [7053] " P L"
## [7054] " P A C"
## [7055] " P C Ales"
## [7056] " P C L Film Studio"
## [7057] " P D C"
## [7058] " P P Film Polski"
## [7059] " P R Productions"
## [7060] " P R Productions Picture"
## [7061] " P T Insantra Film"
## [7062] " P13 Entertainment"
## [7063] " PAC"
## [7064] " Pac Orsa Maggiore"
## [7065] " Pacemaker"
## [7066] " Pacific Bay Entertainment Canada"
## [7067] " Pacific Data Images PDI"
## [7068] " Pacific Entertainment Group"
## [7069] " Pacific Northwest Pictures"
## [7070] " Pacific Pictures"
## [7071] " Pacific Productions"
## [7072] " Pacific Trust"
## [7073] " Pacific Western"
## [7074] " Paco Cinematografica"
## [7075] " Pact Productions"
## [7076] " Pad Ram Enterprises"
## [7077] " Pageant Productions"
## [7078] " Painted Lady Productions"
## [7079] " Pajemer Productions"
## [7080] " Palace Films"
## [7081] " Palace Pictures"
## [7082] " Palisades Partners"
## [7083] " Palisades Pictures"
## [7084] " Palladium"
## [7085] " Palladium Film"
## [7086] " Palladium Productions"
## [7087] " Pallas Film"
## [7088] " Palm Drive Productions"
## [7089] " Palm Pictures"
## [7090] " PalmStar Media"
## [7091] " Palo Alto Productions"
## [7092] " Palo Alto Stock Farm"
## [7093] " Palomar"
## [7094] " Palomar Pictures"
## [7095] " Palomar Pictures I"
## [7096] " Palpable Productions"
## [7097] " Palumbo"
## [7098] " Pampas Produktion"
## [7099] " Pan Entertainment"
## [7100] " Pan Européenne Production"
## [7101] " Pan Vision"
## [7102] " Panama Grand Prix"
## [7103] " Panamax Films"
## [7104] " Panamerican Films S A"
## [7105] " Panamint Film"
## [7106] " Panda Film"
## [7107] " Panda Societa per L Industria Cinematografica"
## [7108] " Pandastorm Pictures"
## [7109] " Pandemonium"
## [7110] " Pandora Cinema"
## [7111] " Pandora Film"
## [7112] " Pandora Filmproduktion"
## [7113] " Pandora Films"
## [7114] " Pandora Filmverleih"
## [7115] " Paneuropean Production Pictures"
## [7116] " Panfilm"
## [7117] " Panic Pictures"
## [7118] " Panitalia"
## [7119] " Pannónia"
## [7120] " Pannónia Filmstúdió"
## [7121] " Panorama"
## [7122] " Panorama Films"
## [7123] " Panorama Studios"
## [7124] " Panoramic Productions"
## [7125] " Pantaleon Entertainment GmbH"
## [7126] " Pantaleon Films"
## [7127] " Pantelion Film"
## [7128] " Pantelion Films"
## [7129] " Pantera Film"
## [7130] " Pantera Productions"
## [7131] " Pantheon Film Productions"
## [7132] " Panthéon Productions"
## [7133] " Pantry Films"
## [7134] " Paola Film S r l"
## [7135] " Papalios Productions"
## [7136] " Paper Bark Films Pty Ltd"
## [7137] " Paper Street Films"
## [7138] " Papi Chulo"
## [7139] " Paprika Production"
## [7140] " Par Par Productions"
## [7141] " Parabolic Pictures"
## [7142] " Parabólica Brasil"
## [7143] " Parachute Pictures"
## [7144] " Parada Film"
## [7145] " Paradigm Pictures"
## [7146] " Paradine Co Productions"
## [7147] " Paradis Films"
## [7148] " Paradise"
## [7149] " Paradise F X Corp"
## [7150] " Paradise Films"
## [7151] " Paradise Group"
## [7152] " Paradiz Prodakshnz"
## [7153] " Paradox Produksjon"
## [7154] " Paradox Spillefilm A S"
## [7155] " Paragon Film Group"
## [7156] " Paragon Films Ltd"
## [7157] " Paragon International Pictures"
## [7158] " Paragon Motion Pictures"
## [7159] " Paralite Productions Ltd"
## [7160] " Parallax East"
## [7161] " Parallax Pictures"
## [7162] " Parallel Films"
## [7163] " Parallel Pictures"
## [7164] " Paramhans Creation"
## [7165] " Paramount"
## [7166] " Paramount Animation"
## [7167] " Paramount Classics"
## [7168] " Paramount Famous Lasky Corporation"
## [7169] " Paramount Famous Productions"
## [7170] " Paramount Home Entertainment"
## [7171] " Paramount Network Television"
## [7172] " Paramount Network Television Productions"
## [7173] " Paramount Orion Filmproduktion"
## [7174] " Paramount Pictures"
## [7175] " Paramount Pictures Corporation"
## [7176] " Paramount Pictures Digital Entertainment"
## [7177] " Paramount Television"
## [7178] " Paramount Vantage"
## [7179] " Parc Film"
## [7180] " Pariah Entertainment Group"
## [7181] " Paris Etolie Films"
## [7182] " Paris Europa Productions"
## [7183] " Paris Film"
## [7184] " Paris Film Productions"
## [7185] " Paris Filmes"
## [7186] " Paris Films Productions"
## [7187] " Paris Hilton Entertainment"
## [7188] " Park Avenue Productions"
## [7189] " Park Chul Soo Films Ltd"
## [7190] " Park Cinema Production"
## [7191] " Park Ex Pictures"
## [7192] " Park Pictures"
## [7193] " Park Place Production"
## [7194] " Parker Film Company"
## [7195] " Parkes Lasker productions"
## [7196] " Parklane Pictures Inc"
## [7197] " Parkse Pictures id"
## [7198] " Parkville Pictures"
## [7199] " Parkwood Entertainment"
## [7200] " Parlay Films"
## [7201] " Parnasse Production"
## [7202] " Participant Media"
## [7203] " Participant Productions"
## [7204] " Partizan"
## [7205] " Partner s Productions"
## [7206] " Parts and Labor"
## [7207] " Party Productions"
## [7208] " Parva Cinematografica"
## [7209] " Pasg Productions Inc id"
## [7210] " PasoFino Entertainment"
## [7211] " Passaro Films"
## [7212] " Passenger Film Studio"
## [7213] " Passion Pictures"
## [7214] " Patagonik"
## [7215] " Patagonik Film Group"
## [7216] " Patalex IV Productions Limited"
## [7217] " Patchett Kaufman Entertainment"
## [7218] " Pātea Film Collective"
## [7219] " Pathe"
## [7220] " Pathé"
## [7221] " Pathe Communications"
## [7222] " Pathé Consortium Cinéma"
## [7223] " Pathé Distribution"
## [7224] " Pathé Entertainment"
## [7225] " Pathé Films"
## [7226] " Pathé Frères"
## [7227] " Pathé Natan"
## [7228] " Pathé Pictures International"
## [7229] " Pathe Productions"
## [7230] " Pathé Productions"
## [7231] " Pathé Renn Productions"
## [7232] " Patriot Pictures"
## [7233] " Paul Hough Entertainment"
## [7234] " Paul Malvern Productions"
## [7235] " Paul Schiff Productions"
## [7236] " Paul Short Productions"
## [7237] " Paulist Pictures"
## [7238] " Pavel Lungin Studios"
## [7239] " Paws"
## [7240] " Pax Enterprises"
## [7241] " Pax Films"
## [7242] " PBS"
## [7243] " PBS HOME VIDEO"
## [7244] " PCB Entertainment"
## [7245] " PCH Films"
## [7246] " PDP Productions"
## [7247] " Peabody Museum"
## [7248] " Peace Arch Entertainment Group"
## [7249] " Peace Arch Films"
## [7250] " PeaceOut Productions"
## [7251] " Peacock Productions"
## [7252] " PeaPie Films"
## [7253] " PECF"
## [7254] " Pee Wee Pictures"
## [7255] " Peg Leg Films"
## [7256] " Pegaso Producciones"
## [7257] " Pegasus Motion Pictures"
## [7258] " Pelemele Film"
## [7259] " Películas Rodríguez"
## [7260] " Pellicola"
## [7261] " Pen India Limited"
## [7262] " Peninsula Films"
## [7263] " Peninsula Management Productions"
## [7264] " Peninsular Media"
## [7265] " Penn Station Entertainment"
## [7266] " Pennebaker Films"
## [7267] " Pennebaker Hegedus Films Inc"
## [7268] " Pennebaker Productions"
## [7269] " Pensylvania Academy of Fine Arts"
## [7270] " Penta Films"
## [7271] " Penta Pictures"
## [7272] " Penthouse Films International"
## [7273] " People Pictures"
## [7274] " People Tree Films"
## [7275] " Peoples Productions"
## [7276] " Pepito Produzioni"
## [7277] " Peppertree Productions Inc"
## [7278] " PEQUI FILMES"
## [7279] " Per Holst Film"
## [7280] " Per Holst Filmproduktion"
## [7281] " Perathon Film und Fernsehproduktions GmbH"
## [7282] " Percept Picture Company"
## [7283] " Perdo Productions id"
## [7284] " Perfect Weekend"
## [7285] " Perfect World Pictures"
## [7286] " PERFINI"
## [7287] " Performing Arts"
## [7288] " Periclean Productions"
## [7289] " Periferia Production"
## [7290] " Periscope Entertainment"
## [7291] " Periscope Pictures"
## [7292] " Periscope Productions"
## [7293] " Perlsea Company"
## [7294] " Permacology Productions"
## [7295] " Permut Presentations"
## [7296] " Perry Street Pictures"
## [7297] " Persistence of Vision Productions"
## [7298] " Persistent Entertainment"
## [7299] " Persky Bright Productions"
## [7300] " Personafilm"
## [7301] " Peru Productions"
## [7302] " Peter Hutton"
## [7303] " Peter Jones Productions"
## [7304] " Peter McCarthy Front Films"
## [7305] " Peter Perry Productions"
## [7306] " Peter Rogers Productions"
## [7307] " Peter Rommel Productions"
## [7308] " Peter Walker Heritage Ltd"
## [7309] " Petit Films"
## [7310] " Petri Entertainment"
## [7311] " PF Pictures"
## [7312] " Pfeiffer Blocker Production"
## [7313] " PFG Entertainment"
## [7314] " PFH Entertainment"
## [7315] " PFI Studios"
## [7316] " PFM Pictures"
## [7317] " PGP Productions"
## [7318] " Phaedra Cinema"
## [7319] " Phalanx Jaelem"
## [7320] " Phalanx Productions"
## [7321] " Phanta Film"
## [7322] " Phantasmes Veo id"
## [7323] " Phantom Film"
## [7324] " Phantom Films"
## [7325] " Phantom Four"
## [7326] " Phantom Productions"
## [7327] " Phase 4 Films"
## [7328] " PHD Productions"
## [7329] " Phenomena"
## [7330] " phi"
## [7331] " Phil Cooke Pictures"
## [7332] " Philip A Waxman Productions Inc"
## [7333] " Philippe Dussart"
## [7334] " Philistine Films"
## [7335] " Phillip Productions"
## [7336] " Phoenician Entertainment"
## [7337] " Phoenician Films"
## [7338] " Phoenix Cinematografica"
## [7339] " Phoenix Entertainment Group PEG"
## [7340] " Phoenix Film"
## [7341] " Phoenix Films"
## [7342] " Phoenix Pictures"
## [7343] " Photon Kathaas"
## [7344] " Photoplay Productions"
## [7345] " Pica Pica Media Limited"
## [7346] " Piccadilly Pictures"
## [7347] " Pickford Corporation"
## [7348] " Pickford Film"
## [7349] " Picture Farm"
## [7350] " Picture Machine"
## [7351] " Picture Music International"
## [7352] " Picture Palace"
## [7353] " Picture Park"
## [7354] " Picture Players Productions"
## [7355] " Picture Tree International"
## [7356] " Picturehouse Entertainment"
## [7357] " Pictures in a Row"
## [7358] " Pictures in Paradise"
## [7359] " Picturesque Films"
## [7360] " Pie Films"
## [7361] " Pierce Williams Entertainment"
## [7362] " Pierpoline Films"
## [7363] " Pierre Grise Productions"
## [7364] " Pig Newton"
## [7365] " Pikchure Zero Entertainment"
## [7366] " Pilgrim Studios"
## [7367] " Pilgrims 7 Corporation"
## [7368] " Pillage and Plunder Pictures"
## [7369] " Pilot Moscow Animation Studio"
## [7370] " Pilot Season Productions"
## [7371] " pinball london"
## [7372] " Pindrop"
## [7373] " Pine Creek Entertainment"
## [7374] " Pine House film"
## [7375] " Pine Thomas Productions"
## [7376] " Pinewood Studios"
## [7377] " PingPongFilm"
## [7378] " Pinnacle Media"
## [7379] " Pint O Bitter Productions"
## [7380] " Pioneer Entertainment"
## [7381] " Pioneer Films"
## [7382] " Pioneer L D C"
## [7383] " Pioneer Pictures"
## [7384] " Pioneer Pictures Corporation"
## [7385] " Pioneer Productions"
## [7386] " Pipeline"
## [7387] " Pitchblack Pictures Inc"
## [7388] " Pittsburgh Films"
## [7389] " Pixar Animation Studios"
## [7390] " Pixel Veil"
## [7391] " PixL Entertainment"
## [7392] " pixstar"
## [7393] " Plan B Entertainment"
## [7394] " Plan B Productions"
## [7395] " Planet Film Productions"
## [7396] " Planet Filmplays"
## [7397] " Planet Grande Pictures"
## [7398] " Planet Productions"
## [7399] " Planman Motion Pictures"
## [7400] " Plantagenet"
## [7401] " Plata Films S A"
## [7402] " Plate of Peas Productions"
## [7403] " Platforma Filma"
## [7404] " Platige Image"
## [7405] " Platinum Dunes"
## [7406] " Plattform Produktion"
## [7407] " Play Art"
## [7408] " Play Film"
## [7409] " Play House Release"
## [7410] " Playarte"
## [7411] " Playboy Enterprises"
## [7412] " Playboy Entertainment Group"
## [7413] " Playboy Productions"
## [7414] " Playcraft Film Unit"
## [7415] " Player Entertainment Group"
## [7416] " Playfilm Productions"
## [7417] " Playhouse International Pictures"
## [7418] " Playtone"
## [7419] " Playtone Productions"
## [7420] " Plaza Productions"
## [7421] " Plitt Theaters"
## [7422] " Plotdigger Films"
## [7423] " Pluck Productions"
## [7424] " Plug Music"
## [7425] " Plum Pictures"
## [7426] " Plunge Pictures LLC"
## [7427] " Plymouth Films"
## [7428] " Plymptoons"
## [7429] " PM Entertainment Group"
## [7430] " Po Boy Productions"
## [7431] " Pocketbook Productions"
## [7432] " Poe films"
## [7433] " Pohjola filmi Oy"
## [7434] " PointBlank Films"
## [7435] " Pointblank Pictures"
## [7436] " Points North Film"
## [7437] " Poison L P"
## [7438] " Poisson Rouge Pictures"
## [7439] " Pokeepsie Films"
## [7440] " Polar Entertainment"
## [7441] " Polar Film Medien GmbH"
## [7442] " Polar Music International"
## [7443] " PolarStar Entertainment"
## [7444] " Polifilm"
## [7445] " Polish Brothers Construction"
## [7446] " Polish Film Institute"
## [7447] " Pollux Pictures"
## [7448] " Pollywog Pictures"
## [7449] " Polonia Brothers Entertainment"
## [7450] " Polski Instytut Sztuki Filmowej"
## [7451] " Polski State Film"
## [7452] " Polsky Films"
## [7453] " Polyc International BV"
## [7454] " Polygon Entertainment"
## [7455] " Polygon Pictures"
## [7456] " PolyGram Audiovisuel"
## [7457] " Polygram Filmed Entertainment"
## [7458] " PolyGram Filmed Entertainment"
## [7459] " PolyGram Veo id"
## [7460] " Ponti De Laurentiis Cinematografica"
## [7461] " Ponto Filmes"
## [7462] " Ponty Up Pictures"
## [7463] " PONY CANYON"
## [7464] " Pony Canyon Enterprises"
## [7465] " Pool Films"
## [7466] " Pop Art Film Factory"
## [7467] " Pop Films"
## [7468] " Pop Gun Pictures"
## [7469] " Pop Movies"
## [7470] " Pop Pictures"
## [7471] " Popcorn films"
## [7472] " Pope Productions"
## [7473] " Poppoli Pictures"
## [7474] " Population 1280 Films"
## [7475] " Populist Pictures"
## [7476] " Porchlight Films"
## [7477] " Porkkana Ryhmä"
## [7478] " Port au Prince Film Kultur Produktion"
## [7479] " Portman Entertainment Group"
## [7480] " Portobello Pictures"
## [7481] " Portrait Films"
## [7482] " Portreeve"
## [7483] " Posa Films"
## [7484] " Possible Films"
## [7485] " Posterity Pictures"
## [7486] " PostPanic"
## [7487] " Potboiler Productions Ltd"
## [7488] " Powercorp"
## [7489] " Praesens Film"
## [7490] " Praesens Film AG"
## [7491] " Pragmatic Pictures Ltd"
## [7492] " Prakash Jha Productions"
## [7493] " Prakash Mehra Productions"
## [7494] " Praktika Pictures"
## [7495] " Prana Animation Studios"
## [7496] " Pranakorn Films"
## [7497] " Pratfilm"
## [7498] " Pravoslavnaya Encyclopaedia"
## [7499] " Praxis Films"
## [7500] " Prayer Flag Pictures"
## [7501] " PRC"
## [7502] " Pre of Gypsies id"
## [7503] " Precinct 13 Entertainment"
## [7504] " Precision Films"
## [7505] " Preferred Content"
## [7506] " Preferred Film TV"
## [7507] " Preger Entertainment"
## [7508] " Premier Productions"
## [7509] " Premiere Picture"
## [7510] " Premise Media Corporation"
## [7511] " Prescience"
## [7512] " Prescience Film Fund"
## [7513] " Present Pictures"
## [7514] " Presio id"
## [7515] " Press On Features"
## [7516] " Press Pop"
## [7517] " Pressman Productions"
## [7518] " Pressman Williams"
## [7519] " Pretty Mouse Films"
## [7520] " Pretty Pictures"
## [7521] " Prettybird"
## [7522] " Prey LLC"
## [7523] " PRF Zespol Filmowy"
## [7524] " Primal Pictures"
## [7525] " Primate Pictures"
## [7526] " Prime Entertainment"
## [7527] " Primetime Pictures"
## [7528] " Primex Italiana"
## [7529] " Primitive Entertainment"
## [7530] " Primo Filmes"
## [7531] " Princes Films"
## [7532] " Princes Production"
## [7533] " Princess Production Corporation"
## [7534] " Princessa Productions"
## [7535] " Principal Productions Inc"
## [7536] " Principalities Of Darkness"
## [7537] " Principle Entertainment"
## [7538] " Prism Entertainment"
## [7539] " Prism Entertainment Corporation"
## [7540] " Prisma Film"
## [7541] " Prisma Film und Fernsehproduktion"
## [7542] " Prithvi Pictures"
## [7543] " Pritish Nandy Communications"
## [7544] " Priya Films"
## [7545] " Pro ject Filmproduktion"
## [7546] " Pro7"
## [7547] " Proartel S A"
## [7548] " Process Film"
## [7549] " Process Media"
## [7550] " Process Productions"
## [7551] " Procinex"
## [7552] " Procirep"
## [7553] " Procusa"
## [7554] " Prodigo Films"
## [7555] " Prodigy Pictures"
## [7556] " Producciones A S H Films S A"
## [7557] " Producciones Anhelo"
## [7558] " Producciones Barbachano Ponce"
## [7559] " Producciones Brooks"
## [7560] " Producciones Cinematográficas Orfeo"
## [7561] " Producciones Escorpión"
## [7562] " Producciones Filmamento"
## [7563] " Producciones Gustavo Alatriste"
## [7564] " Producciones Isla S A"
## [7565] " Producciones Matouk"
## [7566] " Producciones Olmeca"
## [7567] " Producciones Panicas"
## [7568] " Producciones Prisma"
## [7569] " Producciones Tepeyac"
## [7570] " Producciones Yanco"
## [7571] " Producciones Zohar"
## [7572] " Producers Circle"
## [7573] " Producers on Davie"
## [7574] " Producers Releasing Corporation"
## [7575] " Producers Releasing Corporation PRC"
## [7576] " Producers Representative Organization"
## [7577] " Producers Sales Organization"
## [7578] " Producers Sales Organization PSO"
## [7579] " Produções António Lopes Ribeiro"
## [7580] " Produções Cinematográficas Herbert Richers"
## [7581] " Produções Cunha Telles"
## [7582] " Production Center of Andrei Konchalovsky"
## [7583] " Production Concepts Ltd"
## [7584] " Production Film 82"
## [7585] " Production I G"
## [7586] " Production Magic Inc"
## [7587] " Production One"
## [7588] " Production Partners"
## [7589] " production reed"
## [7590] " Productions 2000"
## [7591] " Productions Arys"
## [7592] " Productions Corniglion Molinier"
## [7593] " Productions Four Line Films"
## [7594] " Productions Sigma"
## [7595] " Productions Thalie"
## [7596] " Productions Two"
## [7597] " Productora Ocio"
## [7598] " Productores Exhibores Films Sociedad Anónima PEFSA id"
## [7599] " Produire à Paris"
## [7600] " Produzione D S Dario Sabatello"
## [7601] " Produzione Doria"
## [7602] " Produzione Salvo D Angelo"
## [7603] " Produzioni Atlas Consorziate P A C"
## [7604] " Produzioni Cinematografiche Mediterranee PCM"
## [7605] " Produzioni Cinematografiche Romane P C R"
## [7606] " Produzioni De Laurentiis International Manufacturing Company"
## [7607] " Produzioni De Sica"
## [7608] " Produzioni Europee Associati PEA"
## [7609] " Produzioni Intersound"
## [7610] " Profilmes"
## [7611] " Profit"
## [7612] " Progefi"
## [7613] " Program 33"
## [7614] " Progress Communications"
## [7615] " ProJa Filmgyár"
## [7616] " Project Campo J V"
## [7617] " Project One Films"
## [7618] " Projector Films"
## [7619] " Projektions A G Union PAGU"
## [7620] " Projektions AG Union PAGU"
## [7621] " Prokino Filmproduktion"
## [7622] " Proletkult"
## [7623] " Prolific Films"
## [7624] " Proline Film"
## [7625] " Promark Entertainment Group"
## [7626] " Promenades Films"
## [7627] " Prometheus Enterprises Inc"
## [7628] " Prometheus Film Productions Ltd"
## [7629] " Prominent Features"
## [7630] " Promises Film Project"
## [7631] " Pronto Film"
## [7632] " Propaganda Films"
## [7633] " Propeler"
## [7634] " Prophecy Entertainment"
## [7635] " Prophecy Pictures Ltd"
## [7636] " Proscenium Films"
## [7637] " Prospect Park"
## [7638] " Prospect Pictures"
## [7639] " Prospectacle"
## [7640] " Prospector Films"
## [7641] " Prospero Pictures"
## [7642] " Protean Image Group"
## [7643] " Protest Productions"
## [7644] " Proteus Films"
## [7645] " Proton Cinema"
## [7646] " Protozoa Pictures"
## [7647] " Provenance Pictures"
## [7648] " Provence Entertainment id"
## [7649] " Provent Films id"
## [7650] " Provobis Film"
## [7651] " Proyecto Tucan"
## [7652] " Prspctvs Productions"
## [7653] " PS TVC Studio"
## [7654] " PSC"
## [7655] " PSO International"
## [7656] " Psycho Rock Productions"
## [7657] " Pt Merantau Films"
## [7658] " Pterodactyl Productions"
## [7659] " Public Art Films"
## [7660] " Public Broadcasting Service PBS"
## [7661] " Puck Film Productions"
## [7662] " Puella Films"
## [7663] " Puerto Vallarta Squeeze Productions"
## [7664] " Puja Entertainment India"
## [7665] " Pulsar productions"
## [7666] " Pulse Films"
## [7667] " Punch 21 Productions"
## [7668] " Punch Productions"
## [7669] " Punkrobot"
## [7670] " Pupcake Productions"
## [7671] " Pupkin Film"
## [7672] " Pupkin Production"
## [7673] " Pure Flix Entertainment"
## [7674] " Pure Flix Productions"
## [7675] " Purple Cow Studio"
## [7676] " Purple Pictures"
## [7677] " Push It Productions"
## [7678] " Pushkin Pictures"
## [7679] " Putrefactory Limited"
## [7680] " Puvisate Ltd"
## [7681] " PVR Cinemas"
## [7682] " PWSTiF"
## [7683] " Pygmalion Production"
## [7684] " Pym Films"
## [7685] " Pyrame Distribution id"
## [7686] " Pyrame Films id"
## [7687] " Pyrame Productions id"
## [7688] " Python Monty Pictures Limited"
## [7689] " Q Productions"
## [7690] " Qartuli Pilmi"
## [7691] " QED International"
## [7692] " Qintex Entertainment"
## [7693] " QKO"
## [7694] " Quad Productions"
## [7695] " Quadra Entertainment"
## [7696] " Quadrant Entertainment"
## [7697] " Quake Productions"
## [7698] " Quality Filmed Entertainment"
## [7699] " Quanta Centro de Produções Cinematográficas"
## [7700] " Quantum Entertainment"
## [7701] " Quantum Films"
## [7702] " Quasar Pictures"
## [7703] " QubeFilm"
## [7704] " Querosene Filmes"
## [7705] " Quickfire Films"
## [7706] " Quicksilver Films"
## [7707] " Quiet Films Inc"
## [7708] " Quiet Pictures"
## [7709] " Quiet Village Filmkunst"
## [7710] " Quincy Jones Dav Salzman Entertainment id"
## [7711] " Quinta Communications"
## [7712] " Quintessence Films"
## [7713] " Quintet Productions"
## [7714] " Quite Nice Pictures"
## [7715] " Quixote Films"
## [7716] " Quorum Entertainment"
## [7717] " Quorum Films"
## [7718] " Qwerty Films"
## [7719] " R S Film Enterprises Inc"
## [7720] " R D Banshal Co"
## [7721] " R R Movie Makers"
## [7722] " R 26C Produzioni"
## [7723] " R C Produzioni"
## [7724] " R D Banshai Co"
## [7725] " R D Banshal Co"
## [7726] " R K Films Ltd"
## [7727] " R M Films"
## [7728] " R O C"
## [7729] " R P Productions"
## [7730] " R R Productions"
## [7731] " R S Entertainment"
## [7732] " R S Film"
## [7733] " R U Media"
## [7734] " Raaj Kamal Films International"
## [7735] " RabbitBandini Productions"
## [7736] " Rabinovich Film Fund Cinema Project"
## [7737] " Raccord Produções"
## [7738] " Race Point Films"
## [7739] " Racing Pictures"
## [7740] " Rada Film Group"
## [7741] " Radar Films"
## [7742] " Radar Pictures"
## [7743] " Radiant Film GmbH"
## [7744] " Radiate Films"
## [7745] " Radiator Film ApS"
## [7746] " Radical Media"
## [7747] " Radical Pictures"
## [7748] " Radio Bremen"
## [7749] " Radio Télévision Belge Francophone"
## [7750] " Radio Télévision Belge Francophone RTBF"
## [7751] " Radio Televisión Española RTVE"
## [7752] " Radio televizija Federacije Bosne i Hercegovine RTVFBiH"
## [7753] " Radio Televizija Srbije"
## [7754] " Radiotelevisão Portuguesa RTP"
## [7755] " Radiotelevisione Italiana RAI"
## [7756] " Radiotelevizija Beograd"
## [7757] " Radiotelevizija Crne Gore"
## [7758] " Radius Productions"
## [7759] " Radius TWC"
## [7760] " Radnitz Mattel Productions"
## [7761] " RAF Industries"
## [7762] " Raffaella Productions"
## [7763] " Rafran Cinematografica"
## [7764] " Ragewar Productions"
## [7765] " RAI"
## [7766] " Rai 2"
## [7767] " Rai Cinema"
## [7768] " Rai Cinemafiction"
## [7769] " Rai Fiction"
## [7770] " RAI Radiotelevisione Italiana"
## [7771] " Rai Tre Radiotelevisione Italiana"
## [7772] " RAIN DOMINION"
## [7773] " Rainbow Film Company The"
## [7774] " Rainbow Productions"
## [7775] " Rainbow Shooting Star Pictures"
## [7776] " RainCity Productions"
## [7777] " Raincreek Productions"
## [7778] " Raindance Entertainment"
## [7779] " Rainer Werner Fassbinder Foundation"
## [7780] " Rainfall Films"
## [7781] " Rainforest Films"
## [7782] " Rainmaker Entertainment"
## [7783] " Rainmaker Films"
## [7784] " Rainmark Films"
## [7785] " Raíz Produções Cinematográficas"
## [7786] " Rajkumar Hirani Films"
## [7787] " Rajshri Productions"
## [7788] " Rajshri Productions Pvt Ltd"
## [7789] " Rajvi Pictures"
## [7790] " Rakontur"
## [7791] " Ralph M Like Productions"
## [7792] " Ralph Minden Film"
## [7793] " Ralph Smart Productions"
## [7794] " Ram Bergman Productions"
## [7795] " Ram Films Inc"
## [7796] " Ramalho Filmes"
## [7797] " RAMCO"
## [7798] " Ramón Acín"
## [7799] " Ramon Film Productions"
## [7800] " Ramona Productions"
## [7801] " Rampart Films"
## [7802] " Ramsay Productions"
## [7803] " Ramsway Ltd"
## [7804] " Rangeland Productions"
## [7805] " Rangoon Productions"
## [7806] " Ranjit Films"
## [7807] " Rank Organization"
## [7808] " Rankin Bass Productions"
## [7809] " Rap Film id"
## [7810] " Rap Heart Pictures id"
## [7811] " Rapi Films"
## [7812] " Rappaport Productions"
## [7813] " Rashmi Sharma Telefilms Limited"
## [7814] " Rasta International"
## [7815] " Rastar Films"
## [7816] " Rastar Pictures"
## [7817] " Rat Pack Filmproduktion"
## [7818] " Rather Good Films"
## [7819] " Raven Banner Entertainment"
## [7820] " Raving Cyclops Studios"
## [7821] " Raw Feed"
## [7822] " Raw Nerve"
## [7823] " Raw Siena"
## [7824] " Raw TV"
## [7825] " Raybert Productions"
## [7826] " Raymond Stross Productions"
## [7827] " Razor Film Produktion GmbH"
## [7828] " RBG Films"
## [7829] " RCI"
## [7830] " RCR Media Group"
## [7831] " RD DR Productions"
## [7832] " RE STUDIO Renata Czarnkowska Listos"
## [7833] " Real Dakota"
## [7834] " Real Film GmbH"
## [7835] " Real Internacional"
## [7836] " Réalisation d Art Cinématographique"
## [7837] " Realitism"
## [7838] " Reality Entertainment"
## [7839] " Reality Entertainment RE"
## [7840] " Really Real Films"
## [7841] " RealProduct"
## [7842] " RealReel"
## [7843] " Rebel Film BV"
## [7844] " rebel one pictures"
## [7845] " Reboot USA"
## [7846] " Rec Produtores Associados Ltda"
## [7847] " Récifilms"
## [7848] " Reckareckafilms"
## [7849] " Recluse Films"
## [7850] " Reclusion Films"
## [7851] " Reconser id"
## [7852] " Reconstruction Pictures"
## [7853] " Recorded Picture Company RPC"
## [7854] " Recorded Pictures Company"
## [7855] " Rectangle Productions"
## [7856] " Recyclewala Films"
## [7857] " Red Black Films"
## [7858] " Red Baron Films"
## [7859] " Red Bike Films"
## [7860] " red bone"
## [7861] " Red Bucket Films"
## [7862] " Red Bull Media House"
## [7863] " Red Canyon Pictures"
## [7864] " Red Carpet"
## [7865] " Red Carpet Productions"
## [7866] " Red Chillies Entertainment"
## [7867] " Red Circle Productions"
## [7868] " Red Crown Productions"
## [7869] " Red Envelope Entertainment"
## [7870] " Red Giant Movies"
## [7871] " Red Gourmet Productions"
## [7872] " Red Granite Pictures"
## [7873] " Red Headed Revolution Pictures"
## [7874] " Red horse Native"
## [7875] " Red Hour Films"
## [7876] " Red Lamp Films"
## [7877] " Red Letter Media"
## [7878] " Red Line Films"
## [7879] " Red Line Studios"
## [7880] " Red Lion"
## [7881] " Red Om Films"
## [7882] " Red Union Films"
## [7883] " Red Valkyrie Studios"
## [7884] " Red Wine Pictures"
## [7885] " Redeemable Features"
## [7886] " Redhead Productions"
## [7887] " Redhouse Productions"
## [7888] " Redwire Pictures"
## [7889] " Redwood Palms Pictures"
## [7890] " Redwood Productions"
## [7891] " Reel FX Creative Studios"
## [7892] " Reel Life Productions"
## [7893] " Reel One Entertainment"
## [7894] " Reel One Films 6"
## [7895] " Reeleyes Film"
## [7896] " Reencuentro Films"
## [7897] " REF Productions"
## [7898] " Reforma Films"
## [7899] " Regal Entertainment"
## [7900] " Regal films"
## [7901] " Regal Films"
## [7902] " Regal Films Inc"
## [7903] " Regency Enterprises"
## [7904] " Regency Productions"
## [7905] " Regenerate Films"
## [7906] " Regent Capital"
## [7907] " Regent Entertainment"
## [7908] " Reggane Films"
## [7909] " Regina Films"
## [7910] " Région Ile de France"
## [7911] " Région Provence Côte d Azur"
## [7912] " Regner Grasten Film"
## [7913] " Regner Grasten International"
## [7914] " Reiner Greisman Productions"
## [7915] " Reinventing the Wheel"
## [7916] " Reisenbauer Film"
## [7917] " Rekord Films"
## [7918] " Rekun Cinema"
## [7919] " Rekun TV"
## [7920] " Relativity Media"
## [7921] " Relevant"
## [7922] " Reliance Big Pictures"
## [7923] " Reliance Entertainment"
## [7924] " Reluctant Production"
## [7925] " REM Publishing Ltd"
## [7926] " Remstar Productions"
## [7927] " Remus"
## [7928] " Ren Film"
## [7929] " REN Mar Studios"
## [7930] " Renaissance Films"
## [7931] " Renaissance Pictures"
## [7932] " Rene Clair Productions"
## [7933] " Renegade Films"
## [7934] " Renegade Motion Picture"
## [7935] " Renegade Pictures"
## [7936] " Renegade Worldwe id"
## [7937] " Renkli"
## [7938] " Renn Productions"
## [7939] " Reno Productions"
## [7940] " Renown Pictures Corporation"
## [7941] " Replay Pictures"
## [7942] " Reposado Producciones"
## [7943] " Reprise Films"
## [7944] " Republic Entertainment International"
## [7945] " Republic of EPIC"
## [7946] " Republic Pictures"
## [7947] " Republic Pictures I"
## [7948] " Republic Pictures II"
## [7949] " Republic Pictures International"
## [7950] " Rescued Media"
## [7951] " Resnick Interactive Development"
## [7952] " Resolute Films and Entertainment"
## [7953] " Resonance Film Veo id"
## [7954] " Respect Films"
## [7955] " Restraining Order"
## [7956] " Restraint LLC"
## [7957] " Reteitalia"
## [7958] " Retromedia Entertainment"
## [7959] " Return to Mississippi Productions"
## [7960] " Reunion Pictures"
## [7961] " Revcom Télévision"
## [7962] " Revel Entertainment"
## [7963] " Revelations Entertainment"
## [7964] " Revelin Studios"
## [7965] " Revere Pictures"
## [7966] " Révillon Frères"
## [7967] " Revolution Films"
## [7968] " Revolution Studios"
## [7969] " Revolutionary Eye LLC"
## [7970] " Revolver Film"
## [7971] " Revolver Picture Company"
## [7972] " Revue Studios"
## [7973] " Rex Carlton Productions"
## [7974] " Rex Film GmbH"
## [7975] " Reynolds Pictures"
## [7976] " Rezo Films"
## [7977] " RF2K Productions"
## [7978] " RFB Enterprises"
## [7979] " RGV Film Factory"
## [7980] " RH Cinema"
## [7981] " Rhayuela Cine"
## [7982] " Rhea Films"
## [7983] " RHI"
## [7984] " RHI Entertainment"
## [7985] " Rhino Films"
## [7986] " Rhino Home Veo id"
## [7987] " Rhino Media"
## [7988] " Rhombus Media"
## [7989] " Rhombus Ringfilm"
## [7990] " Rhône Alpes Cinéma"
## [7991] " Rhythm Films"
## [7992] " Rialto Film"
## [7993] " Rialto Films"
## [7994] " Rich Animation Studios"
## [7995] " Rich Heape Films"
## [7996] " Rich Vein Productions"
## [7997] " Richard Oswald Produktion"
## [7998] " Richmond Light Horse Productions"
## [7999] " Richmond Productions"
## [8000] " Richwater Films"
## [8001] " Rick Lashbrook Films"
## [8002] " Rick Sloane Productions"
## [8003] " Rigas Entertainment"
## [8004] " Rigas Kinostudija"
## [8005] " Rigel Entertainment"
## [8006] " Rigel Independent Entertainment"
## [8007] " Right Thinking"
## [8008] " Riley Productions"
## [8009] " Ring Productions"
## [8010] " Ringleader Studios"
## [8011] " Ringling College of Art and Design"
## [8012] " Rio Negro"
## [8013] " Rioma Films"
## [8014] " Ripple World Pictures"
## [8015] " Rising Star"
## [8016] " Rising Sun Films"
## [8017] " Ritz Carlton Pictures"
## [8018] " Riva Filmproduktion"
## [8019] " Rival Pictures"
## [8020] " River One Films"
## [8021] " River Road Entertainment"
## [8022] " RiverRain Productions"
## [8023] " Riverse Entertainment id"
## [8024] " Riviera Films"
## [8025] " Rizoma Films"
## [8026] " Rizzoli Film"
## [8027] " Rizzoli Films"
## [8028] " RK Entertainment"
## [8029] " RKM 29"
## [8030] " RKO Pathé Pictures"
## [8031] " RKO Pictures"
## [8032] " RKO Radio Pictures"
## [8033] " RKO Radio Pictures Inc"
## [8034] " Rley Scott Associates id"
## [8035] " RLJ Entertainment"
## [8036] " RM Films International"
## [8037] " RM Tuotanto"
## [8038] " RMV Film"
## [8039] " Road Movies Dritte Produktionen"
## [8040] " Road Movies Filmproduktion"
## [8041] " Road Movies Filmproduktion GmbH"
## [8042] " Road Show Attractions"
## [8043] " Roadse Attractions id"
## [8044] " Roadshow Attractions"
## [8045] " Roadshow Film Distributors"
## [8046] " Roadshow Productions"
## [8047] " Roas Produzioni"
## [8048] " Roast Beef Productions"
## [8049] " Rob Houwer Productions"
## [8050] " Robert E Kent Productions"
## [8051] " Robert et Raymond Hakim"
## [8052] " Robert Goldstein Productions"
## [8053] " Robert Greenwald Productions"
## [8054] " Robert Lawrence Productions"
## [8055] " Robert P Marcucci Productions"
## [8056] " Robert Patrick Productions"
## [8057] " Robert Roark Productions"
## [8058] " Robert Simonds Productions"
## [8059] " Robert Stigwood Organization RSO"
## [8060] " Robert Stillman Productions"
## [8061] " Robert Stone Productions"
## [8062] " Robert W Paul"
## [8063] " Robert Wise Productions"
## [8064] " Roberts Pictures Inc"
## [8065] " Robin Films"
## [8066] " Robot"
## [8067] " Robot Communications"
## [8068] " Robson Street"
## [8069] " Roc a fella Films"
## [8070] " Rochelle Films"
## [8071] " Rock Film Studio"
## [8072] " Rockaway the Movie"
## [8073] " Rockers Film Corporation"
## [8074] " Rocket Pictures"
## [8075] " Rocket Racer Productions"
## [8076] " Rockfilm"
## [8077] " Rockhaven Pictures"
## [8078] " Rockster Productions"
## [8079] " Rockwell Eyes"
## [8080] " Rodar y Rodar Cine y Televisión"
## [8081] " Roddenberry Entertainment"
## [8082] " Röde Orm Filmproduktion AB"
## [8083] " Rodent Films"
## [8084] " Rodeo"
## [8085] " Rodeo Drive"
## [8086] " Rodeo Productions"
## [8087] " Rodiacines"
## [8088] " Rofima Cinematografica"
## [8089] " ROFLMAO Productions"
## [8090] " Roger Corman Productions"
## [8091] " Rogue Arts"
## [8092] " Rogue Pictures"
## [8093] " Rogue Star Films"
## [8094] " Rogue State"
## [8095] " Rohfilm"
## [8096] " Roissy Films"
## [8097] " Rojak Films"
## [8098] " Roland West Productions"
## [8099] " Rolin Films"
## [8100] " Rollercoaster Entertainment"
## [8101] " Rollin Studio Romania"
## [8102] " Rolling M Productions"
## [8103] " Rollins Joffe Productions"
## [8104] " Roman Spring Pictures"
## [8105] " Romana Film"
## [8106] " Romania Film"
## [8107] " Romax"
## [8108] " Romax Productions"
## [8109] " Rome Paris Films"
## [8110] " Rommel Film"
## [8111] " Romulus Films"
## [8112] " Ronald J Kahn Productions"
## [8113] " Rook Films"
## [8114] " Rooks Nest Entertainment"
## [8115] " Room 101"
## [8116] " Room 608"
## [8117] " Rooster Teeth Productions"
## [8118] " Rootbeer Films"
## [8119] " Rosa Film"
## [8120] " Rosa Filmes"
## [8121] " Rosafrey SRL"
## [8122] " Rose Ruby Productions"
## [8123] " Rosebud Films"
## [8124] " Rosecalypse"
## [8125] " Rosemont Productions"
## [8126] " Rosemont Productions International"
## [8127] " Roser Film"
## [8128] " Ross Hunter Productions Inc"
## [8129] " Ross Stillman Productions Inc"
## [8130] " Roswell Films"
## [8131] " Roth Arnold Productions"
## [8132] " Rotor Film Babelsberg"
## [8133] " Rouge international"
## [8134] " Rouge Productions"
## [8135] " Rough Draft Studios"
## [8136] " Rough House Pictures"
## [8137] " Rough Trade Distribution GmbH"
## [8138] " Round Films"
## [8139] " Route 17 Entertainment"
## [8140] " Roxanne Company"
## [8141] " Roxbury Films"
## [8142] " Roxbury Productions"
## [8143] " Roxy Film"
## [8144] " Roxy Films"
## [8145] " Roy Del Ruth Productions"
## [8146] " Royal Air Force Film Production Unit"
## [8147] " Royal American Pictures"
## [8148] " Royal Avenue Chelsea"
## [8149] " Royal College of Art"
## [8150] " Royal Film"
## [8151] " Royal Oaks Entertainment"
## [8152] " Royal Oaks Entertainment Inc"
## [8153] " Royal Shakespeare Company"
## [8154] " Royce Smeal Film Productions"
## [8155] " RPA Rizzoli Film"
## [8156] " RSA Films"
## [8157] " RSS Production"
## [8158] " RSVP Productions"
## [8159] " RT Features"
## [8160] " RTÉ"
## [8161] " RTL Entertainment"
## [8162] " RTL Television"
## [8163] " RTV Slovenija"
## [8164] " Rubber Tree Productions"
## [8165] " Rubicon Film AS"
## [8166] " Ruby Films"
## [8167] " Ruby in Paradise"
## [8168] " Ruckus Films"
## [8169] " Ruddy Morgan Productions"
## [8170] " Ruff Nation Films"
## [8171] " Run Rabbit Run Media"
## [8172] " Run Rampant"
## [8173] " Rundfunk Berlin Brandenburg RBB"
## [8174] " Running Reel Films"
## [8175] " Running With Scissors"
## [8176] " Rupam Chitra"
## [8177] " Rusconi Film"
## [8178] " Russ Arts"
## [8179] " Russ Field Productions"
## [8180] " Russian Film Committee"
## [8181] " Russian Golden Episodes"
## [8182] " Russkoe Schastie Entertainment"
## [8183] " Russo Productions"
## [8184] " rusty bear entertainment"
## [8185] " Ruthless Pictures"
## [8186] " RVML Animation"
## [8187] " RynoRyder Productions Inc"
## [8188] " RYOT Films"
## [8189] " Rysher Entertainment"
## [8190] " S and Marty Krofft Enterprises id"
## [8191] " S Films"
## [8192] " S N Prodis"
## [8193] " S Pictures"
## [8194] " S U M O Film"
## [8195] " Saban Entertainment"
## [8196] " Sabbatical Pictures"
## [8197] " Sabella Dern Entertainment"
## [8198] " Saber Productions"
## [8199] " sabotage film GmbH"
## [8200] " Saboteur Media"
## [8201] " Sabre Film Productions Ltd"
## [8202] " Sabre Films"
## [8203] " Sacha Pictures"
## [8204] " Sacher Film"
## [8205] " Sacis"
## [8206] " Sack Amusement Enterprises"
## [8207] " Sacred Cow Productions"
## [8208] " Saerom Entertainment"
## [8209] " Safady Entertainment"
## [8210] " Safehouse Pictures"
## [8211] " Saga Film"
## [8212] " Sage Productions"
## [8213] " Sagittaire Films"
## [8214] " Sahamongkol Film"
## [8215] " Sahamongkol Film International"
## [8216] " Sahamongkol Film International Co Ltd"
## [8217] " Sahamongkolfilm Co"
## [8218] " Sahara One Entertainment"
## [8219] " Sahara One Motion Pictures"
## [8220] " Sai Enterprise"
## [8221] " Saigon1515 Productions"
## [8222] " Sailor Bear"
## [8223] " Saito Entertainment"
## [8224] " Sakhkinmrestsvi"
## [8225] " Sakhkinmretsvi"
## [8226] " Salamander Film Productions"
## [8227] " Salaria Film"
## [8228] " Salazar Film"
## [8229] " Sallah Company"
## [8230] " Sally Head Productions"
## [8231] " Salon Pictures"
## [8232] " Salon Productions"
## [8233] " Saltmill"
## [8234] " Salto de Fe Films"
## [8235] " Salto Films"
## [8236] " Salty Features"
## [8237] " Salty Pictures"
## [8238] " Salzgeber Co Medien GmbH"
## [8239] " Salzgeber Company Medien"
## [8240] " Sam Wiesenthal Productions"
## [8241] " Samaritan Entertainment"
## [8242] " Samba P C"
## [8243] " SamFilm Produktion"
## [8244] " Samosa Stories Private Limited"
## [8245] " Samouraï Films"
## [8246] " Samsa Film"
## [8247] " Samsara Films"
## [8248] " Samson Films"
## [8249] " Samsung Entertainment"
## [8250] " Samuel Bronston Productions"
## [8251] " Samuel Fuller Productions"
## [8252] " Samuel Goldwyn"
## [8253] " Samuel Goldwyn Company"
## [8254] " Samuel Goldwyn Company The"
## [8255] " Samuel Goldwyn Films"
## [8256] " Samurai Productions"
## [8257] " San Francisco Film"
## [8258] " San Francisco Independent Cinema"
## [8259] " San Marco S P A Crono S P A"
## [8260] " San Mateo Productions"
## [8261] " Sanai Pictures"
## [8262] " Sancro Film"
## [8263] " Sancrosiap"
## [8264] " Sandbar Pictures"
## [8265] " Sandcastle 5 Productions"
## [8266] " Sandcastle Pictures"
## [8267] " Sandler Institutional Films"
## [8268] " Sandollar Productions"
## [8269] " Sandrew Film Teater AB"
## [8270] " Sandrew Metronome Distribution"
## [8271] " Sandrew Metronome Norge"
## [8272] " Sandrews"
## [8273] " Sands Films"
## [8274] " Sandstorm Films"
## [8275] " Sandy Howard Productions"
## [8276] " Sanford"
## [8277] " Sanjines"
## [8278] " Sanrio Communications"
## [8279] " Santa Clara Productions"
## [8280] " Santa Fe Productions"
## [8281] " Santa Fe Productions I"
## [8282] " Santana Pictures Corporation"
## [8283] " Saptrishi Cinevision"
## [8284] " Sara films"
## [8285] " Sara Films"
## [8286] " Saratoga Film Corporation"
## [8287] " SarcoFilms"
## [8288] " Sarkasmos Productions"
## [8289] " Sarke Studio"
## [8290] " Sascha Film"
## [8291] " Sascha Verleih"
## [8292] " Sat 1"
## [8293] " Sataifilm"
## [8294] " Sateenkaarifilmi Oy"
## [8295] " Sathya Movies"
## [8296] " Saticoy Productions"
## [8297] " Saturn Films"
## [8298] " Satyajit Ray Productions"
## [8299] " Saul Bass Associates"
## [8300] " Savage Film"
## [8301] " Savage Production Ltd"
## [8302] " Savage Productions"
## [8303] " Saville Productions"
## [8304] " Savoy Pictures"
## [8305] " Sayaka Producciones Audiovisuales"
## [8306] " Saylors Brothers Entertainment"
## [8307] " SBA"
## [8308] " SBK Pictures"
## [8309] " SBS"
## [8310] " SBS Films"
## [8311] " SBS Productions"
## [8312] " SC Films International"
## [8313] " Scala Films"
## [8314] " Scala Productions"
## [8315] " Scalera Film S p a"
## [8316] " Scallie Filmworks"
## [8317] " Scanbox"
## [8318] " Scandica Film"
## [8319] " Scanner Rhodes Productions"
## [8320] " Scary Pictures Productions"
## [8321] " Scatena Rosner Films"
## [8322] " scena film"
## [8323] " Scena Film"
## [8324] " Scenes From"
## [8325] " Schaefer Karpf Productions"
## [8326] " Schick Sunn Classics"
## [8327] " Schiwago Film"
## [8328] " Schmtz Katze Filmkollektiv id"
## [8329] " Scholar Films Company"
## [8330] " School Pictures"
## [8331] " Schoolfield Media"
## [8332] " Schorr Pictures"
## [8333] " Schramm Film Koerner Weber"
## [8334] " Schulberg Productions"
## [8335] " Schweizer Fernsehen"
## [8336] " Sci Fi Channel"
## [8337] " Sci Fi Pictures"
## [8338] " Sciapode"
## [8339] " Scimitar Films"
## [8340] " Scimitar Productions"
## [8341] " Scion Films"
## [8342] " Scoop Films"
## [8343] " SCOPE Invest"
## [8344] " Score G Productions"
## [8345] " Scorpio"
## [8346] " Scorpio Studio"
## [8347] " Scorpion"
## [8348] " Scorsese Productions"
## [8349] " Scotia International"
## [8350] " Scott Free Productions"
## [8351] " Scott Rudin Productions"
## [8352] " Scotti Brothers Pictures"
## [8353] " Scotti Brothers Pictures I"
## [8354] " Scottish Screen"
## [8355] " Scout Productions"
## [8356] " Scream HQ"
## [8357] " Screen Australia"
## [8358] " Screen Classics II"
## [8359] " Screen Corporation"
## [8360] " Screen Enterprise"
## [8361] " Screen Entertainment Co"
## [8362] " Screen Gems"
## [8363] " Screen Gems Inc"
## [8364] " Screen Gems Television"
## [8365] " Screen Guild Productions"
## [8366] " Screen Media Films"
## [8367] " Screen Media Ventures"
## [8368] " Screen NSW"
## [8369] " Screen West Mlands id"
## [8370] " Screen Yorkshire"
## [8371] " Screenland"
## [8372] " Screenplay Infinite Films"
## [8373] " Screentime New Zealand"
## [8374] " Sculptor Media"
## [8375] " Sculptures of Dazzling Complexity"
## [8376] " Scythia Films"
## [8377] " Se Gig Productions id"
## [8378] " Se ma for Studios"
## [8379] " SE8 Group"
## [8380] " Seabourne Pictures"
## [8381] " Seafarers International Union Atlantic Gulf Coast District American Federation of Labor"
## [8382] " Sean S Cunningham Films"
## [8383] " Searchlight Films"
## [8384] " Season of Darkness LLC"
## [8385] " Seasonal Film Corporation"
## [8386] " Seattle Film Co"
## [8387] " Sebastian Films Limited"
## [8388] " Secol Superbo e Sciocco Produzioni"
## [8389] " Second Feature Productions"
## [8390] " Secret Handshake Entertainment"
## [8391] " Secret Weapon Films"
## [8392] " Section Eight"
## [8393] " Section Eight Productions"
## [8394] " Security Pictures"
## [8395] " Seda Spettacoli"
## [8396] " Sedic"
## [8397] " Sedic International"
## [8398] " Seduction Cinema"
## [8399] " See Saw Films"
## [8400] " Seed Productions II"
## [8401] " Seeso LLC"
## [8402] " SeeThink Films"
## [8403] " Segal Tokofsky Productions Inc"
## [8404] " Sekick Entertainment id"
## [8405] " Sektor Film Skopje"
## [8406] " Selb Film"
## [8407] " Select Media Holdings Moving Pictures"
## [8408] " Select Productions III"
## [8409] " Selected Pictures"
## [8410] " Self Reliant Film"
## [8411] " Selig Polyscope Company"
## [8412] " Selmur Productions"
## [8413] " Seltzer Films"
## [8414] " Selznick International Pictures"
## [8415] " Semi Professional"
## [8416] " SemiRebellious Films"
## [8417] " SenArt Films"
## [8418] " Senator Entertainment Co"
## [8419] " Senator Film"
## [8420] " Senator Film Produktion"
## [8421] " Senator International"
## [8422] " Sender Films"
## [8423] " Sender Freies Berlin SFB"
## [8424] " SenoReality Pictures"
## [8425] " Sense and Sensibility Ventures"
## [8426] " Seoul Films"
## [8427] " Sepia Films"
## [8428] " Seppä Callahanin Filmimaailma Oy"
## [8429] " September Dawn"
## [8430] " September Gurls Productions"
## [8431] " Sequoia Pictures"
## [8432] " Sequoia Productions"
## [8433] " Ser Film id"
## [8434] " Seraphim Films"
## [8435] " Serenade Films"
## [8436] " Serendipity Point Films"
## [8437] " Serenity Entertainment"
## [8438] " Serpent Films Productions"
## [8439] " Seshow Alley id"
## [8440] " Seshow Pictures id"
## [8441] " Seskri Produktionz"
## [8442] " Setrack Films id"
## [8443] " Seven Arts"
## [8444] " Seven Arts Films"
## [8445] " Seven Arts Pictures"
## [8446] " Seven Arts Productions"
## [8447] " Seven Cities Media"
## [8448] " Seven Keys"
## [8449] " Seven Pictures"
## [8450] " Seven8 Media"
## [8451] " SevenPictures"
## [8452] " SEVER SEVER"
## [8453] " Severin Films"
## [8454] " SF Film"
## [8455] " SF Film Finland Oy"
## [8456] " SF Film Production ApS"
## [8457] " SF Norge"
## [8458] " SF Norge Produksjon"
## [8459] " SGL Entertainment"
## [8460] " Shaboo Arts"
## [8461] " Shadow Entertainment"
## [8462] " Shadow Films"
## [8463] " Shadow Stars"
## [8464] " Shadow Theatre Films"
## [8465] " ShadowCatcher Entertainment"
## [8466] " Shadowlands Productions"
## [8467] " Shadowlight Productions"
## [8468] " Shaft"
## [8469] " Shakespeare Film Company"
## [8470] " Shakey Pictures"
## [8471] " Shanghai Animation Film Studio"
## [8472] " Shanghai Film Group"
## [8473] " Shanghai Film Studios"
## [8474] " Shanghai K Films id"
## [8475] " Shango Films"
## [8476] " Shangri La Entertainment"
## [8477] " Shankar Films"
## [8478] " Shanxi Film Studio"
## [8479] " Shapiro Glickenhaus Entertainment"
## [8480] " Shaw Brothers"
## [8481] " Shaw Brothers HK Ltd"
## [8482] " Sheen Michaels Entertainment"
## [8483] " Sheherazad Media International"
## [8484] " Shelter Films"
## [8485] " Shemaroo"
## [8486] " Sherazade Film Development"
## [8487] " Sherpas Cinema"
## [8488] " Sherwood"
## [8489] " Sherwood Productions"
## [8490] " Sherwood Schwartz Productions"
## [8491] " Shin Cine Communications"
## [8492] " Shin Films"
## [8493] " Shin Kankaku ha Eiga Renmei Productions"
## [8494] " Shinework Media"
## [8495] " Shinkai Makoto"
## [8496] " Shinkô Kinema"
## [8497] " Shintoho Company"
## [8498] " Shintoho Film Distribution Committee"
## [8499] " Shisso Production"
## [8500] " Sho Films"
## [8501] " Shochiku"
## [8502] " Shochiku Co Ltd"
## [8503] " Shochiku Company"
## [8504] " Shôchiku Eiga"
## [8505] " Shochiku Fuji Company"
## [8506] " Shochiku Kinema Kamata"
## [8507] " Shochiku Ofuna"
## [8508] " Shoes Full of Feet"
## [8509] " Shogakukan"
## [8510] " Shogakukan Production"
## [8511] " Shoot First Entertainment"
## [8512] " Shoot Productions"
## [8513] " Shooting Films"
## [8514] " Shooting Gallery"
## [8515] " Shooting Star"
## [8516] " Shooting Star Filmcompany BV"
## [8517] " ShoreFront Entertainment"
## [8518] " Shoreline Entertainment"
## [8519] " Shortcom"
## [8520] " Shostak Rossner Productions"
## [8521] " Shot Szumowski"
## [8522] " Shouchiku Co"
## [8523] " Shout Factory"
## [8524] " Show Dog Productions"
## [8525] " Show East"
## [8526] " Showbox"
## [8527] " Showbox Entertainment"
## [8528] " Showbox Mediaplex"
## [8529] " Showcase Entertaiment Inc"
## [8530] " Showcase Entertainment Inc"
## [8531] " Showcase Television"
## [8532] " Showgate"
## [8533] " Showmen s Pictures"
## [8534] " ShowTime"
## [8535] " Showtime Australia"
## [8536] " Showtime Entertainment Television"
## [8537] " Showtime Films"
## [8538] " Showtime Networks"
## [8539] " Showtime Pictures Inc"
## [8540] " Shree Ashtavinayak Cine Vision"
## [8541] " Shree Ashtavinayak Cinevision Ltd"
## [8542] " Shree Venkatesh Films"
## [8543] " Shri Sai Raam Creations"
## [8544] " Shueisha"
## [8545] " Shumba International Corporation"
## [8546] " Shut Up and Sing LLC"
## [8547] " Si Litvinoff Film Production"
## [8548] " SIA Advertising"
## [8549] " Sick the Life and Death of Bob Flanagan Supermasochist"
## [8550] " Sigma Cinematografica Roma"
## [8551] " Sigma Film Productions"
## [8552] " Sigma Films"
## [8553] " Sigma Films Ltd"
## [8554] " Sigmund Neufeld Productions"
## [8555] " Signature Pictures"
## [8556] " Signboard Hill Productions"
## [8557] " Signe Baumane Studio"
## [8558] " Sikhya Entertainment"
## [8559] " Sil Metropole Organisation"
## [8560] " Silent Films Inc"
## [8561] " Silent Hill DCP Inc"
## [8562] " Silent Night Releasing Corporation"
## [8563] " Silver Ant"
## [8564] " Silver Films"
## [8565] " Silver Leaf Pictures"
## [8566] " Silver Lining Entertainment II"
## [8567] " Silver Lining Film Group"
## [8568] " Silver Nitrate"
## [8569] " Silver Nitrate Films"
## [8570] " Silver Nitrate Pictures"
## [8571] " Silver Peak Productions"
## [8572] " Silver Pictures"
## [8573] " Silver Reel"
## [8574] " Silver River Productions"
## [8575] " Silver Sail Entertainment"
## [8576] " Silver Screen Partners"
## [8577] " Silver Screen Partners II"
## [8578] " Silver Screen Partners III"
## [8579] " Silver Screen Pictures"
## [8580] " Silver Sphere Corporation"
## [8581] " Silver Web Productions"
## [8582] " SilverLight Entertainment"
## [8583] " Silverline Pictures"
## [8584] " Silverscreen Films"
## [8585] " Silverwood Films"
## [8586] " Simaye Mehr"
## [8587] " Simcha Productions"
## [8588] " Simcom Limited"
## [8589] " Simka Entertainment"
## [8590] " Simon Films"
## [8591] " Simon West Productions"
## [8592] " SinCap Productions"
## [8593] " Sindicato de Trabajadores de la Producción Cinematográfica STPC"
## [8594] " Sine Olivia"
## [8595] " Sinegraf"
## [8596] " Sinemart"
## [8597] " Singing Frog Studio"
## [8598] " Singing Trees Entertainment"
## [8599] " Single Spark Pictures"
## [8600] " Singular Audiovisual"
## [8601] " Sinister Siblings Films"
## [8602] " Sino Filmes"
## [8603] " Sio Film and Bravo Entertainment"
## [8604] " Siren Digital Hollywood"
## [8605] " Sirena Film"
## [8606] " Siriol Productions"
## [8607] " Sirk Productions"
## [8608] " Site 4 View Productions"
## [8609] " Site B"
## [8610] " Sitting Cat Productions"
## [8611] " Sivashakthi Movie Makers"
## [8612] " Six Entertainment"
## [8613] " Six Point Harness"
## [8614] " Sixteen Films"
## [8615] " Sixth Wave Productioins"
## [8616] " Sixth Way Productions"
## [8617] " SK Films"
## [8618] " SKA Films"
## [8619] " Skandia Filmi Oy"
## [8620] " Skateland Productions"
## [8621] " Skinny Nervous Guy"
## [8622] " Skipped Parts Productions"
## [8623] " Skladanowsky Film"
## [8624] " SKM"
## [8625] " Skobelev Committee"
## [8626] " Skopia Film"
## [8627] " Skreba Films"
## [8628] " Sky Pictures"
## [8629] " Skyhook Productions"
## [8630] " Skyline Entertainment"
## [8631] " Skyline Entertainment Partners"
## [8632] " Skyline Film Television"
## [8633] " Skyline Films"
## [8634] " Skyline Pictures"
## [8635] " Skyra Entertainment"
## [8636] " Skyscraper Films"
## [8637] " Slaughter FX"
## [8638] " Slava Film"
## [8639] " SLB Films"
## [8640] " SLB Films Pvt Ltd"
## [8641] " SLC"
## [8642] " Sleepwalkers Anonymous"
## [8643] " Sleepy Whippet"
## [8644] " SLM Production Group"
## [8645] " Slot Machine"
## [8646] " Slotint"
## [8647] " Slough Pond"
## [8648] " Slovenská filmová tvorba Koliba SFT"
## [8649] " Slovenská Pozicovna Filmov v Bratislava"
## [8650] " Slovo"
## [8651] " Small Form Films"
## [8652] " Small Moves"
## [8653] " Small Package Films"
## [8654] " Smart Egg Pictures"
## [8655] " Smartest Man Productions"
## [8656] " Smithfield Street Productions"
## [8657] " Smokescreen Inc"
## [8658] " Smokewood Entertainment"
## [8659] " Smokewood Entertainment Group"
## [8660] " Snapper Films Oy"
## [8661] " SND"
## [8662] " Sneak Preview Productions"
## [8663] " Sneaky Pete Productions"
## [8664] " Sney Kimmel Entertainment id"
## [8665] " Sney Lumet Film Productions id"
## [8666] " SNL Studios"
## [8667] " Snoot Entertainment"
## [8668] " Snow Globe Productions"
## [8669] " Snowdog Studio"
## [8670] " Snowfall Films"
## [8671] " Snowfort Pictures"
## [8672] " Snowman Enterprise"
## [8673] " SNPC Società Nazionale Produzioni Cinematografiche"
## [8674] " Sob Noisse Movies"
## [8675] " Sobras International Pictures"
## [8676] " Sochiku"
## [8677] " Social Capital"
## [8678] " Sociedad General de Cine SOGECINE S A"
## [8679] " Sociedade Óptica Técnica"
## [8680] " Società Ambrosiana Cinematografica SAC"
## [8681] " Societa Cooperativa Alfa Cinematografica"
## [8682] " Società Europea Films Internazionali Cinematografica SEFI"
## [8683] " Società Europea Produzioni Associate Cinematografiche"
## [8684] " Società Generale Cinematografica"
## [8685] " Société Cinématographique des Studios de la Victorine"
## [8686] " Societé Cinématographique Lyre"
## [8687] " Societé d Exploitation et de Distribution de Films SEDIF"
## [8688] " Société des Etablissements L Gaumont"
## [8689] " Société Française de Production SFP"
## [8690] " Société Générale de Cinématographie S G C"
## [8691] " Société Générale de Production"
## [8692] " Société générale des films"
## [8693] " Société Lumière"
## [8694] " Société Nationale Pathé Cinéma"
## [8695] " Société Nouvelle Cinévog"
## [8696] " Société Nouvelle de Cinématographie"
## [8697] " Société Nouvelle de Cinématographie SNC"
## [8698] " Société Nouvelle Pathé Cinéma"
## [8699] " Société Radio Canada"
## [8700] " Society Entertainment"
## [8701] " Society Productions Inc"
## [8702] " Sodaperaga Productions"
## [8703] " SODEC"
## [8704] " Sodona Entertainment Inc"
## [8705] " Sofac"
## [8706] " Sofar Film"
## [8707] " Sofica Europacorp"
## [8708] " Sofica Valor 6"
## [8709] " Sofracima"
## [8710] " Softbank Ventures"
## [8711] " Sogecine"
## [8712] " Sogepaq"
## [8713] " Sogetel"
## [8714] " Sohail Khan Production"
## [8715] " Sohail Khan Productionz"
## [8716] " Sokal Film GmbH"
## [8717] " Sol Lesser Productions"
## [8718] " Sol Weld Production id"
## [8719] " Sola Digital Arts"
## [8720] " Solar Films"
## [8721] " Solar Films inc"
## [8722] " Solar Productions"
## [8723] " Solaris Film"
## [8724] " Solax Film Company"
## [8725] " Solventdreams"
## [8726] " Sombracine Producciones"
## [8727] " Sombrero Films"
## [8728] " Someone At The Door Productions"
## [8729] " Somera Productions Flower Film Productions"
## [8730] " Somerset Film Productions"
## [8731] " Sonar Entertainment"
## [8732] " Sonet Film"
## [8733] " Sonet Film AB"
## [8734] " Sonie id"
## [8735] " Sonney Amusement Enterprises Inc"
## [8736] " Sonnis"
## [8737] " Sonocam"
## [8738] " Sonora Films"
## [8739] " Sonset Fray Entertainment id"
## [8740] " Sontalia"
## [8741] " Sony Music Entertainmant"
## [8742] " Sony Music Entertainment Japan"
## [8743] " Sony New Technologies"
## [8744] " Sony Picture Imageworks"
## [8745] " Sony Pictures"
## [8746] " Sony Pictures Animation"
## [8747] " Sony Pictures Classics"
## [8748] " Sony Pictures Entertainment"
## [8749] " Sony Pictures Home Entertainment"
## [8750] " Sony Pictures Releasing"
## [8751] " Sony Pictures Television"
## [8752] " Soon Lee Films"
## [8753] " Sophie Dulac Productions"
## [8754] " Sophie Film"
## [8755] " Soprofilms"
## [8756] " Soraya Intercine Film PT"
## [8757] " Sorcerer Productions"
## [8758] " Sorolla Films"
## [8759] " Sorrento Productions"
## [8760] " Sota Cinema Group"
## [8761] " Soudaine Compagnie"
## [8762] " Soul Kiss Films"
## [8763] " Sound Venture Productions"
## [8764] " Soundsquare"
## [8765] " Soureh Cinema"
## [8766] " South Australian Film Corporation"
## [8767] " South Australian Film Corporation The"
## [8768] " South Central Films"
## [8769] " South Creek Pictures"
## [8770] " South Pacific Pictures"
## [8771] " South Street Films"
## [8772] " Southern Cross Feature Film Company"
## [8773] " Southern Light Films"
## [8774] " Southern Star Productions"
## [8775] " Southpaw Entertainment"
## [8776] " Southwest Motion Pictures"
## [8777] " Sovereign Films"
## [8778] " Sovereign Pictures"
## [8779] " Sovexportfilm"
## [8780] " Sovkino"
## [8781] " Soyuzdetfilm"
## [8782] " Soyuzmultfilm"
## [8783] " SP Entertainments"
## [8784] " SpA Cinematografica"
## [8785] " Space Films Polytechna"
## [8786] " Space Rock Studios"
## [8787] " Spader Knekt"
## [8788] " Spanish Fork Motion Picture"
## [8789] " Spanky Pictures"
## [8790] " Spark Films"
## [8791] " Spark Media"
## [8792] " Spark Pictures"
## [8793] " SparkeFilms History Design"
## [8794] " Sparkhope Productions"
## [8795] " Sparklight Films"
## [8796] " Sparks"
## [8797] " Sparta Productions"
## [8798] " Speak Productions"
## [8799] " Speak Thunder Films"
## [8800] " Special Affects films"
## [8801] " Special Edition Films"
## [8802] " Spectacle Entertainment Group"
## [8803] " Spectacle Films"
## [8804] " Spectacular Trading International"
## [8805] " SpectreVision"
## [8806] " Spectrum Cinema Productions"
## [8807] " Spede Production Oy"
## [8808] " Spede Team"
## [8809] " Spede Tuotanto Oy"
## [8810] " Spellbound Films"
## [8811] " Spelling Entertainment"
## [8812] " Spelling Films International"
## [8813] " Sper Lake Films Ltd Partnership I id"
## [8814] " Spera Productions Inc"
## [8815] " Speranza Films A S"
## [8816] " Sperl Productions"
## [8817] " Spéva Films"
## [8818] " Spheeris Films Inc"
## [8819] " Sphinx Films"
## [8820] " Sphinx Productions"
## [8821] " Spice Factory"
## [8822] " Spicer and Moore"
## [8823] " Spiegel TV"
## [8824] " Spier Films"
## [8825] " Spierigfilm"
## [8826] " Spin Prods LLC"
## [8827] " Spinal Tap Prod"
## [8828] " Spinning Owls Productions"
## [8829] " Spire Production Company"
## [8830] " Spirit Dance Entertainment"
## [8831] " Spitfire Productions"
## [8832] " Spitfire Studios"
## [8833] " Spleis AS"
## [8834] " Splend Film id"
## [8835] " Splend Pictures id"
## [8836] " Spotlight Pictures"
## [8837] " Spread Entertainment"
## [8838] " Spring Creek Productions"
## [8839] " Spring Films"
## [8840] " Spring Pictures"
## [8841] " Sputnik"
## [8842] " Sputnik Oy"
## [8843] " SPVision"
## [8844] " Spy Global Media"
## [8845] " Spy Post Digital"
## [8846] " Spyglass Entertainment"
## [8847] " Square Enix"
## [8848] " Square USA"
## [8849] " Srevi Movies id"
## [8850] " SRF zwei"
## [8851] " Sri Lakshmi Narasimha Productions"
## [8852] " Sri Saravanaa Creaations"
## [8853] " Sri Sathya Sai Movies"
## [8854] " Sri Surya Films"
## [8855] " Sri Surya Movies"
## [8856] " Sri Venkateswara Cine Chitra"
## [8857] " Sri Venkateswara Creations"
## [8858] " SRO Pictures"
## [8859] " SSS Entertainment"
## [8860] " St George s Pictures"
## [8861] " St Michael Finance Limited"
## [8862] " St Petersburg Documentary Film Studio"
## [8863] " ST Renegades"
## [8864] " Staccato Films"
## [8865] " Stacofilm"
## [8866] " Stag Films"
## [8867] " Stage 6 Films"
## [8868] " Stagereel"
## [8869] " Stallion Releasing Inc"
## [8870] " Stampede Entertainment"
## [8871] " Stan Lathan TV"
## [8872] " Stan Winston Productions"
## [8873] " Stand See"
## [8874] " Standard Arts"
## [8875] " Standard Club of California Productions Inc"
## [8876] " Stanley Kramer Productions"
## [8877] " Stanley Kubrick Productions"
## [8878] " Star Cinema Productions"
## [8879] " Star Com Productions"
## [8880] " Star Film"
## [8881] " Star Film Company"
## [8882] " Star Films"
## [8883] " Star Media"
## [8884] " Star Overseas"
## [8885] " Star Partners II Ltd"
## [8886] " Star Ritz Productions Co Ltd"
## [8887] " Star Thrower Entertainment"
## [8888] " Star Union Skykee Film Investment Co"
## [8889] " Staragara"
## [8890] " Staralis Film Company"
## [8891] " Starbucks Entertainment"
## [8892] " Starburns Industries"
## [8893] " Starchild Pictures"
## [8894] " Stardust Pictures"
## [8895] " Starhaus Filmproduktion"
## [8896] " Stark Productions"
## [8897] " Stark Productions id"
## [8898] " Stark Raving Black Productions"
## [8899] " Starlight International Media"
## [8900] " Starstream Entertainment"
## [8901] " Start Motion Pictures"
## [8902] " Startroop Pictures Inc"
## [8903] " Starway International Inc"
## [8904] " Starz Animation"
## [8905] " Starz Media"
## [8906] " Starz Productions"
## [8907] " State Street Pictures"
## [8908] " Statement Pictures"
## [8909] " Statens Filmcentral"
## [8910] " Static Prods"
## [8911] " Station Next"
## [8912] " Státní fond ČR pro podporu a rozvoj české kinematografie"
## [8913] " Status Media Entertainment"
## [8914] " Stayer Studio"
## [8915] " Steam Motion Sound"
## [8916] " Steamroller Productions"
## [8917] " Steel Mill Pictures"
## [8918] " Steeltown Entertainment"
## [8919] " Steelyard Pictures"
## [8920] " Steen Herdel Filmproduktion"
## [8921] " Steen Herdel Filmproduktion ApS"
## [8922] " Steeplechase Films"
## [8923] " Stefan Wodoslawsky Donald Osborne"
## [8924] " Stefano Film"
## [8925] " STEFI Cine TV Productions"
## [8926] " Stein Film"
## [8927] " Stella Films"
## [8928] " Stella Studio"
## [8929] " StellaNova Film"
## [8930] " Stellar Mega Films"
## [8931] " Step by Step Film Production"
## [8932] " Stéphan Films"
## [8933] " Stephanie Germain Productions"
## [8934] " Sterling Cinema"
## [8935] " Sterling Entertainment"
## [8936] " Sterling Pictures Ltd"
## [8937] " Sterling Rock Productions"
## [8938] " Sterobcar Productions"
## [8939] " Steve Krantz Productions"
## [8940] " Steve White Entertainment"
## [8941] " Steve White Productions"
## [8942] " Stewart and Wall Entertainment"
## [8943] " Stick N Stone Productions"
## [8944] " Stick Pictures"
## [8945] " Stick Figure Productions"
## [8946] " Stick Films"
## [8947] " Stickyback Pictures"
## [8948] " Still Silent Films Inc"
## [8949] " Stillking Films"
## [8950] " Stockholm Film"
## [8951] " Stockholm Syndrome Film"
## [8952] " Stoecker Ecological"
## [8953] " Stolen Car Productions"
## [8954] " Stone Five Studios"
## [8955] " Stone Group Pictures"
## [8956] " Stone Productions"
## [8957] " Stone River Productions"
## [8958] " StoneBrook Entertainment"
## [8959] " Stonehaven Media"
## [8960] " Stoney Lake Entertainment"
## [8961] " Stopline Films"
## [8962] " Storm Rosenberg"
## [8963] " Storm Vision Entertainment"
## [8964] " Stormchaser Films"
## [8965] " Stormheart Oy"
## [8966] " Story AB"
## [8967] " Storybox Entertainment"
## [8968] " Storyhill"
## [8969] " Storyline Entertainment"
## [8970] " Stourwater Pictures"
## [8971] " Strada Film"
## [8972] " Straight Up Films"
## [8973] " Straightwire Films"
## [8974] " Strand Productions"
## [8975] " Strand Releasing"
## [8976] " Strange Days Production"
## [8977] " Strata Studios"
## [8978] " Street Trash Joint Venture"
## [8979] " Strela"
## [8980] " Strength Ltd"
## [8981] " Strike Anywhere Productions"
## [8982] " Strike Entertainment"
## [8983] " Strings of Films"
## [8984] " Strohberry Films"
## [8985] " Stromboli Films"
## [8986] " STS Productions Inc"
## [8987] " Stu Segall Productions"
## [8988] " Stuart Miller Productions"
## [8989] " Stuber Productions"
## [8990] " Studija 2"
## [8991] " Studio"
## [8992] " Studio Orlenok Central Television USSR"
## [8993] " Studio 1 Pictures"
## [8994] " Studio 1 Productions"
## [8995] " Studio 100"
## [8996] " Studio 18"
## [8997] " Studio 37"
## [8998] " Studio 4°C"
## [8999] " Studio Babelsberg"
## [9000] " Studio Canal"
## [9001] " Studio Dadashow"
## [9002] " Studio DEEN"
## [9003] " Studio dětského filmu Gottwaldov"
## [9004] " Studio Eight Productions"
## [9005] " Studio Fantasia"
## [9006] " Studio Film Corp"
## [9007] " Studio Filmowe Kadr"
## [9008] " Studio Filmowe Kalejdoskop"
## [9009] " Studio Filmowe Perspektywa"
## [9010] " Studio Filmowe Zebra"
## [9011] " Studio Filmowe Zodiak"
## [9012] " Studio Ghibli"
## [9013] " Studio Golestan"
## [9014] " Studio Green"
## [9015] " Studio Hamburg Filmproduktion"
## [9016] " Studio Hamburg International Production"
## [9017] " Studio Hamburg Letterbox Filmproduktion"
## [9018] " Studio Hraných Filmov Bratislava"
## [9019] " Studio Images 2"
## [9020] " Studio Interzona"
## [9021] " Studio Kankourama"
## [9022] " Studio Khara"
## [9023] " Studio Kinema"
## [9024] " Studio Kino"
## [9025] " Studio Mitte GmbH"
## [9026] " Studio Munka"
## [9027] " Studio Okno"
## [9028] " Studio Ortodoks"
## [9029] " Studio Pavla Lungina"
## [9030] " Studio Pierrot"
## [9031] " Studio Produkcyjne Orka Koprodukcja"
## [9032] " Studio Rewers"
## [9033] " Studio Rock"
## [9034] " Studio Trite"
## [9035] " Studio TV Film GmbH"
## [9036] " StudioCanal"
## [9037] " Studioul Cinematografic București"
## [9038] " StudioUrania"
## [9039] " Studioz IDrream"
## [9040] " Studiya Cherepakha"
## [9041] " Stupendous Talking Pictures International"
## [9042] " STX Entertainment"
## [9043] " Style Jam"
## [9044] " Sub Pop Records"
## [9045] " Subafilms"
## [9046] " Submarine"
## [9047] " Submarine Entertainment Distributors"
## [9048] " Subterranean Films"
## [9049] " Suburban Tempe Company"
## [9050] " Subutopian Films Inc"
## [9051] " Such Good Productions"
## [9052] " Sucia Centroamericana Producciones"
## [9053] " Sudden Storm Productions"
## [9054] " Süddeutscher Rundfunk"
## [9055] " Südwestrundfunk"
## [9056] " Suevia Films Cesáreo González"
## [9057] " Suffolk Productions"
## [9058] " Sujatha Productions"
## [9059] " Sukrit Pictures"
## [9060] " Sullivan Entertainment"
## [9061] " Sullivan Street Productions"
## [9062] " Summer Release"
## [9063] " Summertime Films"
## [9064] " Summit Entertainment"
## [9065] " Sun Entertainment Culture"
## [9066] " Sun Pictures"
## [9067] " Sunbow Productions"
## [9068] " Suncent CinemaWorks"
## [9069] " Sunchild Productions"
## [9070] " Sunday Horse II The"
## [9071] " Sunday Productions"
## [9072] " Sundial Pictures"
## [9073] " Sundream Motion Pictures"
## [9074] " Sunfilm Entertainment"
## [9075] " Sunlion Films"
## [9076] " Sunn Classic Pictures"
## [9077] " Sunny Se Up Films id"
## [9078] " Sunnymede Film Productions"
## [9079] " Sunrise"
## [9080] " Sunrise Films"
## [9081] " Sunset Films International"
## [9082] " Sunset Productions"
## [9083] " Sunshine"
## [9084] " Sunshine Pictures"
## [9085] " Sunswept Entertainment"
## [9086] " Suntaur Entertainment Company"
## [9087] " Suomen Filmiteollisuus"
## [9088] " suomi filmi"
## [9089] " Suomi Filmi"
## [9090] " Super Cassettes Industries Limited T Series"
## [9091] " Super Crispy Entertainment"
## [9092] " Super Écran"
## [9093] " Super Film Production"
## [9094] " Super filmes"
## [9095] " Super International Pictures"
## [9096] " Supercine"
## [9097] " Supercoller Productions id"
## [9098] " Supergravity Pictures"
## [9099] " Superior Pictures"
## [9100] " SuperNormal Pictures"
## [9101] " Supernova Group"
## [9102] " Superpower Productions"
## [9103] " Superstitious Films"
## [9104] " Supinfocom Arles"
## [9105] " Suplex"
## [9106] " Surf s Up"
## [9107] " Surfacing Film Productions"
## [9108] " Suricate"
## [9109] " Surla Films"
## [9110] " Surreal Films"
## [9111] " Surreel"
## [9112] " Sus id"
## [9113] " Sus Pictures id"
## [9114] " Sutjeska Film"
## [9115] " Svensk Filmindustri"
## [9116] " Svensk Filmindustri SF"
## [9117] " Svenska Biografteatern AB"
## [9118] " Svenska Filminstitutet"
## [9119] " Svenska Filminstitutet SFI"
## [9120] " Sverdlovskaya Kinostudiya"
## [9121] " Sveriges Radio"
## [9122] " Sveriges Radio SR"
## [9123] " Sveriges Television"
## [9124] " Sveriges Television SVT"
## [9125] " Sveva Film"
## [9126] " SVS Films"
## [9127] " SVT"
## [9128] " SVT Drama"
## [9129] " Swargachitra"
## [9130] " Swedish Film Production SFP"
## [9131] " Sweet Tomato Films"
## [9132] " Sweetland Films"
## [9133] " Sweetwater"
## [9134] " Sweetwater AB"
## [9135] " Swerve Pictures"
## [9136] " Swirl Films"
## [9137] " Switzer Entertainment Group"
## [9138] " Swordspoint Productions"
## [9139] " SWR"
## [9140] " Sycamore Pictures"
## [9141] " Sydney Box Productions"
## [9142] " Syfy"
## [9143] " Syn Frank Enterprises"
## [9144] " Synchronicity Films"
## [9145] " Syncopy"
## [9146] " Synthetic Cinema International"
## [9147] " Synthetic Fur Productions"
## [9148] " Synthetic Pictures"
## [9149] " Syzygy Productions"
## [9150] " Színház és Filmmüvészeti Egyetem"
## [9151] " Szygzy Productions"
## [9152] " T L Boulton"
## [9153] " T C Film AG"
## [9154] " T E M Productores S A"
## [9155] " T H E Films"
## [9156] " T Series"
## [9157] " T Squared Film"
## [9158] " T Stop Productions"
## [9159] " T42 Entertainment"
## [9160] " Tabasco films"
## [9161] " Tadié Cinéma"
## [9162] " Taechang Productions"
## [9163] " Taehung Pictures"
## [9164] " Taewon Entertainment"
## [9165] " TAFT Entertainment Pictures"
## [9166] " Tag Entertainment"
## [9167] " Tag Spledour and Films"
## [9168] " Tag Traum Filmproduktion"
## [9169] " Tai Entertainment"
## [9170] " Takarazuka Eiga Company Ltd"
## [9171] " Take 1 Productions"
## [9172] " Take25 Pictures"
## [9173] " Tale Filmproduktion"
## [9174] " Talent Associates"
## [9175] " Talent House"
## [9176] " Talent Television"
## [9177] " Talent United"
## [9178] " Talía Films"
## [9179] " Talkback Thames"
## [9180] " Talking Heads"
## [9181] " Talking Monkey"
## [9182] " Tall Man Films"
## [9183] " Tallinnfilm"
## [9184] " Tamtam Film"
## [9185] " Tandem Communications"
## [9186] " Tandem Enterprises Inc"
## [9187] " Tandem Pictures"
## [9188] " Tandem Productions"
## [9189] " Tango Film"
## [9190] " Tantallon"
## [9191] " Tantan Films"
## [9192] " TAO Film"
## [9193] " Taodue Film"
## [9194] " Tapestry Films"
## [9195] " Tapped Pictures"
## [9196] " Tapson Steel Films Productions"
## [9197] " Tarantula"
## [9198] " Tarea Fina"
## [9199] " Tarentula"
## [9200] " Tarnol Group Pictures"
## [9201] " Tarquinia Cinematografica"
## [9202] " Tarquinia Film"
## [9203] " Tartan Works Ltd"
## [9204] " Tarwathie Films"
## [9205] " Tasara Films"
## [9206] " Taska Film"
## [9207] " Tasse Film"
## [9208] " TAT Communications Company"
## [9209] " TAT Filmproduktion"
## [9210] " Tatfilm"
## [9211] " Tatira Hiller Productions"
## [9212] " Tatsunoko Productions Company"
## [9213] " Taurus 7 Film Corporation"
## [9214] " Taurus Entertainment Company"
## [9215] " Taurus Films"
## [9216] " Taurus Produktion"
## [9217] " Tax Credit Finance"
## [9218] " TBIA Flix"
## [9219] " TBN Films"
## [9220] " Tea Shop Film Company"
## [9221] " Team Cherokee Productions"
## [9222] " Team Okuyama"
## [9223] " Team Todd"
## [9224] " Team Work Motion Pictures Ltd"
## [9225] " Teamfilm AS"
## [9226] " teamWorx"
## [9227] " teamWorx Produktion für Kino und Fernsehen GmbH"
## [9228] " Teardrop Productions"
## [9229] " Tecisa"
## [9230] " Teeth"
## [9231] " Tekli British Productions"
## [9232] " Tele München Fernseh Produktionsgesellschaft TMG"
## [9233] " Telecinco"
## [9234] " Telecinco Cinema"
## [9235] " Telecine"
## [9236] " Telecom Entertainment Inc"
## [9237] " Telefe"
## [9238] " Téléfiction Distribution"
## [9239] " Telefilm Canada"
## [9240] " Téléfilm Canada"
## [9241] " Telefilm Saar GmbH"
## [9242] " Teleimage"
## [9243] " TeleImage"
## [9244] " Téléma Productions"
## [9245] " Telemondial"
## [9246] " Telepool"
## [9247] " Telespan 2000"
## [9248] " Televicine S A de C V"
## [9249] " Televisió de Catalunya"
## [9250] " Televisió de Catalunya TV3"
## [9251] " Televisió de Catalunya TV3"
## [9252] " Television Corporation of America"
## [9253] " Televisión Española TVE"
## [9254] " Televisión Española TVE"
## [9255] " Televisión Federal Telefe"
## [9256] " Télévision Suisse Romande"
## [9257] " Televizija Sarajevo"
## [9258] " Telewizja Polsat"
## [9259] " Telewizja Polska"
## [9260] " Telewizja Polska Agencja Filmowa"
## [9261] " Telewizja Polska TVP"
## [9262] " Tellux Film München"
## [9263] " Telmar Film International"
## [9264] " Tempe Veo id"
## [9265] " Tempean Films"
## [9266] " Temple Film"
## [9267] " Temple Hill Entertainment"
## [9268] " Temple Hill Productions"
## [9269] " Templeheart Films"
## [9270] " Tempo Productions Limited"
## [9271] " Tempus"
## [9272] " Ten Forward Films"
## [9273] " Ten Furlongs"
## [9274] " Ten10 Films"
## [9275] " Tenafly Film Company"
## [9276] " Tenlit Films"
## [9277] " Tenth Planet Productions"
## [9278] " Terence Michael Productions"
## [9279] " Terminal City Pictures"
## [9280] " Terra Film Produktion"
## [9281] " Terra Filmkunst"
## [9282] " Terra Filmkunst GmbH"
## [9283] " Terra Firma Films"
## [9284] " Terra Mater Factual Studios"
## [9285] " Terrafilm"
## [9286] " Terror Films"
## [9287] " Terrytoons"
## [9288] " Terwilliger Productions"
## [9289] " Tesauro"
## [9290] " Tesela P C"
## [9291] " Tesela P C"
## [9292] " Tesela P C Impala"
## [9293] " Tesela Producciones Cinematográficas"
## [9294] " Teshigahara Productions"
## [9295] " Tessalit Production"
## [9296] " Tessalit Productions"
## [9297] " Tétra Média"
## [9298] " Teuvo Tulio"
## [9299] " Tevere Film"
## [9300] " Texas Film Company"
## [9301] " Tezuka Production Company Ltd"
## [9302] " TF1"
## [9303] " TF1 Droits Audiovisuels"
## [9304] " TF1 Films Production"
## [9305] " TF1 Films Productions"
## [9306] " TF1 International"
## [9307] " TFI Films Productions"
## [9308] " TFM Distribution"
## [9309] " Th Damaskinos V Michaeles id"
## [9310] " Thai Occental Productions id"
## [9311] " Thalia Productions"
## [9312] " Thames Television"
## [9313] " Thanasis Vengos Tainies Geliou"
## [9314] " Thanhouser Film Corporation"
## [9315] " Thank You Brain Productions"
## [9316] " Thats Hollywood"
## [9317] " The First Musical Company"
## [9318] " The 7th Floor"
## [9319] " The American Film Company"
## [9320] " The American Film Theatre"
## [9321] " The Andre Company"
## [9322] " The Antria Group TAG"
## [9323] " The Archers"
## [9324] " The Associates Aldrich Company"
## [9325] " The Asylum"
## [9326] " The Australian Film Commission"
## [9327] " The Booking Office"
## [9328] " The Bryna Company"
## [9329] " The Bubble Factory"
## [9330] " The Business New York"
## [9331] " The Caddo Company"
## [9332] " the Canadian Council"
## [9333] " The Cartel"
## [9334] " The Charlie Mopic Company"
## [9335] " The Cheerleaders Company"
## [9336] " The Chimney Pot"
## [9337] " The Collective"
## [9338] " The Collective Studios"
## [9339] " The Combine"
## [9340] " The Criterion Collection"
## [9341] " The Curiosity Company"
## [9342] " The Darkse id"
## [9343] " The Department of Motion Pictures"
## [9344] " The Directors Bureau"
## [9345] " The Documentary Group"
## [9346] " The Entertainment Network"
## [9347] " The Essanay Film Manufacturing Company"
## [9348] " The Eternal Film Company"
## [9349] " The Exchange"
## [9350] " The Film"
## [9351] " The Film Company"
## [9352] " The Film Consortium"
## [9353] " The Film Factory"
## [9354] " The Film House"
## [9355] " The Film Works"
## [9356] " The Filmakers"
## [9357] " the filmgroup"
## [9358] " The Fool"
## [9359] " The Foul King 2000"
## [9360] " The Foundation"
## [9361] " The Free History Project"
## [9362] " The Geffen Company"
## [9363] " The Glasgow Film Fund"
## [9364] " The Global Asylum"
## [9365] " The Goatsingers"
## [9366] " The Great American Dream Machine Movie Company"
## [9367] " The Guber Peters Company"
## [9368] " The Hallmark Channel"
## [9369] " The Hamilton Film Group"
## [9370] " The Harold Greenberg Fund"
## [9371] " The Harold Lloyd Corporation"
## [9372] " The Harvey Boys"
## [9373] " The Harvey Entertainment Company"
## [9374] " The Hatchery"
## [9375] " The Image Organization"
## [9376] " The Imaginarium"
## [9377] " The Independent Film Channel Productions"
## [9378] " The Institute for the Intellectual Development of Children Young Adults"
## [9379] " The Jacobson Company"
## [9380] " The Javelina Film Company"
## [9381] " The Jerry Gross Organization"
## [9382] " The Kennedy Marshall Company"
## [9383] " The KL Line"
## [9384] " The Klock Worx Co"
## [9385] " The Königsberg Company"
## [9386] " The Kushner Locke Company"
## [9387] " The Lab Of Madness"
## [9388] " The Ladd Company"
## [9389] " The Last Picture Company"
## [9390] " The Latent Image"
## [9391] " The Legend Lives Company"
## [9392] " The Leonard Goldberg Company"
## [9393] " The Lloyd Segan Company"
## [9394] " The Lost Tribe"
## [9395] " The Made Bed Productions"
## [9396] " The Man"
## [9397] " The Mark Gordon Company"
## [9398] " The Massive Film Company"
## [9399] " The Mayhem Project"
## [9400] " The Mirisch Corporation"
## [9401] " The Mirisch Production Company"
## [9402] " The Mob"
## [9403] " The Mob Film Company"
## [9404] " The Montecito Picture Company"
## [9405] " The Mount Company"
## [9406] " The Movie Group"
## [9407] " The Movie Network TMN"
## [9408] " The New Zealand Film Commission"
## [9409] " The Noel Gay Motion Picture Company"
## [9410] " The Obsian Collective id"
## [9411] " The October People"
## [9412] " The Onion"
## [9413] " The Ontario Film Development Corporation"
## [9414] " The Orchard"
## [9415] " The Pacific Trust"
## [9416] " The Pardon Group"
## [9417] " The Pokémon Company"
## [9418] " The Poker House"
## [9419] " The Polone Winer Company"
## [9420] " The Pumpkin Factory"
## [9421] " The Rank Organisation"
## [9422] " The Rank Organisation Film Productions"
## [9423] " The Running Scared Company"
## [9424] " The Sabi Company"
## [9425] " The Safran Company"
## [9426] " The Salt Company International"
## [9427] " The Sam Company"
## [9428] " The Samuel Goldwyn Company"
## [9429] " The Saul Zaentz Company"
## [9430] " The Selznik Studio"
## [9431] " The Shot Clock"
## [9432] " The Talkies"
## [9433] " The Talking Tree"
## [9434] " The Ultimate Gift LLC"
## [9435] " The Universal Film Mfg Co"
## [9436] " The Venus Project"
## [9437] " The Walt Disney Company"
## [9438] " The Weinstein Company"
## [9439] " The Where s Poppa Company"
## [9440] " The Wing Scope Film Production Ltd"
## [9441] " The Zanuck Company"
## [9442] " Theatre Junkies"
## [9443] " Theatre Of Material"
## [9444] " Théâtre Robert Houdin"
## [9445] " thefyzz"
## [9446] " Thelma Films"
## [9447] " Thema Production"
## [9448] " Theodora Productions"
## [9449] " There Will Be Trivia"
## [9450] " They Are Going To Kill Us Productions"
## [9451] " Thin Man Films"
## [9452] " Think Big Productions"
## [9453] " Think Studio"
## [9454] " Thinkfactory Media"
## [9455] " thinkfilm"
## [9456] " Thinkfilm"
## [9457] " Thinking Bee Productions"
## [9458] " Thinking Man Films"
## [9459] " Third Costa"
## [9460] " Third Films"
## [9461] " Third Floor Pictures"
## [9462] " Third Floor Productions"
## [9463] " Third World Cinema"
## [9464] " Thirteen Disciples"
## [9465] " Thirukumaran Entertainment"
## [9466] " This and That Productions"
## [9467] " This is It Collective"
## [9468] " This is Just a Test"
## [9469] " This Is That Productions"
## [9470] " Thomas Coleman and Michael Rosenblatt Productions"
## [9471] " Thomas H Ince Corporation"
## [9472] " Thor Productions"
## [9473] " Thorn EMI Screen Entertainment"
## [9474] " Thousand Mile Media"
## [9475] " Thousand Miles Entertainment"
## [9476] " Thousand Words"
## [9477] " Three Angels Productions"
## [9478] " Three Baskets"
## [9479] " Three Coin Productions"
## [9480] " Three Crown Productions Inc"
## [9481] " Three Dimension Pictures"
## [9482] " Three Dots Entertainment Company"
## [9483] " Three Michaels Film Productions"
## [9484] " Three Mills Studios"
## [9485] " Three Springs Productions"
## [9486] " Three T Productions"
## [9487] " Three Waters Productions"
## [9488] " Three Way Productions"
## [9489] " Threshold Animation Studios"
## [9490] " Threshold Entertainment"
## [9491] " Thrillsville Productions"
## [9492] " THT"
## [9493] " Thud Rumble"
## [9494] " Thunder Bay Pictures"
## [9495] " Thunder Perfect Mind"
## [9496] " Thunder Road Incorporated"
## [9497] " Thunder Road Pictures"
## [9498] " Thunderbox Films"
## [9499] " Thunderhead Entertainment"
## [9500] " Thura Film"
## [9501] " Tiberius Film"
## [9502] " Tiberius Film Productions"
## [9503] " Tiedebaby Films"
## [9504] " Tietê Produções Cinematográficas"
## [9505] " Tig Productions"
## [9506] " Tiger Aspect Productions"
## [9507] " Tiger Film"
## [9508] " Tiger Productions"
## [9509] " Tiger Tail Entertainment"
## [9510] " Tiger Television Productions"
## [9511] " Tigers Den Studios"
## [9512] " TigerTiger Productions"
## [9513] " Tigielle 33"
## [9514] " Tigmanshu Dhulia Films"
## [9515] " Tigon British Film Productions"
## [9516] " Tigon Pictures"
## [9517] " Tijuana Productions"
## [9518] " Tilted Windmill Productions"
## [9519] " Tim Burton Productions"
## [9520] " Timbergrove Entertainment"
## [9521] " Time"
## [9522] " Time Magnetics"
## [9523] " Time Movies"
## [9524] " Time Warner"
## [9525] " Time Warner Cable"
## [9526] " Timedial Films"
## [9527] " Times In"
## [9528] " Timnick Films"
## [9529] " Timothy Burrill Productions"
## [9530] " Tims Productions"
## [9531] " Tin House Productions"
## [9532] " Tin Pan Films"
## [9533] " Tin Ping Film Company"
## [9534] " Tinderbox Films"
## [9535] " TinRes Entertainment"
## [9536] " Tiny Goat"
## [9537] " Tiny Ponies"
## [9538] " Tips Industries"
## [9539] " Tips Music Films Pvt Ltd"
## [9540] " Tisch Avnet Productions Inc"
## [9541] " TIT Filmproduktion GmbH"
## [9542] " Titan Productions"
## [9543] " titania produzioni"
## [9544] " Titanus"
## [9545] " Titanus Produzione"
## [9546] " Titmouse"
## [9547] " Titus Productions"
## [9548] " TLA Releasing"
## [9549] " TMA 1 Productions"
## [9550] " TMC"
## [9551] " TMS"
## [9552] " TNT"
## [9553] " TNT Originals"
## [9554] " Tobann International Pictures"
## [9555] " Tobis"
## [9556] " Tobis Filmkunst"
## [9557] " Tobis Portuguesa"
## [9558] " Todman Simon LeMasters Productions"
## [9559] " Toei"
## [9560] " TOEI"
## [9561] " Toei Animation"
## [9562] " Toei Animation Company"
## [9563] " Toei Company"
## [9564] " TOEI Company"
## [9565] " Toei Company Ltd"
## [9566] " Toei Doga"
## [9567] " Toei Tokyo"
## [9568] " Toei Veo Company id"
## [9569] " Toeplitz Productions"
## [9570] " Tohei"
## [9571] " Toho"
## [9572] " TOHO"
## [9573] " Toho Company"
## [9574] " Toho Film Eiga Co Ltd"
## [9575] " Toho Pictures Inc"
## [9576] " Toho Towa"
## [9577] " Tohokushinsha Film"
## [9578] " Toilet Pictures"
## [9579] " Tokuma Shoten"
## [9580] " Tokyo Broadcasting System"
## [9581] " Tokyo Broadcasting System TBS"
## [9582] " Tokyo Eiga Co Ltd"
## [9583] " Tokyo FM Broadcasting Co"
## [9584] " Tokyo Movie Shinsha TMS"
## [9585] " Tolda Productions"
## [9586] " Toledo Productions"
## [9587] " Tollin Robbins Productions"
## [9588] " Tom Cat Films"
## [9589] " Tom Girl Films"
## [9590] " Tom Sawyer Entertainment"
## [9591] " Tommy"
## [9592] " Tommy J Productions"
## [9593] " Tomorrow Entertainment"
## [9594] " Tomorrow Entertainment Inc"
## [9595] " Tondero Films"
## [9596] " Tondero Producciones"
## [9597] " Tonefilm"
## [9598] " Tonic Films"
## [9599] " Tony DiDio Productions"
## [9600] " Tony Seven Films"
## [9601] " Tonylyn Productions Inc"
## [9602] " Toonacious Family Entertainment"
## [9603] " Top Hat Productions"
## [9604] " Top Line Production"
## [9605] " Top Pup Media"
## [9606] " Topcraft"
## [9607] " Topiary Productions"
## [9608] " Topkapi Film"
## [9609] " Topkapi Films"
## [9610] " Topps Chewing Gum"
## [9611] " Topsail Entertainment"
## [9612] " Torchlight Productions"
## [9613] " Tornado Film"
## [9614] " Tornasol Films"
## [9615] " Tornasol Films S A"
## [9616] " Total Entertainment"
## [9617] " Total Filmes"
## [9618] " Touba Films"
## [9619] " Touchstone"
## [9620] " Touchstone Pictures"
## [9621] " Touchstone Television"
## [9622] " Touchwood Pacific Partners 1"
## [9623] " Tout à Trac Productions"
## [9624] " Toute Premiere Fois"
## [9625] " Towa Productions"
## [9626] " Towers of London Productions"
## [9627] " Toy Gun Films"
## [9628] " Toy Soldiers Associates"
## [9629] " Tozart Publishing Inc"
## [9630] " TPS Cinéma"
## [9631] " TPS Company"
## [9632] " Traction Media"
## [9633] " Tradewind Pictures"
## [9634] " Trailer Park Partners"
## [9635] " Tramal Films"
## [9636] " Trans America Films"
## [9637] " Trans Cinema TV"
## [9638] " Trans Film"
## [9639] " Trans Pacific Films"
## [9640] " Trans World Entertainment"
## [9641] " Trans World Entertainment TWE"
## [9642] " Transatlantic Films"
## [9643] " Transatlantic Pictures"
## [9644] " Transcona Enterprises"
## [9645] " Transcontinental Films"
## [9646] " Transfax Film Productions"
## [9647] " Transfiguration Productions"
## [9648] " Transglobe Film Inc"
## [9649] " Transient Pictures"
## [9650] " Transmar Films"
## [9651] " Transmedia"
## [9652] " Transmundo Films"
## [9653] " Traveler s Rest Films"
## [9654] " Traverse Media"
## [9655] " Tre Vänner Produktion AB"
## [9656] " Treasure Entertainment"
## [9657] " Tree Line Films"
## [9658] " Tree Tree Tree Productions"
## [9659] " Treehouse Pictures"
## [9660] " Tremolo Productions"
## [9661] " Trent Othick Productions"
## [9662] " Tres Malandros"
## [9663] " Tres Mentes"
## [9664] " Trev Arts id"
## [9665] " Triad Productions"
## [9666] " Triana Films"
## [9667] " Triangle British Films"
## [9668] " Triangle Film Corporation"
## [9669] " Triangle Production"
## [9670] " Triangle Staff"
## [9671] " Tribal Alliance"
## [9672] " Tribeca Film"
## [9673] " Tribeca Productions"
## [9674] " Trick Candle Productions"
## [9675] " Trigger"
## [9676] " Trigger Street"
## [9677] " Trigger Street Productions"
## [9678] " Triggerfish Animation"
## [9679] " Triglav Film"
## [9680] " Trigon Films"
## [9681] " Trillion Entertainment"
## [9682] " Trilogy Entertainment Group"
## [9683] " Trilogy Films"
## [9684] " Trimark"
## [9685] " Trimark Pictures"
## [9686] " Trimod Films"
## [9687] " Trimurti Films Pvt Ltd"
## [9688] " Trinacra Films"
## [9689] " Trinity Filmed Entertainment"
## [9690] " Trio International"
## [9691] " Trionfalcine"
## [9692] " Trionic Entertainment"
## [9693] " Triple Fire Productions"
## [9694] " Triple Peak Productions"
## [9695] " Triple Threat Productions"
## [9696] " TriStar Pictures"
## [9697] " TriStar Television"
## [9698] " Tristone Entertainment Inc"
## [9699] " Triton Films"
## [9700] " Tritone Cinematografica"
## [9701] " Tritone Productions"
## [9702] " Triumph Films"
## [9703] " Triumphant Entertainment"
## [9704] " Triumvirate Films"
## [9705] " Trivisión S L"
## [9706] " Troika Pictures"
## [9707] " Trollhättan Film AB"
## [9708] " Troma Entertainment"
## [9709] " Tropicfilm"
## [9710] " Troublemaker Studios"
## [9711] " Troya Film"
## [9712] " Truque Produtora de Cinema"
## [9713] " Trust Film"
## [9714] " TRUST INTERNATIONAL FILMS"
## [9715] " Trust the Man LLC"
## [9716] " Truth and Soul Pictures Inc"
## [9717] " TruthWillOut Films"
## [9718] " TS Productions"
## [9719] " TS1 Production"
## [9720] " Tsentr tvorcheskoj initsiativy Leningradskogo otdeleniya sovetskogo fonda kultury"
## [9721] " Tu Vas Voir Productions"
## [9722] " Tube Entertainment"
## [9723] " Tube Pictures"
## [9724] " Tudor Alliance"
## [9725] " Tuffi Films"
## [9726] " Tulos Cinema"
## [9727] " Tulsea Pictures"
## [9728] " Tundra Film"
## [9729] " Turbine Films Inc"
## [9730] " Turbulence Films"
## [9731] " Turbulent Arts"
## [9732] " Turin Film"
## [9733] " Turkey Films"
## [9734] " Turman Foster Company"
## [9735] " Turnchapel Films"
## [9736] " Turner Classic Movies TCM"
## [9737] " Turner Entertainment"
## [9738] " Turner Network Television"
## [9739] " Turner Network Television TNT"
## [9740] " Turner Original Productions"
## [9741] " Turner Pictures"
## [9742] " Turner Pictures I"
## [9743] " Turntable Studios"
## [9744] " TV 60 Filmproduktion"
## [9745] " TV Man Union"
## [9746] " TV Productions LTD And Beijing Hop Culture Co"
## [9747] " TV Tokyo"
## [9748] " TV Zero"
## [9749] " TV2"
## [9750] " TV2 Danmark"
## [9751] " TVB"
## [9752] " TVE"
## [9753] " TVINDIE Film Production"
## [9754] " TVO"
## [9755] " Tvorcheskaya Assotsiatsiya Mezhdunarodnykh Programm"
## [9756] " TVP Film Multimedia"
## [9757] " Twelve O Clock Films"
## [9758] " Twentieth Century Fox"
## [9759] " Twentieth Century Fox Film Corporation"
## [9760] " Twentieth Century Fox Home Entertainment"
## [9761] " Twentieth Century Fox Productions"
## [9762] " Twentieth Century Vixen"
## [9763] " Twenty Eighteen Seventy Six"
## [9764] " Twickenham Film Studios"
## [9765] " Twickenham Studios"
## [9766] " Twilight Motion Picture Seven Ltd Partnership"
## [9767] " Twilight Pictures"
## [9768] " Twin Engine Films"
## [9769] " Twins Japan"
## [9770] " Twisted Pictures"
## [9771] " Twisted Twins Productions"
## [9772] " Two 4 The Money Media"
## [9773] " Two Arts Ltd"
## [9774] " Two Cities Films"
## [9775] " Two Dog Productions Inc"
## [9776] " Two Guys and a Film"
## [9777] " Two Hands Entertainment"
## [9778] " Two Oceans Production"
## [9779] " Two Streets Entertainment"
## [9780] " Two Thirds Productions"
## [9781] " Two to Tangle Productions"
## [9782] " Two Ton Films"
## [9783] " Two Tone Pictures"
## [9784] " Tyburn Film Productions Limited"
## [9785] " Tyler Perry Company The"
## [9786] " Tymar Film Productions"
## [9787] " Type 55 Films"
## [9788] " Type A Films"
## [9789] " Typhoon Works"
## [9790] " U Production"
## [9791] " U S Army Pictorial Services"
## [9792] " U S Army Signal Corps"
## [9793] " U S Office of War Information"
## [9794] " U Zone Films"
## [9795] " Ubisoft"
## [9796] " UCLA Film and Television Archive"
## [9797] " UCLA School of Film and Television"
## [9798] " Uco Film GmbH"
## [9799] " UFA Fiction"
## [9800] " UFA Filmproduktion GmbH"
## [9801] " uFilm"
## [9802] " UFO"
## [9803] " UFO International Productions"
## [9804] " UFO Pictures"
## [9805] " ufotable"
## [9806] " UGC"
## [9807] " UGC Distribution"
## [9808] " UGC Images"
## [9809] " UGC PH"
## [9810] " Ugly Duckling Films"
## [9811] " Ugur Film"
## [9812] " UIP"
## [9813] " Új Budapest Filmstudió"
## [9814] " UK Film Council"
## [9815] " UK Film Studio"
## [9816] " Ukbar Filmes"
## [9817] " Ultimate Pictures"
## [9818] " Ultimate Productions"
## [9819] " Ultimativne Medijske Atrakcije"
## [9820] " Ultra Films"
## [9821] " Ultra Muchos Productions"
## [9822] " UltraFilms"
## [9823] " Ultramar Films"
## [9824] " Ulula Films"
## [9825] " Ulysse Production"
## [9826] " Umbrella Entertainment"
## [9827] " Umbrella Films"
## [9828] " Umbrella Rosenblum Film Production"
## [9829] " Umedia"
## [9830] " Una Cinecooperativa"
## [9831] " Una Noche Films"
## [9832] " Unbound Feet Productions"
## [9833] " Uncommon Productions"
## [9834] " Uncooperative Pictures"
## [9835] " Uncork d Entertainment"
## [9836] " Uncorked Productions"
## [9837] " Underdog Productions"
## [9838] " Underground Films"
## [9839] " Uneurop Film"
## [9840] " Unframed USA"
## [9841] " Uni Bet Productions"
## [9842] " Unified Film Organization UFO"
## [9843] " Unified Pictures"
## [9844] " Unikki Production"
## [9845] " UniKorea Pictures"
## [9846] " Union Entertainment Group II"
## [9847] " Union film"
## [9848] " Union Film Company"
## [9849] " Union Générale Cinématographique UGC"
## [9850] " Unión Industrial Cinematográfica"
## [9851] " Unis id"
## [9852] " Unison Films"
## [9853] " Unit Ten Productions"
## [9854] " Unité Trois"
## [9855] " Unitec Films"
## [9856] " United Artists"
## [9857] " United Artists Corporation"
## [9858] " United Artists Pictures"
## [9859] " United British Artists UBA"
## [9860] " United Channel Movies"
## [9861] " United Enterprise H K Corp"
## [9862] " United Entertainment"
## [9863] " United Filmmakers"
## [9864] " United Filmmakers Group"
## [9865] " United Filmmakers Organization UFO"
## [9866] " United King Films"
## [9867] " United Multimedia Projects"
## [9868] " United Pictures"
## [9869] " United Pictures Organization"
## [9870] " United Producers"
## [9871] " United Seven Creations"
## [9872] " United States Navy"
## [9873] " United States Pictures"
## [9874] " United Talent Productions Ltd"
## [9875] " Unity Pictures Group"
## [9876] " Unity Productions Foundation"
## [9877] " Universad del Cine id"
## [9878] " Universal"
## [9879] " Universal 1440 Entertainment"
## [9880] " Universal Animation Studios"
## [9881] " Universal Cartoon Studios"
## [9882] " Universal Film Manufacturing Company"
## [9883] " Universal Home Entertainment"
## [9884] " Universal International Pictures UI"
## [9885] " Universal Majestic Inc"
## [9886] " Universal Marion Corporation UMC"
## [9887] " Universal Music"
## [9888] " Universal Pictures"
## [9889] " Universal Pictures Co Inc"
## [9890] " Universal Pictures Corporation"
## [9891] " Universal Pictures France"
## [9892] " Universal Pictures Germany GmbH"
## [9893] " Universal Pictures International"
## [9894] " Universal Pictures International UPI"
## [9895] " Universal Pictures International Germany GmbH"
## [9896] " Universal Pictures UK"
## [9897] " Universal Productions France S A"
## [9898] " Universal Studios"
## [9899] " Universal Studios Home Entertainment"
## [9900] " Universal Studios Home Entertainment Family Productions"
## [9901] " Universal Studios Home Veo id"
## [9902] " Universal Television"
## [9903] " Universal TV"
## [9904] " Universalia Film"
## [9905] " Universe Films Distribution"
## [9906] " University of Southern California"
## [9907] " University of Southern California School of Cinematic Arts"
## [9908] " Universum Film UFA"
## [9909] " Unstoppable Entertainment"
## [9910] " Unstuck"
## [9911] " Untitled Entertainment"
## [9912] " Untouchable Films"
## [9913] " Upload Films"
## [9914] " UPP"
## [9915] " Upstream Pictures"
## [9916] " Urania Film"
## [9917] " Uranos Cinematografica"
## [9918] " Urban Way Productions"
## [9919] " Ursus Films"
## [9920] " USA Films"
## [9921] " USA Network"
## [9922] " USofAnderson I"
## [9923] " Ústřední půjčovna filmů Praha"
## [9924] " Utopia"
## [9925] " Utopia Pictures"
## [9926] " Utu Productions"
## [9927] " UTV Motion Pictures"
## [9928] " UTV Spotboy Motion Pictures"
## [9929] " UZ Productions"
## [9930] " Uzbekfilm"
## [9931] " V Creations"
## [9932] " V I P Films"
## [9933] " V M Productions"
## [9934] " V O Filmes"
## [9935] " Vaca Films"
## [9936] " Vacationeer Productions"
## [9937] " VAE Productions"
## [9938] " Vaishno Academy"
## [9939] " Vale Film Productions"
## [9940] " Valiant"
## [9941] " Valkyrie Films"
## [9942] " Vallelonga Productions"
## [9943] " Valoria Films"
## [9944] " Valve"
## [9945] " Van Peebles Films"
## [9946] " Vangard Productions"
## [9947] " Vanguard Films"
## [9948] " Vanguard Productions I"
## [9949] " Vanguardia Films"
## [9950] " Vanish Films"
## [9951] " Vanishing Angle"
## [9952] " Vans"
## [9953] " Vansan Movies"
## [9954] " Vantage Holdings"
## [9955] " Vantis Pictures"
## [9956] " Vanwick Productions"
## [9957] " Varahi Chalana Chitram"
## [9958] " Varahonar Company"
## [9959] " Variance Films"
## [9960] " Varient Busted Buggy Entertainmen"
## [9961] " Variety Film Production"
## [9962] " Varma Corporation"
## [9963] " Vasan Visual Ventures"
## [9964] " Vaughan Films"
## [9965] " VEB DEFA Studio für Spielfilme"
## [9966] " Vega Film"
## [9967] " Vegetarian Films"
## [9968] " Veit Helmer Filmproduktion"
## [9969] " Velvet Film"
## [9970] " Velvet Steamroller Entertainment"
## [9971] " Vendome Pictures"
## [9972] " Vent Productions"
## [9973] " Ventana Film und Fernsehproduktion"
## [9974] " Ventanarosa Productions"
## [9975] " Vento Film"
## [9976] " Ventura Film"
## [9977] " Ventura Hi Way Productions"
## [9978] " Ventura Valley Films"
## [9979] " Venture Forth"
## [9980] " Venus Records Tapes"
## [9981] " Veo Flims id"
## [9982] " Veo Tape Corp id"
## [9983] " Veocine id"
## [9984] " Veocine S A de C V id"
## [9985] " VeoFilmes id"
## [9986] " Veovision Entertainment id"
## [9987] " Vera Cruz Studios"
## [9988] " Véra Films"
## [9989] " Vera Films S p a"
## [9990] " Veracity Productions"
## [9991] " Verdeoro"
## [9992] " Vereinigte Star Film GmbH"
## [9993] " Verenigde Arbeers Radio Amateurs VARA id"
## [9994] " Verenigde Nederlandsche Filmcompagnie VNF"
## [9995] " Verisimilitude"
## [9996] " Vermillon Films"
## [9997] " Verona Produzione"
## [9998] " Versatile Film"
## [9999] " Versus Production"
## [10000] " Vertigo"
## [10001] " Vertigo Entertainment"
## [10002] " Vertigo Films"
## [10003] " Vertigo Productions"
## [10004] " Very Ape Productions"
## [10005] " Ves Cinematografica id"
## [10006] " Vestron Pictures"
## [10007] " Veterans"
## [10008] " Vetter Brothers Filmworks"
## [10009] " VH1 Rock Docs"
## [10010] " VHShitfest"
## [10011] " Vhu Vinod Chopra Productions id"
## [10012] " Via Appia Communications"
## [10013] " Vía Digital"
## [10014] " Viacom 18 Motion Pictures"
## [10015] " Viacom Productions"
## [10016] " Viacom18 Motion Pictures"
## [10017] " Viada Producciones"
## [10018] " Viaduc Productions"
## [10019] " Vic Films Productions"
## [10020] " Vice Films"
## [10021] " Vico Films"
## [10022] " Vicomte de Noailles"
## [10023] " Victor Edward Halperin Productions"
## [10024] " Victor Hanbury Productions"
## [10025] " Victoria Film"
## [10026] " Victorian Film"
## [10027] " Victorious Films"
## [10028] " Victory Pictures Production"
## [10029] " Vienna Film Financing Fund"
## [10030] " Viennale"
## [10031] " Viens Films"
## [10032] " View Askew Productions"
## [10033] " Vif Babelsberger Filmproduktion GmbH Co Dritte KG"
## [10034] " Vijaya Productions"
## [10035] " Vijayam Cine Combines"
## [10036] " Vijayta Films Pvt Ltd"
## [10037] " Viking Film"
## [10038] " Viking Films"
## [10039] " Viking Productions"
## [10040] " Viktorija Film"
## [10041] " Vill Lee Film"
## [10042] " Village Roadshow"
## [10043] " Village Roadshow Entertainment"
## [10044] " Village Roadshow Pictures"
## [10045] " Village Roadshow Productions"
## [10046] " Villani Film"
## [10047] " Villani Rockhill Productions"
## [10048] " Villealfa Filmproduction Oy"
## [10049] " Vinay Pictures"
## [10050] " Vincent Pictures"
## [10051] " Vineyard Film Ltd"
## [10052] " Vintage Pictures"
## [10053] " VIP 2 Medienfonds"
## [10054] " VIP 3 Medienfonds"
## [10055] " VIP Medienfonds 2 3 Filmgeschäftsführungs GmbH"
## [10056] " Virgil Films"
## [10057] " Virgin"
## [10058] " Virgin Films"
## [10059] " Virgin Produced"
## [10060] " Virgin Vision"
## [10061] " Virtual Audiovisuais"
## [10062] " Virtual Films"
## [10063] " Virtual InterActive Inc"
## [10064] " Virtual Studios"
## [10065] " Virtus Film"
## [10066] " Viscount"
## [10067] " Vishal Bhardwaj Pictures"
## [10068] " Vishesh Films"
## [10069] " Visible Pictures"
## [10070] " Vision"
## [10071] " Vision Associates Productions"
## [10072] " Vision Comunicaciones"
## [10073] " Vision Entertainment Group"
## [10074] " Vision Films"
## [10075] " Vision International"
## [10076] " Vision P D G"
## [10077] " Vision PDG"
## [10078] " Vision Productions Ltd"
## [10079] " Visionary Films"
## [10080] " VisionQuest Productions"
## [10081] " Visions Sud Est"
## [10082] " Vista Organization"
## [10083] " Vista Street Entertainment"
## [10084] " Visto International Inc"
## [10085] " Visual Arts Entertainment"
## [10086] " Visualeyes Productions"
## [10087] " Visualizer Film Productions"
## [10088] " Vita Aktiva"
## [10089] " Vitagraph Company of America"
## [10090] " Vitamin A Films"
## [10091] " Vitamin K Film"
## [10092] " Vivendi Entertainment"
## [10093] " Vivo Film"
## [10094] " Vixen Films"
## [10095] " Vladar Company The"
## [10096] " VLMedia"
## [10097] " VMI Worldwe id"
## [10098] " Vnesheconombank"
## [10099] " Vocal Yokels"
## [10100] " Voices of America"
## [10101] " Volcanic Eruptions"
## [10102] " Voltage Films"
## [10103] " Voltage pictures"
## [10104] " Voltage Pictures"
## [10105] " Von Oma gefördert"
## [10106] " Von Vietinghoff Filmproduktion"
## [10107] " Von Zerneck Sertner Films"
## [10108] " Vortex Words Pictures"
## [10109] " Vostokfilm"
## [10110] " Vostokkino"
## [10111] " Votiv Films"
## [10112] " Vox Hound Productions"
## [10113] " Vox Pictures"
## [10114] " Vox3 Films"
## [10115] " VPRO Television"
## [10116] " Vroom Productions"
## [10117] " Vsesoyuznyj Gosudarstvennyj Institut Kinematografii VGIK"
## [10118] " VTM"
## [10119] " VUFKU"
## [10120] " Vulcan Productions"
## [10121] " Vulcan Productions Inc"
## [10122] " VVP Alyans"
## [10123] " W Lee Wilder Productions"
## [10124] " Wa Entertainment"
## [10125] " Waadi Animations"
## [10126] " Wadi Rum Productions"
## [10127] " Wadleigh Maurice"
## [10128] " Wag TV"
## [10129] " Wakamatsu Production"
## [10130] " Wakeford Orloff"
## [10131] " Waken Productions"
## [10132] " Wald Krasna Productions"
## [10133] " Walden Media"
## [10134] " Walkaway Entertainment"
## [10135] " Wall to Wall"
## [10136] " Wallis Hazen"
## [10137] " Walls Farm Productions"
## [10138] " Walt deFaria"
## [10139] " Walt Disney"
## [10140] " Walt Disney Animation Studios"
## [10141] " Walt Disney Company"
## [10142] " Walt Disney Feature Animation"
## [10143] " Walt Disney Home Veo id"
## [10144] " Walt Disney Pictures"
## [10145] " Walt Disney Production"
## [10146] " Walt Disney Productions"
## [10147] " Walt Disney Studios HE"
## [10148] " Walt Disney Studios Home Entertainment"
## [10149] " Walt Disney Studios Motion Pictures"
## [10150] " Walt Disney Television"
## [10151] " Walt Disney Television Animation"
## [10152] " Walter Lantz Productions"
## [10153] " Walter Seltzer Productions"
## [10154] " Walter Shenson Films"
## [10155] " Walter Wagner Productions"
## [10156] " Walter Wanger Productions"
## [10157] " Wanda Films"
## [10158] " Wanda Visión S A"
## [10159] " Wang Bing Film Workshop"
## [10160] " WANGO Films"
## [10161] " War activities committee of the motion pictures industry"
## [10162] " Warner Bro Japan"
## [10163] " Warner Bros"
## [10164] " Warner Bros Animation"
## [10165] " Warner Bros Entertainment"
## [10166] " Warner Bros Entertainment Finland Oy"
## [10167] " Warner Bros Family Entertainment"
## [10168] " Warner Bros Feature Animation"
## [10169] " Warner Bros Home Veo id"
## [10170] " Warner Bros Pictures"
## [10171] " Warner Bros Television"
## [10172] " Warner Brothers First National Productions"
## [10173] " Warner Brothers Seven Arts"
## [10174] " Warner Home Veo id"
## [10175] " Warner Independent Pictures WIP"
## [10176] " Warner Music"
## [10177] " Warner Premiere"
## [10178] " Warp Films"
## [10179] " Warp Films Australia"
## [10180] " Warp X"
## [10181] " WarpX"
## [10182] " Warren Miller Entertainment"
## [10183] " Warrior Poets"
## [10184] " Warwick Film Productions"
## [10185] " Washington Square Films"
## [10186] " Wasted Pictures"
## [10187] " Watchmaker Films"
## [10188] " Waterfront Productions"
## [10189] " Watergate Films"
## [10190] " Waterland"
## [10191] " Waterland Film TV"
## [10192] " Watermark Films"
## [10193] " Watershed Entertainment"
## [10194] " Waverly Films"
## [10195] " Waverly Productions"
## [10196] " WAY CREATIVE FILMS"
## [10197] " Wayfare Entertainment"
## [10198] " Wayne Fellows Productions"
## [10199] " Waypoint Entertainment"
## [10200] " WBMC"
## [10201] " WDR"
## [10202] " We Angle Creations id"
## [10203] " We Angle Pictures id"
## [10204] " We Eye Films id"
## [10205] " We World of Entertainment id"
## [10206] " WeBros Entertainment"
## [10207] " Weed Road Pictures"
## [10208] " Weekend Blockbusters"
## [10209] " Wega Film"
## [10210] " Weggee Productions"
## [10211] " Weinstein Company"
## [10212] " Weinstein Company The"
## [10213] " Weintraub Entertainment Group"
## [10214] " WeiT Media"
## [10215] " Wellingmax"
## [10216] " Wellington Films"
## [10217] " Wells Jeta Entertainment"
## [10218] " Weltecho"
## [10219] " Wendy Finerman Productions"
## [10220] " Wenhua Film Company"
## [10221] " Werc Werk Works"
## [10222] " Werner Herzog Filmproduktion"
## [10223] " Wernham Entertainment"
## [10224] " Wescom Productions"
## [10225] " Wessex Film Productions"
## [10226] " Wessler Entertainment"
## [10227] " West Bay One"
## [10228] " West End Productions"
## [10229] " West Film"
## [10230] " West Films"
## [10231] " Westdeutscher Rundfunk WDR"
## [10232] " Westerly Films"
## [10233] " Western Edge Pictures"
## [10234] " Weston Pictures"
## [10235] " Weyunaegang Productions"
## [10236] " WG Film"
## [10237] " WG Film AB"
## [10238] " WGBH"
## [10239] " Whale Studio"
## [10240] " Wheel Productions"
## [10241] " When Angels Sing"
## [10242] " Whenua Films"
## [10243] " Whiskers Post Production"
## [10244] " White Feather Films"
## [10245] " White Horse Pictures"
## [10246] " White Lair"
## [10247] " White Mirror Film Company"
## [10248] " White Mountain Films"
## [10249] " White Rock Lake Productions"
## [10250] " White Whale Pictures"
## [10251] " WhiteFlame Productions"
## [10252] " Whitesands Media House"
## [10253] " Whitewater Films"
## [10254] " Whitley Partners"
## [10255] " Whizbang Films"
## [10256] " Why Not Productions"
## [10257] " Wichita Films"
## [10258] " Wicked Pixel Cinema"
## [10259] " Wiedemann Berg Filmproduktion"
## [10260] " Wiedemann Berg Television"
## [10261] " Wigwam Films"
## [10262] " Wilco Co"
## [10263] " Wild Bear Films"
## [10264] " Wild Bunch"
## [10265] " Wild Bunch Distribution"
## [10266] " Wild Hogs Productions"
## [10267] " Wild Street Pictures"
## [10268] " Wild Style"
## [10269] " Wildcard Films"
## [10270] " Wildcat Productions"
## [10271] " Wildgaze Films"
## [10272] " Wildheart Films"
## [10273] " Wilding Picture Productions"
## [10274] " Wildse id"
## [10275] " Wildstorm Productions"
## [10276] " Wildstreet Pictures"
## [10277] " Wildwood Enterprises"
## [10278] " Wildwood Productions"
## [10279] " Will Packer Productions"
## [10280] " Will Vinton Studios"
## [10281] " William Cagney Productions"
## [10282] " William Castle Enterprises"
## [10283] " William Castle Productions"
## [10284] " William Conrad Productions"
## [10285] " William Dozier Productions"
## [10286] " William F Broy Productions id"
## [10287] " William Goetz Productions"
## [10288] " Williams Street"
## [10289] " Williamsburg Media Cult"
## [10290] " Williamson Kinematograph Company"
## [10291] " Williamson Powell"
## [10292] " Willing Suspension Films"
## [10293] " Willis Kent Productions"
## [10294] " Willowbrook Regent Films"
## [10295] " Wilshire Court Productions"
## [10296] " Win s Movie Production Limited"
## [10297] " Win s Movie Productions Ltd"
## [10298] " Win Tone Productions"
## [10299] " Wind Dancer Productions"
## [10300] " Wind River Productions"
## [10301] " Windjammer Productions Inc"
## [10302] " Windmill Film"
## [10303] " Windmill Theatre"
## [10304] " WindowLight Pictures"
## [10305] " Windwalker"
## [10306] " Windward Entertainment"
## [10307] " Windy Hill Pictures"
## [10308] " Winger"
## [10309] " Wingman Productions"
## [10310] " WingNut Films"
## [10311] " Winkast Film Productions"
## [10312] " Winkler Films"
## [10313] " Winning Edge Partners"
## [10314] " Winslow Partners Ltd"
## [10315] " Winter Gold Productions"
## [10316] " Winterfilm Collective"
## [10317] " Winters Hollywood Entertainment Holdings Corporation"
## [10318] " Wisconsin"
## [10319] " Wise Vision"
## [10320] " Wiseau Films"
## [10321] " Wiseman Film Productions"
## [10322] " Wisteria Productions"
## [10323] " Wit Studio"
## [10324] " Witchboard Partners"
## [10325] " WithanO Productions"
## [10326] " Wizan Productions"
## [10327] " Wizart Animation"
## [10328] " Wladyslaw Starewicz Production"
## [10329] " WMG Film"
## [10330] " WNET Channel 13 New York"
## [10331] " Wo Ping Films"
## [10332] " woestijnvis"
## [10333] " Woestijnvis"
## [10334] " Wolf Films"
## [10335] " Wolf Pack Film Works"
## [10336] " Wolfe Releasing"
## [10337] " Wolfkill"
## [10338] " Wolper Organization"
## [10339] " Wolper Pictures"
## [10340] " Wolper Productions"
## [10341] " Woman Wanted Productions Ltd"
## [10342] " Wonder Entertainment"
## [10343] " Wonder Room Productions"
## [10344] " Wonderland Sound and Vision"
## [10345] " WonderPhil Productions"
## [10346] " Wonderview Productions"
## [10347] " Wonderworld Studios"
## [10348] " Wong Fu Productions"
## [10349] " Wong Jing s Workshop"
## [10350] " Wong Jing s Workshop Ltd"
## [10351] " Wood Entertainment"
## [10352] " Wood Thomas Pictures"
## [10353] " Woodfall Film Productions"
## [10354] " Woods Entertainment"
## [10355] " Woodshed Films Inc"
## [10356] " Woodward Productions"
## [10357] " Woolner Brothers Pictures Inc"
## [10358] " Working Dog"
## [10359] " Working Pictures"
## [10360] " Working Title Films"
## [10361] " Working Title Television"
## [10362] " World 2000 Entertainment"
## [10363] " World Amusement Company"
## [10364] " World Entertainment"
## [10365] " World Film Services"
## [10366] " World International Network WIN"
## [10367] " World of Wonder"
## [10368] " World of Wonder Productions"
## [10369] " World Premiere Entertainment"
## [10370] " World Production"
## [10371] " World We Pictures id"
## [10372] " World We Pictures WWP id"
## [10373] " World We Productions id"
## [10374] " World Wrestling Entertainment WWE"
## [10375] " Worldcross"
## [10376] " Worldview Entertainment"
## [10377] " Worldvision"
## [10378] " Worldwe Bonus Entertainment id"
## [10379] " Worldwe Media Conspiracy id"
## [10380] " Worry Dolls Productions"
## [10381] " Woss Group Film Productions"
## [10382] " WoWow"
## [10383] " Wrather Productions"
## [10384] " Wrecking Crew"
## [10385] " WSB"
## [10386] " WT Canada Productions"
## [10387] " WT2 Productions"
## [10388] " WTFilms"
## [10389] " WTFN Entertainment"
## [10390] " Wunderbar Films"
## [10391] " Wunderkind Pictures"
## [10392] " Wurstfilm"
## [10393] " Wüste Film West"
## [10394] " Wüste Filmproduktion"
## [10395] " WVG Medien GmbH"
## [10396] " WW S Productions Inc"
## [10397] " WWE Network"
## [10398] " WWE Studios"
## [10399] " WXS Productions"
## [10400] " WY Productions"
## [10401] " Wytwórnia Filmów Dokumentalnych i Fabularnych WFDiF"
## [10402] " X Filme Creative Pool"
## [10403] " X Filme International"
## [10404] " X Ray Films"
## [10405] " Xaloc"
## [10406] " Xanadeux Company"
## [10407] " Xanthus Pictures"
## [10408] " Xbox Entertainment Studios"
## [10409] " Xenon Pictures"
## [10410] " Xi an Film Studio"
## [10411] " Xian Motion Picture Company"
## [10412] " Xiao Xiang Film Group"
## [10413] " Xingu Films"
## [10414] " Xstream Pictures"
## [10415] " Xstream Pictures Limited"
## [10416] " XX Film Aps"
## [10417] " XYZ Films"
## [10418] " XYZ Productions"
## [10419] " Y Filme Directors Pool"
## [10420] " Y3 Film"
## [10421] " Yachaywasi Films"
## [10422] " Yalta Film"
## [10423] " Yang His Gang Filmmakers"
## [10424] " Yari Film Group"
## [10425] " Yari Film Group YFG"
## [10426] " Yarno Cinematografica"
## [10427] " Yash Raj Films"
## [10428] " Yeah"
## [10429] " Yellow Black White"
## [10430] " Yellow Bastard Production"
## [10431] " Yellow Bird"
## [10432] " Yellow Bird Films"
## [10433] " Yellow Brick Films"
## [10434] " Yellow Cote Productions"
## [10435] " Yellow Fever Productions"
## [10436] " Yellow Film TV"
## [10437] " Yellow Films"
## [10438] " Yeni Stüdyo"
## [10439] " Yer Dead Productions"
## [10440] " Yerba Buena Productions Inc"
## [10441] " Yerevan Film Studio"
## [10442] " Yerli Film"
## [10443] " Yermoliev"
## [10444] " Yeşilçam Film"
## [10445] " Yin Zhang Films"
## [10446] " Yleisradio"
## [10447] " Yleisradio YLE"
## [10448] " Ymagis"
## [10449] " Yoav Shamir Films"
## [10450] " Yodi Movie Craftsman"
## [10451] " Yona Films"
## [10452] " Yongning Creation Workshop"
## [10453] " Yoram Gross Films"
## [10454] " York Pictures Corporation"
## [10455] " Yorkshire Television"
## [10456] " Yorkshire Television YTV"
## [10457] " Yorktown Productions"
## [10458] " Yoshimoto Kogyo Company"
## [10459] " Young Medium"
## [10460] " Younger Than You"
## [10461] " Younggu Art Movies"
## [10462] " Youth House Productions"
## [10463] " YouTube Red"
## [10464] " Youz Films"
## [10465] " Yuca Film"
## [10466] " YUMETA COMPANY"
## [10467] " Yuzu Productions"
## [10468] " Z Films Inc"
## [10469] " Z M Productions"
## [10470] " ZAD Communication Production"
## [10471] " Zagreb Film"
## [10472] " Zanuck Independent"
## [10473] " Zanzibar Films"
## [10474] " ZAO Studia F A F"
## [10475] " Zap O Matik"
## [10476] " ZAP Zoetrope Aubry Productions"
## [10477] " Zazen Produções"
## [10478] " ZBROS"
## [10479] " ZDF"
## [10480] " ZDF Das Kleine Fernsehspiel"
## [10481] " ZDF Productions"
## [10482] " Ze Perry Productions id"
## [10483] " Zealous Creative"
## [10484] " Zebra Films"
## [10485] " Zebra Producciones"
## [10486] " Zed Filmworks"
## [10487] " Zee Limelight"
## [10488] " Zee Music Company"
## [10489] " Zee Talkies"
## [10490] " ZEILT productions"
## [10491] " Zeitgeist"
## [10492] " Zeitman Landers Roberts Productions"
## [10493] " Zeitsprung Entertainment"
## [10494] " Zeitsprung Pictures"
## [10495] " Zeitun Films"
## [10496] " Zen Films"
## [10497] " Zenith Entertainment"
## [10498] " Zenith Productions"
## [10499] " Zéno Films"
## [10500] " Zenshinza Theatre Company"
## [10501] " Zentropa"
## [10502] " Zentropa Entertainments"
## [10503] " Zentropa Productions"
## [10504] " Zephyr Films"
## [10505] " Zero Film GmbH"
## [10506] " Zero Gravity Management"
## [10507] " Zero One Film"
## [10508] " Zero Sum Productions"
## [10509] " Zero Trans Fat Productions"
## [10510] " Zespol Filmowy"
## [10511] " Zespol Filmowy Iluzjon"
## [10512] " Zespól Filmowy Kadr"
## [10513] " Zespol Filmowy Kamera"
## [10514] " Zespól Filmowy Oko"
## [10515] " Zespol Filmowy Perspektywa"
## [10516] " Zespol Filmowy Plan"
## [10517] " Zespol Filmowy Pryzmat"
## [10518] " Zespół Filmowy Pryzmat"
## [10519] " Zespol Filmowy Silesia"
## [10520] " Zespól Filmowy Tor"
## [10521] " Zespól Filmowy X"
## [10522] " Zespół Filmowy X"
## [10523] " Zespół Filmowy TOR"
## [10524] " Zeta Audiovisual"
## [10525] " Zeta Entertainment"
## [10526] " Zeugma Produções"
## [10527] " Zeynofilm"
## [10528] " Zhao Wei Films"
## [10529] " Zik Zak Kvikmyndir"
## [10530] " Zillion Films"
## [10531] " Zimbalist Roberts Bernds Productions"
## [10532] " Zimgor Productions"
## [10533] " Zinc Entertainment Inc"
## [10534] " Zingraff Motion Pictures"
## [10535] " Zininsa Film Production"
## [10536] " Zipline Entertainment"
## [10537] " Zipper Bros Films"
## [10538] " Zipporah Films Inc"
## [10539] " Zircocine"
## [10540] " Zjednoczenie Artystów i Rzemieslników"
## [10541] " Zodiac Pictures International"
## [10542] " Zodiac Productions"
## [10543] " Zodiac Produzioni"
## [10544] " Zodiak Finland Oy"
## [10545] " Zoetrope Studios"
## [10546] " Zoki Century International Culture Media Beijing Co"
## [10547] " Zombie Orpheus Entertainment"
## [10548] " Zone Films"
## [10549] " Zoom Cinema Entertainment"
## [10550] " Zoomo Productions"
## [10551] " zootrope"
## [10552] " Zootrope Films"
## [10553] " Zopix Company"
## [10554] " ZRF Kadr"
## [10555] " ZRF Syrena"
## [10556] " ZU33"
## [10557] " Zurbano Films"
## [10558] " Zweites Deutsches Fernsehen ZDF"
## [10559] " Zygote Films"
## [10560] " Zyzak Film Company"
## [10561] " Zyzzyx LLC"
## [10562] " Ελληνικό Κέντρο Κινηματογράφου ΕΡΤ"
## [10563] " Вертикаль"
## [10564] " Вольга"
## [10565] " Грузия фильм"
## [10566] " Киевнаучфильм"
## [10567] " Кинокомпания Lunapark"
## [10568] " Киностудия Мосфильм"
## [10569] " Леополис"
## [10570] " Межрабпом Русь"
## [10571] " Наше Кино"
## [10572] " Одесская киностудия"
## [10573] " Ритм"
## [10574] " Роскинопрокат"
## [10575] " Союзмультфильм"
## [10576] " Союзмульфильм"
## [10577] " СТВ"
## [10578] " Студия ТриТэ"
## [10579] " Фокс"
## [10580] " Централ Партнершип"
## [10581] " 롯데엔터테인먼트"
## [10582] " 쇼박스 주 미디어플렉스"
## [10583] " 싸이더스 픽쳐스"
## [10584] " 씨너스엔터테인먼트 주"
## [10585] " 영화사 수박"
## [10586] " 영화사 집"
## [10587] " 이디오플랜"
## [10588] " 인벤트 디"
## [10589] " 프로덕션M"
## [10590] " 安乐 北京 电影发行有限公司"
movies %>% count(company1) %>% arrange(desc(n))
## # A tibble: 10,590 × 2
## company1 n
## <fct> <int>
## 1 "" 11861
## 2 " Paramount Pictures" 996
## 3 " Metro Goldwyn Mayer MGM" 851
## 4 " Twentieth Century Fox Film Corporation" 780
## 5 " Warner Bros" 757
## 6 " Universal Pictures" 754
## 7 " Columbia Pictures" 429
## 8 " Columbia Pictures Corporation" 401
## 9 " RKO Radio Pictures" 290
## 10 " United Artists" 272
## # ℹ 10,580 more rows
movies %>% count(company2) %>% arrange(desc(n))
## # A tibble: 9,042 × 2
## company2 n
## <fct> <int>
## 1 "" 28428
## 2 " Warner Bros" 270
## 3 " Metro Goldwyn Mayer MGM" 149
## 4 " Canal+" 124
## 5 " Touchstone Pictures" 75
## 6 " Universal Pictures" 71
## 7 " TF1 Films Production" 52
## 8 " StudioCanal" 47
## 9 " Twentieth Century Fox Film Corporation" 45
## 10 " Amblin Entertainment" 43
## # ℹ 9,032 more rows
movies %>% count(company3) %>% arrange(desc(n))
## # A tibble: 5,980 × 2
## company3 n
## <fct> <int>
## 1 "" 36385
## 2 " Warner Bros" 130
## 3 " Canal+" 109
## 4 " Metro Goldwyn Mayer MGM" 44
## 5 " Relativity Media" 42
## 6 " TF1 Films Production" 29
## 7 " Touchstone Pictures" 27
## 8 " Working Title Films" 24
## 9 " Centre National de la Cinématographie CNC" 20
## 10 " Film4" 20
## # ℹ 5,970 more rows
Too many blank values, it should be corrected, also some companies are repeated, they could be inside the same category.
company1_sort <- movies %>% count(company1) %>% arrange(desc(n))
company2_sort <- movies %>% count(company2) %>% arrange(desc(n))
company3_sort <- movies %>% count(company3) %>% arrange(desc(n))
top_50_company1 <- company1_sort$company1[1:51]
top_50_company2 <- company2_sort$company2[1:51]
top_50_company3 <- company3_sort$company3[1:51]
# Move all the companies that does not form part of the 50 biggest companies or are blank in the category "Other"
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Other" = company1[!company1 %in% top_50_company1]))
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Other" = company2[!company2 %in% top_50_company2]))
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Other" = company3[!company3 %in% top_50_company2]))
#New category for blank spaces
movies <- movies %>% mutate(company1 = fct_collapse(company1, "No Company" = ""))
movies <- movies %>% mutate(company2 = fct_collapse(company2, "No Company" = ""))
movies <- movies %>% mutate(company3 = fct_collapse(company3, "No Company" = ""))
movies %>% count(company1) %>% arrange(desc(n))
## # A tibble: 52 × 2
## company1 n
## <fct> <int>
## 1 "Other" 24274
## 2 "No Company" 11861
## 3 " Paramount Pictures" 996
## 4 " Metro Goldwyn Mayer MGM" 851
## 5 " Twentieth Century Fox Film Corporation" 780
## 6 " Warner Bros" 757
## 7 " Universal Pictures" 754
## 8 " Columbia Pictures" 429
## 9 " Columbia Pictures Corporation" 401
## 10 " RKO Radio Pictures" 290
## # ℹ 42 more rows
movies %>% count(company2) %>% arrange(desc(n))
## # A tibble: 52 × 2
## company2 n
## <fct> <int>
## 1 "No Company" 28428
## 2 "Other" 15072
## 3 " Warner Bros" 270
## 4 " Metro Goldwyn Mayer MGM" 149
## 5 " Canal+" 124
## 6 " Touchstone Pictures" 75
## 7 " Universal Pictures" 71
## 8 " TF1 Films Production" 52
## 9 " StudioCanal" 47
## 10 " Twentieth Century Fox Film Corporation" 45
## # ℹ 42 more rows
movies %>% count(company3) %>% arrange(desc(n))
## # A tibble: 46 × 2
## company3 n
## <fct> <int>
## 1 "No Company" 36385
## 2 "Other" 8332
## 3 " Warner Bros" 130
## 4 " Canal+" 109
## 5 " Metro Goldwyn Mayer MGM" 44
## 6 " Relativity Media" 42
## 7 " TF1 Films Production" 29
## 8 " Touchstone Pictures" 27
## 9 " Film4" 20
## 10 " Millennium Films" 19
## # ℹ 36 more rows
# Eliminate white space inconsistency
movies <- movies %>% mutate(company1 = str_trim(company1))
movies <- movies %>% mutate(company2 = str_trim(company2))
movies <- movies %>% mutate(company3 = str_trim(company3))
movies <- movies %>% mutate(company1 = as.factor(movies$company1))
movies <- movies %>% mutate(company2 = as.factor(movies$company2))
movies <- movies %>% mutate(company3 = as.factor(movies$company3))
#Collapse similar levels
#Disney
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Disney" = "Walt Disney Pictures"))
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Disney" = "Walt Disney Productions"))
levels(droplevels(movies$company1))
## [1] "American International Pictures AIP"
## [2] "BBC Films"
## [3] "British Broadcasting Corporation BBC"
## [4] "Canal+"
## [5] "Channel Four Films"
## [6] "CJ Entertainment"
## [7] "Columbia Pictures"
## [8] "Columbia Pictures Corporation"
## [9] "DC Comics"
## [10] "DreamWorks SKG"
## [11] "First National Pictures"
## [12] "Fox Film Corporation"
## [13] "Fox Searchlight Pictures"
## [14] "France 2 Cinéma"
## [15] "Gaumont"
## [16] "Hammer Film Productions"
## [17] "Hollywood Pictures"
## [18] "Imagine Entertainment"
## [19] "Lions Gate Films"
## [20] "Lionsgate"
## [21] "Metro Goldwyn Mayer MGM"
## [22] "Miramax Films"
## [23] "Monogram Pictures"
## [24] "Mosfilm"
## [25] "New Line Cinema"
## [26] "New World Pictures"
## [27] "Nikkatsu"
## [28] "No Company"
## [29] "Nordisk Film"
## [30] "Orion Pictures"
## [31] "Other"
## [32] "Paramount Pictures"
## [33] "Rai Cinema"
## [34] "Regency Enterprises"
## [35] "RKO Radio Pictures"
## [36] "Shaw Brothers"
## [37] "Shôchiku Eiga"
## [38] "StudioCanal"
## [39] "Summit Entertainment"
## [40] "The Rank Organisation"
## [41] "TLA Releasing"
## [42] "Toho Company"
## [43] "Touchstone Pictures"
## [44] "TriStar Pictures"
## [45] "Twentieth Century Fox Film Corporation"
## [46] "United Artists"
## [47] "Universal International Pictures UI"
## [48] "Universal Pictures"
## [49] "Village Roadshow Pictures"
## [50] "Disney"
## [51] "Warner Bros"
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Disney" = "Walt Disney Pictures"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company2 = fct_collapse(company2, Disney = "Walt Disney
## Pictures")`.
## Caused by warning:
## ! Unknown levels in `f`: Walt Disney Pictures
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Disney" = "Walt Disney Productions"))
levels(droplevels(movies$company2))
## [1] "Amblin Entertainment"
## [2] "American International Pictures AIP"
## [3] "BBC Films"
## [4] "Blumhouse Productions"
## [5] "British Broadcasting Corporation BBC"
## [6] "Canal+"
## [7] "Carolco Pictures"
## [8] "Castle Rock Entertainment"
## [9] "Columbia Pictures Corporation"
## [10] "Dimension Films"
## [11] "DreamWorks SKG"
## [12] "Dune Entertainment"
## [13] "Film i Väst"
## [14] "Film4"
## [15] "Focus Features"
## [16] "Globo Filmes"
## [17] "Happy Madison Productions"
## [18] "HBO Films"
## [19] "Hollywood Pictures"
## [20] "Lionsgate"
## [21] "M6 Films"
## [22] "Metro Goldwyn Mayer MGM"
## [23] "Millennium Films"
## [24] "Morgan Creek Productions"
## [25] "Nickelodeon Movies"
## [26] "No Company"
## [27] "Original Film"
## [28] "Other"
## [29] "Pixar Animation Studios"
## [30] "PolyGram Filmed Entertainment"
## [31] "Rai Cinema"
## [32] "Regency Enterprises"
## [33] "Relativity Media"
## [34] "Revolution Studios"
## [35] "Scott Rudin Productions"
## [36] "Spyglass Entertainment"
## [37] "StudioCanal"
## [38] "Svensk Filmindustri SF"
## [39] "TF1 Films Production"
## [40] "The Vitaphone Corporation"
## [41] "Touchstone Pictures"
## [42] "TriStar Pictures"
## [43] "Twentieth Century Fox Film Corporation"
## [44] "UK Film Council"
## [45] "United Artists Pictures"
## [46] "Universal Pictures"
## [47] "Walt Disney Animation Studios"
## [48] "Disney"
## [49] "Warner Bros"
## [50] "Warner Bros Animation"
## [51] "Wild Bunch"
## [52] "Zweites Deutsches Fernsehen ZDF"
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Disney" = "Walt Disney Pictures"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company3 = fct_collapse(company3, Disney = "Walt Disney
## Pictures")`.
## Caused by warning:
## ! Unknown levels in `f`: Walt Disney Pictures
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Disney" = "Walt Disney Productions"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company3 = fct_collapse(company3, Disney = "Walt Disney
## Productions")`.
## Caused by warning:
## ! Unknown levels in `f`: Walt Disney Productions
levels(droplevels(movies$company3))
## [1] "Amblin Entertainment"
## [2] "BBC Films"
## [3] "Blumhouse Productions"
## [4] "British Broadcasting Corporation BBC"
## [5] "Canal+"
## [6] "Carolco Pictures"
## [7] "Castle Rock Entertainment"
## [8] "Columbia Pictures Corporation"
## [9] "Dimension Films"
## [10] "Dune Entertainment"
## [11] "Film i Väst"
## [12] "Film4"
## [13] "Focus Features"
## [14] "Globo Filmes"
## [15] "Happy Madison Productions"
## [16] "HBO Films"
## [17] "Hollywood Pictures"
## [18] "Lionsgate"
## [19] "M6 Films"
## [20] "Metro Goldwyn Mayer MGM"
## [21] "Millennium Films"
## [22] "Morgan Creek Productions"
## [23] "Nickelodeon Movies"
## [24] "No Company"
## [25] "Original Film"
## [26] "Other"
## [27] "PolyGram Filmed Entertainment"
## [28] "Rai Cinema"
## [29] "Regency Enterprises"
## [30] "Relativity Media"
## [31] "Revolution Studios"
## [32] "Scott Rudin Productions"
## [33] "Spyglass Entertainment"
## [34] "StudioCanal"
## [35] "Svensk Filmindustri SF"
## [36] "TF1 Films Production"
## [37] "The Vitaphone Corporation"
## [38] "Touchstone Pictures"
## [39] "TriStar Pictures"
## [40] "Twentieth Century Fox Film Corporation"
## [41] "UK Film Council"
## [42] "Universal Pictures"
## [43] "Warner Bros"
## [44] "Warner Bros Animation"
## [45] "Wild Bunch"
## [46] "Zweites Deutsches Fernsehen ZDF"
#Universal
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Universal" = "Universal International Pictures UI"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company1 = fct_collapse(company1, Universal = "Universal
## International Pictures UI")`.
## Caused by warning:
## ! Unknown levels in `f`: Universal International Pictures UI
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Universal" = "Universal Pictures"))
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Universal" = "Universal International Pictures UI"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company2 = fct_collapse(company2, Universal = "Universal
## International Pictures UI")`.
## Caused by warning:
## ! Unknown levels in `f`: Universal International Pictures UI
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Universal" = "Universal Pictures"))
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Universal" = "Universal International Pictures UI"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company3 = fct_collapse(company3, Universal = "Universal
## International Pictures UI")`.
## Caused by warning:
## ! Unknown levels in `f`: Universal International Pictures UI
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Universal" = "Universal Pictures"))
#Columbia
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Columbia" = "Columbia Pictures"))
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Columbia" = "Columbia Pictures Corporation"))
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Columbia" = "Columbia Pictures"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company2 = fct_collapse(company2, Columbia = "Columbia
## Pictures")`.
## Caused by warning:
## ! Unknown levels in `f`: Columbia Pictures
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Columbia" = "Columbia Pictures Corporation"))
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Columbia" = "Columbia Pictures"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company3 = fct_collapse(company3, Columbia = "Columbia
## Pictures")`.
## Caused by warning:
## ! Unknown levels in `f`: Columbia Pictures
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Columbia" = "Columbia Pictures Corporation"))
#Fox
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Fox" = "Fox Film Corporation"))
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Fox" = "Fox Searchlight Pictures"))
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Fox" = "Twentieth Century Fox Film Corporation"))
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Fox" = "Fox Film Corporation"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company2 = fct_collapse(company2, Fox = "Fox Film
## Corporation")`.
## Caused by warning:
## ! Unknown levels in `f`: Fox Film Corporation
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Fox" = "Fox Searchlight Pictures"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company2 = fct_collapse(company2, Fox = "Fox Searchlight
## Pictures")`.
## Caused by warning:
## ! Unknown levels in `f`: Fox Searchlight Pictures
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Fox" = "Twentieth Century Fox Film Corporation"))
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Fox" = "Fox Film Corporation"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company3 = fct_collapse(company3, Fox = "Fox Film
## Corporation")`.
## Caused by warning:
## ! Unknown levels in `f`: Fox Film Corporation
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Fox" = "Fox Searchlight Pictures"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company3 = fct_collapse(company3, Fox = "Fox Searchlight
## Pictures")`.
## Caused by warning:
## ! Unknown levels in `f`: Fox Searchlight Pictures
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Fox" = "Twentieth Century Fox Film Corporation"))
#Lions Gate
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Lionsgate" = "Lionsgate"))
movies <- movies %>% mutate(company1 = fct_collapse(company1, "Lionsgate" = "Lions Gate Films"))
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Lionsgate" = "Lionsgate"))
movies <- movies %>% mutate(company2 = fct_collapse(company2, "Lionsgate" = "Lions Gate Films"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company2 = fct_collapse(company2, Lionsgate = "Lions Gate
## Films")`.
## Caused by warning:
## ! Unknown levels in `f`: Lions Gate Films
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Lionsgate" = "Lionsgate"))
movies <- movies %>% mutate(company3 = fct_collapse(company3, "Lionsgate" = "Lions Gate Films"))
## Warning: There was 1 warning in `mutate()`.
## ℹ In argument: `company3 = fct_collapse(company3, Lionsgate = "Lions Gate
## Films")`.
## Caused by warning:
## ! Unknown levels in `f`: Lions Gate Films
Categorize according to the ones that have no company, the companies that are repeated, include them in the same category and the companies that are no in the top 50, make a new category named “Other”.
levels(droplevels(movies$country1_language))
## [1] "" " Afrikaans" " Azərbaycan"
## [4] " Bahasa indonesia" " Bahasa melayu" " Bamanankan"
## [7] " Bokmål" " Bosanski" " Català"
## [10] " Český" " Cymraeg" " Dansk"
## [13] " Deutsch" " Eesti" " English"
## [16] " Español" " Esperanto" " euskera"
## [19] " Français" " Fulfulde" " Gaeilge"
## [22] " Galego" " Hausa" " Hrvatski"
## [25] " isiZulu" " Íslenska" " Italiano"
## [28] " Kinyarwanda" " Kiswahili" " Latin"
## [31] " Latviešu" " Lietuvi x9akai" " Magyar"
## [34] " Nederlands" " No Language" " Norsk"
## [37] " Polski" " Português" " Pусский"
## [40] " Română" " shqip" " Slovenčina"
## [43] " Slovenščina" " Somali" " Srpski"
## [46] " suomi" " svenska" " Tiếng Việt"
## [49] " Türkçe" " Wolof" " ελληνικά"
## [52] " беларуская мова" " български език" " қазақ"
## [55] " Український" " ქართული" " עִבְרִית"
## [58] " اردو" " العربية" " پښتو"
## [61] " فارسی" " हिन्दी" " বাংলা"
## [64] " ਪੰਜਾਬੀ" " தமிழ்" " తెలుగు"
## [67] " ภาษาไทย" " 한국어 조선말" " 广州话 廣州話"
## [70] " 日本語" " 普通话"
levels(droplevels(movies$country2_language))
## [1] "" " Afrikaans" " Bahasa indonesia"
## [4] " Bahasa melayu" " Bamanankan" " Bosanski"
## [7] " Català" " Český" " Cymraeg"
## [10] " Dansk" " Deutsch" " Eesti"
## [13] " English" " Español" " Esperanto"
## [16] " Français" " Fulfulde" " Gaeilge"
## [19] " Galego" " Hrvatski" " isiZulu"
## [22] " Íslenska" " Italiano" " Kinyarwanda"
## [25] " Kiswahili" " Latin" " Latviešu"
## [28] " Lietuvi x9akai" " Magyar" " Malti"
## [31] " Nederlands" " No Language" " Norsk"
## [34] " ozbek" " Polski" " Português"
## [37] " Pусский" " Română" " shqip"
## [40] " Slovenčina" " Slovenščina" " Somali"
## [43] " Srpski" " suomi" " svenska"
## [46] " Tiếng Việt" " Türkçe" " Wolof"
## [49] " ελληνικά" " български език" " қазақ"
## [52] " Український" " ქართული" " עִבְרִית"
## [55] " اردو" " العربية" " پښتو"
## [58] " فارسی" " हिन्दी" " বাংলা"
## [61] " ਪੰਜਾਬੀ" " தமிழ்" " తెలుగు"
## [64] " ภาษาไทย" " 한국어 조선말" " 广州话 廣州話"
## [67] " 日本語" " 普通话"
levels(droplevels(movies$country3_language))
## [1] "" " Afrikaans" " Bahasa indonesia"
## [4] " Bahasa melayu" " Bamanankan" " Bosanski"
## [7] " Český" " Cymraeg" " Dansk"
## [10] " Deutsch" " Eesti" " English"
## [13] " Español" " Esperanto" " euskera"
## [16] " Français" " Gaeilge" " Hrvatski"
## [19] " isiZulu" " Íslenska" " Italiano"
## [22] " Kiswahili" " Latin" " Latviešu"
## [25] " Lietuvi x9akai" " Magyar" " Nederlands"
## [28] " Norsk" " Polski" " Português"
## [31] " Pусский" " Română" " shqip"
## [34] " Slovenčina" " Slovenščina" " Somali"
## [37] " Srpski" " suomi" " svenska"
## [40] " Tiếng Việt" " Türkçe" " Wolof"
## [43] " ελληνικά" " български език" " қазақ"
## [46] " Український" " ქართული" " עִבְרִית"
## [49] " اردو" " العربية" " پښتو"
## [52] " فارسی" " हिन्दी" " ਪੰਜਾਬੀ"
## [55] " தமிழ்" " తెలుగు" " ภาษาไทย"
## [58] " 한국어 조선말" " 广州话 廣州話" " 日本語"
## [61] " 普通话"
movies %>% count(country1_language)
## # A tibble: 71 × 2
## country1_language n
## <fct> <int>
## 1 "" 4050
## 2 " Afrikaans" 22
## 3 " Azərbaycan" 4
## 4 " Bahasa indonesia" 26
## 5 " Bahasa melayu" 5
## 6 " Bamanankan" 4
## 7 " Bokmål" 3
## 8 " Bosanski" 25
## 9 " Català" 31
## 10 " Český" 263
## # ℹ 61 more rows
movies %>% count(country2_language)
## # A tibble: 68 × 2
## country2_language n
## <fct> <int>
## 1 "" 37667
## 2 " Afrikaans" 4
## 3 " Bahasa indonesia" 9
## 4 " Bahasa melayu" 4
## 5 " Bamanankan" 1
## 6 " Bosanski" 3
## 7 " Català" 5
## 8 " Český" 14
## 9 " Cymraeg" 4
## 10 " Dansk" 18
## # ℹ 58 more rows
movies %>% count(country3_language)
## # A tibble: 61 × 2
## country3_language n
## <fct> <int>
## 1 "" 42970
## 2 " Afrikaans" 2
## 3 " Bahasa indonesia" 2
## 4 " Bahasa melayu" 6
## 5 " Bamanankan" 1
## 6 " Bosanski" 2
## 7 " Český" 2
## 8 " Cymraeg" 1
## 9 " Dansk" 5
## 10 " Deutsch" 328
## # ℹ 51 more rows
Blank values that should be replaced and also eliminate whitespaces.
# Eliminate white space inconsistency
movies <- movies %>% mutate(country1_language = str_trim(country1_language))
movies <- movies %>% mutate(country2_language = str_trim(country2_language))
movies <- movies %>% mutate(country3_language = str_trim(country3_language))
movies <- movies %>% mutate(country1_language = as.factor(movies$country1_language))
movies <- movies %>% mutate(country2_language = as.factor(movies$country2_language))
movies <- movies %>% mutate(country3_language = as.factor(movies$country3_language))
levels(droplevels(movies$country1_language))
## [1] "" "Afrikaans" "Azərbaycan" "Bahasa indonesia"
## [5] "Bahasa melayu" "Bamanankan" "Bokmål" "Bosanski"
## [9] "Català" "Český" "Cymraeg" "Dansk"
## [13] "Deutsch" "Eesti" "English" "Español"
## [17] "Esperanto" "euskera" "Français" "Fulfulde"
## [21] "Gaeilge" "Galego" "Hausa" "Hrvatski"
## [25] "isiZulu" "Íslenska" "Italiano" "Kinyarwanda"
## [29] "Kiswahili" "Latin" "Latviešu" "Lietuvi x9akai"
## [33] "Magyar" "Nederlands" "No Language" "Norsk"
## [37] "Polski" "Português" "Pусский" "Română"
## [41] "shqip" "Slovenčina" "Slovenščina" "Somali"
## [45] "Srpski" "suomi" "svenska" "Tiếng Việt"
## [49] "Türkçe" "Wolof" "ελληνικά" "беларуская мова"
## [53] "български език" "қазақ" "Український" "ქართული"
## [57] "עִבְרִית" "اردو" "العربية" "پښتو"
## [61] "فارسی" "हिन्दी" "বাংলা" "ਪੰਜਾਬੀ"
## [65] "தமிழ்" "తెలుగు" "ภาษาไทย" "한국어 조선말"
## [69] "广州话 廣州話" "日本語" "普通话"
levels(droplevels(movies$country2_language))
## [1] "" "Afrikaans" "Bahasa indonesia" "Bahasa melayu"
## [5] "Bamanankan" "Bosanski" "Català" "Český"
## [9] "Cymraeg" "Dansk" "Deutsch" "Eesti"
## [13] "English" "Español" "Esperanto" "Français"
## [17] "Fulfulde" "Gaeilge" "Galego" "Hrvatski"
## [21] "isiZulu" "Íslenska" "Italiano" "Kinyarwanda"
## [25] "Kiswahili" "Latin" "Latviešu" "Lietuvi x9akai"
## [29] "Magyar" "Malti" "Nederlands" "No Language"
## [33] "Norsk" "ozbek" "Polski" "Português"
## [37] "Pусский" "Română" "shqip" "Slovenčina"
## [41] "Slovenščina" "Somali" "Srpski" "suomi"
## [45] "svenska" "Tiếng Việt" "Türkçe" "Wolof"
## [49] "ελληνικά" "български език" "қазақ" "Український"
## [53] "ქართული" "עִבְרִית" "اردو" "العربية"
## [57] "پښتو" "فارسی" "हिन्दी" "বাংলা"
## [61] "ਪੰਜਾਬੀ" "தமிழ்" "తెలుగు" "ภาษาไทย"
## [65] "한국어 조선말" "广州话 廣州話" "日本語" "普通话"
levels(droplevels(movies$country3_language))
## [1] "" "Afrikaans" "Bahasa indonesia" "Bahasa melayu"
## [5] "Bamanankan" "Bosanski" "Český" "Cymraeg"
## [9] "Dansk" "Deutsch" "Eesti" "English"
## [13] "Español" "Esperanto" "euskera" "Français"
## [17] "Gaeilge" "Hrvatski" "isiZulu" "Íslenska"
## [21] "Italiano" "Kiswahili" "Latin" "Latviešu"
## [25] "Lietuvi x9akai" "Magyar" "Nederlands" "Norsk"
## [29] "Polski" "Português" "Pусский" "Română"
## [33] "shqip" "Slovenčina" "Slovenščina" "Somali"
## [37] "Srpski" "suomi" "svenska" "Tiếng Việt"
## [41] "Türkçe" "Wolof" "ελληνικά" "български език"
## [45] "қазақ" "Український" "ქართული" "עִבְרִית"
## [49] "اردو" "العربية" "پښتو" "فارسی"
## [53] "हिन्दी" "ਪੰਜਾਬੀ" "தமிழ்" "తెలుగు"
## [57] "ภาษาไทย" "한국어 조선말" "广州话 廣州話" "日本語"
## [61] "普通话"
# Create the category "Unspecified Language"
movies <- movies %>% mutate(country1_language = fct_collapse(country1_language, "Unspecified Language" = ""))
movies <- movies %>% mutate(country2_language = fct_collapse(country2_language, "Unspecified Language" = ""))
movies <- movies %>% mutate(country3_language = fct_collapse(country3_language, "Unspecified Language" = ""))
I will use a code that searches for the words inside the vector, and makes a sum of the total amount of cases where the word was detected”
str_detect(movies$country1, paste(c("id","name","iso_3166_1","iso_639_1"), collapse = "|")) %>% sum()
## [1] 2
movies %>% filter(str_detect(country1,paste(c("id","name","iso_3166_1","iso_639_1"), collapse = "|")))
## # A tibble: 2 × 43
## adult belongs_to_collection budget genres homepage id imdb_id
## <lgl> <chr> <dbl> <chr> <chr> <chr> <chr>
## 1 FALSE "" 0 [{'id': 12, 'name':… "" 18444 tt0054…
## 2 FALSE "" 0 [{'id': 10749, 'nam… "" 4035… tt2922…
## # ℹ 36 more variables: original_language <fct>, original_title <chr>,
## # overview <chr>, popularity <dbl>, poster_path <chr>,
## # production_companies <chr>, production_countries <chr>,
## # release_date <date>, revenue <dbl>, runtime <dbl>, spoken_languages <chr>,
## # status <fct>, tagline <chr>, title <chr>, video <lgl>, vote_average <dbl>,
## # vote_count <int>, id_collection <chr>, name_collection <chr>,
## # poster_path_collection <chr>, backdrop_path_collection <chr>, …
A imdb id should have the same character length regardless of the format, this is an example of how it should look “tt7158814”. In total it contains 9 characters therefore, any imdb_id that contains less than that should be changed.
# Find out the lenght of an imdb_id
str_length(movies$imdb_id) %>% head(10)
## [1] 0 9 9 9 9 9 9 9 9 9
# Search for invalid id's
movies %>%
filter(str_length(imdb_id) != 9)
## # A tibble: 1 × 43
## adult belongs_to_collection budget genres homepage id imdb_id
## <lgl> <chr> <dbl> <chr> <chr> <chr> <chr>
## 1 FALSE "" 0 [{'id': 16, 'name':… "" 15257 ""
## # ℹ 36 more variables: original_language <fct>, original_title <chr>,
## # overview <chr>, popularity <dbl>, poster_path <chr>,
## # production_companies <chr>, production_countries <chr>,
## # release_date <date>, revenue <dbl>, runtime <dbl>, spoken_languages <chr>,
## # status <fct>, tagline <chr>, title <chr>, video <lgl>, vote_average <dbl>,
## # vote_count <int>, id_collection <chr>, name_collection <chr>,
## # poster_path_collection <chr>, backdrop_path_collection <chr>, …
# Replace the invalid id with the correct one
movies <- movies %>% mutate(imdb_id = case_when(imdb_id == "" ~ str_replace(imdb_id, "^$", "tt1308622"),TRUE ~ imdb_id))
By running the code we can find that the only invalid id is the same we have detected previously, searching on imdb the title of the movie, the id for this movie was found, which is the following “tt1308622”
# Importing files
keywords <- read.csv("/Users/osvaldotello/Downloads/archive/keywords.csv")
keywords <- distinct(keywords)
#Merging database
movies <- merge(movies,keywords,all.x =TRUE)
#Cleaning database
new_keywords <- str_split_fixed(movies$keywords, ":", n = Inf)
new_keywords <- new_keywords[,2:7]
new_keywords <- new_keywords[, c(2,4,6)]
new_keywords <- as.data.frame(new_keywords)
new_keywords <- new_keywords %>%
mutate(keyword1 = str_replace_all(new_keywords$V1, "[[:punct:]]", " "))
new_keywords <- new_keywords %>%
mutate(keyword2 = str_replace_all(new_keywords$V2, "[[:punct:]]", " "))
new_keywords <- new_keywords %>%
mutate(keyword3 = str_replace_all(new_keywords$V3, "[[:punct:]]", " "))
new_keywords$keyword1 <- str_remove(new_keywords$keyword1,"id")
new_keywords$keyword2 <- str_remove(new_keywords$keyword2,"id")
new_keywords$keyword3 <- str_remove(new_keywords$keyword3,"id")
new_keywords <- new_keywords[,4:6]
new_keywords$keyword1 <- str_trim(new_keywords$keyword1, "right")
new_keywords$keyword2 <- str_trim(new_keywords$keyword2, "right")
new_keywords$keyword3 <- str_trim(new_keywords$keyword3, "right")
new_keywords$keyword1 <- as.factor(new_keywords$keyword1)
new_keywords$keyword2 <- as.factor(new_keywords$keyword2)
new_keywords$keyword3 <- as.factor(new_keywords$keyword3)
movies <- cbind(movies, new_keywords)
# Remove unnecessary rows
movies2 <- select(movies, -genres, -production_companies, -production_countries, -spoken_languages,-video,-keywords)
This is helpful because it provides a more complete database, excluding the non relevant variables, but unite the important ones.
There are no problem regarding the units.
Upon a quick examination of the counts, it’s evident that there’s a significant issue with missing data in this dataset. Some of the movies I looked into did have the actual values in their IMDb profiles. Therefore, I infer that the zeroes in the missing data likely indicate a lack of available data at the time the dataset was compiled. The only exceptions to this might be in the categories of vote averages and vote counts, so I’ll keep those unchanged. However, for the other categories, I’ll need to address this missing data.
# Split the dataset to obtain a better visualization when using visdat
moviesp1 <- select(movies2,1:10)
moviesp2 <- select(movies2,11:20)
moviesp3 <- select(movies2,21:30)
moviesp4 <- select(movies2,31:41)
# Visualize missing values
vis_miss(moviesp1,warn_large_data = FALSE)
vis_miss(moviesp2,warn_large_data = FALSE)
It seems that there is very few data that was left as NA in the database after the cleaning process done during the deliverable of the progress setup, however there are some missing data in revenue, runtime and votes.
There is not a big problem with missing data, some of them are MAR or MNAR, but I previously replaced the missing data.
unique_languages <- table(movies2$country1_language)
write.csv(unique_languages,"languages.csv")
languages_corrected <- read.csv("/Users/osvaldotello/Desktop/languages_corrected.csv")
# Join both datasets using string distance as the criteria
movies2 <- movies2 %>%
stringdist_left_join(languages_corrected, by = c("country1_language" = "Language"), method = "dl") %>%
stringdist_left_join(languages_corrected, by = c("country2_language" = "Language"), method = "dl") %>%
stringdist_left_join(languages_corrected, by = c("country3_language" = "Language"), method = "dl")
summary(movies2$country1_language)
## Unspecified Language Afrikaans Azərbaycan
## 4051 22 4
## Bahasa indonesia Bahasa melayu Bamanankan
## 26 5 4
## Bokmål Bosanski Català
## 3 26 31
## Český Cymraeg Dansk
## 270 2 300
## Deutsch Eesti English
## 1321 41 26890
## Español Esperanto euskera
## 1144 3 14
## Français Fulfulde Gaeilge
## 2430 1 6
## Galego Hausa Hrvatski
## 3 1 34
## isiZulu Íslenska Italiano
## 4 32 1416
## Kinyarwanda Kiswahili Latin
## 1 2 24
## Latviešu Lietuvi x9akai Magyar
## 17 15 144
## Nederlands No Language Norsk
## 297 306 112
## Polski Português Pусский
## 246 330 909
## Română shqip Slovenčina
## 75 24 18
## Slovenščina Somali Srpski
## 24 1 47
## suomi svenska Tiếng Việt
## 345 676 15
## Türkçe Wolof ελληνικά
## 149 3 133
## беларуская мова български език қазақ
## 2 25 8
## Український ქართული עִבְרִית
## 16 21 76
## اردو العربية پښتو
## 15 269 2
## فارسی हिन्दी বাংলা
## 102 546 43
## ਪੰਜਾਬੀ தமிழ் తెలుగు
## 4 81 43
## ภาษาไทย 한국어 조선말 广州话 廣州話
## 72 446 405
## 日本語 普通话
## 1385 414
summary(movies2$country2_language)
## Unspecified Language Afrikaans Bahasa indonesia
## 37996 4 9
## Bahasa melayu Bamanankan Bosanski
## 4 1 3
## Català Český Cymraeg
## 5 14 4
## Dansk Deutsch Eesti
## 19 924 10
## English Español Esperanto
## 1617 786 3
## Français Fulfulde Gaeilge
## 1488 1 11
## Galego Hrvatski isiZulu
## 1 14 5
## Íslenska Italiano Kinyarwanda
## 22 623 2
## Kiswahili Latin Latviešu
## 7 48 2
## Lietuvi x9akai Magyar Malti
## 7 138 2
## Nederlands No Language Norsk
## 29 13 49
## ozbek Polski Português
## 2 162 160
## Pусский Română shqip
## 332 27 1
## Slovenčina Slovenščina Somali
## 18 10 4
## Srpski suomi svenska
## 27 40 244
## Tiếng Việt Türkçe Wolof
## 29 51 7
## ελληνικά български език қазақ
## 44 4 2
## Український ქართული עִבְרִית
## 17 8 74
## اردو العربية پښتو
## 19 28 2
## فارسی हिन्दी বাংলা
## 26 126 2
## ਪੰਜਾਬੀ தமிழ் తెలుగు
## 6 21 16
## ภาษาไทย 한국어 조선말 广州话 廣州話
## 42 54 44
## 日本語 普通话
## 240 222
summary(movies2$country3_language)
## Unspecified Language Afrikaans Bahasa indonesia
## 43438 2 2
## Bahasa melayu Bamanankan Bosanski
## 6 1 2
## Český Cymraeg Dansk
## 2 1 5
## Deutsch Eesti English
## 330 1 243
## Español Esperanto euskera
## 309 1 1
## Français Gaeilge Hrvatski
## 237 4 3
## isiZulu Íslenska Italiano
## 6 8 225
## Kiswahili Latin Latviešu
## 9 41 2
## Lietuvi x9akai Magyar Nederlands
## 2 60 7
## Norsk Polski Português
## 24 82 65
## Pусский Română shqip
## 212 18 3
## Slovenčina Slovenščina Somali
## 4 4 4
## Srpski suomi svenska
## 21 8 112
## Tiếng Việt Türkçe Wolof
## 8 29 2
## ελληνικά български език қазақ
## 28 2 1
## Український ქართული עִבְרִית
## 8 4 37
## اردو العربية پښتو
## 15 31 1
## فارسی हिन्दी ਪੰਜਾਬੀ
## 8 28 7
## தமிழ் తెలుగు ภาษาไทย
## 4 8 31
## 한국어 조선말 广州话 廣州話 日本語
## 28 12 87
## 普通话
## 88
Now the language values are corrected in case there was a typo within the dataset. With this we ensure that the same language stays in one category only.
In this new dataset there will be only the essential to make an easier analysis and continue with the interpretation.
movies3 <- select(movies2,adult,original_title,revenue,budget,runtime,release_date,status,vote_average,vote_count,genre1,company1,country1,country1_language,popularity_max,keyword1)
#create_report(movies3, y="revenue", report_title = "Movies Report")
Only 0.052% of the data is completely absent for the dataset which is a low number an indicates the missing data will not heavily impact the analysis, however as stated on a previous section it appears 0 is also used in this dataset as missing data, which would mean the percentage is higher than the report suggests and a treatment to the missing values should be done.
In terms of were the missing data is located, it mainly is on the variables of release date and runtime.
The histograms shows an excessive amounts of data in zeroes which could represent negatively the quality of the results obtained in the analysis.
In terms of the QQ Plots it seems that only the vote_average and runtime with less precision possesses some type of normal distribution while the other variables do not come close at all.
The PCU analysis show more than one PC with variances ranging from 7.2% to 78%. Overall based on the report and observations the next step would be to decide what to do with the zeroes in the dataset, as dropping the zeroes would result on the majority of the dataset disappearing while leaving them as they are could alter all the statistical descriptors significantly, changing the result of the analysis completely. Unfortunately mice seems demanding to use on large dataset, so another option would be to use basic imputation even though is not the most accurate method.
genre_freq <- table(movies$genre1, movies$company1)
genre_freq
##
## American International Pictures AIP BBC Films
## Action 21 2
## Adventure 3 3
## Animation 0 0
## Comedy 6 23
## Crime 5 4
## Documentary 0 2
## Drama 8 53
## Family 0 0
## Fantasy 0 0
## Foreign 0 0
## History 0 3
## Horror 13 3
## Music 0 1
## Mystery 0 1
## Romance 0 3
## Science Fiction 1 0
## Thriller 5 5
## TV Movie 0 2
## Unspecified 1 2
## War 0 2
## Western 0 0
##
## British Broadcasting Corporation BBC Canal+
## Action 0 4
## Adventure 2 1
## Animation 1 0
## Comedy 6 13
## Crime 1 1
## Documentary 17 2
## Drama 22 25
## Family 2 0
## Fantasy 1 1
## Foreign 0 0
## History 2 1
## Horror 0 0
## Music 2 0
## Mystery 1 2
## Romance 4 5
## Science Fiction 2 0
## Thriller 3 4
## TV Movie 7 0
## Unspecified 1 1
## War 3 1
## Western 0 1
##
## Channel Four Films CJ Entertainment Columbia DC Comics
## Action 1 13 133 30
## Adventure 1 2 44 1
## Animation 2 0 11 15
## Comedy 17 6 198 1
## Crime 3 1 58 0
## Documentary 4 0 1 0
## Drama 39 13 210 1
## Family 0 3 8 1
## Fantasy 1 0 11 2
## Foreign 0 0 0 0
## History 2 0 3 0
## Horror 1 4 26 1
## Music 1 1 10 0
## Mystery 0 2 14 0
## Romance 1 3 25 0
## Science Fiction 0 1 8 2
## Thriller 1 9 32 0
## TV Movie 0 0 0 0
## Unspecified 0 0 0 0
## War 1 0 10 0
## Western 0 0 28 0
##
## DreamWorks SKG First National Pictures Fox France 2 Cinéma
## Action 13 4 127 1
## Adventure 6 2 51 3
## Animation 3 0 15 0
## Comedy 23 14 248 28
## Crime 0 11 58 4
## Documentary 0 0 2 0
## Drama 18 24 264 48
## Family 1 0 7 2
## Fantasy 2 0 17 0
## Foreign 0 0 0 0
## History 0 0 8 1
## Horror 2 1 16 0
## Music 0 4 11 0
## Mystery 1 0 16 0
## Romance 1 5 23 0
## Science Fiction 2 0 10 0
## Thriller 3 3 11 8
## TV Movie 0 0 0 0
## Unspecified 0 0 7 0
## War 1 1 15 4
## Western 1 0 23 0
##
## Gaumont Hammer Film Productions Hollywood Pictures
## Action 11 4 14
## Adventure 6 3 4
## Animation 0 0 0
## Comedy 50 2 17
## Crime 5 6 0
## Documentary 2 0 0
## Drama 35 7 11
## Family 1 0 0
## Fantasy 0 1 0
## Foreign 1 0 0
## History 1 0 2
## Horror 1 43 2
## Music 0 0 2
## Mystery 1 2 0
## Romance 4 1 2
## Science Fiction 0 2 1
## Thriller 4 4 2
## TV Movie 0 0 0
## Unspecified 0 1 0
## War 0 0 0
## Western 0 0 0
##
## Imagine Entertainment Lionsgate Metro Goldwyn Mayer MGM
## Action 7 13 62
## Adventure 4 5 44
## Animation 1 1 5
## Comedy 18 27 233
## Crime 5 3 54
## Documentary 3 1 5
## Drama 11 35 280
## Family 1 1 6
## Fantasy 2 3 7
## Foreign 0 0 0
## History 0 0 4
## Horror 1 23 15
## Music 0 0 23
## Mystery 0 6 16
## Romance 1 5 42
## Science Fiction 0 3 8
## Thriller 2 9 13
## TV Movie 0 1 0
## Unspecified 0 0 5
## War 0 0 8
## Western 2 1 21
##
## Miramax Films Monogram Pictures Mosfilm New Line Cinema
## Action 12 6 9 44
## Adventure 3 3 12 8
## Animation 1 0 1 1
## Comedy 50 21 46 78
## Crime 12 6 4 13
## Documentary 3 0 3 1
## Drama 65 6 69 45
## Family 0 0 4 3
## Fantasy 3 0 3 8
## Foreign 0 0 0 0
## History 0 0 3 0
## Horror 8 5 0 36
## Music 1 0 0 3
## Mystery 2 8 2 2
## Romance 8 1 14 7
## Science Fiction 0 0 2 6
## Thriller 4 2 0 6
## TV Movie 0 0 0 0
## Unspecified 0 0 1 0
## War 2 0 7 0
## Western 0 2 0 0
##
## New World Pictures Nikkatsu No Company Nordisk Film
## Action 29 8 718 14
## Adventure 2 1 165 0
## Animation 0 0 226 1
## Comedy 7 3 1974 14
## Crime 1 6 223 4
## Documentary 0 0 1954 0
## Drama 4 23 2560 12
## Family 0 0 105 3
## Fantasy 3 0 112 0
## Foreign 0 7 54 0
## History 0 0 56 1
## Horror 13 6 486 2
## Music 0 1 150 0
## Mystery 0 3 89 1
## Romance 1 3 225 0
## Science Fiction 4 0 125 0
## Thriller 4 3 313 7
## TV Movie 0 0 121 0
## Unspecified 0 3 2093 0
## War 0 0 53 0
## Western 0 0 59 0
##
## Orion Pictures Other Paramount Pictures Rai Cinema
## Action 20 2522 137 2
## Adventure 5 822 57 0
## Animation 0 668 13 0
## Comedy 39 4544 300 12
## Crime 9 967 45 1
## Documentary 0 1387 5 1
## Drama 19 6974 231 27
## Family 1 328 5 0
## Fantasy 2 428 15 0
## Foreign 0 49 0 0
## History 0 170 4 1
## Horror 1 1734 39 2
## Music 1 224 14 0
## Mystery 2 319 11 0
## Romance 0 680 28 6
## Science Fiction 2 407 24 0
## Thriller 5 1077 28 0
## TV Movie 0 258 0 0
## Unspecified 0 300 5 2
## War 2 215 15 1
## Western 1 201 20 0
##
## Regency Enterprises RKO Radio Pictures Shaw Brothers
## Action 10 15 64
## Adventure 3 15 2
## Animation 0 7 0
## Comedy 21 78 2
## Crime 4 29 0
## Documentary 0 1 0
## Drama 11 80 1
## Family 1 1 0
## Fantasy 2 2 1
## Foreign 0 0 2
## History 1 0 0
## Horror 3 5 2
## Music 0 4 1
## Mystery 2 11 0
## Romance 0 13 0
## Science Fiction 0 0 2
## Thriller 3 10 0
## TV Movie 0 0 0
## Unspecified 0 0 0
## War 0 4 0
## Western 1 15 0
##
## Shôchiku Eiga StudioCanal Summit Entertainment
## Action 2 8 7
## Adventure 0 4 9
## Animation 0 2 0
## Comedy 7 13 8
## Crime 4 5 1
## Documentary 0 2 0
## Drama 35 12 11
## Family 0 1 0
## Fantasy 0 0 3
## Foreign 1 0 0
## History 0 1 1
## Horror 2 3 7
## Music 0 0 3
## Mystery 0 1 1
## Romance 6 2 2
## Science Fiction 0 0 1
## Thriller 0 6 2
## TV Movie 0 0 0
## Unspecified 2 0 0
## War 3 1 0
## Western 0 0 0
##
## The Rank Organisation TLA Releasing Toho Company
## Action 5 0 22
## Adventure 3 0 8
## Animation 0 0 4
## Comedy 26 22 7
## Crime 2 1 2
## Documentary 0 1 0
## Drama 17 37 44
## Family 0 0 0
## Fantasy 1 0 6
## Foreign 0 1 2
## History 0 0 4
## Horror 3 2 10
## Music 0 0 1
## Mystery 0 3 1
## Romance 2 2 3
## Science Fiction 0 0 5
## Thriller 4 2 5
## TV Movie 0 0 0
## Unspecified 0 4 0
## War 3 0 2
## Western 1 0 0
##
## Touchstone Pictures TriStar Pictures United Artists
## Action 14 41 40
## Adventure 6 12 20
## Animation 0 1 2
## Comedy 43 41 61
## Crime 0 8 9
## Documentary 0 0 0
## Drama 26 34 79
## Family 1 1 3
## Fantasy 5 3 2
## Foreign 0 0 0
## History 0 0 2
## Horror 1 5 11
## Music 2 0 5
## Mystery 1 0 6
## Romance 2 4 4
## Science Fiction 0 4 2
## Thriller 1 7 8
## TV Movie 0 1 0
## Unspecified 0 0 0
## War 0 1 3
## Western 0 0 15
##
## Universal International Pictures UI Universal
## Action 11 120
## Adventure 8 48
## Animation 0 12
## Comedy 15 207
## Crime 4 34
## Documentary 0 3
## Drama 18 148
## Family 0 5
## Fantasy 0 21
## Foreign 0 0
## History 0 3
## Horror 8 60
## Music 0 9
## Mystery 2 11
## Romance 0 16
## Science Fiction 0 15
## Thriller 3 23
## TV Movie 0 0
## Unspecified 2 0
## War 1 4
## Western 13 15
##
## Village Roadshow Pictures Disney Warner Bros
## Action 27 31 89
## Adventure 5 66 36
## Animation 3 102 25
## Comedy 13 58 175
## Crime 3 0 67
## Documentary 0 5 7
## Drama 17 28 215
## Family 3 24 2
## Fantasy 0 24 10
## Foreign 0 0 0
## History 0 0 5
## Horror 3 0 10
## Music 0 0 13
## Mystery 1 1 11
## Romance 1 7 28
## Science Fiction 2 1 5
## Thriller 9 1 12
## TV Movie 0 0 0
## Unspecified 0 5 2
## War 1 0 15
## Western 0 0 30
genre_prop <- prop.table(genre_freq)
genre_prop
##
## American International Pictures AIP BBC Films
## Action 4.623819e-04 4.403637e-05
## Adventure 6.605456e-05 6.605456e-05
## Animation 0.000000e+00 0.000000e+00
## Comedy 1.321091e-04 5.064183e-04
## Crime 1.100909e-04 8.807275e-05
## Documentary 0.000000e+00 4.403637e-05
## Drama 1.761455e-04 1.166964e-03
## Family 0.000000e+00 0.000000e+00
## Fantasy 0.000000e+00 0.000000e+00
## Foreign 0.000000e+00 0.000000e+00
## History 0.000000e+00 6.605456e-05
## Horror 2.862364e-04 6.605456e-05
## Music 0.000000e+00 2.201819e-05
## Mystery 0.000000e+00 2.201819e-05
## Romance 0.000000e+00 6.605456e-05
## Science Fiction 2.201819e-05 0.000000e+00
## Thriller 1.100909e-04 1.100909e-04
## TV Movie 0.000000e+00 4.403637e-05
## Unspecified 2.201819e-05 4.403637e-05
## War 0.000000e+00 4.403637e-05
## Western 0.000000e+00 0.000000e+00
##
## British Broadcasting Corporation BBC Canal+
## Action 0.000000e+00 8.807275e-05
## Adventure 4.403637e-05 2.201819e-05
## Animation 2.201819e-05 0.000000e+00
## Comedy 1.321091e-04 2.862364e-04
## Crime 2.201819e-05 2.201819e-05
## Documentary 3.743092e-04 4.403637e-05
## Drama 4.844001e-04 5.504547e-04
## Family 4.403637e-05 0.000000e+00
## Fantasy 2.201819e-05 2.201819e-05
## Foreign 0.000000e+00 0.000000e+00
## History 4.403637e-05 2.201819e-05
## Horror 0.000000e+00 0.000000e+00
## Music 4.403637e-05 0.000000e+00
## Mystery 2.201819e-05 4.403637e-05
## Romance 8.807275e-05 1.100909e-04
## Science Fiction 4.403637e-05 0.000000e+00
## Thriller 6.605456e-05 8.807275e-05
## TV Movie 1.541273e-04 0.000000e+00
## Unspecified 2.201819e-05 2.201819e-05
## War 6.605456e-05 2.201819e-05
## Western 0.000000e+00 2.201819e-05
##
## Channel Four Films CJ Entertainment Columbia DC Comics
## Action 2.201819e-05 2.862364e-04 2.928419e-03 6.605456e-04
## Adventure 2.201819e-05 4.403637e-05 9.688002e-04 2.201819e-05
## Animation 4.403637e-05 0.000000e+00 2.422001e-04 3.302728e-04
## Comedy 3.743092e-04 1.321091e-04 4.359601e-03 2.201819e-05
## Crime 6.605456e-05 2.201819e-05 1.277055e-03 0.000000e+00
## Documentary 8.807275e-05 0.000000e+00 2.201819e-05 0.000000e+00
## Drama 8.587093e-04 2.862364e-04 4.623819e-03 2.201819e-05
## Family 0.000000e+00 6.605456e-05 1.761455e-04 2.201819e-05
## Fantasy 2.201819e-05 0.000000e+00 2.422001e-04 4.403637e-05
## Foreign 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00
## History 4.403637e-05 0.000000e+00 6.605456e-05 0.000000e+00
## Horror 2.201819e-05 8.807275e-05 5.724729e-04 2.201819e-05
## Music 2.201819e-05 2.201819e-05 2.201819e-04 0.000000e+00
## Mystery 0.000000e+00 4.403637e-05 3.082546e-04 0.000000e+00
## Romance 2.201819e-05 6.605456e-05 5.504547e-04 0.000000e+00
## Science Fiction 0.000000e+00 2.201819e-05 1.761455e-04 4.403637e-05
## Thriller 2.201819e-05 1.981637e-04 7.045820e-04 0.000000e+00
## TV Movie 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00
## Unspecified 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00
## War 2.201819e-05 0.000000e+00 2.201819e-04 0.000000e+00
## Western 0.000000e+00 0.000000e+00 6.165092e-04 0.000000e+00
##
## DreamWorks SKG First National Pictures Fox
## Action 2.862364e-04 8.807275e-05 2.796310e-03
## Adventure 1.321091e-04 4.403637e-05 1.122928e-03
## Animation 6.605456e-05 0.000000e+00 3.302728e-04
## Comedy 5.064183e-04 3.082546e-04 5.460510e-03
## Crime 0.000000e+00 2.422001e-04 1.277055e-03
## Documentary 0.000000e+00 0.000000e+00 4.403637e-05
## Drama 3.963274e-04 5.284365e-04 5.812801e-03
## Family 2.201819e-05 0.000000e+00 1.541273e-04
## Fantasy 4.403637e-05 0.000000e+00 3.743092e-04
## Foreign 0.000000e+00 0.000000e+00 0.000000e+00
## History 0.000000e+00 0.000000e+00 1.761455e-04
## Horror 4.403637e-05 2.201819e-05 3.522910e-04
## Music 0.000000e+00 8.807275e-05 2.422001e-04
## Mystery 2.201819e-05 0.000000e+00 3.522910e-04
## Romance 2.201819e-05 1.100909e-04 5.064183e-04
## Science Fiction 4.403637e-05 0.000000e+00 2.201819e-04
## Thriller 6.605456e-05 6.605456e-05 2.422001e-04
## TV Movie 0.000000e+00 0.000000e+00 0.000000e+00
## Unspecified 0.000000e+00 0.000000e+00 1.541273e-04
## War 2.201819e-05 2.201819e-05 3.302728e-04
## Western 2.201819e-05 0.000000e+00 5.064183e-04
##
## France 2 Cinéma Gaumont Hammer Film Productions
## Action 2.201819e-05 2.422001e-04 8.807275e-05
## Adventure 6.605456e-05 1.321091e-04 6.605456e-05
## Animation 0.000000e+00 0.000000e+00 0.000000e+00
## Comedy 6.165092e-04 1.100909e-03 4.403637e-05
## Crime 8.807275e-05 1.100909e-04 1.321091e-04
## Documentary 0.000000e+00 4.403637e-05 0.000000e+00
## Drama 1.056873e-03 7.706365e-04 1.541273e-04
## Family 4.403637e-05 2.201819e-05 0.000000e+00
## Fantasy 0.000000e+00 0.000000e+00 2.201819e-05
## Foreign 0.000000e+00 2.201819e-05 0.000000e+00
## History 2.201819e-05 2.201819e-05 0.000000e+00
## Horror 0.000000e+00 2.201819e-05 9.467820e-04
## Music 0.000000e+00 0.000000e+00 0.000000e+00
## Mystery 0.000000e+00 2.201819e-05 4.403637e-05
## Romance 0.000000e+00 8.807275e-05 2.201819e-05
## Science Fiction 0.000000e+00 0.000000e+00 4.403637e-05
## Thriller 1.761455e-04 8.807275e-05 8.807275e-05
## TV Movie 0.000000e+00 0.000000e+00 0.000000e+00
## Unspecified 0.000000e+00 0.000000e+00 2.201819e-05
## War 8.807275e-05 0.000000e+00 0.000000e+00
## Western 0.000000e+00 0.000000e+00 0.000000e+00
##
## Hollywood Pictures Imagine Entertainment Lionsgate
## Action 3.082546e-04 1.541273e-04 2.862364e-04
## Adventure 8.807275e-05 8.807275e-05 1.100909e-04
## Animation 0.000000e+00 2.201819e-05 2.201819e-05
## Comedy 3.743092e-04 3.963274e-04 5.944910e-04
## Crime 0.000000e+00 1.100909e-04 6.605456e-05
## Documentary 0.000000e+00 6.605456e-05 2.201819e-05
## Drama 2.422001e-04 2.422001e-04 7.706365e-04
## Family 0.000000e+00 2.201819e-05 2.201819e-05
## Fantasy 0.000000e+00 4.403637e-05 6.605456e-05
## Foreign 0.000000e+00 0.000000e+00 0.000000e+00
## History 4.403637e-05 0.000000e+00 0.000000e+00
## Horror 4.403637e-05 2.201819e-05 5.064183e-04
## Music 4.403637e-05 0.000000e+00 0.000000e+00
## Mystery 0.000000e+00 0.000000e+00 1.321091e-04
## Romance 4.403637e-05 2.201819e-05 1.100909e-04
## Science Fiction 2.201819e-05 0.000000e+00 6.605456e-05
## Thriller 4.403637e-05 4.403637e-05 1.981637e-04
## TV Movie 0.000000e+00 0.000000e+00 2.201819e-05
## Unspecified 0.000000e+00 0.000000e+00 0.000000e+00
## War 0.000000e+00 0.000000e+00 0.000000e+00
## Western 0.000000e+00 4.403637e-05 2.201819e-05
##
## Metro Goldwyn Mayer MGM Miramax Films Monogram Pictures
## Action 1.365128e-03 2.642182e-04 1.321091e-04
## Adventure 9.688002e-04 6.605456e-05 6.605456e-05
## Animation 1.100909e-04 2.201819e-05 0.000000e+00
## Comedy 5.130238e-03 1.100909e-03 4.623819e-04
## Crime 1.188982e-03 2.642182e-04 1.321091e-04
## Documentary 1.100909e-04 6.605456e-05 0.000000e+00
## Drama 6.165092e-03 1.431182e-03 1.321091e-04
## Family 1.321091e-04 0.000000e+00 0.000000e+00
## Fantasy 1.541273e-04 6.605456e-05 0.000000e+00
## Foreign 0.000000e+00 0.000000e+00 0.000000e+00
## History 8.807275e-05 0.000000e+00 0.000000e+00
## Horror 3.302728e-04 1.761455e-04 1.100909e-04
## Music 5.064183e-04 2.201819e-05 0.000000e+00
## Mystery 3.522910e-04 4.403637e-05 1.761455e-04
## Romance 9.247639e-04 1.761455e-04 2.201819e-05
## Science Fiction 1.761455e-04 0.000000e+00 0.000000e+00
## Thriller 2.862364e-04 8.807275e-05 4.403637e-05
## TV Movie 0.000000e+00 0.000000e+00 0.000000e+00
## Unspecified 1.100909e-04 0.000000e+00 0.000000e+00
## War 1.761455e-04 4.403637e-05 0.000000e+00
## Western 4.623819e-04 0.000000e+00 4.403637e-05
##
## Mosfilm New Line Cinema New World Pictures Nikkatsu
## Action 1.981637e-04 9.688002e-04 6.385274e-04 1.761455e-04
## Adventure 2.642182e-04 1.761455e-04 4.403637e-05 2.201819e-05
## Animation 2.201819e-05 2.201819e-05 0.000000e+00 0.000000e+00
## Comedy 1.012837e-03 1.717419e-03 1.541273e-04 6.605456e-05
## Crime 8.807275e-05 2.862364e-04 2.201819e-05 1.321091e-04
## Documentary 6.605456e-05 2.201819e-05 0.000000e+00 0.000000e+00
## Drama 1.519255e-03 9.908184e-04 8.807275e-05 5.064183e-04
## Family 8.807275e-05 6.605456e-05 0.000000e+00 0.000000e+00
## Fantasy 6.605456e-05 1.761455e-04 6.605456e-05 0.000000e+00
## Foreign 0.000000e+00 0.000000e+00 0.000000e+00 1.541273e-04
## History 6.605456e-05 0.000000e+00 0.000000e+00 0.000000e+00
## Horror 0.000000e+00 7.926547e-04 2.862364e-04 1.321091e-04
## Music 0.000000e+00 6.605456e-05 0.000000e+00 2.201819e-05
## Mystery 4.403637e-05 4.403637e-05 0.000000e+00 6.605456e-05
## Romance 3.082546e-04 1.541273e-04 2.201819e-05 6.605456e-05
## Science Fiction 4.403637e-05 1.321091e-04 8.807275e-05 0.000000e+00
## Thriller 0.000000e+00 1.321091e-04 8.807275e-05 6.605456e-05
## TV Movie 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00
## Unspecified 2.201819e-05 0.000000e+00 0.000000e+00 6.605456e-05
## War 1.541273e-04 0.000000e+00 0.000000e+00 0.000000e+00
## Western 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00
##
## No Company Nordisk Film Orion Pictures Other
## Action 1.580906e-02 3.082546e-04 4.403637e-04 5.552987e-02
## Adventure 3.633001e-03 0.000000e+00 1.100909e-04 1.809895e-02
## Animation 4.976110e-03 2.201819e-05 0.000000e+00 1.470815e-02
## Comedy 4.346390e-02 3.082546e-04 8.587093e-04 1.000506e-01
## Crime 4.910056e-03 8.807275e-05 1.981637e-04 2.129159e-02
## Documentary 4.302354e-02 0.000000e+00 0.000000e+00 3.053923e-02
## Drama 5.636656e-02 2.642182e-04 4.183456e-04 1.535548e-01
## Family 2.311910e-03 6.605456e-05 2.201819e-05 7.221965e-03
## Fantasy 2.466037e-03 0.000000e+00 4.403637e-05 9.423784e-03
## Foreign 1.188982e-03 0.000000e+00 0.000000e+00 1.078891e-03
## History 1.233018e-03 2.201819e-05 0.000000e+00 3.743092e-03
## Horror 1.070084e-02 4.403637e-05 2.201819e-05 3.817954e-02
## Music 3.302728e-03 0.000000e+00 2.201819e-05 4.932074e-03
## Mystery 1.959619e-03 2.201819e-05 4.403637e-05 7.023802e-03
## Romance 4.954092e-03 0.000000e+00 0.000000e+00 1.497237e-02
## Science Fiction 2.752273e-03 0.000000e+00 4.403637e-05 8.961402e-03
## Thriller 6.891693e-03 1.541273e-04 1.100909e-04 2.371359e-02
## TV Movie 2.664201e-03 0.000000e+00 0.000000e+00 5.680692e-03
## Unspecified 4.608407e-02 0.000000e+00 0.000000e+00 6.605456e-03
## War 1.166964e-03 0.000000e+00 4.403637e-05 4.733910e-03
## Western 1.299073e-03 0.000000e+00 2.201819e-05 4.425656e-03
##
## Paramount Pictures Rai Cinema Regency Enterprises
## Action 3.016492e-03 4.403637e-05 2.201819e-04
## Adventure 1.255037e-03 0.000000e+00 6.605456e-05
## Animation 2.862364e-04 0.000000e+00 0.000000e+00
## Comedy 6.605456e-03 2.642182e-04 4.623819e-04
## Crime 9.908184e-04 2.201819e-05 8.807275e-05
## Documentary 1.100909e-04 2.201819e-05 0.000000e+00
## Drama 5.086201e-03 5.944910e-04 2.422001e-04
## Family 1.100909e-04 0.000000e+00 2.201819e-05
## Fantasy 3.302728e-04 0.000000e+00 4.403637e-05
## Foreign 0.000000e+00 0.000000e+00 0.000000e+00
## History 8.807275e-05 2.201819e-05 2.201819e-05
## Horror 8.587093e-04 4.403637e-05 6.605456e-05
## Music 3.082546e-04 0.000000e+00 0.000000e+00
## Mystery 2.422001e-04 0.000000e+00 4.403637e-05
## Romance 6.165092e-04 1.321091e-04 0.000000e+00
## Science Fiction 5.284365e-04 0.000000e+00 0.000000e+00
## Thriller 6.165092e-04 0.000000e+00 6.605456e-05
## TV Movie 0.000000e+00 0.000000e+00 0.000000e+00
## Unspecified 1.100909e-04 4.403637e-05 0.000000e+00
## War 3.302728e-04 2.201819e-05 0.000000e+00
## Western 4.403637e-04 0.000000e+00 2.201819e-05
##
## RKO Radio Pictures Shaw Brothers Shôchiku Eiga StudioCanal
## Action 3.302728e-04 1.409164e-03 4.403637e-05 1.761455e-04
## Adventure 3.302728e-04 4.403637e-05 0.000000e+00 8.807275e-05
## Animation 1.541273e-04 0.000000e+00 0.000000e+00 4.403637e-05
## Comedy 1.717419e-03 4.403637e-05 1.541273e-04 2.862364e-04
## Crime 6.385274e-04 0.000000e+00 8.807275e-05 1.100909e-04
## Documentary 2.201819e-05 0.000000e+00 0.000000e+00 4.403637e-05
## Drama 1.761455e-03 2.201819e-05 7.706365e-04 2.642182e-04
## Family 2.201819e-05 0.000000e+00 0.000000e+00 2.201819e-05
## Fantasy 4.403637e-05 2.201819e-05 0.000000e+00 0.000000e+00
## Foreign 0.000000e+00 4.403637e-05 2.201819e-05 0.000000e+00
## History 0.000000e+00 0.000000e+00 0.000000e+00 2.201819e-05
## Horror 1.100909e-04 4.403637e-05 4.403637e-05 6.605456e-05
## Music 8.807275e-05 2.201819e-05 0.000000e+00 0.000000e+00
## Mystery 2.422001e-04 0.000000e+00 0.000000e+00 2.201819e-05
## Romance 2.862364e-04 0.000000e+00 1.321091e-04 4.403637e-05
## Science Fiction 0.000000e+00 4.403637e-05 0.000000e+00 0.000000e+00
## Thriller 2.201819e-04 0.000000e+00 0.000000e+00 1.321091e-04
## TV Movie 0.000000e+00 0.000000e+00 0.000000e+00 0.000000e+00
## Unspecified 0.000000e+00 0.000000e+00 4.403637e-05 0.000000e+00
## War 8.807275e-05 0.000000e+00 6.605456e-05 2.201819e-05
## Western 3.302728e-04 0.000000e+00 0.000000e+00 0.000000e+00
##
## Summit Entertainment The Rank Organisation TLA Releasing
## Action 1.541273e-04 1.100909e-04 0.000000e+00
## Adventure 1.981637e-04 6.605456e-05 0.000000e+00
## Animation 0.000000e+00 0.000000e+00 0.000000e+00
## Comedy 1.761455e-04 5.724729e-04 4.844001e-04
## Crime 2.201819e-05 4.403637e-05 2.201819e-05
## Documentary 0.000000e+00 0.000000e+00 2.201819e-05
## Drama 2.422001e-04 3.743092e-04 8.146729e-04
## Family 0.000000e+00 0.000000e+00 0.000000e+00
## Fantasy 6.605456e-05 2.201819e-05 0.000000e+00
## Foreign 0.000000e+00 0.000000e+00 2.201819e-05
## History 2.201819e-05 0.000000e+00 0.000000e+00
## Horror 1.541273e-04 6.605456e-05 4.403637e-05
## Music 6.605456e-05 0.000000e+00 0.000000e+00
## Mystery 2.201819e-05 0.000000e+00 6.605456e-05
## Romance 4.403637e-05 4.403637e-05 4.403637e-05
## Science Fiction 2.201819e-05 0.000000e+00 0.000000e+00
## Thriller 4.403637e-05 8.807275e-05 4.403637e-05
## TV Movie 0.000000e+00 0.000000e+00 0.000000e+00
## Unspecified 0.000000e+00 0.000000e+00 8.807275e-05
## War 0.000000e+00 6.605456e-05 0.000000e+00
## Western 0.000000e+00 2.201819e-05 0.000000e+00
##
## Toho Company Touchstone Pictures TriStar Pictures
## Action 4.844001e-04 3.082546e-04 9.027457e-04
## Adventure 1.761455e-04 1.321091e-04 2.642182e-04
## Animation 8.807275e-05 0.000000e+00 2.201819e-05
## Comedy 1.541273e-04 9.467820e-04 9.027457e-04
## Crime 4.403637e-05 0.000000e+00 1.761455e-04
## Documentary 0.000000e+00 0.000000e+00 0.000000e+00
## Drama 9.688002e-04 5.724729e-04 7.486184e-04
## Family 0.000000e+00 2.201819e-05 2.201819e-05
## Fantasy 1.321091e-04 1.100909e-04 6.605456e-05
## Foreign 4.403637e-05 0.000000e+00 0.000000e+00
## History 8.807275e-05 0.000000e+00 0.000000e+00
## Horror 2.201819e-04 2.201819e-05 1.100909e-04
## Music 2.201819e-05 4.403637e-05 0.000000e+00
## Mystery 2.201819e-05 2.201819e-05 0.000000e+00
## Romance 6.605456e-05 4.403637e-05 8.807275e-05
## Science Fiction 1.100909e-04 0.000000e+00 8.807275e-05
## Thriller 1.100909e-04 2.201819e-05 1.541273e-04
## TV Movie 0.000000e+00 0.000000e+00 2.201819e-05
## Unspecified 0.000000e+00 0.000000e+00 0.000000e+00
## War 4.403637e-05 0.000000e+00 2.201819e-05
## Western 0.000000e+00 0.000000e+00 0.000000e+00
##
## United Artists Universal International Pictures UI
## Action 8.807275e-04 2.422001e-04
## Adventure 4.403637e-04 1.761455e-04
## Animation 4.403637e-05 0.000000e+00
## Comedy 1.343109e-03 3.302728e-04
## Crime 1.981637e-04 8.807275e-05
## Documentary 0.000000e+00 0.000000e+00
## Drama 1.739437e-03 3.963274e-04
## Family 6.605456e-05 0.000000e+00
## Fantasy 4.403637e-05 0.000000e+00
## Foreign 0.000000e+00 0.000000e+00
## History 4.403637e-05 0.000000e+00
## Horror 2.422001e-04 1.761455e-04
## Music 1.100909e-04 0.000000e+00
## Mystery 1.321091e-04 4.403637e-05
## Romance 8.807275e-05 0.000000e+00
## Science Fiction 4.403637e-05 0.000000e+00
## Thriller 1.761455e-04 6.605456e-05
## TV Movie 0.000000e+00 0.000000e+00
## Unspecified 0.000000e+00 4.403637e-05
## War 6.605456e-05 2.201819e-05
## Western 3.302728e-04 2.862364e-04
##
## Universal Village Roadshow Pictures Disney
## Action 2.642182e-03 5.944910e-04 6.825638e-04
## Adventure 1.056873e-03 1.100909e-04 1.453200e-03
## Animation 2.642182e-04 6.605456e-05 2.245855e-03
## Comedy 4.557765e-03 2.862364e-04 1.277055e-03
## Crime 7.486184e-04 6.605456e-05 0.000000e+00
## Documentary 6.605456e-05 0.000000e+00 1.100909e-04
## Drama 3.258692e-03 3.743092e-04 6.165092e-04
## Family 1.100909e-04 6.605456e-05 5.284365e-04
## Fantasy 4.623819e-04 0.000000e+00 5.284365e-04
## Foreign 0.000000e+00 0.000000e+00 0.000000e+00
## History 6.605456e-05 0.000000e+00 0.000000e+00
## Horror 1.321091e-03 6.605456e-05 0.000000e+00
## Music 1.981637e-04 0.000000e+00 0.000000e+00
## Mystery 2.422001e-04 2.201819e-05 2.201819e-05
## Romance 3.522910e-04 2.201819e-05 1.541273e-04
## Science Fiction 3.302728e-04 4.403637e-05 2.201819e-05
## Thriller 5.064183e-04 1.981637e-04 2.201819e-05
## TV Movie 0.000000e+00 0.000000e+00 0.000000e+00
## Unspecified 0.000000e+00 0.000000e+00 1.100909e-04
## War 8.807275e-05 2.201819e-05 0.000000e+00
## Western 3.302728e-04 0.000000e+00 0.000000e+00
##
## Warner Bros
## Action 1.959619e-03
## Adventure 7.926547e-04
## Animation 5.504547e-04
## Comedy 3.853183e-03
## Crime 1.475219e-03
## Documentary 1.541273e-04
## Drama 4.733910e-03
## Family 4.403637e-05
## Fantasy 2.201819e-04
## Foreign 0.000000e+00
## History 1.100909e-04
## Horror 2.201819e-04
## Music 2.862364e-04
## Mystery 2.422001e-04
## Romance 6.165092e-04
## Science Fiction 1.100909e-04
## Thriller 2.642182e-04
## TV Movie 0.000000e+00
## Unspecified 4.403637e-05
## War 3.302728e-04
## Western 6.605456e-04
ggplot(movies, aes(x = genre1, fill = budget)) +
geom_bar() +
labs(x = "Genre", y = "Count", title = "Relationship between genre and budget")
ggplot(movies, aes(x = genre1, fill = revenue)) +
geom_bar() +
labs(x = "Genre", y = "Count", title = "Relationship between genre and revenue")
Drama, Comedy and Action are the genres that receive the most budget and also they got the most revenue. That is an interesting fact to take into account when doing the analysis of what makes a movie successful. Considering the budget and revenue, those 3 genres are really successful.
company1_freq <- table(movies$company1)
company1_freq_sorted <- sort(company1_freq, decreasing = TRUE)
top_10_company1 <- names(company1_freq_sorted)[1:10]
top_10_company1
## [1] "Other" "No Company"
## [3] "Paramount Pictures" "Fox"
## [5] "Metro Goldwyn Mayer MGM" "Columbia"
## [7] "Warner Bros" "Universal"
## [9] "Disney" "RKO Radio Pictures"
# Filter the movies dataset to only include the top 10 values of company1
filtered_movies <- movies[movies$company1 %in% top_10_company1, ] %>%
filter(company1 != "No Company" & company1 != "Other")
# Create the plot
ggplot(filtered_movies, aes(x = company1, fill = genre1)) +
geom_bar(position="dodge") +
labs(x = "Company", y = "Count", title = "Relationship between company and genre")
# Create the plot
ggplot(filtered_movies, aes(x = company1, fill = budget)) +
geom_bar(position="dodge") + facet_wrap(~ genre1) +
labs(x = "Company", y = "Count", title = "Relationship between company and genre")
summary(movies$genre1)
## Action Adventure Animation Comedy Crime
## 4487 1508 1123 8815 1683
## Documentary Drama Family Fantasy Foreign
## 3412 11952 524 702 117
## History Horror Music Mystery Romance
## 279 2619 487 553 1190
## Science Fiction Thriller TV Movie Unspecified War
## 647 1663 390 2437 379
## Western
## 450
summary(movies$company1)
## American International Pictures AIP BBC Films
## 63 109
## British Broadcasting Corporation BBC Canal+
## 77 62
## Channel Four Films CJ Entertainment
## 75 58
## Columbia DC Comics
## 830 54
## DreamWorks SKG First National Pictures
## 77 69
## Fox France 2 Cinéma
## 929 99
## Gaumont Hammer Film Productions
## 122 76
## Hollywood Pictures Imagine Entertainment
## 57 58
## Lionsgate Metro Goldwyn Mayer MGM
## 137 851
## Miramax Films Monogram Pictures
## 174 60
## Mosfilm New Line Cinema
## 180 261
## New World Pictures Nikkatsu
## 68 67
## No Company Nordisk Film
## 11861 59
## Orion Pictures Other
## 109 24274
## Paramount Pictures Rai Cinema
## 996 55
## Regency Enterprises RKO Radio Pictures
## 62 290
## Shaw Brothers Shôchiku Eiga
## 77 62
## StudioCanal Summit Entertainment
## 61 56
## The Rank Organisation TLA Releasing
## 67 75
## Toho Company Touchstone Pictures
## 126 102
## TriStar Pictures United Artists
## 163 272
## Universal International Pictures UI Universal
## 85 754
## Village Roadshow Pictures Disney
## 88 353
## Warner Bros
## 757
Paramount Pictures, Fox and Metro Goldwyn have the most amount of movies.
# Create the plot
ggplot(movies, aes(x = genre1, fill = popularity)) +
geom_bar(position="dodge") +
labs(x = "Genre", y = "Count", title = "Popularity and genre")
## Warning: The following aesthetics were dropped during statistical transformation: fill.
## ℹ This can happen when ggplot fails to infer the correct grouping structure in
## the data.
## ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
## variable into a factor?
# Create the plot
ggplot(filtered_movies, aes(x = company1, fill = popularity)) +
geom_bar(position="dodge") +
labs(x = "Company", y = "Count", title = "Popularity and company")
## Warning: The following aesthetics were dropped during statistical transformation: fill.
## ℹ This can happen when ggplot fails to infer the correct grouping structure in
## the data.
## ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
## variable into a factor?
ggplot(movies) +
aes(x = runtime_mean, y = popularity) +
geom_point(shape = "circle", size = 1.5, colour = "#112446") +
theme_minimal()
## Warning: Removed 3 rows containing missing values or values outside the scale range
## (`geom_point()`).
Drama, Comedy and Action are also the most popular movies. The
interesting part comes when analyzing the most popular companies, even
though they don’t have the same amount of movies, the popularity is
almost equal between Paramount Pictures, Fox, Metro Goldwyn and now also
Columbia and Universal appearing close to them. Also the popularity
rises when the run time is between 110-150 minutes. The larger amount of
run time in some of them is because they are series.
library(esquisse)
# Load the 'movies' dataset into Esquisse for interactive plotting
#esquisser(data = movies)
str(movies3)
## 'data.frame': 45972 obs. of 15 variables:
## $ adult : logi FALSE FALSE FALSE FALSE FALSE FALSE ...
## $ original_title : chr "Lock, Stock and Two Smoking Barrels" "La estrategia del caracol" "Young Einstein" "Flight Command" ...
## $ revenue : num 3897569 0 0 0 0 ...
## $ budget : num 1350000 0 0 0 0 0 0 68000000 0 0 ...
## $ runtime : num 105 116 91 116 87 104 100 116 180 78 ...
## $ release_date : Date, format: "1998-03-05" "1993-12-25" ...
## $ status : Factor w/ 6 levels "Released","Canceled",..: 1 1 1 1 1 1 1 1 1 1 ...
## $ vote_average : num 7.5 7.2 4.5 6 4.8 6.7 4.3 5.9 6.8 6.9 ...
## $ vote_count : int 1671 9 46 1 7 62 13 310 5 7 ...
## $ genre1 : Factor w/ 21 levels "Action","Adventure",..: 4 4 4 7 7 7 12 17 7 7 ...
## $ company1 : Factor w/ 47 levels "American International Pictures AIP",..: 28 28 47 18 28 28 25 29 28 28 ...
## $ country1 : Factor w/ 144 levels ""," Afghanistan",..: 137 31 9 139 51 137 139 139 139 66 ...
## $ country1_language: Factor w/ 71 levels "Unspecified Language",..: 15 16 15 15 13 15 15 15 15 70 ...
## $ popularity_max : num 4.608 0.282 2.563 0.769 2.964 ...
## $ keyword1 : Factor w/ 4558 levels ""," xa0fishbone",..: 104 3511 234 3077 1478 2361 1031 388 1 943 ...
# Convert budget and revenue as numeric
movies3$budget <- as.numeric(as.character(movies3$budget))
movies3$revenue <- as.numeric(as.character(movies3$revenue))
summary(movies3$budget)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 0 0 0 4194725 0 380000000
summary(movies3$revenue)
## Min. 1st Qu. Median Mean 3rd Qu. Max. NA's
## 0.000e+00 0.000e+00 0.000e+00 1.114e+07 0.000e+00 2.788e+09 3
budget_mean <- mean(movies3$budget, na.rm = TRUE)
budget_median <- median(movies3$budget, na.rm = TRUE)
budget_sd <- sd(movies3$budget, na.rm = TRUE)
budget_min <- min(movies3$budget, na.rm = TRUE)
budget_max <- max(movies3$budget, na.rm = TRUE)
revenue_mean <- mean(movies3$revenue, na.rm = TRUE)
revenue_median <- median(movies3$revenue, na.rm = TRUE)
revenue_sd <- sd(movies3$revenue, na.rm = TRUE)
revenue_min <- min(movies3$revenue, na.rm = TRUE)
revenue_max <- max(movies3$revenue, na.rm = TRUE)
#results
cat("Budget - Media: ", budget_mean, ", Mediana: ", budget_median, ", Desviación Estándar: ", budget_sd, ", Mínimo: ", budget_min, ", Máximo: ", budget_max, "\n")
## Budget - Media: 4194725 , Mediana: 0 , Desviación Estándar: 17363925 , Mínimo: 0 , Máximo: 3.8e+08
cat("Revenue - Media: ", revenue_mean, ", Mediana: ", revenue_median, ", Desviación Estándar: ", revenue_sd, ", Mínimo: ", revenue_min, ", Máximo: ", revenue_max, "\n")
## Revenue - Media: 11139954 , Mediana: 0 , Desviación Estándar: 64127446 , Mínimo: 0 , Máximo: 2787965087
I opted to conduct a different analysis by focusing on categories of budget and revenue after excluding zero values, due to the prevalence of zero values in the data. By excluding these zeros, I aim to achieve a clearer understanding of the cases that contain complete information.
movies_filtered_budget <- movies3[movies3$budget != 0, ]
budget_mean_filtered <- mean(movies_filtered_budget$budget, na.rm = TRUE)
budget_median_filtered <- median(movies_filtered_budget$budget, na.rm = TRUE)
budget_sd_filtered <- sd(movies_filtered_budget$budget, na.rm = TRUE)
budget_min_filtered <- min(movies_filtered_budget$budget, na.rm = TRUE)
budget_max_filtered <- max(movies_filtered_budget$budget, na.rm = TRUE)
cat("Budget (Filtrado) - Media: ", budget_mean_filtered, ", Mediana: ", budget_median_filtered, ", Desviación Estándar: ", budget_sd_filtered, ", Mínimo: ", budget_min_filtered, ", Máximo: ", budget_max_filtered, "\n")
## Budget (Filtrado) - Media: 21565635 , Mediana: 8e+06 , Desviación Estándar: 34286508 , Mínimo: 1 , Máximo: 3.8e+08
movies_filtered_revenue <- movies3[movies3$revenue != 0, ]
revenue_mean_filtered <- mean(movies_filtered_revenue$revenue, na.rm = TRUE)
revenue_median_filtered <- median(movies_filtered_revenue$revenue, na.rm = TRUE)
revenue_sd_filtered <- sd(movies_filtered_revenue$revenue, na.rm = TRUE)
revenue_min_filtered <- min(movies_filtered_revenue$revenue, na.rm = TRUE)
revenue_max_filtered <- max(movies_filtered_revenue$revenue, na.rm = TRUE)
cat("Revenue (Filtrado) - Media: ", revenue_mean_filtered, ", Mediana: ", revenue_median_filtered, ", Desviación Estándar: ", revenue_sd_filtered, ", Mínimo: ", revenue_min_filtered, ", Máximo: ", revenue_max_filtered, "\n")
## Revenue (Filtrado) - Media: 68829646 , Mediana: 16801876 , Desviación Estándar: 146424469 , Mínimo: 1 , Máximo: 2787965087
I analyzed the budget and revenue data after filtering out zero values to focus on cases with complete information. This allowed for a clearer insight into the distribution of budgets within our dataset. The mean budget for our filtered dataset is [budget_mean_filtered], representing the average budget allocated to movies. Additionally, the median budget is [budget_median_filtered]. The standard deviation, [budget_sd_filtered], measures the dispersion of budget values around the mean. The minimum and maximum budgets observed are [budget_min_filtered] and [budget_max_filtered], respectively, providing insights into the range of budget allocations. Overall, this approach provides a more accurate understanding of the budget distribution, aiding informed decision-making and strategic planning.
budget_mean <- mean(movies_filtered_budget$budget)
budget_median <- median(movies_filtered_budget$budget)
revenue_mean <- mean(movies_filtered_revenue$revenue)
revenue_median <- median(movies_filtered_revenue$revenue)
get_mode <- function(v) {
uniqv <- unique(v)
uniqv[which.max(tabulate(match(v, uniqv)))]
}
get_mode <- function(v) {
uniqv <- unique(v)
uniqv[which.max(tabulate(match(v, uniqv)))]
}
budget_mode <- get_mode(movies_filtered_budget$budget)
revenue_mode <- get_mode(movies_filtered_revenue$revenue)
cat("Budget - Media: ", budget_mean, ", Mediana: ", budget_median, ", Modo: ", budget_mode, "\n")
## Budget - Media: 21565635 , Mediana: 8e+06 , Modo: 5e+06
cat("Revenue - Media: ", revenue_mean, ", Mediana: ", revenue_median, ", Modo: ", revenue_mode, "\n")
## Revenue - Media: NA , Mediana: NA , Modo: 1.2e+07
if(!require(ggplot2))
library(ggplot2)
movies_filtered_both <- movies3[movies3$budget != 0 & movies3$revenue != 0, ]
# scatterplot
ggplot(data = movies_filtered_both, aes(x = budget, y = revenue)) +
geom_point(alpha = 0.5) +
labs(title = "Budget vs Revenue",
x = "Budget",
y = "Revenue") +
theme_minimal()
movies_filtered_both$country1 <- trimws(movies_filtered_both$country1)
movies_filtered_both <- movies_filtered_both %>%
mutate(USA = country1 == "United States of America")
head(movies_filtered_both)
## adult original_title revenue budget
## 1 FALSE Lock, Stock and Two Smoking Barrels 3897569 1350000
## 8 FALSE The Saint 118063304 68000000
## 12 FALSE Dumb and Dumber To 169837010 40000000
## 29 FALSE Cursed 19294901 35000000
## 31 FALSE Peggy Sue Got Married 41382841 18000000
## 32 FALSE A Nightmare on Elm Street Part 2: Freddy's Revenge 29999213 3000000
## runtime release_date status vote_average vote_count genre1
## 1 105 1998-03-05 Released 7.5 1671 Comedy
## 8 116 1997-04-03 Released 5.9 310 Thriller
## 12 110 2014-11-12 Released 5.4 1140 Comedy
## 29 97 2005-02-25 Released 5.1 168 Horror
## 31 103 1986-10-05 Released 5.9 138 Comedy
## 32 87 1985-10-31 Released 5.7 367 Horror
## company1 country1 country1_language popularity_max
## 1 Other United Kingdom English 4.607860
## 8 Paramount Pictures United States of America English 10.976330
## 12 New Line Cinema United States of America English 15.402597
## 29 Other Germany English 8.949722
## 31 Other United States of America English 7.471655
## 32 New Line Cinema United States of America English 8.668146
## keyword1 USA
## 1 ambush FALSE
## 8 berlin TRUE
## 12 friendship TRUE
## 29 brother sister relationship FALSE
## 31 time travel TRUE
## 32 gay TRUE
summary_stats <- movies_filtered_both %>%
group_by(USA) %>%
summarize(
mean_revenue = mean(revenue, na.rm = TRUE),
median_revenue = median(revenue, na.rm = TRUE)
)
print(summary_stats)
## # A tibble: 2 × 3
## USA mean_revenue median_revenue
## <lgl> <dbl> <dbl>
## 1 FALSE 73431073. 18800000
## 2 TRUE 100046323. 37170057
get_mode <- function(v) {
uniqv <- unique(v)
tabulated <- tabulate(match(v, uniqv))
if (any(tabulated > 1)) {
uniqv[which.max(tabulated)]
} else {
NA # Return NA if no mode exists
}
}
mean_revenue <- mean(movies_filtered_both$revenue, na.rm = TRUE)
median_revenue <- median(movies_filtered_both$revenue, na.rm = TRUE)
mode_revenue <- get_mode(movies_filtered_both$revenue)
sd_revenue <- sd(movies_filtered_both$revenue, na.rm = TRUE)
var_revenue <- var(movies_filtered_both$revenue, na.rm = TRUE)
iqr_revenue <- IQR(movies_filtered_both$revenue, na.rm = TRUE)
min_revenue <- min(movies_filtered_both$revenue, na.rm = TRUE)
max_revenue <- max(movies_filtered_both$revenue, na.rm = TRUE)
range_revenue <- range(movies_filtered_both$revenue, na.rm = TRUE)
diff_revenue <- max_revenue - min_revenue
statistics_table <- data.frame(
Statistic = c("Mean", "Median", "Mode", "Standard Deviation", "Variance", "IQR", "Min", "Max", "Diff", "Range"),
Value = c(mean_revenue, median_revenue, mode_revenue, sd_revenue, var_revenue, iqr_revenue, min_revenue, max_revenue, diff_revenue, paste(range_revenue[1], "to", range_revenue[2]))
)
print(statistics_table)
## Statistic Value
## 1 Mean 90440189.5394448
## 2 Median 29911946
## 3 Mode 1.2e+07
## 4 Standard Deviation 166189478.816842
## 5 Variance 27618942869413424
## 6 IQR 92990947
## 7 Min 1
## 8 Max 2787965087
## 9 Diff 2787965086
## 10 Range 1 to 2787965087
ggplot(movies_filtered_both, aes(x = log(revenue), fill = factor(USA))) +
geom_density(alpha = 0.3) +
labs(title = "Density Distribution of Revenue",
x = "Revenue",
y = "Density",
fill = "United States of America") +
scale_fill_manual(values = c("TRUE" = "red", "FALSE" = "blue")) +
theme_minimal()
This shows that the density distribution of revenue in the US and not in
the US is left skewed, which means that it is not symetric and there are
many outliers that affect the distribution.
ggplot(movies_filtered_both, aes(x = log(revenue), fill = factor(USA))) +
geom_boxplot(alpha = 0.3) +
labs(title = "Density Distribution of Revenue",
x = "Revenue",
y = "Density",
fill = "United States of America") +
scale_fill_manual(values = c("TRUE" = "red", "FALSE" = "blue")) +
theme_minimal()
There are more outliers in the USA.
movies_filtered_both <- movies_filtered_both %>%
mutate(is_outlier = revenue < 100000)
movies_filtered_both %>%
filter(is_outlier) %>%
arrange(desc(revenue))
## adult original_title revenue budget
## 1 FALSE キュア 99000 20000
## 2 FALSE Rubber 98017 500000
## 3 FALSE 羅生門 96568 250000
## 4 FALSE Twelve and Holding 95687 400000
## 5 FALSE Stitches 95000 100000
## 6 FALSE The Night Flier 91549 1000000
## 7 FALSE Byzantium 89237 10000000
## 8 FALSE Life After Beth 88273 2400000
## 9 FALSE Sunshine Superman 88097 400000
## 10 FALSE Mozart and the Whale 84967 12000000
## 11 FALSE Peeping Tom 83957 150000
## 12 FALSE A Street Cat Named Bob 82703 8000000
## 13 FALSE The Treatment 82701 900000
## 14 FALSE The Innkeepers 78396 750000
## 15 FALSE Silent Trigger 76382 15000000
## 16 FALSE Better Living Through Chemistry 75143 5000000
## 17 FALSE No One Lives 74918 2900000
## 18 FALSE Foodfight! 73706 65000000
## 19 FALSE Eye of the Dolphin 71904 2500000
## 20 FALSE A Troll in Central Park 71368 23000000
## 21 FALSE Assassination of a High School President 69564 11500000
## 22 FALSE Surfer, Dude 69497 6000000
## 23 FALSE Deadfall 66351 12000000
## 24 FALSE All About Eve 63463 1400000
## 25 FALSE The Mudge Boy 62852 800000
## 26 FALSE Hallam Foe 60641 8000000
## 27 FALSE Camp X-Ray 59744 1000000
## 28 FALSE Walk of Shame 59209 15000000
## 29 FALSE Aftershock 58510 2000000
## 30 FALSE Dom durakov 57862 2500000
## 31 FALSE The Canyons 56825 250000
## 32 FALSE Beautiful 56000 1500000
## 33 FALSE Dirty Girl 55125 4000000
## 34 FALSE Inhale 55089 10000000
## 35 FALSE La terza madre 54947 3500000
## 36 FALSE Return of the Living Dead 3 54207 2000000
## 37 FALSE Aloft 53086 8000000
## 38 FALSE Hatchet II 52604 2500000
## 39 FALSE Curdled 49620 2300000
## 40 FALSE Following 48482 6000
## 41 FALSE Decoding Annie Parker 48390 2000000
## 42 FALSE Polițist, adjectiv 48298 1089360
## 43 FALSE Viva la libertà 48125 5000000
## 44 FALSE Mal de pierres 47748 10300000
## 45 FALSE Margaret 46495 14000000
## 46 FALSE Ca$h 46488 7000000
## 47 FALSE December Boys 46474 4000000
## 48 FALSE An Alan Smithee Film: Burn, Hollywood, Burn 45779 10000000
## 49 FALSE Lost River 45431 2000000
## 50 FALSE Opposite Sex 45000 3300000
## 51 FALSE La mariée était en noir 44566 747000
## 52 FALSE Defendor 44462 3500000
## 53 FALSE Jackpot 43719 400000
## 54 FALSE Zaytoun 42330 8000000
## 55 FALSE First Love, Last Rites 40542 300000
## 56 FALSE CBGB 40400 5000000
## 57 FALSE Der rote Baron 40239 18000000
## 58 FALSE Mr. Right 34694 8000000
## 59 FALSE Bwakaw 34659 11178
## 60 FALSE Cowboys & Angels 33700 2000000
## 61 FALSE Stake Land 33245 650000
## 62 FALSE Local Color 32788 3250000
## 63 FALSE Song One 32251 6000000
## 64 FALSE Pontypool 32000 1500000
## 65 FALSE Meet Monica Velour 31649 5000000
## 66 FALSE The Tracey Fragments 31576 700000
## 67 FALSE Maniac 31081 6000000
## 68 FALSE Королёв 31000 6000000
## 69 FALSE L!fe Happens 30905 930000
## 70 FALSE Valhalla Rising 30638 5641880
## 71 FALSE The Boondock Saints 30471 6000000
## 72 FALSE Jimmy P. 30283 10000000
## 73 FALSE Road to Nowhere 27046 5000000
## 74 FALSE La Tête haute 26144 5000000
## 75 FALSE Highway to Hell 26055 9000000
## 76 FALSE Hood of Horror 25900 5000000
## 77 FALSE The Tulse Luper Suitcases, Part 1: The Moab Story 25800 10000000
## 78 FALSE Lost in the Sun 25000 25000
## 79 FALSE Pink Ribbons, Inc. 25000 900000
## 80 FALSE Captive 24591 11180
## 81 FALSE Vivre sa vie: film en douze tableaux 24517 64000
## 82 FALSE Paradies: Liebe 24267 3600000
## 83 FALSE Behind the Burly Q 23859 250000
## 84 FALSE All The Queen's Men 23000 15000000
## 85 FALSE The Divide 22000 3000000
## 86 FALSE Term Life 21256 16500000
## 87 FALSE 섬 21075 50000
## 88 FALSE The Good Night 20380 15000000
## 89 FALSE City Lights 19181 1500000
## 90 FALSE Itty Bitty Titty Committee 18479 1000000
## 91 FALSE Venuto al mondo 18295 13000000
## 92 FALSE Women in Trouble 18097 3000000
## 93 FALSE 5 Days of War 17479 20000000
## 94 FALSE Strangerland 17472 10000000
## 95 FALSE Cruel World 16344 2000000
## 96 FALSE Quiet City 15425 2500
## 97 FALSE Barefoot 15071 6000000
## 98 FALSE Vulgar 14904 120000
## 99 FALSE Major Dundee 14873 3800000
## 100 FALSE Cherry 2000 14000 10000000
## 101 FALSE 13 Sins 13809 5000000
## 102 FALSE Blood, Guts, Bullets and Octane 13674 7300
## 103 FALSE Naqoyqatsi 13308 3000000
## 104 FALSE Standing Still 12762 1700000
## 105 FALSE Laurence Anyways 12250 9500000
## 106 FALSE Waltzing Anna 11455 1000000
## 107 FALSE Peter and Vandy 11276 500000
## 108 FALSE Forces spéciales 10759 10000000
## 109 FALSE Naturally Native 10508 700000
## 110 FALSE Logan 10474 135000
## 111 FALSE Squeeze 10300 500000
## 112 FALSE Chaos 10289 20000000
## 113 FALSE Alone With Her 10018 1000000
## 114 FALSE Down Terrace 10000 31192
## 115 FALSE Welcome to the Punch 9747 8500000
## 116 FALSE Honeymoon 9318 1000000
## 117 FALSE The Sacrament 9221 4000000
## 118 FALSE Fishtales 9216 14000000
## 119 FALSE Janky Promoters 9069 10000000
## 120 FALSE Stolen Lives 7306 2000000
## 121 FALSE Idioterne 7235 2500000
## 122 FALSE Special 7202 1000000
## 123 FALSE The Adventurer: The Curse of the Midas Box 6399 25000000
## 124 FALSE Sweetwater 6147 7000000
## 125 FALSE Nasty Old People 5300 15000
## 126 FALSE Nasty Old People 5300 15000
## 127 FALSE Xue di zi 5290 15000000
## 128 FALSE The Amazing Truth About Queen Raquela 5255 400000
## 129 FALSE The Good Doctor 5206 6000000
## 130 FALSE The Duel 4500 10000000
## 131 FALSE Aftermath 3451 10500000
## 132 FALSE Nuit Blanche 3358 2500000
## 133 FALSE Eegah 3274 15000
## 134 FALSE ATM 3010 3000000
## 135 FALSE About Cherry 3003 2500000
## 136 FALSE Philadelphia Experiment II 2970 5000000
## 137 FALSE The Samaritan 2521 12000000
## 138 FALSE Best Man Down 1938 1500000
## 139 FALSE The House of Usher 1677 130000
## 140 FALSE Running Time 1596 130000
## 141 FALSE Poor White Trash 1404 1200000
## 142 FALSE Love, Wedding, Marriage 1378 1
## 143 FALSE Star of Midnight 831 280
## 144 FALSE The Mysterious Lady 551 337
## 145 FALSE 무수단 500 500
## 146 FALSE A Perfect Man 388 5000000
## 147 FALSE Sunday 288 450
## 148 FALSE Falling From Grace 232 3
## 149 FALSE I Married a Strange Person! 203 250
## 150 FALSE Šišanje 198 500000
## 151 FALSE The Cherry Orchard 135 5
## 152 FALSE वांटेड 134 75
## 153 FALSE Make Your Move 122 15
## 154 FALSE Rugrats in Paris: The Movie 103 30
## 155 FALSE Lost & Found 100 1
## 156 FALSE Die Angst des Tormanns beim Elfmeter 100 410000
## 157 FALSE Every Which Way But Loose 85 5
## 158 FALSE The Immortals 83 50
## 159 FALSE The End of Poverty? 57 1000000
## 160 FALSE 검사외전 50 500
## 161 FALSE Death at a Funeral 46 9000000
## 162 FALSE Boy 43 3
## 163 FALSE Assisted Living 41 500
## 164 FALSE Zyzzyx Road 30 2000000
## 165 FALSE Madonna: Truth or Dare 29 4
## 166 FALSE A Farewell to Arms 25 4
## 167 FALSE In the Cut 23 12000000
## 168 FALSE Starter for 10 21 8
## 169 FALSE Same Time, Next Year 19 118
## 170 FALSE Deadfall 18 10000000
## 171 FALSE The Prophecy 16 8
## 172 FALSE William & Kate 15 20
## 173 FALSE The 51st State 14 28
## 174 FALSE Angela's Ashes 13 25
## 175 FALSE Chasing Liberty 12 23000000
## 176 FALSE The Cookout 12 16000000
## 177 FALSE Hross í oss 11 10
## 178 FALSE F.I.S.T. 11 11
## 179 FALSE Pollock 8 6
## 180 FALSE Bodyguard 8 130
## 181 FALSE Dreaming of Joseph Lees 7 2000000
## 182 FALSE Bran Nue Dae 7 7
## 183 FALSE Ladrón que roba a ladrón 6 4002313
## 184 FALSE Never Talk to Strangers 6 6400000
## 185 FALSE Split Second 5 7
## 186 FALSE Miami Rhapsody 5 6
## 187 FALSE East of Eden 5 1
## 188 FALSE Raja Natwarlal 4 5
## 189 FALSE Man Trouble 4 30
## 190 FALSE 예의없는 것들 4 3
## 191 FALSE American Adobo 4 344
## 192 FALSE Dr. Horrible's Sing-Along Blog 3 200000
## 193 FALSE Desmundo 3 3
## 194 FALSE Duniyadari 3 390000
## 195 FALSE Все и сразу 3 750000
## 196 FALSE Saamy 3 1
## 197 FALSE Tere Naam 2 1
## 198 FALSE The Letters 1 1
## 199 FALSE The Wind in the Willows 1 12
## 200 FALSE Mute Witness 1 2
## 201 FALSE The Merry Widow 1 592
## runtime release_date status vote_average vote_count genre1
## 1 111 1997-11-06 Released 7.4 63 Crime
## 2 85 2010-07-09 Released 5.7 252 Comedy
## 3 88 1950-12-26 Released 8.0 471 Crime
## 4 90 2005-09-11 Released 7.0 20 Drama
## 5 86 2012-05-19 Released 5.5 94 Horror
## 6 93 1997-04-30 Released 5.7 60 Mystery
## 7 118 2012-09-09 Released 6.1 300 Drama
## 8 90 2014-08-15 Released 5.0 235 Romance
## 9 100 2015-05-22 Released 7.2 10 Documentary
## 10 92 2005-09-10 Released 6.5 41 Comedy
## 11 101 1960-04-06 Released 7.6 148 Horror
## 12 103 2016-11-04 Released 7.5 195 Drama
## 13 86 2006-04-08 Released 6.0 4 Comedy
## 14 102 2011-12-01 Released 5.4 223 Horror
## 15 93 1996-06-26 Released 5.0 22 Drama
## 16 91 2014-03-14 Released 5.9 99 Drama
## 17 86 2013-03-09 Released 5.5 173 Horror
## 18 87 2012-06-15 Released 2.3 28 Animation
## 19 100 2007-08-24 Released 7.1 7 Drama
## 20 76 1994-10-07 Released 4.4 40 Fantasy
## 21 93 2008-01-17 Released 6.1 96 Comedy
## 22 85 2008-09-05 Released 4.7 25 Comedy
## 23 95 2012-11-08 Released 5.6 228 Crime
## 24 138 1950-11-09 Released 8.0 367 Drama
## 25 94 2003-01-17 Released 7.3 24 Drama
## 26 95 2007-02-16 Released 6.8 51 Drama
## 27 117 2014-10-17 Released 6.7 395 Drama
## 28 95 2014-05-02 Released 5.8 561 Comedy
## 29 89 2012-09-12 Released 5.3 110 Horror
## 30 104 2002-12-06 Released 5.7 9 Drama
## 31 99 2013-07-29 Released 4.1 75 Thriller
## 32 97 2009-04-27 Released 4.6 17 Drama
## 33 90 2010-09-12 Released 6.4 71 Drama
## 34 100 2010-08-27 Released 6.3 39 Drama
## 35 102 2007-09-06 Released 4.1 135 Horror
## 36 97 1993-10-01 Released 5.9 88 Comedy
## 37 112 2014-02-12 Released 5.1 41 Drama
## 38 89 2010-08-26 Released 5.6 91 Horror
## 39 88 1996-09-06 Released 6.2 29 Comedy
## 40 69 1998-09-12 Released 7.2 363 Crime
## 41 91 2014-05-02 Released 5.5 38 Drama
## 42 115 2009-05-15 Released 6.1 14 Drama
## 43 94 2013-02-13 Released 7.2 42 Drama
## 44 120 2016-10-19 Released 6.7 63 Drama
## 45 149 2011-09-30 Released 6.1 86 Drama
## 46 108 2010-01-01 Released 6.0 73 Crime
## 47 105 2007-09-20 Released 6.2 79 Drama
## 48 86 1998-02-20 Released 3.0 9 Comedy
## 49 95 2015-04-08 Released 5.8 228 Fantasy
## 50 96 2014-11-08 Released 4.1 9 Comedy
## 51 107 1968-03-22 Released 7.3 41 Mystery
## 52 101 2009-09-12 Released 6.5 197 Drama
## 53 97 2001-07-26 Released 6.0 1 Unspecified
## 54 107 2012-10-14 Released 6.6 16 Drama
## 55 94 1998-08-07 Released 3.0 1 Drama
## 56 101 2013-10-11 Released 6.5 45 Drama
## 57 120 2008-03-29 Released 6.4 80 Action
## 58 95 2016-02-29 Released 6.3 395 Action
## 59 104 2012-09-05 Released 8.0 1 Comedy
## 60 89 2003-05-14 Released 5.9 10 Comedy
## 61 98 2010-09-30 Released 6.2 290 Drama
## 62 107 2006-09-19 Released 6.1 8 Drama
## 63 86 2014-01-20 Released 5.5 87 Drama
## 64 93 2009-03-06 Released 6.6 187 Horror
## 65 98 2010-06-04 Released 5.5 12 Comedy
## 66 77 2007-02-08 Released 5.9 36 Drama
## 67 89 2012-12-26 Released 5.9 322 Horror
## 68 NA 2007-10-29 Released 1.0 1 Drama
## 69 100 2011-06-18 Released 5.3 66 Comedy
## 70 93 2009-09-04 Released 5.9 323 Adventure
## 71 108 1999-01-22 Released 7.2 848 Action
## 72 117 2013-09-11 Released 6.0 30 Drama
## 73 121 2011-04-13 Released 5.0 18 Mystery
## 74 119 2015-05-13 Released 7.3 149 Drama
## 75 94 1991-11-21 Released 6.1 19 Fantasy
## 76 84 2006-06-27 Released 4.2 18 Action
## 77 127 2003-05-24 Released 7.8 5 War
## 78 95 2015-11-05 Released 5.8 48 Action
## 79 97 2011-09-11 Released 6.8 6 Documentary
## 80 120 2012-09-05 Released 5.9 11 Drama
## 81 85 1962-09-20 Released 7.6 105 Drama
## 82 120 2012-04-27 Released 6.7 53 Drama
## 83 97 2010-04-23 Released 5.5 3 Documentary
## 84 99 2001-10-14 Released 6.1 7 Action
## 85 112 2011-03-13 Released 5.7 198 Horror
## 86 93 2016-04-29 Released 5.7 81 Thriller
## 87 90 2000-04-22 Released 6.9 60 Drama
## 88 93 2007-01-25 Released 5.7 41 Comedy
## 89 87 1931-01-30 Released 8.2 444 Comedy
## 90 87 2007-02-09 Released 6.0 12 Comedy
## 91 127 2012-09-13 Released 6.9 142 Drama
## 92 92 2009-11-13 Released 5.2 30 Comedy
## 93 113 2011-04-14 Released 5.8 63 War
## 94 111 2015-07-01 Released 5.1 90 Drama
## 95 88 2005-09-01 Released 4.8 6 Thriller
## 96 78 2007-03-12 Released 6.6 7 Drama
## 97 90 2014-02-02 Released 6.3 210 Comedy
## 98 87 2000-09-13 Released 5.3 16 Drama
## 99 123 1965-04-07 Released 6.2 41 War
## 100 99 1987-11-12 Released 6.0 67 Science Fiction
## 101 93 2014-04-18 Released 6.2 355 Horror
## 102 87 1998-10-16 Released 6.0 3 Action
## 103 89 2002-09-02 Released 6.1 37 Documentary
## 104 90 2005-01-02 Released 5.7 12 Comedy
## 105 168 2012-05-18 Released 7.7 190 Drama
## 106 108 2006-08-11 Released 7.0 1 Drama
## 107 78 2009-01-01 Released 6.5 8 Drama
## 108 109 2011-11-02 Released 6.4 132 Action
## 109 107 1999-10-08 Released 0.0 0 Drama
## 110 94 2010-09-10 Released 5.3 2 Comedy
## 111 95 1997-06-06 Released 6.0 1 Crime
## 112 106 2005-01-17 Released 6.1 278 Drama
## 113 78 2006-04-28 Released 6.2 20 Crime
## 114 89 2009-09-01 Released 6.3 26 Drama
## 115 99 2013-03-15 Released 5.7 284 Action
## 116 87 2014-09-12 Released 5.4 261 Horror
## 117 99 2013-09-02 Released 5.6 139 Horror
## 118 94 2007-08-24 Released 4.0 2 Fantasy
## 119 85 2009-10-16 Released 7.0 5 Comedy
## 120 97 2009-10-10 Released 6.5 28 Crime
## 121 117 1998-04-28 Released 6.7 107 Drama
## 122 81 2006-01-30 Released 6.6 32 Drama
## 123 99 2013-12-05 Released 5.1 74 Fantasy
## 124 95 2013-01-24 Released 6.0 71 Western
## 125 84 2009-10-10 Released 6.0 6 Drama
## 126 84 2009-10-10 Released 6.0 6 Drama
## 127 113 2012-12-20 Released 5.4 27 Action
## 128 80 2008-03-07 Released 5.0 1 Documentary
## 129 93 2011-01-01 Released 5.0 52 Drama
## 130 110 2016-06-24 Released 5.5 82 Western
## 131 92 2017-04-06 Released 5.8 162 Drama
## 132 98 2011-11-14 Released 6.0 48 Action
## 133 90 1962-06-08 Released 2.8 18 Horror
## 134 90 2012-02-17 Released 5.1 195 Horror
## 135 102 2012-02-14 Released 4.4 91 Drama
## 136 97 1993-11-12 Released 5.0 15 Science Fiction
## 137 90 2012-03-02 Released 5.2 69 Thriller
## 138 90 2012-10-20 Released 6.1 65 Comedy
## 139 80 2007-09-11 Released 5.0 3 Drama
## 140 70 1997-12-18 Released 6.2 5 Crime
## 141 85 2000-06-16 Released 3.9 7 Crime
## 142 90 2011-06-03 Released 5.1 73 Comedy
## 143 90 1935-04-19 Released 5.3 3 Romance
## 144 89 1928-08-04 Released 7.5 6 Adventure
## 145 87 2016-03-03 Released 5.5 3 Mystery
## 146 95 2013-11-01 Released 4.8 14 Drama
## 147 91 1997-08-27 Released 6.3 3 Drama
## 148 100 1992-02-21 Released 5.3 3 Drama
## 149 72 1998-08-28 Released 7.5 12 Drama
## 150 97 2010-10-06 Released 5.9 14 Action
## 151 141 1999-01-01 Released 0.0 0 Drama
## 152 129 2009-09-18 Released 5.2 32 Action
## 153 110 2013-08-07 Released 6.2 30 Music
## 154 78 2000-09-14 Released 6.0 101 Adventure
## 155 95 1999-04-23 Released 4.9 26 Comedy
## 156 101 1972-02-19 Released 3.5 5 Crime
## 157 110 1978-12-19 Released 6.2 126 Action
## 158 98 1995-10-05 Released 7.8 5 Action
## 159 106 2008-05-19 Released 0.0 0 Documentary
## 160 126 2016-02-03 Released 7.6 25 Crime
## 161 90 2007-02-09 Released 6.9 508 Comedy
## 162 87 2010-02-14 Released 7.5 66 Drama
## 163 78 2005-02-02 Released 7.5 1 Comedy
## 164 90 2006-02-25 Released 4.0 4 Thriller
## 165 119 1991-05-10 Released 6.3 32 Documentary
## 166 89 1932-12-08 Released 6.2 29 Drama
## 167 119 2003-09-09 Released 4.7 93 Mystery
## 168 92 2006-09-13 Released 6.7 131 Drama
## 169 119 1978-04-23 Released 6.5 18 Comedy
## 170 98 1993-10-08 Released 3.1 14 Crime
## 171 98 1995-09-01 Released 6.4 139 Fantasy
## 172 83 2011-04-18 Released 5.8 30 Drama
## 173 93 2001-12-07 Released 5.9 173 Thriller
## 174 145 1999-12-25 Released 7.0 59 Drama
## 175 111 2004-01-09 Released 6.1 154 Comedy
## 176 97 2004-09-03 Released 4.6 10 Comedy
## 177 85 2013-08-30 Released 6.9 26 Drama
## 178 145 1978-04-26 Released 6.5 30 Drama
## 179 122 2000-09-06 Released 6.6 91 Drama
## 180 130 2011-08-31 Released 5.2 29 Drama
## 181 92 1999-10-29 Released 6.0 2 Romance
## 182 82 2009-08-09 Released 5.2 6 Comedy
## 183 98 2007-08-31 Released 6.0 4 Action
## 184 86 1995-10-20 Released 4.7 31 Thriller
## 185 90 1992-05-01 Released 5.8 64 Thriller
## 186 95 1995-01-27 Released 5.6 7 Comedy
## 187 115 1955-03-09 Released 7.5 163 Drama
## 188 141 2014-08-29 Released 5.5 8 Thriller
## 189 100 1992-07-17 Released 4.7 11 Comedy
## 190 113 2006-08-24 Released 6.8 18 Action
## 191 104 2001-09-29 Released 5.3 3 Comedy
## 192 42 2008-07-15 Released 7.8 236 Adventure
## 193 101 2002-11-08 Released 9.0 1 Drama
## 194 148 2014-07-19 Released 0.0 0 Unspecified
## 195 0 2014-06-05 Released 6.0 4 Crime
## 196 140 2003-05-05 Released 5.8 5 Action
## 197 132 2003-08-15 Released 6.4 18 Romance
## 198 114 2015-12-04 Released 5.6 10 Drama
## 199 84 1996-10-16 Released 4.9 16 Fantasy
## 200 95 1995-09-28 Released 6.4 36 Thriller
## 201 137 1925-08-26 Released 6.5 6 Romance
## company1 country1 country1_language
## 1 Other Japan 日本語
## 2 Canal+ France English
## 3 Other Japan 日本語
## 4 Other United States of America English
## 5 Other Ireland English
## 6 Other Italy English
## 7 Other Ireland English
## 8 Other United States of America English
## 9 No Company English
## 10 No Company United States of America English
## 11 Other United Kingdom English
## 12 Other United Kingdom English
## 13 No Company English
## 14 Other United States of America English
## 15 Other Canada English
## 16 Other United Kingdom English
## 17 Other United States of America English
## 18 Other United States of America English
## 19 Other United States of America English
## 20 Warner Bros United States of America English
## 21 Other United States of America English
## 22 No Company United States of America English
## 23 StudioCanal France English
## 24 Fox United States of America English
## 25 No Company United States of America English
## 26 No Company United Kingdom English
## 27 Other United States of America English
## 28 Other United States of America English
## 29 Other Chile English
## 30 No Company Unspecified Language
## 31 Other United States of America English
## 32 Other Australia English
## 33 Other United States of America English
## 34 Other United States of America English
## 35 Other Italy English
## 36 Other United States of America Český
## 37 Other France Français
## 38 Other United States of America English
## 39 Other United States of America English
## 40 Other United Kingdom English
## 41 Other United States of America English
## 42 Other Romania Română
## 43 Other Italy Italiano
## 44 Other Canada Français
## 45 Fox United States of America English
## 46 Other United States of America English
## 47 Village Roadshow Pictures Australia English
## 48 Hollywood Pictures United States of America English
## 49 Other United States of America English
## 50 Other United States of America English
## 51 Other France Français
## 52 Other Canada English
## 53 No Company Unspecified Language
## 54 Other Israel العربية
## 55 Other United States of America English
## 56 Other United States of America English
## 57 Other Germany Deutsch
## 58 Other United States of America English
## 59 Other Philippines Unspecified Language
## 60 TLA Releasing Ireland English
## 61 Other United States of America English
## 62 Other United States of America English
## 63 Other United States of America English
## 64 Other Canada Unspecified Language
## 65 No Company United States of America English
## 66 Other Canada English
## 67 Other France English
## 68 No Company Unspecified Language
## 69 Other Canada English
## 70 BBC Films Denmark English
## 71 Other Canada English
## 72 Other France English
## 73 Other United States of America English
## 74 Other France Français
## 75 Other United States of America English
## 76 Other United States of America English
## 77 No Company United Kingdom Español
## 78 No Company United States of America English
## 79 Other United States of America English
## 80 Other Philippines English
## 81 Other France Français
## 82 Other Austria Deutsch
## 83 Other United States of America English
## 84 No Company Austria English
## 85 Other Canada English
## 86 Other United States of America English
## 87 Other South Korea 한국어 조선말
## 88 Other Germany English
## 89 Other United States of America English
## 90 No Company United States of America English
## 91 Other Italy Italiano
## 92 Other United States of America English
## 93 Other United States of America English
## 94 Other Australia English
## 95 Other United States of America Pусский
## 96 No Company United States of America English
## 97 Other United States of America English
## 98 No Company United States of America English
## 99 Columbia United States of America English
## 100 Orion Pictures United States of America English
## 101 Other United States of America English
## 102 No Company United States of America English
## 103 Miramax Films United States of America English
## 104 Other United States of America English
## 105 Other Canada Français
## 106 No Company Unspecified Language
## 107 No Company English
## 108 StudioCanal France Français
## 109 Other United States of America English
## 110 Other United States of America English
## 111 No Company Unspecified Language
## 112 Other Canada English
## 113 Other United States of America English
## 114 No Company United Kingdom English
## 115 Other United Kingdom English
## 116 Other United States of America English
## 117 Other United States of America English
## 118 Other Greece ελληνικά
## 119 Other United States of America English
## 120 Other United States of America English
## 121 Other Denmark Dansk
## 122 Other United States of America English
## 123 Other Belgium English
## 124 Other United States of America English
## 125 No Company Sweden svenska
## 126 No Company Sweden svenska
## 127 Other China 广州话 廣州話
## 128 No Company English
## 129 No Company United States of America English
## 130 Other United States of America English
## 131 Other United States of America English
## 132 Other France Français
## 133 Other United States of America English
## 134 Other Canada English
## 135 Other United States of America English
## 136 Other United States of America Deutsch
## 137 Other Canada English
## 138 Other United States of America English
## 139 No Company Deutsch
## 140 Other United States of America English
## 141 Other United States of America English
## 142 Other United States of America English
## 143 RKO Radio Pictures United States of America English
## 144 Metro Goldwyn Mayer MGM United States of America Unspecified Language
## 145 No Company South Korea 한국어 조선말
## 146 No Company English
## 147 Other United States of America English
## 148 No Company Unspecified Language
## 149 Other United States of America English
## 150 Other Serbia Srpski
## 151 No Company Greece English
## 152 Other India हिन्दी
## 153 CJ Entertainment South Korea English
## 154 Paramount Pictures Germany English
## 155 Other United States of America English
## 156 Other Germany Deutsch
## 157 Other United States of America English
## 158 Other United States of America English
## 159 No Company English
## 160 No Company South Korea 한국어 조선말
## 161 Other United Kingdom English
## 162 Other New Zealand English
## 163 No Company United States of America English
## 164 Other United States of America English
## 165 Miramax Films United States of America English
## 166 Paramount Pictures United States of America English
## 167 Other Australia English
## 168 BBC Films United Kingdom English
## 169 No Company United States of America English
## 170 Other United States of America English
## 171 Other United States of America English
## 172 No Company Unspecified Language
## 173 Other Canada English
## 174 Paramount Pictures Ireland English
## 175 Other United Kingdom English
## 176 Other United States of America English
## 177 Other Norway English
## 178 United Artists United States of America English
## 179 Other United States of America English
## 180 Other India हिन्दी
## 181 Other United Kingdom English
## 182 No Company Unspecified Language
## 183 Other Español
## 184 TriStar Pictures United States of America English
## 185 Other United Kingdom English
## 186 Hollywood Pictures United States of America English
## 187 Warner Bros United States of America English
## 188 Other India हिन्दी
## 189 Other Italy English
## 190 Other South Korea 한국어 조선말
## 191 Other United States of America English
## 192 No Company United States of America English
## 193 Other Brazil Português
## 194 No Company Unspecified Language
## 195 Other Russia Pусский
## 196 No Company India தமிழ்
## 197 Other India हिन्दी
## 198 Other United States of America English
## 199 Other United Kingdom English
## 200 Other Germany Pусский
## 201 Metro Goldwyn Mayer MGM United States of America Unspecified Language
## popularity_max keyword1 USA is_outlier
## 1 3.111281 japan FALSE TRUE
## 2 5.305905 exploding building FALSE TRUE
## 3 9.887355 japan FALSE TRUE
## 4 1.829593 dying and death TRUE TRUE
## 5 8.328705 slapstick FALSE TRUE
## 6 7.146514 journalist FALSE TRUE
## 7 6.794970 vampire FALSE TRUE
## 8 5.486893 TRUE TRUE
## 9 0.984906 love FALSE TRUE
## 10 8.334487 autism TRUE TRUE
## 11 7.229587 cinematographer FALSE TRUE
## 12 9.609879 based on novel FALSE TRUE
## 13 2.782910 independent film FALSE TRUE
## 14 8.560726 anti terror TRUE TRUE
## 15 1.672406 FALSE TRUE
## 16 7.392294 pharmacist FALSE TRUE
## 17 7.202832 suice id TRUE TRUE
## 18 6.693589 supermarket TRUE TRUE
## 19 0.463350 dolphin TRUE TRUE
## 20 3.612089 cave TRUE TRUE
## 21 6.679050 independent film TRUE TRUE
## 22 2.023166 surfing TRUE TRUE
## 23 8.435294 partner FALSE TRUE
## 24 12.063080 jealousy TRUE TRUE
## 25 7.137026 chicken TRUE TRUE
## 26 8.762536 sexuality FALSE TRUE
## 27 11.153327 guantanamo bay TRUE TRUE
## 28 7.844705 journalist TRUE TRUE
## 29 8.367858 rape FALSE TRUE
## 30 0.870645 FALSE TRUE
## 31 4.281631 sex TRUE TRUE
## 32 2.713961 suspense FALSE TRUE
## 33 10.964499 virgin TRUE TRUE
## 34 4.163207 mexico TRUE TRUE
## 35 34.145916 rome FALSE TRUE
## 36 9.796755 gang TRUE TRUE
## 37 3.851653 new age FALSE TRUE
## 38 12.525758 ax TRUE TRUE
## 39 2.781581 miami TRUE TRUE
## 40 5.283661 london england FALSE TRUE
## 41 3.880541 infelity id TRUE TRUE
## 42 0.663231 romanian new wave FALSE TRUE
## 43 2.513078 FALSE TRUE
## 44 6.165491 based on novel FALSE TRUE
## 45 5.113573 new york TRUE TRUE
## 46 9.107829 independent film TRUE TRUE
## 47 4.661689 sea FALSE TRUE
## 48 1.453096 alan smithee TRUE TRUE
## 49 6.640704 underworld TRUE TRUE
## 50 3.436499 bet TRUE TRUE
## 51 2.775402 repayment FALSE TRUE
## 52 5.600277 crime fighter FALSE TRUE
## 53 0.218588 FALSE TRUE
## 54 3.549738 FALSE TRUE
## 55 0.546143 sex TRUE TRUE
## 56 3.711772 night life TRUE TRUE
## 57 4.918419 flying FALSE TRUE
## 58 7.317816 hitman TRUE TRUE
## 59 0.079287 staged death FALSE TRUE
## 60 1.188935 independent film FALSE TRUE
## 61 7.814255 male nudity TRUE TRUE
## 62 1.393391 independent film TRUE TRUE
## 63 6.743182 woman director TRUE TRUE
## 64 6.407207 disc jockey FALSE TRUE
## 65 1.608163 stripper TRUE TRUE
## 66 2.819298 bullying FALSE TRUE
## 67 8.804658 prostitute FALSE TRUE
## 68 0.292296 FALSE TRUE
## 69 10.114319 baby FALSE TRUE
## 70 8.651468 fog FALSE TRUE
## 71 12.457908 arbitrary law FALSE TRUE
## 72 4.503330 psychoanalysis FALSE TRUE
## 73 1.744659 passion TRUE TRUE
## 74 4.206655 woman director FALSE TRUE
## 75 1.808090 TRUE TRUE
## 76 2.065280 graffiti TRUE TRUE
## 77 0.524432 FALSE TRUE
## 78 3.985181 robbery TRUE TRUE
## 79 0.489328 marketing TRUE TRUE
## 80 0.660969 FALSE TRUE
## 81 11.305910 paris FALSE TRUE
## 82 4.645724 FALSE TRUE
## 83 0.386717 feminism TRUE TRUE
## 84 1.652275 transvestism FALSE TRUE
## 85 7.406609 basement FALSE TRUE
## 86 7.355780 TRUE TRUE
## 87 3.882092 jealousy FALSE TRUE
## 88 8.031164 dream FALSE TRUE
## 89 10.891524 suice attempt id TRUE TRUE
## 90 1.833892 beauty TRUE TRUE
## 91 5.849716 FALSE TRUE
## 92 7.052376 women TRUE TRUE
## 93 3.174512 journalist TRUE TRUE
## 94 5.975657 australia FALSE TRUE
## 95 0.262437 television TRUE TRUE
## 96 0.404753 independent film TRUE TRUE
## 97 5.939334 naivety TRUE TRUE
## 98 1.626320 TRUE TRUE
## 99 3.055936 mexico TRUE TRUE
## 100 2.849779 andro id TRUE TRUE
## 101 9.067788 TRUE TRUE
## 102 0.137676 TRUE TRUE
## 103 2.850011 independent film TRUE TRUE
## 104 2.095106 independent film TRUE TRUE
## 105 8.594980 homosexuality FALSE TRUE
## 106 0.333017 FALSE TRUE
## 107 0.892007 FALSE TRUE
## 108 5.358400 journalist FALSE TRUE
## 109 0.101618 native american TRUE TRUE
## 110 0.588872 TRUE TRUE
## 111 0.321515 independent film FALSE TRUE
## 112 9.517950 chaos theory FALSE TRUE
## 113 2.392367 obsession TRUE TRUE
## 114 1.585713 murder FALSE TRUE
## 115 7.678570 detective FALSE TRUE
## 116 6.107378 lake TRUE TRUE
## 117 5.350658 poison TRUE TRUE
## 118 0.964715 merma id FALSE TRUE
## 119 1.192891 TRUE TRUE
## 120 2.300459 loss of child TRUE TRUE
## 121 9.174221 mentally disabled FALSE TRUE
## 122 2.003309 hallucination TRUE TRUE
## 123 5.955203 london england FALSE TRUE
## 124 5.799861 new mexico TRUE TRUE
## 125 0.993784 woman director FALSE TRUE
## 126 0.993784 woman director FALSE TRUE
## 127 2.080781 FALSE TRUE
## 128 0.038876 biography FALSE TRUE
## 129 8.278079 TRUE TRUE
## 130 5.927867 hunting human beings TRUE TRUE
## 131 10.150041 airport TRUE TRUE
## 132 2.942355 FALSE TRUE
## 133 1.274228 cavemen TRUE TRUE
## 134 8.950643 atm FALSE TRUE
## 135 5.465670 pornography TRUE TRUE
## 136 1.155075 time travel TRUE TRUE
## 137 11.521280 prison FALSE TRUE
## 138 5.875708 TRUE TRUE
## 139 0.116890 FALSE TRUE
## 140 0.471913 heist TRUE TRUE
## 141 0.584397 sex TRUE TRUE
## 142 4.060122 wedding vows TRUE TRUE
## 143 0.110801 dancer TRUE TRUE
## 144 0.765930 silent film TRUE TRUE
## 145 0.460016 FALSE TRUE
## 146 1.740242 FALSE TRUE
## 147 0.299620 sunday TRUE TRUE
## 148 0.000001 FALSE TRUE
## 149 0.817002 TRUE TRUE
## 150 1.018477 skinhead FALSE TRUE
## 151 0.001880 FALSE TRUE
## 152 4.450762 gang war FALSE TRUE
## 153 6.792607 FALSE TRUE
## 154 5.568359 paris FALSE TRUE
## 155 1.337096 restaurant TRUE TRUE
## 156 0.769053 sport FALSE TRUE
## 157 6.759519 bare knuckle boxing TRUE TRUE
## 158 0.825042 nightclub TRUE TRUE
## 159 0.075176 capitalism FALSE TRUE
## 160 1.398756 prison FALSE TRUE
## 161 8.832907 brother brother relationship FALSE TRUE
## 162 3.308503 new zealand FALSE TRUE
## 163 0.261278 senility TRUE TRUE
## 164 0.717595 suspense TRUE TRUE
## 165 1.325299 eroticism TRUE TRUE
## 166 2.411191 italy TRUE TRUE
## 167 5.799628 eroticism FALSE TRUE
## 168 5.140016 sex FALSE TRUE
## 169 2.103581 extramarital affair TRUE TRUE
## 170 1.145806 murder TRUE TRUE
## 171 10.187623 angel TRUE TRUE
## 172 2.493638 royal family FALSE TRUE
## 173 6.368323 chemical FALSE TRUE
## 174 4.496585 emigration FALSE TRUE
## 175 5.950792 venice FALSE TRUE
## 176 1.758079 comedy TRUE TRUE
## 177 2.861451 horse FALSE TRUE
## 178 3.566996 TRUE TRUE
## 179 11.179864 artist TRUE TRUE
## 180 2.402032 lie FALSE TRUE
## 181 1.241349 lust FALSE TRUE
## 182 0.265854 musical FALSE TRUE
## 183 1.020710 FALSE TRUE
## 184 7.506958 telephone TRUE TRUE
## 185 3.276800 flooding FALSE TRUE
## 186 1.137266 TRUE TRUE
## 187 6.428830 indivual id TRUE TRUE
## 188 1.109545 FALSE TRUE
## 189 0.833330 FALSE TRUE
## 190 1.486349 female nudity FALSE TRUE
## 191 0.158651 independent film TRUE TRUE
## 192 8.927994 anti hero TRUE TRUE
## 193 0.265070 FALSE TRUE
## 194 0.016219 FALSE TRUE
## 195 0.201582 robbery FALSE TRUE
## 196 0.438490 FALSE TRUE
## 197 1.280455 FALSE TRUE
## 198 2.240259 letter TRUE TRUE
## 199 1.410322 FALSE TRUE
## 200 2.466066 chase FALSE TRUE
## 201 0.286719 dance TRUE TRUE
# Filter out outliers
movies_filtered_no_outliers <- movies_filtered_both %>%
filter(!is_outlier)
# Plot density distributions of log-transformed revenue without outliers
ggplot(movies_filtered_no_outliers, aes(x = log(revenue), fill = factor(USA))) +
geom_density(alpha = 0.3) +
labs(title = "Density Distribution of Log-transformed Revenue (Excluding Outliers)",
x = "Log Revenue",
y = "Density",
fill = "United States of America") +
scale_fill_manual(values = c("TRUE" = "red", "FALSE" = "blue")) +
theme_minimal()
We observe notable differences in the density distributions of
log-transformed revenue between movies produced in the USA and those
produced elsewhere. Movies originating from the USA, depicted in red,
exhibit a denser concentration of log-transformed revenue values within
the mid-range. This implies a tendency towards higher revenue values for
domestically produced films compared to those from other countries.
Movies produced elsewhere, represented in blue, display a broader spread
of density, suggesting a wider range of revenue values. Collectively,
these findings suggest distinct revenue generation patterns between
domestic and international productions, with US-produced movies
demonstrating a propensity towards higher revenue outcomes.
# Calculating correlations between numerical variables
correlation_matrix <- cor(movies_filtered_no_outliers[, c("budget", "revenue", "popularity_max", "vote_average", "vote_count")])
# Scatterplot of budget vs revenue
ggplot(data = movies_filtered_no_outliers, aes(x = budget, y = revenue)) +
geom_point(alpha = 0.5) +
labs(title = "Budget vs Revenue",
x = "Budget",
y = "Revenue") +
theme_minimal()
The scatterplot visually depicts the relationship between budget and
revenue across movies in the dataset, where each point corresponds to a
movie. By setting the alpha parameter to 0.5, the transparency of points
is adjusted to enhance visibility and identify overlapping areas. This
visualization serves as an intuitive tool to discern any potential
linear relationship between budget and revenue. A positive linear
relationship would be characterized by points clustering around a
diagonal line sloping upwards from left to right, indicating that higher
budgets tend to result in higher revenues. A negative linear
relationship would manifest as points clustered around a diagonal line
sloping downwards from left to right, suggesting that higher budgets are
associated with lower revenues.
# Analysis of the relationship between budget and revenue
budget_revenue_lm <- lm(revenue ~ budget, data = movies_filtered_no_outliers)
summary(budget_revenue_lm)
##
## Call:
## lm(formula = revenue ~ budget, data = movies_filtered_no_outliers)
##
## Residuals:
## Min 1Q Median 3Q Max
## -677974787 -40715382 -5447567 15288916 2075081200
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -3.130e+06 2.044e+06 -1.531 0.126
## budget 3.021e+00 3.951e-02 76.469 <2e-16 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Residual standard error: 115500000 on 5197 degrees of freedom
## Multiple R-squared: 0.5294, Adjusted R-squared: 0.5294
## F-statistic: 5847 on 1 and 5197 DF, p-value: < 2.2e-16
# Scatterplot of revenue by country
ggplot(data = movies_filtered_no_outliers, aes(x = country1, y = revenue, fill = country1)) +
geom_boxplot() +
labs(title = "Revenue by Country of Origin",
x = "Country",
y = "Revenue") +
theme_minimal()
After doing the analysis of the different variables, what makes a movie successful in an overview is the Genre, in a more specific matter, if a movie has as a main gender Drama, it will be successful. Also the Comedy movies as a main genre is good, but not as much as Drama. The company that is more successful is Universal reflecting that even though it does not have as many movies as Paramount Pictures or Fox, their popularity and vote average is high. Regarding the runtime and release date of a movie, I didn’t identify any tendency, meaning that it doesn’t have a direct impact on whether a movie is successful or not. In language and country, English and the United States are the most likely to have great impact in the success of a movie.
To enhance the success and profitability of movie productions, the company aims to establish strategic partnerships with leading production companies like Universal, Fox and Paramount Pictures, or other production companies in the US. This initiative seeks to leverage the expertise and resources of established players while amplying content offerings. Produce in the english language and make drama or comedy films, and also some of horror or family. To optimize box office performance, the company will strategically plan movie releases during the vacations, particularly in winter or summer, since is when the movies can get more revenue.