diff --git a/.travis.yml b/.travis.yml index 2b04cfca93..f7aadda801 100644 --- a/.travis.yml +++ b/.travis.yml @@ -4,6 +4,7 @@ warnings_are_errors: true r_github_packages: - hadley/staticdocs + - hadley/ggplot2movies - jimhester/covr before_script: diff --git a/DESCRIPTION b/DESCRIPTION index fa7d6a517e..44305c3503 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -24,6 +24,7 @@ Imports: scales (>= 0.2.3), stats Suggests: + ggplot2movies, hexbin, Hmisc, knitr, diff --git a/NEWS b/NEWS index 9e4f78c80f..334c15bd38 100644 --- a/NEWS +++ b/NEWS @@ -1,6 +1,11 @@ ggplot2 1.0.1.9xxx ---------------------------------------------------------------- +* The movies dataset has been moved into its own package, ggplot2movies, + because it was large and not terribly useful. If you've used the movies + dataset, you'll now need to explicitly load the package with + `library(ggplot2movies)`. + * The default legend will now allocate multiple rows (if vertical) or columns (if horizontal) in order to make a legend that is more likely to fit on the screen. You can override with the `nrow`/`ncol` arguments diff --git a/R/aes-colour-fill-alpha.r b/R/aes-colour-fill-alpha.r index 983e9cff2a..7af412d642 100644 --- a/R/aes-colour-fill-alpha.r +++ b/R/aes-colour-fill-alpha.r @@ -25,9 +25,9 @@ #' k + geom_bar() #' #' # Fill aesthetic can also be used with a continuous variable -#' m <- ggplot(movies, aes(x = rating)) -#' m + geom_histogram() -#' m + geom_histogram(aes(fill = ..count..)) +#' m <- ggplot(faithfuld, aes(waiting, eruptions)) +#' m + geom_raster() +#' m + geom_raster(aes(fill = density)) #' #' # Some geoms don't use both aesthetics (i.e. geom_point or geom_line) #' b <- ggplot(economics, aes(x = date, y = unemploy)) diff --git a/R/coord-polar.r b/R/coord-polar.r index e71d8fd7ab..b7fee05292 100644 --- a/R/coord-polar.r +++ b/R/coord-polar.r @@ -41,6 +41,7 @@ #' labs(title = "Pac man") #' #' # Windrose + doughnut plot +#' if (require("ggplot2movies")) { #' movies$rrating <- cut_interval(movies$rating, length = 1) #' movies$budgetq <- cut_number(movies$budget, 4) #' @@ -51,6 +52,7 @@ #' # Race track plot #' doh + geom_bar(width = 0.9, position = "fill") + coord_polar(theta = "y") #' } +#' } coord_polar <- function(theta = "x", start = 0, direction = 1) { theta <- match.arg(theta, c("x", "y")) r <- if (theta == "x") "y" else "x" diff --git a/R/geom-bar-histogram.r b/R/geom-bar-histogram.r index 1111472629..dae68df939 100644 --- a/R/geom-bar-histogram.r +++ b/R/geom-bar-histogram.r @@ -14,7 +14,7 @@ #' @export #' @inheritParams geom_point #' @examples -#' \donttest{ +#' if (require("ggplot2movies")) { #' set.seed(5689) #' movies <- movies[sample(nrow(movies), 1000), ] #' # Basic example diff --git a/R/geom-blank.r b/R/geom-blank.r index 81bbebf19d..a92052bb5b 100644 --- a/R/geom-blank.r +++ b/R/geom-blank.r @@ -6,7 +6,7 @@ #' @export #' @inheritParams geom_point #' @examples -#' ggplot(movies, aes(length, rating)) + geom_blank() +#' ggplot(mtcars, aes(wt, mpg)) + geom_blank() #' # Nothing to see here! #' #' # Take the following scatter plot diff --git a/R/geom-boxplot.r b/R/geom-boxplot.r index 349dac5cce..5df5b1fbaa 100644 --- a/R/geom-boxplot.r +++ b/R/geom-boxplot.r @@ -71,6 +71,7 @@ #' # Scale transformations occur before the boxplot statistics are computed. #' # Coordinate transformations occur afterwards. Observe the effect on the #' # number of outliers. +#' if (require("ggplot2movies")) { #' library(plyr) # to access round_any #' m <- ggplot(movies, aes(y = votes, x = rating, #' group = round_any(rating, 0.5))) @@ -86,6 +87,7 @@ #' #' ggplot(movies, aes(year, budget)) + #' geom_boxplot(aes(group=round_any(year, 10, floor))) +#' } #' #' # Using precomputed statistics #' # generate sample data @@ -100,7 +102,6 @@ #' p + geom_boxplot(varwidth = TRUE) #' #' # Update the defaults for the outliers by changing the defaults for geom_point -#' #' p <- ggplot(mtcars, aes(factor(cyl), mpg)) #' p + geom_boxplot() #' diff --git a/R/geom-path-.r b/R/geom-path-.r index e00a426ef0..8c50056212 100644 --- a/R/geom-path-.r +++ b/R/geom-path-.r @@ -15,6 +15,7 @@ #' @examples #' \donttest{ #' # Generate data +#' if (require("ggplot2movies")) { #' library(plyr) #' myear <- ddply(movies, .(year), colwise(mean, .(length, rating))) #' p <- ggplot(myear, aes(length, rating)) @@ -29,6 +30,7 @@ #' #' # Set aesthetics to fixed value #' p + geom_path(colour = "green") +#' } #' #' # Control line join parameters #' df <- data.frame(x = 1:3, y = c(4, 1, 9)) diff --git a/R/geom-path-line.r b/R/geom-path-line.r index 45beab8463..f79614ef21 100644 --- a/R/geom-path-line.r +++ b/R/geom-path-line.r @@ -10,6 +10,7 @@ #' @export #' @examples #' # Summarise number of movie ratings by year of movie +#' if (require("ggplot2movies")) { #' mry <- do.call(rbind, by(movies, round(movies$rating), function(df) { #' nums <- tapply(df$length, df$year, length) #' data.frame(rating=round(df$rating[1]), year = as.numeric(names(nums)), number=as.vector(nums)) @@ -28,6 +29,7 @@ #' #' # Set aesthetics to fixed value #' p + geom_line(colour = "red", size = 1) +#' } #' #' # Using a time series #' ggplot(economics, aes(date, pop)) + geom_line() diff --git a/R/geom-ribbon-.r b/R/geom-ribbon-.r index 86b838179d..ba5e30bbfa 100644 --- a/R/geom-ribbon-.r +++ b/R/geom-ribbon-.r @@ -29,14 +29,6 @@ #' huron[huron$year > 1900 & huron$year < 1910, "level"] <- NA #' h <- ggplot(huron, aes(x=year)) #' h + geom_ribbon(aes(ymin=level-1, ymax=level+1)) + geom_line(aes(y=level)) -#' -#' # Another data set, with multiple y's for each x -#' m <- ggplot(movies, aes(y=votes, x=year)) -#' (m <- m + geom_point()) -#' -#' # The default summary isn't that useful -#' m + stat_summary(geom="ribbon", fun.ymin="min", fun.ymax="max") -#' m + stat_summary(geom="ribbon", fun.data="median_hilow") #' } geom_ribbon <- function (mapping = NULL, data = NULL, stat = "identity", position = "identity", na.rm = FALSE, show_guide = NA, inherit.aes = TRUE, ...) diff --git a/R/geom-violin.r b/R/geom-violin.r index a249dac393..6c986859f2 100644 --- a/R/geom-violin.r +++ b/R/geom-violin.r @@ -42,6 +42,7 @@ #' p + geom_violin(fill = "grey80", colour = "#3366FF") #' #' # Scales vs. coordinate transforms ------- +#' if (require("ggplot2movies")) { #' # Scale transformations occur before the density statistics are computed. #' # Coordinate transformations occur afterwards. Observe the effect on the #' # number of outliers. @@ -59,6 +60,7 @@ #' ggplot(movies, aes(year, budget)) + #' geom_violin(aes(group = round_any(year, 10, floor))) #' } +#' } geom_violin <- function (mapping = NULL, data = NULL, stat = "ydensity", position = "dodge", trim = TRUE, scale = "area", show_guide = NA, inherit.aes = TRUE, ...) diff --git a/R/ggplot2.r b/R/ggplot2.r index 1c0d5905ff..b13b49e608 100644 --- a/R/ggplot2.r +++ b/R/ggplot2.r @@ -88,36 +88,6 @@ NULL "midwest" -#' Movie information and user ratings from IMDB.com. -#' -#' The internet movie database, \url{http://imdb.com/}, is a website devoted -#' to collecting movie data supplied by studios and fans. It claims to be the -#' biggest movie database on the web and is run by amazon. More about -#' information imdb.com can be found online, -#' \url{http://imdb.com/help/show_leaf?about}, including information about -#' the data collection process, -#' \url{http://imdb.com/help/show_leaf?infosource}. -#' -#' Movies were selected for inclusion if they had a known length and had been -#' rated by at least one imdb user. -#' -#' @format A data frame with 28819 rows and 24 variables -#' \itemize{ -#' \item title. Title of the movie. -#' \item year. Year of release. -#' \item budget. Total budget (if known) in US dollars -#' \item length. Length in minutes. -#' \item rating. Average IMDB user rating. -#' \item votes. Number of IMDB users who rated this movie. -#' \item r1-10. Multiplying by ten gives percentile (to nearest 10\%) of -#' users who rated this movie a 1. -#' \item mpaa. MPAA rating. -#' \item action, animation, comedy, drama, documentary, romance, short. -#' Binary variables representing if movie was classified as belonging to that genre. -#' } -#' @references \url{http://had.co.nz/data/movies/} -"movies" - #' Fuel economy data from 1999 and 2008 for 38 popular models of car #' #' This dataset contains a subset of the fuel economy data that the EPA makes diff --git a/R/save.r b/R/save.r index d6935fc16b..cac5c81d2a 100644 --- a/R/save.r +++ b/R/save.r @@ -25,16 +25,16 @@ #' @export #' @examples #' \dontrun{ -#' ggplot(movies, aes(rating)) + geom_histogram(binwidth = 0.1) +#' ggplot(mtcars, aes(mpg, wt)) + geom_point() #' -#' ggsave("ratings.pdf") -#' ggsave("ratings.png") +#' ggsave("mtcars.pdf") +#' ggsave("mtcars.png") #' -#' ggsave("ratings.pdf", width = 4, height = 4) -#' ggsave("ratings.pdf", width = 20, height = 20, units = "cm") +#' ggsave("mtcars.pdf", width = 4, height = 4) +#' ggsave("mtcars.pdf", width = 20, height = 20, units = "cm") #' -#' unlink("ratings.pdf") -#' unlink("ratings.png") +#' unlink("mtcars.pdf") +#' unlink("mtcars.png") #' #' # specify device when saving to a file with unknown extension #' # (for example a server supplied temporary file) diff --git a/R/scale-continuous.r b/R/scale-continuous.r index 1163ff4be4..d2a97010b3 100644 --- a/R/scale-continuous.r +++ b/R/scale-continuous.r @@ -11,6 +11,7 @@ #' @export #' @examples #' \donttest{ +#' if (require(ggplot2movies)) { #' m <- ggplot(subset(movies, votes > 1000), aes(rating, votes)) + #' geom_point(na.rm = TRUE) #' m @@ -72,6 +73,7 @@ #' scale_x_log10() + #' scale_y_log10() #' } +#' } scale_x_continuous <- function(name = NULL, breaks = waiver(), minor_breaks = waiver(), labels = waiver(), limits = NULL, expand = waiver(), oob = censor, diff --git a/R/stat-bin.r b/R/stat-bin.r index d45b672b82..bc7a9b5859 100644 --- a/R/stat-bin.r +++ b/R/stat-bin.r @@ -29,19 +29,16 @@ #' # If right = TRUE, and intervals are of the form (a, b] #' base + stat_bin(binwidth = 1, drop = FALSE, right = TRUE, col = "black") #' -#' m <- ggplot(movies, aes(x=rating)) -#' m + stat_bin() -#' m + stat_bin(binwidth=0.1) -#' m + stat_bin(breaks=seq(4,6, by=0.1)) +#' d <- ggplot(diamonds, aes(carat)) +#' d + stat_bin() +#' d + stat_bin(binwidth = 0.1) +#' d + stat_bin(breaks=seq(0, 2, by = 0.01)) #' # See geom_histogram for more histogram examples #' #' # To create a unit area histogram, use aes(y = ..density..) -#' (linehist <- m + stat_bin(aes(y = ..density..), binwidth=0.1, -#' geom="line", position="identity")) -#' linehist + stat_density(colour="blue", fill=NA) -#' -#' # Also works with categorical variables -#' ggplot(movies, aes(x=mpaa)) + stat_bin() +#' linehist <- d + geom_freqpoly(aes(y = ..density..), binwidth = 0.1) +#' linehist +#' linehist + stat_density(colour = "blue", fill = NA) #' } stat_bin <- function (mapping = NULL, data = NULL, geom = "bar", position = "stack", width = 0.9, drop = FALSE, right = FALSE, diff --git a/R/stat-density.r b/R/stat-density.r index 5202a9f432..d082190f26 100644 --- a/R/stat-density.r +++ b/R/stat-density.r @@ -24,6 +24,7 @@ #' @export #' @examples #' \donttest{ +#' if (require("ggplot2movies")) { #' m <- ggplot(movies, aes(x = rating)) #' m + geom_density() #' @@ -88,6 +89,7 @@ #' m + geom_density(fill=NA) #' m + geom_density(fill=NA) + aes(y = ..count..) #' } +#' } stat_density <- function (mapping = NULL, data = NULL, geom = "area", position = "stack", adjust = 1, kernel = "gaussian", trim = FALSE, na.rm = FALSE, show_guide = NA, inherit.aes = TRUE, ...) diff --git a/R/stat-quantile.r b/R/stat-quantile.r index f7086a9f32..42e889a33a 100644 --- a/R/stat-quantile.r +++ b/R/stat-quantile.r @@ -15,6 +15,7 @@ #' @export #' @examples #' \donttest{ +#' if (require("ggplot2movies")) { #' msamp <- movies[sample(nrow(movies), 1000), ] #' m <- ggplot(msamp, aes(year, rating)) + geom_point() #' m + stat_quantile() @@ -40,6 +41,7 @@ #' # Set aesthetics to fixed value #' m + stat_quantile(colour = "red", size = 2, linetype = 2) #' } +#' } stat_quantile <- function (mapping = NULL, data = NULL, geom = "quantile", position = "identity", quantiles = c(0.25, 0.5, 0.75), formula = NULL, method = "rq", na.rm = FALSE, show_guide = NA, inherit.aes = TRUE, ...) diff --git a/R/stat-summary.r b/R/stat-summary.r index 77312c762f..4b382f4ef7 100644 --- a/R/stat-summary.r +++ b/R/stat-summary.r @@ -91,6 +91,7 @@ #' xlab("cyl") #' m #' # An example with highly skewed distributions: +#' if (require("ggplot2movies")) { #' set.seed(596) #' mov <- movies[sample(nrow(movies), 1000), ] #' m2 <- ggplot(mov, aes(x= factor(round(rating)), y=votes)) + geom_point() @@ -111,6 +112,7 @@ #' # standard errors. #' m2 + coord_trans(y="log10") #' } +#' } stat_summary <- function (mapping = NULL, data = NULL, geom = "pointrange", position = "identity", show_guide = NA, inherit.aes = TRUE, ...) { diff --git a/R/translate-qplot-lattice.r b/R/translate-qplot-lattice.r index 9071e35254..5a095b32b4 100644 --- a/R/translate-qplot-lattice.r +++ b/R/translate-qplot-lattice.r @@ -9,6 +9,7 @@ #' \dontrun{ #' library(lattice) #' +#' if (require("ggplot2movies")) { #' xyplot(rating ~ year, data=movies) #' qplot(year, rating, data=movies) #' @@ -35,6 +36,7 @@ #' #' xyplot(wt ~ mpg, mtcars, type = c("p","r")) #' qplot(mpg, wt, data = mtcars, geom = c("point","smooth"), method = "lm") +#' } #' #' # The capabilities for scale manipulations are similar in both ggplot2 and #' # lattice, although the syntax is a little different. diff --git a/data-raw/movies.R b/data-raw/movies.R deleted file mode 100644 index dfed5baa6a..0000000000 --- a/data-raw/movies.R +++ /dev/null @@ -1,4 +0,0 @@ -library(readr) - -movies <- read_csv("data-raw/movies.csv") -use_data(movies, overwrite = TRUE) diff --git a/data-raw/movies.csv b/data-raw/movies.csv deleted file mode 100644 index b7c6048787..0000000000 --- a/data-raw/movies.csv +++ /dev/null @@ -1,58789 +0,0 @@ -"title","year","length","budget","rating","votes","r1","r2","r3","r4","r5","r6","r7","r8","r9","r10","mpaa","Action","Animation","Comedy","Drama","Documentary","Romance","Short" -"$",1971,121,NA,6.4,348,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"$1000 a Touchdown",1939,71,NA,6,20,0,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"$21 a Day Once a Month",1941,7,NA,8.2,5,0,0,0,0,0,24.5,0,44.5,24.5,24.5,"",0,1,0,0,0,0,1 -"$40,000",1996,70,NA,8.2,6,14.5,0,0,0,0,0,0,0,34.5,45.5,"",0,0,1,0,0,0,0 -"$50,000 Climax Show, The",1975,71,NA,3.4,17,24.5,4.5,0,14.5,14.5,4.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"$pent",2000,91,NA,4.3,45,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"$windle",2002,93,NA,5.3,200,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"'15'",2002,25,NA,6.7,24,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"'38",1987,97,NA,6.6,18,4.5,4.5,4.5,0,0,0,34.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"'49-'17",1917,61,NA,6,51,4.5,0,4.5,4.5,4.5,44.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"'68",1988,99,NA,5.4,23,4.5,0,4.5,14.5,24.5,4.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"'94 du bi dao zhi qing",1994,96,NA,5.9,53,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"'?' Motorist, The",1906,10,NA,7,44,4.5,0,0,0,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"'A'",1965,10,NA,6.7,11,14.5,0,0,0,0,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"'A' gai waak",1983,106,NA,7.1,1259,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",1,0,1,0,0,0,0 -"'A' gai waak juk jaap",1987,101,NA,7.2,614,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,1,0,0,0,0 -"'Breaker' Morant",1980,107,NA,7.9,2718,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"'Bullitt': Steve McQueen's Commitment to Reality",1968,10,NA,6.6,37,0,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"'Crocodile' Dundee II",1988,110,NA,5,7252,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"'E'",1981,7,NA,8.6,15,0,0,0,0,4.5,4.5,0,14.5,24.5,45.5,"",0,1,1,0,0,0,1 -"'El Chicko' - der Verdacht",1995,90,NA,3.9,10,24.5,14.5,24.5,14.5,0,14.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"'G' Men",1935,85,450000,7.2,281,0,4.5,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"'Gator Bait",1974,88,NA,3.5,100,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"'Gator Bait II: Cajun Justice",1988,95,NA,3.1,54,24.5,14.5,4.5,14.5,4.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"'High Sign', The",1921,18,NA,7.8,145,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,1 -"'Hukkunud Alpinisti' hotell",1979,80,NA,7.7,45,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"'Hyp-Nut-Tist', The",1935,6,NA,6.2,18,4.5,0,0,24.5,0,24.5,14.5,14.5,14.5,0,"",0,1,1,0,0,0,1 -"'I Do...'",1989,86,NA,6.2,10,0,0,0,24.5,24.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"'I Know Where I'm Going!'",1945,92,NA,7.7,825,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"'Java Madness' formerly titled 'Coffee Madness'",1995,7,NA,6.8,10,0,14.5,0,0,14.5,14.5,34.5,0,14.5,34.5,"",0,0,1,0,0,0,1 -"'Je vous salue, Marie'",1985,105,NA,6.4,322,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"'Kaash'",1987,140,NA,5.9,13,4.5,4.5,0,0,24.5,24.5,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"'M' Word",1996,99,NA,4.6,6,14.5,0,14.5,14.5,14.5,0,14.5,0,0,14.5,"",0,0,1,0,0,1,0 -"'Mad' Boy, I'll Blow Your Blues Away. Be Mine",1997,19,NA,7.3,21,4.5,0,0,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"'Manos' the Hands of Fate",1966,74,19000,1.6,7996,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"'Merci la vie'",1991,117,NA,7.2,251,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"'Neath Brooklyn Bridge",1942,61,NA,6.1,114,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"'Neath Canadian Skies",1946,41,NA,5.4,7,14.5,0,14.5,14.5,0,24.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"'Neath the Arizona Skies",1934,52,NA,4.6,105,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"'Night, Mother",1986,96,NA,6.8,364,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"'O re",1989,90,NA,3.9,8,0,14.5,14.5,0,0,34.5,0,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"'Pimpernel' Smith",1941,120,NA,7.2,139,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"'R Xmas",2001,83,NA,4.9,288,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"'Round Midnight",1986,133,NA,7.3,902,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"'Sheba, Baby'",1975,90,NA,5.5,91,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"'Sugar Chile' Robinson, Billie Holiday, Count Basie and His Sextet",1951,15,NA,5.3,5,0,0,0,0,64.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"'Teddy' Bears, The",1907,15,NA,5.8,23,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,"",0,1,0,0,0,0,1 -"'Til There Was You",1997,113,23000000,4.8,799,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"'Til We Meet Again",1940,99,NA,6.3,83,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"'What's Your 'I.Q.'?' Number Two",1940,9,NA,5.9,9,0,0,14.5,14.5,24.5,24.5,14.5,0,14.5,14.5,"",0,0,0,0,1,0,1 -"'burbs, The",1989,101,NA,6,7641,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"(A)Torzija",2002,13,NA,7.2,71,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"(Entre nous)",2002,82,NA,4.8,22,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"(Haru)",1996,118,NA,6.6,19,4.5,0,14.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"(Paris: XY)",2001,80,NA,1.4,6,14.5,0,14.5,0,14.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"(T)Raumschiff Surprise - Periode 1",2004,87,NA,5.6,1275,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"*Corpus Callosum",2002,92,NA,4.9,36,24.5,14.5,4.5,4.5,0,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"*batteries not included",1987,106,NA,5.7,4148,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"+1 -1",1987,7,NA,9.4,6,0,0,0,0,0,0,0,0,45.5,45.5,"",0,1,1,0,0,0,1 -"-30-",1959,96,NA,6.3,43,4.5,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"-But the Flesh Is Weak",1932,77,NA,5.8,32,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"...4 ...3 ...2 ...1 ...morte",1967,95,NA,3.6,67,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"...All the Marbles",1981,113,NA,5.6,348,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,1,1,0,1,0 -"...Almost",1990,84,NA,5.3,38,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"...And Justice for All",1979,119,NA,7,2610,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"...And Millions Die!",1973,93,NA,4.4,23,14.5,0,4.5,34.5,24.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"...Because She Disobeyed",1935,104,NA,6,11,0,0,0,0,14.5,14.5,0,4.5,34.5,14.5,"",0,0,1,1,0,0,0 -"...Belpaese, Il",1977,109,NA,5.2,11,4.5,0,0,0,34.5,34.5,4.5,4.5,0,0,"",0,0,1,1,0,0,0 -"...Comme elle respire",1998,106,NA,6.1,103,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"...Is It the Design on the Wrapper?",1997,8,NA,2.6,14,24.5,0,0,0,4.5,4.5,24.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"...Ja teeb trikke",1978,10,NA,7.9,7,0,0,0,0,0,0,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"...Lost",2000,5,NA,6.2,13,4.5,0,0,4.5,24.5,34.5,24.5,4.5,0,0,"",0,0,0,0,0,0,1 -"...Maybe This Time",1980,96,NA,5.7,8,0,0,0,0,24.5,34.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"...Po prozvishchu 'Zver'",1990,88,NA,4.7,11,4.5,0,4.5,4.5,4.5,14.5,14.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"...Quando Troveja",1999,92,NA,4.6,25,4.5,0,4.5,14.5,24.5,14.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"...To Skin a Cat",2004,22,NA,8.1,11,0,4.5,0,0,4.5,0,4.5,14.5,4.5,44.5,"",0,0,1,0,0,0,1 -"...a tutte le auto della polizia",1975,90,NA,6.8,7,0,0,0,0,0,24.5,74.5,0,0,0,"",0,0,0,0,0,0,0 -"...a zase ta Lucie!",1984,82,NA,5.8,19,4.5,0,14.5,0,24.5,24.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"...al fin, el mar",2005,95,NA,5,9,24.5,0,14.5,14.5,24.5,14.5,0,0,0,24.5,"",0,0,0,1,0,1,0 -"...ani smrt nebere",1996,88,NA,3.6,5,44.5,24.5,0,0,0,24.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"...borgnes sont rois, Les",1974,15,NA,8.3,6,0,0,0,14.5,0,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"...dopo di che, uccide il maschio e lo divora",1971,96,NA,6.1,5,0,0,0,0,0,44.5,0,44.5,0,24.5,"",0,0,0,1,0,0,0 -"...e per tetto un cielo di stelle",1968,100,NA,3.9,19,0,14.5,14.5,24.5,0,24.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"...e tanta paura",1976,98,NA,5.8,20,0,0,14.5,14.5,4.5,14.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"...som havets nakna vind",1968,105,NA,5.3,21,4.5,4.5,0,0,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,1,0 -"...tick...tick...tick...",1970,100,NA,6,145,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"...und abends in die Scala",1958,94,NA,5.7,5,0,0,24.5,0,0,0,64.5,24.5,0,0,"",0,0,0,0,0,0,0 -"...und das ist erst der Anfang",2000,95,NA,5.9,50,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"...und die Liebe lacht dazu",1957,97,NA,6.8,5,0,0,0,24.5,0,0,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"...ya no puede caminar.",2001,14,NA,7.1,35,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -".com for Murder",2002,96,5000000,3.7,271,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"00 Schneider - Jagd auf Nihil Baxter",1994,90,NA,5.9,339,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"002 agenti segretissimi",1964,83,NA,3.6,6,34.5,0,0,0,0,14.5,14.5,14.5,0,14.5,"",1,0,1,0,0,0,0 -"002 operazione Luna",1965,90,NA,4.7,9,14.5,14.5,0,14.5,0,0,24.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"06",1994,87,NA,6.4,238,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"06/05",2004,117,NA,6.3,165,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"07 con el 2 delante (Agente: Jaime Bonet)",1966,101,NA,1.8,13,64.5,0,4.5,4.5,0,0,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"08/15",1954,95,NA,4.6,65,14.5,0,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"08/15 - In der Heimat",1955,96,NA,4.2,48,14.5,4.5,0,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"08/15 - Zweiter Teil",1955,110,NA,3.7,47,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"1 Giant Leap",2002,155,NA,6.6,75,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"1+1=3",1979,85,NA,7.5,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,1,0,0,0,0 -"1,000 Dollars a Minute",1935,70,NA,6.2,5,0,0,24.5,0,24.5,0,44.5,0,0,24.5,"",0,0,1,0,0,0,0 -"1,99 - Um Supermercado Que Vende Palavras",2003,72,NA,4.9,28,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,1,0,0 -"1-2-3-4 ou Les Collants noirs",1960,125,NA,7.3,34,0,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"1. April 2000",1952,105,NA,6.9,27,4.5,0,0,14.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"1/2 Mensch",1986,48,NA,8.1,29,4.5,0,0,0,4.5,0,0,4.5,24.5,64.5,"",0,0,0,0,1,0,0 -"10",1979,122,NA,5.7,3170,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"10 Magnificent Killers",1977,84,NA,2.6,9,64.5,0,0,14.5,14.5,14.5,0,0,0,0,"",1,0,0,1,0,0,0 -"10 Rillington Place",1971,111,NA,7.2,486,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"10 Seconds",1998,10,NA,7.3,21,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,1 -"10 Things I Hate About You",1999,97,16000000,6.7,19095,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,1,0,0,1,0 -"10 Violent Women",1982,95,NA,3.8,31,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"10 from Your Show of Shows",1973,92,NA,8.6,61,4.5,0,4.5,4.5,0,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"10 jaar leuven kort",2004,240,NA,7.9,7,0,0,14.5,0,0,14.5,14.5,0,14.5,44.5,"",0,0,0,1,0,0,1 -"10 on Ten",2004,88,NA,5.9,40,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"10 pesos",2003,6,NA,6.1,8,0,0,0,14.5,14.5,24.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,1 -"10 to Midnight",1983,101,NA,5.4,530,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"10.000 dollari per un massacro",1967,100,NA,3.6,16,0,14.5,0,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"10.7",1997,28,NA,8.8,5,0,0,0,0,0,0,0,64.5,0,44.5,"",0,0,0,0,0,0,1 -"100 Days",1991,161,NA,5.8,59,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"100 Days",2001,100,NA,6.2,14,0,14.5,0,0,4.5,0,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"100 Girls",2000,90,NA,5.8,3349,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"100 Mile Rule",2002,98,1100000,5.6,181,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"100 Pro",2001,88,NA,5.5,94,4.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"100 Proof",1997,94,140000,3.3,19,14.5,14.5,4.5,14.5,14.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"100 Rifles",1969,110,NA,5.6,267,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"100 Years at the Movies",1994,9,NA,9.2,91,0,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,1,0,1 -"100 minuta slave",2004,100,NA,5.9,21,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"1000 Boomerangs",1995,101,NA,4.6,7,45.5,14.5,0,0,0,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"1000 Convicts and a Woman",1971,92,NA,6.1,10,0,24.5,14.5,0,14.5,14.5,0,24.5,0,34.5,"",0,0,0,1,0,0,0 -"1000 Rosen",1994,95,NA,5.1,17,14.5,4.5,0,0,0,4.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"1000 Shapes of a Female",1963,79,NA,2.2,6,0,45.5,0,14.5,0,0,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"10000th Day, The",1997,18,NA,8,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,0,0,0,0,0,1 -"1001 Arabian Nights",1959,75,NA,5.2,59,14.5,0,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"1001 Erotic Nights 2",1986,79,NA,7.7,15,14.5,0,0,0,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"1001 Nights",1998,23,NA,7.3,11,0,0,0,0,0,14.5,0,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"1001 nuits, Les",1990,98,NA,5.1,122,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"101",1989,117,200000,7.8,299,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"101 Dalmatians",1996,103,NA,5.5,5028,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"101 Rent Boys",2000,78,NA,6.3,83,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"101 Ways (The Things a Girl Will Do to Keep Her Volvo)",2000,100,NA,5.5,68,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"101-vy kilometer",2001,103,200000,5.8,7,0,0,14.5,0,0,44.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"101byeonjae propose",1993,112,NA,5.2,20,14.5,0,4.5,4.5,44.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"102 Dalmatians",2000,100,85000000,4.7,1987,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"10:10",2000,14,NA,6,6,0,0,0,14.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"10:30 P.M. Summer",1966,85,NA,6.2,42,4.5,0,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"10e chambre - Instants d'audience",2004,105,NA,7.4,111,0,0,4.5,0,0,14.5,24.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"11 Harrowhouse",1974,94,NA,6,177,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"11 Uhr 59",2000,11,NA,8.4,5,0,0,0,0,24.5,0,0,0,64.5,24.5,"",0,0,0,0,0,0,1 -"11 commandements, Les",2004,85,NA,4.7,199,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"11'09''01 - September 11",2002,134,NA,6.9,1264,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"11:11",2004,95,NA,4.3,222,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"11:14",2003,95,6000000,7.1,605,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"12 + 1",1969,94,NA,5.5,51,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"12 Angry Men",1957,96,340000,8.7,29278,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"12 B",2001,150,NA,5.2,6,0,0,14.5,34.5,14.5,14.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"12 Bucks",1998,86,NA,5.1,46,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"12 Hot Women",2003,4,NA,5.2,24,14.5,0,4.5,4.5,4.5,14.5,0,4.5,4.5,45.5,"",0,0,1,0,0,0,1 -"12 Stops on the Road to Nowhere",1999,18,NA,7.2,24,14.5,0,0,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"12 horas",2001,89,NA,6.2,39,24.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"12 mesyatsev",1956,55,NA,8.5,14,0,0,0,0,0,0,4.5,4.5,24.5,64.5,"",0,1,0,0,0,0,0 -"12 stulev",1971,161,NA,8.9,252,4.5,0,4.5,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"12 to the Moon",1960,74,150000,2.8,89,34.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"120 Tage von Bottrop, Die",1997,60,NA,2.4,52,34.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"125 rue Montmartre",1959,85,NA,5.2,22,0,0,14.5,14.5,4.5,24.5,4.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"12:01 PM",1990,25,NA,7.4,183,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"12:35",2002,92,NA,8.2,5,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"13 Dead Men",2003,85,NA,2.2,69,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"13 Fighting Men",1960,69,NA,4.2,5,24.5,0,24.5,44.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"13 Frightened Girls",1963,89,NA,5,34,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"13 Ghosts",1960,85,NA,5.6,578,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"13 Going On 30",2004,98,37000000,6.4,7859,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"13 Lakes",2004,135,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,1,0,0 -"13 Moons",2002,93,NA,5.6,196,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"13 Rue Madeleine",1947,95,NA,6.8,262,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"13 West Street",1962,80,NA,6.3,35,0,0,0,0,24.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"13 kaidan",2003,122,NA,7.2,23,0,0,4.5,4.5,0,14.5,14.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"13. jul",1982,110,NA,6.4,11,0,0,4.5,4.5,24.5,0,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"13ta godenitsa na printsa",1987,89,NA,6.8,54,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,0,0,0,0 -"13th Floor, The",1988,88,NA,4.3,131,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"13th House, The",2003,58,NA,4.9,12,0,0,0,14.5,14.5,4.5,0,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"13th Letter, The",1951,85,NA,6.1,27,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"13th Man, The",1937,70,NA,5.1,5,0,0,24.5,0,24.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"13th Sign, The",2000,85,NA,3.9,28,24.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"13th Warrior, The",1999,102,85000000,6.1,14344,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"14 Carrot Rabbit",1952,7,NA,7.2,66,4.5,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"14 Million Dreams",2003,52,NA,8.3,7,14.5,0,0,0,0,0,0,0,44.5,44.5,"",0,0,0,1,1,0,0 -"14 numara",1985,83,NA,3.6,12,24.5,4.5,24.5,4.5,0,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"14, The",1973,105,NA,6.7,7,0,0,0,0,0,14.5,24.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"14/1 endlos",1998,27,NA,7,5,0,0,0,44.5,0,0,0,0,64.5,0,"",0,0,0,0,0,0,1 -"1492: Conquest of Paradise",1992,154,47000000,6,3379,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"14e kippetje, Het",1998,88,NA,5.5,118,4.5,4.5,4.5,14.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"15",2003,90,NA,6.4,97,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"15 Amore",1998,92,NA,6.5,88,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"15 Minutes",1999,25,NA,4.8,19,14.5,0,0,4.5,24.5,24.5,14.5,24.5,4.5,0,"",0,0,1,0,0,0,1 -"15 Minutes",2001,120,42000000,6.1,10866,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"15' zondergrond",2000,20,NA,6.4,7,0,0,24.5,0,0,14.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,1 -"15-Sai: Gakko IV",2000,120,NA,5.5,13,24.5,0,0,4.5,4.5,0,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"15.35: spoor 1",2003,74,NA,5.6,27,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"16 Days of Glory",1985,145,NA,7.7,37,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"16 December",2002,158,NA,7.3,26,4.5,0,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,1 -"16 Fathoms Deep",1948,82,NA,7.6,6,0,0,0,0,0,34.5,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"16/67: 20. September",1967,6,NA,5.5,6,0,0,14.5,14.5,0,14.5,0,0,14.5,34.5,"",0,0,0,0,0,0,1 -"16060",1995,86,NA,6.7,30,4.5,4.5,4.5,0,14.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"17 Seconds to Sophie",1998,1,NA,5.1,7,0,0,0,14.5,24.5,14.5,0,0,0,44.5,"",0,0,0,0,1,0,1 -"17 and Under",1998,107,NA,4.1,13,4.5,0,0,14.5,14.5,14.5,0,0,4.5,34.5,"",0,0,0,1,0,0,0 -"17 op",1989,75,NA,4.4,9,14.5,34.5,0,0,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"17 rue Bleue",2001,95,NA,5.7,22,0,0,14.5,4.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"1776",1972,180,4000000,7.3,1754,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG",0,0,0,1,0,0,0 -"1789",1974,150,NA,5.2,18,0,0,4.5,14.5,24.5,0,4.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"17th Man, The",2004,23,NA,7.6,18,4.5,14.5,0,0,0,0,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"18 Again!",1988,93,NA,4.8,643,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"18 Shades of Dust",1999,87,NA,4.5,43,14.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"18 Weapons of Kung Fu",1977,89,NA,2,21,24.5,4.5,14.5,4.5,0,4.5,4.5,0,0,34.5,"",1,0,0,1,0,0,0 -"18 anni tra una settimana",1991,98,NA,5.9,7,14.5,0,0,0,14.5,44.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"18-j",2004,100,NA,8.5,26,4.5,4.5,0,4.5,0,4.5,0,14.5,14.5,45.5,"",0,0,0,1,1,0,0 -"1860",1934,80,NA,7,16,0,0,14.5,4.5,14.5,34.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"1871",1990,100,NA,4.2,11,4.5,14.5,4.5,4.5,0,0,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"187: Documented",1997,58,NA,3,14,44.5,0,0,14.5,0,4.5,14.5,0,4.5,14.5,"",0,0,0,1,1,0,0 -"1895",1995,30,NA,7.8,21,4.5,4.5,0,0,4.5,0,4.5,4.5,0,64.5,"",0,1,0,0,0,0,1 -"19",2000,82,NA,7,59,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"19 Months",2002,77,NA,5.3,51,14.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"19 djevojaka i Mornar",1971,73,NA,5.4,5,24.5,0,24.5,0,0,0,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"1900",1976,245,9000000,7.5,2408,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"1918",1985,94,NA,5.8,65,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"1919",1985,99,NA,5,28,14.5,0,14.5,14.5,0,4.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"1919",1997,8,NA,6.2,13,34.5,4.5,0,4.5,14.5,0,4.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"1925 Studio Tour",1925,32,NA,8.2,26,0,0,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,1 -"1939",1989,193,NA,5.7,62,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"1941",1941,7,NA,7.9,5,0,0,0,0,24.5,0,24.5,0,0,64.5,"",0,0,0,0,0,0,1 -"1941",1979,146,35000000,5.6,5536,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"1942: A Love Story",1993,157,NA,6.5,210,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,1,0 -"1952: Ivan i Aleksandra",1989,80,NA,7.3,16,4.5,4.5,0,0,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"1955 Motion Picture Theatre Celebration",1955,18,NA,4.6,12,14.5,0,0,4.5,14.5,14.5,0,0,0,44.5,"",0,0,0,0,1,0,1 -"1958",1980,96,NA,5.9,23,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"1969",1988,95,NA,5.3,659,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"1974",2000,8,NA,4.4,12,0,14.5,24.5,4.5,24.5,0,4.5,0,4.5,4.5,"",0,1,0,0,0,0,1 -"1974, une partie de campagne",1974,90,NA,7.6,22,0,0,0,0,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,0,1,0,0 -"1984",1956,90,NA,6.9,304,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"1990: I guerrieri del Bronx",1982,89,NA,3.9,181,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"1991: The Year Punk Broke",1992,99,NA,6.9,166,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"1997 - Zapisi Rustema s risunkami",1998,80,NA,7.9,11,0,0,0,4.5,0,0,14.5,74.5,0,0,"",0,0,0,0,0,0,0 -"1999",1998,92,NA,5.3,93,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"1999 - Nen no natsu yasumi",1988,90,NA,6.5,66,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"1999 Madeleine",1999,86,NA,5.6,52,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"2 A.M. in the Subway",1905,1,NA,5.2,13,0,0,14.5,14.5,24.5,34.5,4.5,0,4.5,0,"",0,0,1,0,0,0,1 -"2 Birds with 1 Stallone",2002,76,NA,1.5,30,24.5,4.5,0,0,4.5,0,0,14.5,0,64.5,"",0,0,0,1,0,0,0 -"2 Days in the Valley",1996,104,NA,6.4,5057,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"2 Dyuo",1997,90,NA,6.5,9,14.5,14.5,0,0,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"2 Fast 2 Furious",2003,107,76000000,5.1,9556,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"2 G's & a Key",2000,97,NA,4.4,44,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"2 Little, 2 Late",1999,87,NA,6.5,18,14.5,0,0,4.5,0,0,0,4.5,14.5,64.5,"",0,0,1,1,0,0,0 -"2 bileta na dnevnoy seans",1966,90,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"2 deputati, I",1968,95,NA,6.9,9,14.5,0,0,0,0,24.5,34.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"2 minutter",2001,8,NA,6.9,9,0,0,0,0,14.5,24.5,14.5,14.5,0,44.5,"",0,0,0,0,0,0,1 -"2 or 3 Things But Nothing for Sure",1997,12,NA,7.2,5,0,0,24.5,0,0,24.5,0,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"2 ou 3 choses que je sais d'elle",1967,90,NA,6.7,355,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"2 ryk og 1 aflevering",2003,96,NA,5.5,86,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"2 secondes",1998,100,NA,6.8,166,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"2+1",2004,28,NA,8.2,16,14.5,4.5,0,0,0,0,0,4.5,0,74.5,"",0,0,1,0,0,0,1 -"2+5: Missione Hydra",1965,89,NA,3.3,29,24.5,14.5,4.5,24.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"2,000 Women",1944,97,NA,5.9,50,0,4.5,0,0,4.5,14.5,14.5,4.5,34.5,24.5,"",0,0,0,0,0,0,0 -"2. juledag",2000,25,NA,5.5,8,0,0,14.5,0,24.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"20 Dates",1998,87,60000,5.4,841,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,1,1,0 -"20 Fingers",2004,74,NA,6.7,52,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"20 Million Miles to Earth",1957,82,NA,6.2,523,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"20 Mule Team",1940,84,NA,7.1,25,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"20,000 Cheers for the Chain Gang",1933,20,NA,6.5,16,0,4.5,4.5,0,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"20,000 Leagues Under the Sea",1916,105,200000,6.2,135,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"20,000 Years in Sing Sing",1932,78,NA,7,274,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"20-seiki nosutarujia",1997,93,NA,3.7,14,24.5,0,0,0,14.5,14.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"20. Juli, Der",1955,97,NA,8.6,18,4.5,0,0,0,4.5,0,14.5,34.5,4.5,34.5,"",0,0,0,0,0,0,0 -"20/20 Vision",1999,20,NA,1,5,64.5,0,0,0,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,1 -"200 American",2003,84,NA,5.4,62,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"200 Cigarettes",1999,101,6000000,5.4,4514,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"200 Motels",1971,98,679000,5.2,338,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"2000 Nordestes",2000,70,NA,7.9,25,4.5,0,0,0,4.5,0,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"2000 Years Later",1969,80,NA,4.4,12,4.5,14.5,0,0,24.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"20000 Leagues Under the Sea",1954,127,5000000,7.1,2741,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"2001 Yonggary",1999,99,NA,3.1,241,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"2001: A Space Odyssey",1968,156,10500000,8.3,64982,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"2001: A Space Travesty",2000,99,26000000,2.5,2023,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"2002: The Rape of Eden",1994,90,NA,4,24,14.5,4.5,14.5,4.5,24.5,14.5,0,4.5,0,14.5,"",1,0,1,1,0,0,0 -"2009: Lost Memories",2002,136,NA,6.6,639,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"201 Kanarinia, Ta",1964,96,NA,7.1,6,0,0,0,0,0,34.5,0,45.5,0,14.5,"",0,0,0,0,0,0,0 -"2010",1984,116,NA,6.5,7300,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"2010: The Odyssey Continues",1984,18,NA,5.8,154,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,1 -"2019 - Dopo la caduta di New York",1983,91,NA,5.3,176,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"203 kochi",1980,185,NA,6.8,24,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"2046",2004,129,12000000,7.6,2663,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"2069 A.D.",1969,75,NA,5.3,8,0,0,0,0,34.5,34.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"2084",1984,10,NA,6.4,10,14.5,0,0,0,14.5,14.5,34.5,34.5,0,14.5,"",0,0,0,0,1,0,1 -"20:30:40",2004,113,NA,7.1,177,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"20h17 rue Darling",2003,101,NA,6.3,75,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"21",2000,105,NA,6,25,4.5,0,4.5,4.5,0,4.5,14.5,4.5,14.5,44.5,"",0,0,1,1,0,1,0 -"21 Grams",2003,124,20000000,8,21857,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"21-87",1964,10,NA,6.1,13,0,4.5,0,0,4.5,14.5,44.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"2103: The Deadly Wake",1997,100,NA,3.8,78,34.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"21st Century Jet: The Building of the 777",1996,285,NA,7.6,7,0,0,0,0,0,0,14.5,14.5,44.5,24.5,"",0,0,0,0,1,0,0 -"22 June 1897",1979,121,NA,6,11,4.5,0,0,0,4.5,4.5,4.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"23",1998,100,NA,7.2,1246,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"23 -- Skidoo",1930,10,NA,4.8,15,0,0,4.5,34.5,24.5,4.5,4.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"23 Paces to Baker Street",1956,103,NA,7,179,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"237",2000,12,NA,4.3,7,0,0,24.5,0,0,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,1 -"23:58",1993,84,NA,7,8,0,0,0,0,14.5,0,64.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"23rd March 1931: Shaheed",2002,188,NA,6.3,25,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"24",2002,91,NA,7.4,75,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"24 7: Twenty Four Seven",1997,96,NA,6.7,504,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"24 Hour Party People",2002,117,NA,7.2,3603,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"24 Hour Woman, The",1999,93,2500000,5.6,149,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"24 Hours",1931,66,NA,7,11,0,0,0,14.5,0,4.5,14.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"24 Hours in London",2000,90,NA,3.8,242,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"24 Nights",1999,97,NA,6.3,81,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"24 chasa",2000,86,NA,6,39,14.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"24 heures de la vie d'une femme",2002,107,NA,5.6,74,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"24 heures ou plus...",1977,114,NA,7.6,9,0,0,0,0,0,0,14.5,34.5,45.5,0,"",0,0,0,0,0,0,0 -"24 horas de placer",1969,95,NA,8.1,7,0,0,0,0,0,24.5,0,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"24-Seven",1999,8,NA,5.9,22,0,4.5,4.5,0,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"24/24",2001,11,NA,4.8,9,24.5,0,0,0,14.5,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"24fps",2000,6,NA,4.8,16,4.5,4.5,24.5,4.5,34.5,14.5,0,0,0,4.5,"",0,0,0,0,0,0,1 -"24th Day, The",2004,92,NA,6.4,502,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"25 Kids and a Dad",2002,90,NA,6.2,8,0,0,0,0,14.5,34.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"25 Watts",2001,92,200000,7,275,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"25 Ways to Quit Smoking",1989,5,NA,7.2,114,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"25th Hour",2002,135,15000000,7.8,15788,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"26 Summer Street",1996,17,NA,4.7,20,14.5,0,0,0,24.5,0,0,4.5,0,64.5,"",0,0,0,0,0,0,1 -"27 Down",1974,118,NA,8.9,7,0,0,0,0,0,0,14.5,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"27 Missing Kisses",2000,98,NA,6.6,291,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"27 horas",1986,81,NA,5.2,38,4.5,0,0,4.5,24.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"27A",1974,86,NA,5,8,0,0,0,14.5,24.5,0,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"27th Day, The",1957,75,NA,5.9,84,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"28 Days",2000,103,43000000,6,7465,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"28 Days Later...",2002,113,8000000,7.3,24174,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"28 minuti per 3 milioni di dollari",1967,90,NA,3.9,6,0,14.5,0,0,14.5,14.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"28 oktovriou, ora 5:30",1971,90,NA,6.2,5,0,0,0,0,44.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"29 Palms",2002,93,NA,4.7,406,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"29th Street",1991,101,NA,6.9,436,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"2BPerfectlyHonest",2004,88,NA,7.3,17,0,0,4.5,14.5,14.5,14.5,4.5,14.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"2LDK",2002,70,NA,7.3,381,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"2by4",1998,90,NA,6.4,44,0,4.5,4.5,4.5,4.5,34.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"2wks, 1yr",2002,104,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,0 -"3",1971,86,NA,6,14,44.5,24.5,0,0,0,0,4.5,24.5,0,0,"",0,0,0,1,0,0,0 -"3 A.M.",1976,72,NA,6.9,15,0,0,4.5,4.5,0,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"3 A.M.",2001,88,NA,5.9,243,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"3 AM",2003,22,32000,4.8,11,4.5,0,0,4.5,14.5,4.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"3 Bad Men",1926,122,NA,5.6,64,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"3 Chinesen mit dem Kontrabass",2000,88,NA,6.5,120,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"3 Days of Rain",2002,98,NA,5.8,20,4.5,0,0,0,24.5,0,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"3 Dumb Clucks",1937,17,NA,7.1,80,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"3 Feet Under: Digging Deep for the Geoduck",2003,63,NA,7,15,0,0,0,0,0,0,24.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"3 Godfathers",1948,106,NA,6.9,779,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"3 Little Ninjas and the Lost Treasure",1990,100,NA,2.2,51,45.5,14.5,4.5,4.5,4.5,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"3 Men and a Little Lady",1990,104,NA,4.5,3066,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"3 Minute Wonder",2000,3,NA,4.3,6,0,0,14.5,34.5,0,45.5,0,0,0,0,"",0,0,0,0,0,0,1 -"3 Misses",1998,11,NA,7.2,23,4.5,0,0,4.5,0,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"3 Ninjas",1992,98,NA,4,1392,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"3 Ninjas Kick Back",1994,93,NA,3.5,565,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"3 Ninjas Knuckle Up",1995,85,NA,2.9,324,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",1,0,1,0,0,0,0 -"3 Ninjas: High Noon at Mega Mountain",1998,93,NA,2.2,744,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"3 Nuts in Search of a Bolt",1964,78,NA,5.2,16,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"3 Ring Circus",1954,103,NA,5.6,99,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"3 Ring Wing-Ding",1968,6,NA,6.3,9,14.5,0,24.5,0,0,14.5,24.5,0,14.5,24.5,"",0,1,1,0,0,0,1 -"3 Strikes",2000,82,6000000,3.7,305,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"3 Tage 44",2000,21,NA,5,6,0,0,0,0,34.5,0,14.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"3 Weeks After Paradise",2002,51,NA,7,5,0,24.5,0,0,0,0,24.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"3 Women",1977,124,1500000,7.7,912,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"3 Worlds of Gulliver, The",1960,100,NA,6,215,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,0,0,0,0,0 -"3 dev adam",1973,81,NA,5.2,36,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"3 hommes et un couffin",1985,106,NA,6.6,537,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"3 noches",2001,105,NA,6.4,9,0,0,14.5,0,14.5,24.5,0,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"3-4x juugatsu",1990,96,NA,6.6,761,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"3-Way",2004,88,NA,4.6,177,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"30 Days",1999,87,NA,4.2,31,14.5,4.5,14.5,24.5,4.5,4.5,0,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"30 Foot Bride of Candy Rock, The",1959,75,NA,4.6,102,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"30 Frames a Second: The WTO in Seattle",2000,73,NA,5.4,7,14.5,14.5,0,0,14.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,1,0,0 -"30 Is a Dangerous Age, Cynthia",1968,85,NA,4.8,32,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"30 Winchester per El Diablo",1965,95,NA,3.4,7,0,14.5,45.5,14.5,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"30 Years of Fun",1963,85,NA,6.7,15,14.5,0,0,24.5,4.5,0,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"30 Years to Life",2001,110,NA,5.1,42,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"R",0,0,1,1,0,1,0 -"30 ans",2000,105,NA,5.8,14,0,0,4.5,14.5,14.5,34.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"30 panen a Pythagoras",1977,68,NA,2.5,8,34.5,14.5,0,0,24.5,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"30, Still Single: Contemplating Suicide",1998,91,NA,7.1,26,4.5,0,0,4.5,0,14.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"300 Spartans, The",1962,114,NA,6.4,548,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"3000 Miles to Graceland",2001,125,62000000,5.4,7298,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"301, 302",1995,100,NA,6.8,275,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"30:e november",1995,116,NA,3.9,193,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"31",2003,27,NA,2.8,5,64.5,0,24.5,0,0,0,0,24.5,0,0,"",0,0,0,0,0,0,1 -"317e section, La",1965,86,NA,8,73,0,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"322",1969,95,NA,6,9,0,0,0,0,14.5,14.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"34-y skoryy",1981,83,NA,7.3,8,0,0,0,14.5,14.5,0,14.5,14.5,0,45.5,"",1,0,0,0,0,0,0 -"35 Aside",1995,27,NA,6.6,40,0,4.5,0,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,1 -"35 Miles from Normal",1997,99,NA,6.6,21,4.5,0,4.5,0,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"36 Chowringhee Lane",1981,122,NA,7.7,41,4.5,4.5,0,0,4.5,4.5,4.5,24.5,34.5,14.5,"",0,0,0,0,0,0,0 -"36 Deadly Styles, The",1980,92,NA,5.1,13,0,4.5,0,4.5,34.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"36 Hours",1953,80,NA,5.7,8,0,14.5,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"36 Hours",1965,115,NA,7.3,373,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"36 fillette",1988,88,NA,6,232,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"36 ore all'inferno",1969,93,NA,3.7,7,0,14.5,0,44.5,0,14.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"365 Nights in Hollywood",1934,77,NA,5.8,17,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"36K",2000,83,NA,7.8,12,4.5,0,4.5,4.5,0,0,0,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"37 og et halvt",2005,101,NA,5.6,27,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"39 Pounds of Love",2005,70,NA,7.6,7,14.5,14.5,0,0,0,0,0,0,0,74.5,"",0,0,0,0,1,0,0 -"39 Steps, The",1935,86,NA,8,7931,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"39 Steps, The",1959,93,NA,6.6,223,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"3:10 to Yuma",1957,92,NA,7.7,526,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"3:15",1986,86,NA,4.5,94,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"3:am",2005,21,NA,8.8,9,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,0,0,1 -"3D",2000,24,NA,6,5,24.5,0,0,0,24.5,64.5,0,0,0,0,"",0,0,0,0,0,0,1 -"3azima",2003,5,NA,5,6,0,0,0,14.5,14.5,0,0,0,0,64.5,"",0,0,0,1,0,0,1 -"3groschenoper, Die",1931,112,NA,6.9,147,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"3rd Voice, The",1960,79,NA,7.3,20,0,0,4.5,0,4.5,14.5,14.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"4",2004,126,NA,6.3,30,4.5,0,4.5,14.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"4 Artists Paint 1 Tree: A Walt Disney 'Adventure in Art'",1964,16,NA,6.9,10,0,0,0,0,0,34.5,34.5,14.5,0,34.5,"",0,0,0,0,1,0,1 -"4 Clowns",1970,97,NA,7.9,35,0,0,0,0,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"4 Devils",1928,97,NA,8.7,9,0,0,0,0,0,0,14.5,34.5,14.5,44.5,"",0,0,0,1,0,0,0 -"4 Freunde und 4 Pfoten",2003,76,NA,5.1,11,0,4.5,4.5,0,4.5,4.5,34.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"4 Inyong shiktak",2003,123,NA,5.7,156,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"4 Little Girls",1997,102,NA,7.5,463,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"4 P.M.",2000,15,NA,5.5,21,0,14.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"4 Second Delay",1998,26,NA,6.1,12,34.5,0,0,0,14.5,0,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"4 a.m.: Open All Night",1999,15,NA,6,17,4.5,14.5,4.5,0,0,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"4 aventures de Reinette et Mirabelle",1987,99,NA,7.6,167,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"4 for Texas",1963,124,NA,5.3,399,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"4 maneras de tapar un hoyo",1995,8,NA,8.2,12,0,0,0,0,4.5,4.5,14.5,0,45.5,4.5,"",0,1,0,0,0,0,1 -"4 marmittoni alle grandi manovre",1974,90,NA,3.7,6,0,14.5,14.5,0,34.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"4 mosche di velluto grigio",1971,104,NA,6.3,251,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"4 saisons d'Espigoule, Les",1999,97,NA,6.5,65,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,1,0,0 -"4 x 4",1965,105,NA,5.6,8,14.5,0,14.5,0,0,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"40",2002,12,NA,5.7,12,4.5,0,0,0,14.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"40 Carats",1973,110,NA,6,104,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"40 Days and 40 Nights",2002,96,17000000,5.4,8609,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"40 Days of Musa Dagh",1982,143,NA,7.5,16,14.5,0,4.5,0,0,0,14.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"40 Guns to Apache Pass",1967,95,NA,5.8,60,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"40 Pounds of Trouble",1962,106,NA,6.3,126,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"40 Quadratmeter Deutschland",1986,80,NA,7.3,15,4.5,0,0,0,0,0,24.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"40 gradi all'ombra del lenzuolo",1976,100,NA,4.7,34,0,14.5,4.5,24.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"40 grados a la sombra",1967,90,NA,5.5,6,0,0,0,14.5,14.5,14.5,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"40,000 Horsemen",1941,100,NA,6.9,20,4.5,0,0,4.5,0,24.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"400 Million, The",1939,52,NA,5,10,0,0,14.5,0,45.5,14.5,14.5,0,0,24.5,"",0,0,0,0,1,0,0 -"405",2000,11,NA,6.9,250,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,1 -"420",2004,116,NA,8.3,6,0,0,14.5,0,0,0,0,0,45.5,34.5,"",0,0,1,0,0,0,0 -"42K",2000,90,NA,5.1,25,4.5,4.5,0,14.5,4.5,0,24.5,24.5,4.5,24.5,"",1,0,1,0,0,0,0 -"42nd Street",1933,89,439000,7.5,1247,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"42nd. Street Special, The",1933,6,NA,6.2,11,0,0,0,0,4.5,14.5,64.5,4.5,0,0,"",0,0,0,0,1,0,1 -"43: The Richard Petty Story",1974,83,NA,6.4,18,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"47 morto che parla",1950,95,NA,7.6,21,0,0,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"48 Hrs.",1982,96,NA,6.8,8742,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",1,0,1,1,0,0,0 -"48 Stunden bis Acapulco",1967,81,NA,4.3,5,24.5,0,0,0,44.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"491",1964,88,NA,6.2,38,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"49th Man, The",1953,73,NA,6.2,17,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"49th Parallel",1941,104,NA,7.7,395,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"4D Man",1959,85,NA,5.2,192,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,1,0 -"4th Floor, The",1999,90,NA,5.7,1088,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"4th Tenor, The",2002,97,NA,4.2,71,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"PG-13",0,0,1,0,0,1,0 -"5 Against the House",1955,84,NA,6.2,49,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"5 Branded Women",1960,118,NA,5.2,53,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"5 Card Stud",1968,105,NA,6.2,457,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"5 Card Stud",2002,96,NA,8.3,7,14.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,0,1,0 -"5 Dark Souls",1996,94,1500,7.3,11,14.5,0,0,4.5,0,0,4.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"5 Dead on the Crimson Canvas",1996,96,25000,2,24,14.5,4.5,0,0,4.5,0,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"5 Fingers",1952,108,NA,7.6,392,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"5 Millionen suchen einen Erben",1938,85,NA,6.5,22,0,0,4.5,0,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"5 Steps to Danger",1957,81,NA,5.6,24,0,0,0,4.5,14.5,44.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"5 bambole per la luna d'agosto",1970,90,NA,5.5,145,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"5 de chocolate y 1 de fresa",1968,85,NA,4.3,12,24.5,4.5,0,0,14.5,0,4.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"5 donne per l'assassino",1974,95,NA,3.7,7,0,14.5,0,14.5,0,44.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"5 i fedtefadet, De",1970,90,NA,5.4,21,0,0,14.5,14.5,34.5,0,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"5 og spionerne, De",1969,81,NA,4.6,18,14.5,0,4.5,24.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"5 tombe per un medium",1965,85,NA,4.8,34,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"5,000 Fingers of Dr. T., The",1953,89,1600000,6.7,699,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"50 First Dates",2004,99,75000000,6.8,13497,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"50 Ways to Leave Your Lover",2004,95,NA,6.8,22,14.5,4.5,0,4.5,0,4.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,1,0 -"50,000 B.C. (Before Clothing)",1963,75,NA,3.4,15,24.5,24.5,4.5,0,4.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"50/50",1982,87,NA,4,7,14.5,0,24.5,24.5,14.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"500 Years Later",2005,106,NA,9.3,17,4.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,1,0,0 -"500!",2001,92,NA,6.4,14,4.5,0,0,4.5,0,4.5,0,0,14.5,64.5,"",0,0,1,0,0,0,0 -"50CC",2000,41,NA,5.9,7,0,0,14.5,0,14.5,24.5,14.5,14.5,0,14.5,"",1,0,0,0,0,1,1 -"51 Bar",1985,95,NA,8.7,5,0,0,0,24.5,0,0,0,24.5,64.5,0,"",0,0,0,1,0,0,0 -"51st State, The",2001,92,28000000,6.1,6752,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"52 Pick-Up",1986,110,NA,5.9,609,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"52nd Street",1937,80,NA,7,5,0,0,0,0,0,24.5,64.5,0,0,24.5,"",0,0,0,1,0,0,0 -"54",1998,100,13000000,5.4,6905,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"55 Days at Peking",1963,150,17000000,6.6,700,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"588 rue paradis",1993,130,NA,7.9,56,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"5th Ave Girl",1939,83,NA,6.6,112,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"5th World",2005,75,NA,5.2,11,14.5,14.5,0,14.5,4.5,0,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"5x2",2004,90,NA,6.6,691,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"6 Day Bike Rider",1934,69,NA,6.7,107,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"6 Miles of 8 Feet",1999,22,NA,7.9,8,0,0,0,0,34.5,0,0,14.5,0,45.5,"",0,0,0,0,0,0,1 -"6 Points",2004,85,NA,4.3,56,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"6 dni strusia",2001,100,NA,5.1,9,0,14.5,14.5,0,24.5,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"6.5 Special",1958,85,NA,4,6,14.5,0,0,34.5,0,0,0,45.5,0,0,"",0,0,0,0,0,0,0 -"6000 Enemies",1939,62,NA,6.5,11,0,0,4.5,0,14.5,45.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"633 Squadron",1964,103,NA,6.2,367,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"64,000,000 Years Ago",1981,11,NA,6.7,7,0,0,0,0,14.5,14.5,74.5,0,0,0,"",0,1,0,0,0,0,1 -"65, 66 och jag",1936,89,NA,5.3,21,0,0,14.5,14.5,14.5,4.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"66 scener fra Amerika",1982,43,NA,5.3,13,4.5,0,0,4.5,24.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"666 mo gui fu huo",1996,100,NA,5.3,54,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"681-0638",2001,90,NA,7.1,7,0,0,14.5,0,0,14.5,14.5,44.5,0,14.5,"",0,0,1,1,0,0,0 -"69",1968,5,NA,5.1,5,24.5,0,0,24.5,0,64.5,0,0,0,0,"",0,0,0,0,0,0,1 -"69 - Sixtynine",1969,98,NA,5.8,5,0,24.5,0,0,0,44.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"69 Park Avenue",1985,90,NA,6.1,5,0,24.5,0,0,0,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"6ix",1999,11,NA,5.5,30,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,1 -"6th Day, The",2000,123,82000000,5.9,12064,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"7 Days In September",2002,94,NA,7.9,33,4.5,0,0,0,14.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,0,1,0,0 -"7 Faces of Dr. Lao",1964,100,NA,6.9,646,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"7 Lucky Ninja Kids",1989,90,NA,4.8,19,24.5,4.5,0,4.5,14.5,14.5,14.5,0,4.5,24.5,"",1,0,1,0,0,0,0 -"7 Star Grand Mantis",1983,85,NA,3.1,7,24.5,14.5,0,14.5,0,0,44.5,0,0,0,"",1,0,1,0,0,0,0 -"7 Wise Dwarfs",1941,4,NA,6,35,0,0,4.5,4.5,14.5,34.5,24.5,4.5,0,4.5,"",0,1,0,0,0,0,1 -"7 Women",1966,87,NA,6.2,225,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"7 Year Zig Zag",2003,90,NA,6,6,14.5,14.5,0,0,0,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"7 Zwerge",2004,95,NA,5,439,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"7 ans de mariage",2003,97,NA,6.3,148,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"7 fois... par jour",1971,98,NA,3.4,16,34.5,14.5,14.5,4.5,14.5,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"7 jin gong",1994,90,NA,5.4,67,4.5,0,4.5,4.5,4.5,34.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"7 pra-jan-barn",2002,110,NA,4.8,15,0,0,24.5,14.5,4.5,14.5,14.5,14.5,0,24.5,"",1,0,1,0,0,0,0 -"7, Hyden Park: la casa maledetta",1985,96,NA,4.7,16,4.5,0,14.5,4.5,44.5,14.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"71 Fragmente einer Chronologie des Zufalls",1994,95,NA,6.6,176,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"711 Ocean Drive",1950,102,NA,7,48,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"72 Desperate Rebels",1972,93,NA,3.3,8,14.5,0,14.5,0,24.5,14.5,14.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"72 Faced Liar",2003,15,NA,7,6,0,0,0,34.5,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,1 -"72 metra",2004,100,1600000,6,147,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"7337",2000,17,NA,3.9,28,14.5,0,4.5,0,4.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"76-89-03",2000,85,NA,6.6,75,4.5,4.5,0,4.5,4.5,4.5,34.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"78 Tours",1985,4,NA,7.9,10,0,0,14.5,0,14.5,14.5,14.5,34.5,24.5,14.5,"",0,1,0,0,0,0,1 -"79 primaveras",1969,25,NA,6.2,5,0,0,0,0,24.5,0,24.5,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"7th Cavalry",1956,75,NA,6.3,84,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"7th Dawn, The",1964,123,NA,5.3,64,0,4.5,14.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"7th Street",2003,72,NA,7,42,0,0,0,0,4.5,4.5,44.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"7th Voyage of Sinbad, The",1958,88,650000,6.9,1224,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"8 Ball Bunny",1950,7,NA,7.4,90,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"8 Heads in a Duffel Bag",1997,94,NA,4.8,2076,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"8 Mile",2002,110,41000000,6.8,17900,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"8 Million Ways to Die",1986,115,NA,4.9,642,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"8 Seconds",1994,105,NA,5.9,747,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"8 femmes",2002,111,NA,7.1,5503,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"8 to 4",1981,77,NA,5.8,32,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"8-A",1993,84,NA,6.9,14,0,0,4.5,0,0,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"80 Steps to Jonah",1969,107,NA,5.1,57,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"80's Ending",2003,9,10000,8.3,15,0,0,0,0,4.5,4.5,4.5,34.5,24.5,24.5,"",0,0,1,0,0,0,1 -"80,000 Suspects",1963,113,NA,5.5,35,4.5,0,4.5,14.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"800 Fantasy Lane",1979,82,NA,5.1,30,14.5,0,0,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"800 Two Lap Runners",1994,110,NA,4.7,13,4.5,0,4.5,0,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"800 balas",2002,124,NA,6.5,404,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"84 Charing Cross Road",1987,100,NA,7.3,1172,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"84C MoPic",1989,95,NA,6.9,284,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"88 Antop Hill",2003,119,NA,4.1,8,24.5,0,24.5,24.5,0,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"89 mm od Europy",1994,12,NA,7.8,12,0,0,0,0,4.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,0,1,0,1 -"8MM",1999,123,40000000,5.9,18541,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"8cht",1997,7,NA,3.7,11,14.5,4.5,0,0,34.5,0,0,0,0,34.5,"",0,0,0,0,0,0,1 -"9 Mornings",2002,100,NA,6.2,9,14.5,0,0,0,0,34.5,0,34.5,14.5,14.5,"",0,0,0,0,0,1,0 -"9 Songs",2004,71,NA,5.2,464,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"9 Souls",2003,120,NA,7.5,100,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"9 dney odnogo goda",1961,120,NA,7.8,39,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"9/30/55",1977,101,NA,6.7,56,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"9/64: O Tannenbaum",1964,3,NA,8.2,6,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"90",2005,14,4000,9.1,10,0,14.5,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,1 -"90 Day Wondering",1956,6,NA,7.1,13,0,0,14.5,4.5,0,4.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"90 Days",1985,100,NA,5.8,17,4.5,0,0,4.5,0,24.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"90 Miles",2001,75,NA,7.4,5,0,0,0,0,24.5,24.5,0,44.5,0,24.5,"",0,0,0,0,1,0,0 -"900 Women",2001,72,NA,5.1,8,45.5,0,0,0,0,0,0,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"901: After 45 Years of Working",1990,29,NA,7.1,8,0,14.5,0,0,0,14.5,45.5,24.5,0,0,"",0,0,0,0,1,0,1 -"91:an Karlsson muckar (tror han)",1959,90,NA,4.5,6,14.5,0,34.5,0,34.5,0,0,14.5,0,0,"",0,0,1,0,0,0,0 -"91:an Karlssons bravader",1951,88,NA,3.6,7,14.5,24.5,0,24.5,14.5,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"91:an och generalernas fnatt",1977,101,NA,2.3,14,45.5,4.5,14.5,14.5,4.5,0,0,0,0,4.5,"",0,0,1,0,0,0,0 -"92 hak mooi gwai dui hak mooi gwai",1992,100,NA,5.9,32,4.5,0,4.5,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",1,0,1,0,0,1,0 -"92 in the Shade",1975,93,NA,5.9,56,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"9413",1998,90,NA,6.3,12,14.5,0,0,4.5,4.5,14.5,14.5,24.5,0,4.5,"",1,0,0,0,0,0,0 -"964 Pinocchio",1991,93,NA,5.7,82,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"97 ga yau choi si",1997,90,NA,4.7,59,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"976-EVIL",1989,100,NA,3.6,495,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"976-EVIL 2: The Astral Factor",1991,93,NA,2.9,162,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"976-WISH",1997,42,NA,1.8,17,14.5,0,4.5,0,4.5,0,14.5,0,14.5,44.5,"",0,0,1,0,0,1,1 -"99 Euro Films",2002,79,NA,6.1,53,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"99 River Street",1953,83,NA,7,102,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"99 Threadwaxing",1998,13,NA,4,7,14.5,14.5,0,0,14.5,0,0,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"99 mujeres",1969,108,NA,5.6,62,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"99.9",1997,106,NA,6.3,78,4.5,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"999 Aliza Mizrahi",1967,104,NA,7.1,12,4.5,0,0,0,0,4.5,14.5,24.5,0,44.5,"",0,0,1,1,0,0,0 -"999-9999",2002,103,NA,5.8,42,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"9:30",2004,13,12000,7.1,11,4.5,0,0,14.5,0,4.5,0,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"9mm of Love",2000,10,NA,6.7,27,4.5,0,0,0,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,1 -"A",1998,136,NA,5.1,18,24.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"A",2002,60,NA,2.3,11,74.5,4.5,0,0,4.5,0,0,0,0,4.5,"",0,0,0,0,1,0,0 -"A & P",1996,17,NA,5.6,26,4.5,4.5,0,0,14.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,1 -"A + (Amas)",2004,104,NA,5.2,17,4.5,14.5,4.5,0,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"A 008, operazione Sterminio",1965,84,NA,6.1,7,0,0,14.5,24.5,0,24.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"A 11-a porunca",1991,144,NA,6.2,11,0,0,0,0,0,14.5,0,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"A Banna",1980,90,NA,7,5,0,0,0,44.5,0,0,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"A Fei jing juen",1991,94,NA,7.5,986,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"A Hunting We Will Go",1932,8,NA,6.3,20,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,24.5,4.5,"",0,1,1,0,0,0,1 -"A Is for Atom",1953,14,NA,6.1,6,0,0,0,0,34.5,14.5,34.5,14.5,0,0,"",0,0,0,1,0,0,1 -"A byl li Karotin",1989,161,NA,3.9,6,34.5,0,0,0,0,34.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"A cavallo della tigre",1961,104,NA,5.9,21,0,4.5,0,24.5,0,4.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"A cavallo della tigre",2002,98,NA,5.3,17,0,0,0,14.5,24.5,14.5,24.5,0,14.5,0,"",0,0,1,0,0,0,0 -"A ciascuno il suo",1967,99,NA,6.4,52,0,0,4.5,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"A ciegas",1997,92,NA,4.7,49,14.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"A doppia faccia",1969,88,NA,4.9,43,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"A esli eto lyubov?",1961,102,NA,7.3,8,0,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"A futura memoria: Pier Paolo Pasolini",1986,115,NA,6.6,7,14.5,0,0,0,0,0,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"A galope tendido",2000,87,NA,5.6,10,0,0,14.5,0,24.5,24.5,14.5,0,0,44.5,"",0,0,1,0,0,0,0 -"A la medianoche y media",1999,90,NA,5.9,34,4.5,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"A los cirujanos se les va la mano",1980,90,NA,5.3,14,4.5,0,0,0,24.5,24.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"A los que aman",1998,98,NA,7.3,93,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,1,0,1,0 -"A mezzanotte va la ronda del piacere",1975,100,NA,5.6,27,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"A mi madre le gustan las mujeres",2002,96,NA,6.3,296,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"A ruota libera",2000,89,NA,3.6,25,44.5,0,14.5,14.5,4.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"A sega nakade?",1988,93,NA,7.4,14,0,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"A spasso nel tempo",1996,94,NA,3.5,49,45.5,4.5,4.5,14.5,4.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"A spasso nel tempo: l'avventura continua",1997,95,NA,2.7,26,45.5,4.5,14.5,4.5,14.5,0,0,0,0,4.5,"",0,0,1,0,0,0,0 -"A tiro limpio",1963,86,NA,5.8,8,14.5,0,14.5,14.5,0,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"A tiro limpio",1996,87,NA,6.7,16,0,0,14.5,14.5,14.5,24.5,4.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"A tu per tu",1984,102,NA,4.5,18,14.5,4.5,14.5,0,24.5,24.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"A un dios desconocido",1977,104,NA,6.7,15,0,0,0,4.5,4.5,14.5,4.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"A zori zdes tikhie",1972,188,NA,8.6,137,0,0,4.5,0,4.5,4.5,4.5,14.5,24.5,45.5,"",1,0,0,0,0,0,0 -"A+ Pollux",2002,90,NA,6.3,53,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"A, B, C... Manhattan",1997,90,NA,6.3,36,4.5,4.5,4.5,4.5,0,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"A-Ducking They Did Go",1939,17,NA,8,89,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"A-Haunting We Will Go",1942,68,NA,5.6,81,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"A-Haunting We Will Go",1966,6,NA,6,29,4.5,0,4.5,0,4.5,34.5,24.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"A-Lad-In Bagdad",1938,8,NA,5.6,11,0,0,0,14.5,34.5,4.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"A-Lad-in His Lamp",1948,7,NA,7.9,52,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"A-Tom-inable Snowman, The",1966,6,NA,5,26,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"A-ge-man",1990,114,NA,6.3,22,4.5,0,4.5,0,4.5,24.5,4.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"A.B. normal college (Todo na 'yan, kulang pa 'yun)",2003,115,NA,3.8,6,34.5,0,0,34.5,14.5,0,0,14.5,0,0,"",0,0,1,0,0,0,0 -"A.D.3 operazione squalo bianco",1966,82,NA,1.2,5,64.5,0,24.5,0,0,0,0,24.5,0,0,"",1,0,0,0,0,0,0 -"A.D.A.M.",1988,98,NA,5.9,27,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"A.K.",1985,71,NA,7.7,60,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"A.K.A. Birdseye",2002,90,NA,5.5,27,14.5,0,0,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"A.K.A. Don Bonus",1995,65,NA,8.2,9,14.5,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"A.N.I. 1240",2003,13,8000,5.9,9,14.5,14.5,0,0,0,24.5,34.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"A.P.E.X.",1994,98,NA,4.3,207,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"A.S.S.",1988,80,NA,6.1,9,0,0,14.5,0,0,0,24.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"A.W.O.L.",1918,5,NA,5.3,23,4.5,0,4.5,14.5,4.5,24.5,24.5,0,4.5,0,"",0,1,1,0,0,0,1 -"A.k.a. Cassius Clay",1970,85,NA,5.7,43,4.5,0,4.5,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"PG",0,0,0,0,1,0,0 -"A/R andata+ritorno",2004,86,NA,6,79,0,4.5,0,4.5,14.5,4.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"A2",2001,131,NA,8.8,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"ABBA: The Movie",1977,96,NA,6.1,613,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"ABC Africa",2001,83,NA,6.5,90,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"ABC of Love and Sex: Australia Style, The",1978,85,NA,3.7,5,0,24.5,0,24.5,64.5,0,0,0,0,0,"",0,0,1,0,1,0,0 -"ABC's of Happiness, The",2001,5,NA,3.3,17,24.5,14.5,0,0,0,14.5,4.5,4.5,0,24.5,"",0,1,0,0,0,0,1 -"ABC's of Sex Education for Trainable Persons, The",1975,20,NA,6.6,37,34.5,0,0,4.5,14.5,4.5,0,4.5,0,34.5,"",0,0,0,0,1,0,1 -"ABCD",1999,105,200000,5.4,88,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"AC/DC: Let There Be Rock",1980,95,NA,8.5,159,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"AFI's 100 Years... 100 Movies: The Antiheroes",1998,60,NA,4,19,34.5,0,0,4.5,0,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"AKA",2002,123,NA,6,335,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"AVP: Alien Vs. Predator",2004,102,45000000,5.4,14651,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Aa Ab Laut Chalen",1999,178,NA,5.5,73,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Aa Gale Lag Jaa",1973,148,NA,8.1,10,0,0,0,0,0,14.5,0,44.5,0,45.5,"",0,0,0,0,0,1,0 -"Aa Okkati Adakku",1993,155,NA,8.4,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Aab, baad, khaak",1989,75,NA,5.4,22,0,14.5,0,0,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Aadmi",1968,175,NA,8.2,15,0,0,0,0,14.5,0,4.5,44.5,34.5,4.5,"",0,0,0,0,0,1,0 -"Aag",1948,138,NA,6.5,31,4.5,0,0,0,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Aah",1953,150,NA,6.7,25,4.5,0,0,4.5,0,0,24.5,4.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Aakhree Raasta",1986,164,NA,8.2,46,0,4.5,0,4.5,0,4.5,24.5,14.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Aakrosh",1980,144,NA,7.9,31,0,0,0,0,0,4.5,14.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Aaltra",2004,92,NA,6.8,219,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Aamdani Atthanni Kharcha Rupaiya",2001,150,NA,5.2,12,14.5,0,0,0,14.5,4.5,4.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Aan",1952,101,NA,7.1,13,0,0,0,0,0,4.5,14.5,4.5,14.5,45.5,"",0,0,0,0,0,1,0 -"Aan: Men at Work",2004,149,NA,4.8,20,14.5,4.5,14.5,4.5,24.5,14.5,24.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Aandhi",1975,133,NA,7,35,0,0,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Aankhen",1993,170,NA,5.4,22,4.5,0,4.5,0,14.5,4.5,4.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Aankhen",2002,165,NA,6.8,134,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Aanslag, De",1986,144,NA,7.3,532,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Aanspreker, De",1999,26,NA,6.2,5,24.5,0,0,0,0,0,44.5,44.5,0,0,"",0,0,0,1,0,0,1 -"Aap Ki Kasam",1974,153,NA,6.6,20,0,0,14.5,0,4.5,14.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Aapathbandavudu",1992,173,NA,9.2,5,0,0,0,0,0,0,0,24.5,44.5,44.5,"",0,0,0,1,0,0,0 -"Aapo",1994,55,NA,5,26,4.5,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Aar Paar",1954,146,NA,7.2,31,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Aardwolf, De",1984,74,NA,2.2,5,44.5,0,0,24.5,0,0,0,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Aaron Cohen's Debt",1999,96,NA,5.6,16,4.5,0,4.5,14.5,0,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Aaron Loves Angela",1975,99,NA,5.7,23,4.5,4.5,0,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Aaron Slick from Punkin Crick",1952,95,NA,5.3,33,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Aashiq",2001,160,NA,3.7,11,0,24.5,4.5,4.5,0,4.5,4.5,14.5,0,14.5,"",1,0,1,1,0,0,0 -"Aashiqui",1990,152,NA,5.6,18,0,4.5,0,0,24.5,24.5,14.5,4.5,0,24.5,"",0,0,0,1,0,1,0 -"Aashirwad",1968,146,NA,8.6,11,0,0,0,0,14.5,0,0,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Aatish",1994,155,NA,8.6,16,0,0,4.5,0,4.5,0,4.5,14.5,34.5,34.5,"",1,0,0,0,0,0,0 -"Aau chin",1999,93,NA,7.1,690,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Aau chin 2",2001,95,NA,5.9,138,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Aau dut",1997,81,NA,7.1,230,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Aau fung yee",2000,82,NA,4.4,5,0,0,24.5,44.5,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Ab ins Paradies",2001,90,NA,7.9,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Ab morgen sind wir reich und ehrlich",1976,82,NA,4.6,5,24.5,0,0,24.5,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Ab nach Tibet!",1994,128,NA,2.7,6,45.5,0,0,0,0,14.5,0,34.5,0,0,"",0,0,0,0,0,0,0 -"Abade qingren",1995,115,NA,5.6,10,14.5,0,0,24.5,0,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Abajo firmantes, Los",2003,90,NA,6.2,23,24.5,0,4.5,0,0,4.5,14.5,34.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Abandon",2002,99,25000000,4.7,2364,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Abandonadas, Las",1945,103,NA,6.2,8,0,0,14.5,0,0,14.5,34.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Abandoned",1949,78,NA,6.3,16,4.5,0,0,14.5,4.5,34.5,14.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Abar Aranye",2003,123,NA,5.5,15,14.5,24.5,0,0,24.5,14.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Abashiri Bangaichi",1965,92,NA,5.5,5,0,0,0,0,24.5,24.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Abba Ganuv",1988,95,NA,5.5,17,14.5,0,4.5,14.5,0,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Abba Ganuv II",1989,85,NA,2.2,7,44.5,14.5,0,24.5,0,0,0,0,0,14.5,"",0,0,1,1,0,0,0 -"Abba Ganuv III",1991,88,NA,2.1,9,44.5,0,14.5,14.5,0,0,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Abbasso la ricchezza!",1946,90,NA,7,7,0,0,0,14.5,0,14.5,44.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Abbiamo solo fatto l'amore",1998,80,NA,3.9,12,4.5,4.5,0,14.5,4.5,34.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Abbott and Costello Go to Mars",1953,81,754000,5.2,455,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abbott and Costello Meet Captain Kidd",1952,75,450000,5.3,255,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abbott and Costello Meet Dr. Jekyll and Mr. Hyde",1953,80,NA,6,522,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abbott and Costello Meet the Invisible Man",1951,86,NA,6.2,573,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abbott and Costello Meet the Keystone Kops",1955,85,NA,5.7,252,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abbott and Costello Meet the Killer, Boris Karloff",1949,88,NA,6,466,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abbott and Costello Meet the Mummy",1955,83,NA,5.7,627,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Abbott and Costello in Hollywood",1945,85,NA,5.7,288,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abbott and Costello in the Foreign Legion",1950,85,NA,5.7,417,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abbronzatissimi",1991,96,NA,5,29,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Abbronzatissimi 2 - un anno dopo",1993,105,NA,4.2,18,24.5,4.5,4.5,4.5,34.5,14.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Abbuzze! Der Badesalz Film",1996,95,NA,5.8,191,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Abby",1974,89,400000,5.9,75,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Abby Singer",2003,79,1500,3.5,39,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Abdication, The",1974,103,NA,5.7,52,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Abducted",1986,87,NA,4.9,73,14.5,4.5,4.5,4.5,24.5,4.5,24.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Abducted",1994,2,NA,3.2,7,14.5,14.5,24.5,0,0,24.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Abducted II: The Reunion",1994,92,NA,3.1,64,24.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Abduction",1975,95,NA,4.4,38,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Abduction Club, The",2002,96,NA,6.2,212,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,1,1,0,1,0 -"Abduction of Figaro",1984,144,NA,9.1,22,0,0,0,0,0,0,0,14.5,4.5,84.5,"",0,0,1,0,0,0,0 -"Abductors, The",1957,80,NA,3.9,8,14.5,14.5,14.5,14.5,24.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Abductors, The",1972,91,NA,4,83,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Abdulla the Great",1955,103,NA,4.5,7,0,14.5,14.5,24.5,24.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Abdulladzhan, ili posvyashchaetsya Stivenu Spilbergu",1991,89,NA,5.9,24,14.5,4.5,0,0,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Abe Lincoln in Illinois",1940,110,NA,7.6,226,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Abe Lincoln: Freedom Fighter",1978,54,NA,1.6,7,44.5,14.5,0,0,24.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Abe's Manhood",2000,15,NA,5,16,0,0,14.5,14.5,14.5,24.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Abel",1986,100,NA,7.9,336,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Abel Ferrara: Not Guilty",2003,85,NA,6.5,10,0,0,14.5,14.5,0,34.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Abel Raises Cain",2005,82,NA,7.8,13,0,0,0,0,0,0,4.5,44.5,0,44.5,"",0,0,0,0,1,0,0 -"Abendland",1999,146,NA,5,46,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Abenteuer des Grafen Bobby, Die",1961,90,NA,3,24,44.5,4.5,4.5,0,4.5,4.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Abenteuer des Prinzen Achmed, Die",1926,66,NA,8.4,169,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,0,0,0,1,0 -"Abenteuer des Werner Holt, Die",1965,158,NA,8.3,42,4.5,0,0,0,0,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Abenteuer eines Sommers",1973,83,NA,3,5,0,0,64.5,0,24.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Abeoji",1997,113,NA,3.2,5,64.5,0,0,0,0,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Aberdeen",2000,106,6500000,7.3,644,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Aberration",1997,93,NA,4.8,149,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Abfahrer, Die",1978,97,NA,4.6,20,14.5,4.5,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abgefahren",2004,86,NA,4.5,93,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Abgeschminkt!",1993,55,NA,6.7,291,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Abhijaan",1962,150,NA,6.3,28,4.5,0,0,4.5,0,24.5,0,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Abie's Irish Rose",1946,96,NA,3.2,17,24.5,14.5,4.5,4.5,4.5,14.5,0,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Abilene",1999,104,NA,4.9,42,0,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,24.5,"PG",0,0,0,1,0,0,0 -"Abilene Town",1946,89,NA,6.4,102,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Abismos da Meia-Noite, Os",1984,105,NA,4.4,10,34.5,0,0,0,24.5,0,24.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Abissinia",1993,87,NA,5,17,0,0,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Abjad",2003,109,NA,6.6,39,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Ablaze",2001,97,NA,3.6,98,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Able Edwards",2004,87,30000,6.2,24,14.5,4.5,4.5,0,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Able's House Is Green, The",2003,13,6800,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,1,0,0,1 -"Abnormal Man",1994,117,NA,1.7,12,64.5,4.5,0,0,4.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Abominable Dr. Phibes, The",1971,94,NA,6.7,1547,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Abominable Snow Rabbit, The",1961,7,NA,6.9,97,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Abominable Snowman, The",1957,85,NA,6,351,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Abominable homme des douanes, L'",1963,86,NA,3.8,6,0,14.5,14.5,45.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Abomination, The",1986,100,NA,2.4,132,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Abot kamay ang pangarap",1996,100,NA,8.4,5,0,0,0,0,0,0,44.5,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Abouna",2002,84,NA,6.5,81,0,0,0,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"About Adam",2000,105,NA,6.4,1303,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"About Face",1952,94,NA,5,27,0,0,4.5,14.5,34.5,14.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"About Last Night...",1986,113,NA,5.9,3017,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"About Mrs. Leslie",1954,104,NA,6.5,77,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,1,0 -"About Schmidt",2002,125,30000000,7.3,23279,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"About a Boy",2002,101,27000000,7.5,18318,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"About a Girl",2001,9,NA,7.6,41,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Above Freezing",1998,85,NA,5,45,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Above Suspicion",1943,90,NA,6.6,224,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Above Suspicion",1995,95,NA,6.4,394,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Above Suspicion",2000,92,NA,5.8,128,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Above Us the Waves",1955,92,NA,6.7,134,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Above and Beyond",1952,122,NA,6.6,119,4.5,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Above and Beyond",2001,91,NA,4.3,35,14.5,4.5,14.5,24.5,14.5,0,4.5,4.5,0,14.5,"",0,0,0,1,0,1,0 -"Above the Dust Level",1999,9,NA,6.5,47,0,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Above the Law",1988,93,NA,5.2,3126,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Above the Rim",1994,96,NA,5.8,1065,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Abracadabra",1993,78,NA,6.8,13,0,14.5,0,0,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Abrafaxe - Unter schwarzer Flagge, Die",2001,81,NA,6.3,42,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Abraham Lincoln",1930,97,NA,5.6,149,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Abrahams Gold",1990,95,NA,9,31,0,0,0,0,0,4.5,4.5,4.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Abraxas, Guardian of the Universe",1991,90,NA,3.3,190,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Abrazo partido, El",2004,100,NA,7.4,405,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Abre los ojos",1997,117,NA,7.8,8087,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,1,0 -"Abroad with Two Yanks",1944,80,NA,5.8,17,0,0,4.5,4.5,24.5,14.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Abschied",1930,80,15000,6.7,14,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Abschied vom falschen Paradies",1989,92,NA,4.5,10,0,0,14.5,14.5,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Abschied von den Wolken",1959,99,NA,5.8,6,0,14.5,14.5,14.5,0,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Abschied von gestern - (Anita G.)",1966,88,NA,7.8,46,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Abschiedswalzer",1934,87,NA,6.4,5,0,0,0,24.5,0,0,24.5,64.5,0,0,"",0,0,0,0,0,0,0 -"Absence of Light, The",2004,94,NA,7.5,6,14.5,0,0,0,0,14.5,0,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Absence of Malice",1981,116,NA,6.8,1849,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Absence, L'",1993,112,NA,6.2,15,0,4.5,0,0,4.5,24.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Absent Minded Professor, The",1961,97,NA,6.5,1293,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Absent Without Leave",1992,95,NA,5.3,31,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,0,34.5,"",0,0,0,1,0,1,0 -"Absent-Minded Waiter, The",1977,7,NA,7.6,140,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Absolon",2003,96,8000000,4.1,548,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Absolument fabuleux",2001,105,NA,4.9,242,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Absolut",2004,94,NA,6.4,20,0,4.5,4.5,14.5,0,4.5,44.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Absolut Warhola",2001,80,NA,6.3,50,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Absolutamente Certo",1957,95,NA,6.1,13,0,0,0,4.5,14.5,4.5,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Absolute Beginners",1986,108,NA,5.3,601,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Absolute Force",1997,91,NA,6.2,9,24.5,0,14.5,0,14.5,14.5,24.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Absolute Giganten",1999,72,NA,7.6,660,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",1,0,1,1,0,1,0 -"Absolute Power",1997,121,50000000,6.4,7995,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Absolute Quiet",1936,70,NA,5.5,28,4.5,0,4.5,24.5,24.5,24.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Absolutely Positive",1991,87,NA,7.8,8,0,0,0,0,0,14.5,14.5,45.5,24.5,0,"",0,0,0,0,1,0,0 -"Absolution",1978,95,NA,5.5,123,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Absolution",2001,23,13000,1.6,8,14.5,14.5,0,0,0,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Absolution of Anthony, The",1997,13,NA,5.4,19,0,0,4.5,14.5,14.5,24.5,14.5,4.5,0,24.5,"",0,0,1,1,0,0,1 -"Abu el Banat",1973,88,NA,8,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,0,1,0,0,0 -"Abuelitos",1999,15,NA,5.3,30,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Abuelo Cheno y otras historias, El",1994,30,NA,4.5,7,0,0,0,14.5,0,0,0,0,44.5,44.5,"",0,0,0,0,1,0,1 -"Abuelo Made in Spain",1969,90,NA,3.9,37,14.5,4.5,14.5,4.5,24.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Abuelo tiene un plan, El",1973,90,NA,3.5,22,34.5,4.5,0,14.5,14.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Abuelo, El",1998,147,NA,7.7,423,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Abus de confiance",1938,88,NA,6.1,12,0,0,4.5,4.5,0,4.5,74.5,0,0,0,"",0,0,0,1,0,0,0 -"Abuse",1983,94,NA,6.8,39,0,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Abusement Park",1947,7,NA,5.2,10,0,0,0,24.5,44.5,24.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Abuzer Kadayif",2000,104,NA,5.7,79,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Abwab al Moghlaka, Al",1999,107,NA,6.1,47,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Abwege",1928,107,NA,8.2,16,0,0,0,0,0,4.5,14.5,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Abxang",2003,102,NA,7.2,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Abyss, The",1989,171,69500000,7.4,21987,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Academy Boyz",1997,90,NA,8.9,24,14.5,0,0,0,0,0,0,14.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Acadie, l'Acadie, L'",1971,75,NA,6,7,0,0,14.5,0,0,0,0,44.5,44.5,0,"",0,0,0,0,1,0,0 -"Acapulco Gold",1978,105,NA,4,25,4.5,4.5,14.5,24.5,24.5,4.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Acapulco, prima spiaggia... a sinistra",1983,88,NA,4.7,22,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Accadde al commissariato",1954,105,NA,6.2,15,0,0,4.5,14.5,14.5,24.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Accadde al penitenziario",1955,95,NA,6.1,7,0,0,0,14.5,0,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Accattone",1961,120,NA,7.6,434,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Accelerator",1999,86,NA,6.3,162,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Accent on Youth",1935,77,NA,5.1,5,0,24.5,0,0,24.5,44.5,24.5,0,0,0,"",0,0,1,0,0,1,0 -"Acceptable Levels",1983,100,NA,5.7,10,0,14.5,0,14.5,24.5,24.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Access Code",1984,88,NA,3.4,17,14.5,24.5,34.5,14.5,4.5,0,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Access Denied",1997,95,NA,3.8,43,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Accident",1967,105,600000,7.1,340,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Accident",1985,121,NA,6.5,11,14.5,0,14.5,0,4.5,0,0,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Accidental Tourist, The",1988,121,NA,6.7,4025,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Accidents",1988,86,NA,4.9,20,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Accidents",2000,15,NA,6.6,5,0,0,0,0,24.5,64.5,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Accidents Will Happen",1938,62,NA,4.6,41,14.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Accompagnatrice, L'",1992,111,NA,6.9,207,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"According to Spencer",2001,95,NA,4.1,124,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,1,0,0,1,0 -"Accordion Tribe",2004,87,NA,7.4,8,0,0,0,0,14.5,34.5,0,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Account Rendered",1957,59,NA,5.1,15,0,14.5,4.5,4.5,24.5,4.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Accountant, The",1989,100,NA,6.3,19,14.5,0,0,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Accountant, The",1999,50,5000,6.3,19,4.5,0,4.5,4.5,4.5,0,24.5,4.5,24.5,34.5,"",1,0,0,0,0,0,0 -"Accountant, The",2001,35,NA,7.5,159,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Accueil de jour, L'",2000,18,NA,8.5,5,0,0,0,0,0,0,0,24.5,84.5,0,"",0,0,0,0,1,0,1 -"Accueil familial, vieillir comme chez soi, L'",1996,17,NA,9,5,0,0,0,0,0,0,0,0,100,0,"",0,0,0,0,1,0,1 -"Accused of Murder",1956,74,NA,5.6,16,0,0,0,14.5,45.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Accused, The",1949,101,NA,6.9,120,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Accused, The",1988,111,NA,7.1,4589,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ace Drummond",1936,255,NA,6.9,22,0,0,4.5,0,24.5,24.5,14.5,24.5,4.5,0,"",1,0,0,0,0,0,0 -"Ace Eli and Rodger of the Skies",1973,89,NA,5.7,60,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ace Up My Sleeve",1976,92,NA,4.7,34,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Ace Ventura: Pet Detective",1994,86,12000000,6.2,20705,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Ace Ventura: When Nature Calls",1995,90,30000000,4.9,15161,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Ace in the Hole",1951,111,1821052,7.9,1097,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ace of Aces",1933,76,NA,5.8,45,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ace of Hearts, The",1921,75,NA,6.7,138,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Aces High",1976,114,NA,6.2,315,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Aces Wild",1936,63,NA,6.1,8,0,0,0,0,24.5,24.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Aces and Eights",1936,62,NA,6.3,10,0,0,0,0,24.5,34.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Aces: Iron Eagle III",1992,98,NA,3.2,536,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ach Egon!",1961,90,NA,4.9,30,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Ach Shel Driks, Ha-",1994,50,NA,7.3,13,0,0,0,0,0,14.5,34.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Ach du lieber Harry",1981,85,NA,5.1,54,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Ach jodel mir noch einen",1974,73,NA,4,130,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ache in Every Stake, An",1941,18,NA,8.1,84,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Achilles",1996,11,NA,8,33,4.5,0,0,4.5,4.5,0,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Achilles' Love",2000,90,NA,4.4,20,34.5,4.5,14.5,4.5,4.5,14.5,0,4.5,14.5,14.5,"PG",0,0,1,0,0,1,0 -"Achte Tag, Der",1990,99,NA,6.3,16,4.5,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Achterland",1994,93,NA,3.2,12,34.5,14.5,34.5,0,0,0,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Achtung! Banditi!",1951,90,NA,5.1,11,0,0,0,4.5,45.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Achtung, fertig, Charlie!",2003,92,NA,4.9,286,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Acid Eaters, The",1968,65,NA,3.3,24,24.5,4.5,0,14.5,14.5,4.5,4.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Acid House, The",1998,111,NA,5.8,1117,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Acne",2005,72,NA,7.1,9,14.5,0,0,14.5,0,14.5,14.5,24.5,0,34.5,"",0,0,1,0,0,0,0 -"Acordar",2001,20,NA,7.6,5,0,0,24.5,0,0,24.5,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Acosada",1984,90,NA,1.5,9,74.5,14.5,0,0,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Acqua e sapone",1983,109,NA,6.1,82,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Acqua... il fuoco, L'",2003,94,NA,7.9,9,14.5,14.5,0,0,24.5,0,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Acquaria",2003,103,NA,3.9,89,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Acquasanta Joe",1971,94,NA,4.8,15,4.5,0,4.5,24.5,24.5,14.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Acri",1996,108,NA,4.6,11,4.5,0,0,0,4.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Acrobate, L'",1976,101,NA,6.6,5,0,0,0,24.5,0,0,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Acrobate, Le",1997,123,NA,6.4,43,4.5,0,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Acrobatty Bunny",1946,8,NA,7.2,72,4.5,4.5,0,4.5,4.5,14.5,34.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Acropol",1995,125,NA,6.7,21,4.5,0,0,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Across 110th Street",1972,102,NA,6.6,325,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Across This Land with Stompin' Tom Connors",1973,90,NA,7.3,10,0,0,0,0,0,14.5,14.5,44.5,0,44.5,"",0,0,0,0,1,0,0 -"Across the Atlantic",2003,54,NA,7.3,12,0,0,0,0,0,4.5,45.5,44.5,0,0,"",0,0,0,0,1,0,0 -"Across the Badlands",1950,55,NA,7.3,10,0,0,0,14.5,0,0,44.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Across the Bridge",1957,103,NA,6.9,68,0,0,4.5,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Across the Great Divide",1976,100,NA,6,82,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Across the Line",2000,99,NA,5.6,48,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Across the Moon",1995,88,NA,4.3,93,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Across the Pacific",1942,97,NA,6.6,493,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Across the Rio Grande",1949,56,NA,6,11,0,0,0,24.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Across the Sea of Time",1995,51,NA,6.3,90,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Across the Sierras",1941,59,NA,5.1,11,0,24.5,0,14.5,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Across the Tracks",1991,100,NA,5.4,436,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Across the Wide Missouri",1951,78,5000000,6.1,209,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Across to Singapore",1928,86,290000,6.4,53,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Act One",1963,110,NA,5.4,20,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Act Your Age",1949,13,NA,2.5,7,24.5,0,44.5,14.5,14.5,0,0,0,0,0,"",0,0,0,1,0,0,1 -"Act of Murder, An",1948,91,NA,7.4,54,0,4.5,0,0,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Act of Piracy",1988,101,NA,4.2,73,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Act of Seeing with One's Own Eyes, The",1971,32,NA,6.9,93,4.5,4.5,4.5,0,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Act of Violence",1948,82,NA,7.4,274,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Act of War",1998,94,NA,3.5,64,24.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Act of the Heart",1970,103,NA,5.9,64,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Act, The",1982,94,NA,5.5,8,14.5,14.5,14.5,0,0,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Act, The",2005,8,NA,8.2,10,0,0,14.5,0,14.5,0,0,14.5,44.5,34.5,"",0,0,0,0,0,0,1 -"Acta General de Chile",1986,240,NA,7.3,10,14.5,0,0,0,0,0,24.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Actas de Marusia",1976,110,NA,5.7,33,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Acteur, L'",1974,6,NA,6.5,5,0,0,0,0,0,44.5,64.5,0,0,0,"",0,1,0,0,0,0,1 -"Acteurs anonymes, Les",2001,90,NA,6.2,16,4.5,4.5,4.5,4.5,4.5,24.5,34.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Acteurs, Les",2000,103,NA,5.1,232,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Action",1980,121,NA,4,15,0,0,14.5,44.5,0,14.5,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Action Jackson",1988,96,NA,4.4,1743,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Action League Now!!: Rock-A-Big-Baby",1997,5,NA,2.8,26,14.5,4.5,4.5,0,0,14.5,4.5,4.5,4.5,44.5,"PG",0,1,1,0,0,0,1 -"Action Nitsch-Journiac",1989,10,NA,5.7,6,0,0,14.5,0,0,0,14.5,34.5,34.5,0,"",1,0,0,0,0,0,1 -"Action On the Beach",1964,6,NA,6.6,6,14.5,0,0,0,0,34.5,14.5,0,0,34.5,"",0,0,0,0,1,0,1 -"Action U.S.A.",1989,89,NA,5,21,14.5,4.5,4.5,4.5,14.5,4.5,4.5,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Action de corps exclu",1983,15,NA,8.7,6,0,0,0,0,0,0,0,64.5,34.5,0,"",1,0,0,0,0,0,1 -"Action for Slander",1937,83,NA,5.6,12,14.5,0,0,0,14.5,14.5,24.5,0,14.5,4.5,"",0,0,0,1,0,0,0 -"Action in Arabia",1944,72,NA,6.2,36,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Action in the North Atlantic",1943,126,NA,6.8,362,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Action of the Tiger",1957,93,NA,4.9,65,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Action: The October Crisis of 1970",1974,87,NA,8.6,24,0,4.5,0,0,0,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Active Stealth",1999,99,NA,3,146,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Acto de Primavera",1963,94,NA,5.1,17,0,14.5,4.5,14.5,0,4.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Actor's and Sin",1952,82,NA,5.8,27,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Actors Anonymous: The Truth Behind the Dream",2003,60,30000,3.2,8,45.5,14.5,0,0,0,0,14.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Actors, The",2003,91,NA,5.6,211,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Actress, The",1953,90,NA,6.6,119,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Actrius",1997,90,NA,5.8,37,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Acts of Betrayal",1997,90,3000000,4.6,94,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Acts of Worship",2001,94,NA,6.2,43,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Ad Fundum",1993,98,NA,6.1,187,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ad and the Ego, The",1997,57,NA,4.4,16,14.5,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Ad ogni costo",1967,114,NA,6.5,102,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ad ovest di Paperino",1982,102,NA,7.2,38,0,0,0,4.5,4.5,14.5,34.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Ada",1961,109,NA,6.6,121,4.5,4.5,0,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ada apa dengan cinta?",2002,112,NA,7.1,151,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Adada",1987,118,NA,7.1,14,4.5,0,4.5,0,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Adagio",2000,7,NA,6.9,7,0,0,0,0,14.5,0,24.5,0,14.5,44.5,"",0,1,0,1,0,0,1 -"Adam",1991,6,NA,6.8,142,0,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Adam",1997,4,NA,7,6,0,0,0,14.5,0,0,34.5,34.5,14.5,0,"",0,1,0,0,0,0,1 -"Adam & Eva",1997,104,NA,6.6,633,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Adam & Eva",2003,99,NA,6.6,89,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Adam & Evil",2004,90,NA,3.4,81,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Adam & Paul",2004,83,NA,6.8,96,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Adam Had Four Sons",1941,81,488000,6.2,76,4.5,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Adam and Evelyne",1949,70,NA,5.8,37,0,0,0,14.5,14.5,44.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Adam and Evil",1927,70,NA,1.8,5,64.5,24.5,0,24.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Adam at 6 A.M.",1970,100,NA,5.8,61,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Adam barfi",1995,106,NA,6.1,30,4.5,4.5,4.5,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Adam og Eva",1953,96,NA,7.2,9,0,0,0,0,0,34.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Adam's Rib",1949,101,NA,7.6,3282,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Adam's Woman",1970,116,NA,5.8,49,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Adamah",1947,48,NA,9.4,7,0,0,0,0,0,14.5,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Adamo ed Eva, la prima storia d'amore",1983,91,NA,2.5,11,24.5,0,4.5,4.5,4.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,1,0 -"Adamski",1994,89,NA,7.2,9,0,0,14.5,0,14.5,14.5,0,44.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Adamsson i Sverige",1966,79,NA,4.5,6,14.5,0,34.5,0,0,45.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Adaptation.",2002,114,19000000,7.9,25140,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Adaptatziya",1981,165,NA,9.6,27,0,0,0,0,4.5,0,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Addams Family Values",1993,94,NA,6.1,7756,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Addams Family, The",1991,99,38000000,6.4,11549,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Addicted to Love",1988,87,NA,5.8,5,0,0,0,24.5,24.5,64.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Addicted to Love",1997,100,NA,6,5445,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Addicted to Murder: Tainted Blood",1998,74,NA,4.5,22,24.5,14.5,0,4.5,0,14.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Addiction",2003,115,NA,6.9,14,14.5,0,0,0,0,4.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Addiction, The",1995,82,NA,5.8,1425,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Adding Machine, The",1969,100,NA,5.6,45,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Addio Kira!",1942,95,NA,7.8,11,0,0,0,0,4.5,0,0,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Addio ultimo uomo",1978,91,NA,5.9,8,0,0,14.5,0,14.5,14.5,14.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Addio zio Tom",1971,103,NA,5.8,91,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Addio, fratello crudele",1971,91,NA,5.2,33,0,4.5,0,14.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Addition, L'",1984,85,NA,6,35,0,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Address Unknown",1944,75,NA,6.2,12,0,4.5,0,4.5,14.5,4.5,24.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Address Unknown",1997,92,NA,4.9,80,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Adebar",1957,2,NA,7.8,5,0,0,0,0,24.5,24.5,0,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Adela",1987,88,NA,2.9,5,0,84.5,0,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Adela",2000,103,NA,6.4,5,0,24.5,0,0,0,0,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Adelbert",1977,32,NA,5.3,13,0,0,14.5,0,0,0,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Adelfos Anna",1963,105,NA,7.8,6,0,0,0,0,0,14.5,14.5,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Adelheid",1969,99,NA,6.1,32,0,0,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Ademloos",1982,90,NA,6.4,14,0,0,0,4.5,4.5,44.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Adeus Princesa",1994,93,NA,6.7,13,4.5,0,0,4.5,4.5,14.5,34.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Adeus, Pai",1996,85,NA,6.3,77,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Adi Shankaracharya",1983,130,NA,6.6,16,0,4.5,0,0,0,0,14.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Adi Vasfiye",1985,90,NA,6.9,33,4.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Adieu",2003,124,NA,8,17,0,4.5,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Adieu Babylone",2001,91,NA,5.2,49,4.5,0,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Adieu Bonaparte",1985,115,NA,6.4,27,4.5,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Adieu Philippine",1962,106,NA,7.7,39,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Adieu blaireau",1985,94,NA,5.6,11,4.5,14.5,4.5,14.5,0,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Adieu je t'aime",1988,92,NA,3.7,7,0,14.5,14.5,14.5,14.5,14.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Adieu l'ami",1968,115,NA,6,169,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Adieu pays",2003,85,NA,6.6,7,0,0,0,0,24.5,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Adieu, Galaxy Express 999",1997,135,NA,4.8,34,14.5,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Adieu, plancher des vaches!",1999,118,NA,6.5,252,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Adieu, poulet",1975,91,NA,7.2,118,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Adio, Rio",1989,88,NA,8.6,24,4.5,0,0,0,4.5,4.5,24.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Adjuster, The",1991,102,NA,6.9,687,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Admirable Crichton, The",1957,94,NA,6.3,144,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Admiral Cigarette",1897,1,NA,4.4,34,4.5,4.5,4.5,14.5,14.5,14.5,24.5,0,4.5,4.5,"",0,0,0,0,1,0,1 -"Admiral Dewey Leading Land Parade",1899,1,NA,4.1,27,14.5,4.5,24.5,4.5,24.5,14.5,4.5,4.5,4.5,0,"",0,0,0,0,1,0,1 -"Admiral Ushakov",1953,108,NA,5.9,10,0,0,0,14.5,0,24.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Admiral Was a Lady, The",1950,87,NA,5.4,37,0,0,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Admission Free",1932,7,NA,7.4,11,0,0,0,0,4.5,34.5,4.5,4.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Admit One",1999,4,NA,5,20,4.5,14.5,0,4.5,44.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Adolescente, L'",1979,90,NA,5.6,21,4.5,0,4.5,0,4.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Adolescente, sucre d'amour",1985,90,NA,5.4,6,0,14.5,0,0,14.5,0,14.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Adolescentes, Las",1975,105,NA,4,25,14.5,4.5,14.5,14.5,14.5,14.5,0,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Adolf Armstarke",1937,87,NA,3.9,12,0,4.5,24.5,14.5,44.5,4.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Adolf Hitler - My Part in His Downfall",1972,102,NA,5.2,71,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Adolf Hitler - Wahlpropagandafilm",1938,8,NA,6.6,8,34.5,0,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Adolf i toppform",1952,84,NA,4,5,0,0,0,64.5,24.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Adolf und Marlene",1977,88,NA,6.6,6,0,0,0,0,0,45.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Adolphe",2002,100,NA,5.4,144,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Adorable",1933,88,NA,6.1,5,0,0,24.5,24.5,24.5,0,0,0,0,44.5,"",0,0,1,0,0,1,0 -"Adorable menteuse",1962,105,NA,6,16,0,0,0,14.5,34.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Adorables mentiras",1992,108,NA,5.5,12,14.5,0,4.5,14.5,0,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Adoration",1996,16,NA,4.5,9,14.5,14.5,14.5,14.5,0,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Adorenarin doraibu",1999,112,NA,7.3,293,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Adosados",1996,95,NA,5.7,28,0,0,4.5,14.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Adrenalin: Fear the Rush",1996,88,NA,3.5,664,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Adrenaline",2000,97,NA,5.8,8,0,0,45.5,0,0,14.5,0,14.5,0,24.5,"",1,0,0,0,0,0,0 -"Adrenaline Rush: The Science of Risk",2002,40,NA,8.4,22,4.5,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Adrian",1998,15,NA,4.9,8,14.5,0,0,24.5,14.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Adrian und der Wolf",2000,10,NA,5.3,5,0,0,0,0,44.5,0,0,64.5,0,0,"",0,0,0,0,0,0,1 -"Adua e le compagne",1960,128,NA,7.2,31,4.5,4.5,0,4.5,0,4.5,34.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Adult Version of Jekyll & Hide, The",1972,75,NA,3.5,41,24.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Adulterer, The",2000,85,NA,8.7,6,0,0,0,0,14.5,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Adulteress, The",1973,85,NA,2.9,13,34.5,4.5,14.5,24.5,0,0,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Adulterio all'italiana",1966,95,NA,5.6,12,0,0,0,4.5,14.5,24.5,4.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Advance and Be Mechanized",1967,6,NA,4.7,22,14.5,14.5,4.5,4.5,14.5,4.5,14.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Advance to the Rear",1964,100,NA,5.8,120,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Adventure",1945,135,3500000,5.4,106,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Adventure Girl",1934,69,NA,4.7,18,4.5,4.5,4.5,24.5,14.5,34.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Adventure Island",1947,66,NA,5.2,14,4.5,0,0,14.5,34.5,24.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Adventure in Baltimore",1949,89,NA,5.3,30,0,0,4.5,14.5,34.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Adventure in Diamonds",1940,76,NA,6.4,6,0,0,0,0,0,34.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Adventure in Iraq",1943,65,NA,4.6,14,0,4.5,24.5,24.5,4.5,14.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Adventure in Manhattan",1936,73,NA,6.4,17,0,0,4.5,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Adventure of Faustus Bidgood, The",1986,110,NA,8.5,14,0,0,0,0,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Adventure of Sherlock Holmes' Smarter Brother, The",1975,91,NA,5.9,904,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Adventure of the Wrong Santa Claus, The",1914,14,NA,6.1,25,0,0,4.5,4.5,0,45.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,1 -"Adventure's End",1937,60,90000,3.3,16,24.5,14.5,4.5,0,14.5,14.5,0,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Adventurers, The",1951,74,NA,3.9,6,0,0,14.5,34.5,34.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Adventurers, The",1970,171,NA,4.3,139,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Adventures in Babysitting",1987,102,NA,6.3,5363,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Adventures in Dinosaur City",1992,88,NA,3.3,87,24.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Adventures in South America",1945,10,NA,6.1,9,0,0,0,0,34.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"Adventures in Wild California",2000,41,NA,7.2,51,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Adventures of Baron Munchausen, The",1988,125,46630000,6.8,7927,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Adventures of Barry McKenzie, The",1972,114,NA,5.2,101,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Adventures of Billy, The",1911,18,NA,5.2,5,0,24.5,0,0,44.5,24.5,0,0,0,24.5,"",0,0,0,1,0,0,1 -"Adventures of Bob & Doug McKenzie: Strange Brew, The",1983,90,4000000,6.6,4556,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Adventures of Buckaroo Banzai Across the 8th Dimension, The",1984,103,NA,6.1,5036,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Adventures of Bullwhip Griffin, The",1967,108,NA,6.6,122,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Adventures of Buttman, The",1989,119,NA,6.1,15,14.5,0,0,4.5,0,4.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Adventures of Captain Fabian",1951,100,NA,5.9,34,4.5,4.5,0,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Adventures of Captain Marvel",1941,216,NA,7.3,146,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Adventures of Dick Black the Black Dick, The",1987,85,NA,1.4,21,44.5,4.5,0,0,4.5,0,0,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Adventures of Dollie, The",1908,12,0,5.1,34,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,4.5,14.5,"",1,0,0,0,0,0,1 -"Adventures of Don Coyote",1947,65,NA,5.8,5,0,0,0,24.5,0,24.5,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Adventures of Don Juan",1948,110,NA,6.7,362,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Adventures of Elmo in Grouchland, The",1999,89,17000000,5.5,420,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Adventures of Ford Fairlane, The",1990,104,NA,5.2,4133,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Adventures of Frank and Jesse James",1948,180,NA,6.9,17,4.5,0,4.5,0,0,24.5,24.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Adventures of Frontier Fremont",1976,106,NA,5.4,13,0,0,0,24.5,24.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Adventures of Gallant Bess",1948,71,NA,5.9,13,0,0,0,4.5,24.5,44.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Adventures of Gerard, The",1970,92,NA,4.1,23,4.5,4.5,24.5,0,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Adventures of Hajji Baba, The",1954,94,NA,5.7,68,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Adventures of Handyman, The",2000,5,NA,7.2,5,0,0,0,0,24.5,44.5,0,0,24.5,24.5,"",0,0,1,0,0,0,1 -"Adventures of Huck Finn, The",1993,108,6500000,5.9,1134,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Adventures of Huckleberry Finn, The",1939,91,NA,7.1,121,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Adventures of Huckleberry Finn, The",1960,107,NA,6.1,216,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Adventures of Ichabod and Mr. Toad, The",1949,68,NA,7.3,625,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Adventures of Jane Arden, The",1939,58,NA,5.7,29,0,4.5,0,4.5,34.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Adventures of Lucky Pierre, The",1961,70,7100,1.9,15,44.5,4.5,4.5,4.5,4.5,4.5,0,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Adventures of Marco Polo, The",1938,100,2000000,5.8,136,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Adventures of Mark Twain, The",1944,130,NA,6.8,127,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Adventures of Mark Twain, The",1986,86,NA,7.1,116,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Adventures of Martin Eden, The",1942,87,NA,7.9,7,0,0,0,0,0,0,24.5,45.5,14.5,0,"",0,0,0,0,0,0,0 -"Adventures of Mikki Finn, The",1991,85,NA,5.6,24,4.5,0,0,4.5,4.5,24.5,14.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Adventures of Pinocchio, The",1996,92,25000000,5.6,577,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Adventures of Pluto Nash, The",2002,95,100000000,3.9,2543,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Adventures of Popeye",1935,9,NA,5.6,33,0,4.5,14.5,4.5,24.5,14.5,4.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Adventures of Priscilla, Queen of the Desert, The",1994,104,NA,7.2,7721,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Adventures of Quentin Durward, The",1955,100,NA,6,126,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Adventures of Ragtime, The",1998,96,NA,2.8,26,24.5,0,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Adventures of Red Ryder",1940,205,NA,7.4,28,0,4.5,0,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Adventures of Rex and Rinty, The",1935,229,NA,4.6,5,0,24.5,0,0,0,24.5,24.5,24.5,24.5,0,"",1,0,0,0,0,0,0 -"Adventures of Robin Hood, The",1938,102,1900000,8.2,7359,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",1,0,0,0,0,1,0 -"Adventures of Rocky & Bullwinkle, The",2000,88,76000000,4.3,4815,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,1,1,0,0,0,0 -"Adventures of Sebastian Cole, The",1998,99,NA,6.5,579,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Adventures of Sherlock Holmes, The",1939,85,NA,7.7,509,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Adventures of Sir Galahad, The",1949,252,NA,7,10,0,0,0,14.5,14.5,0,34.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Adventures of Smilin' Jack",1943,265,NA,8.2,18,0,14.5,0,0,0,14.5,4.5,34.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Adventures of Tom Sawyer, The",1938,119,NA,7.4,209,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Adventures of a Plumber's Mate",1978,88,NA,3.3,40,24.5,14.5,14.5,14.5,24.5,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Adventures of a Private Eye",1977,96,NA,3.6,45,14.5,4.5,24.5,4.5,14.5,24.5,4.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Adventures of a Rookie, The",1943,64,NA,5.4,12,0,4.5,4.5,34.5,14.5,4.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Adventures of a Taxi Driver",1976,89,NA,3.6,72,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Adventures of the American Rabbit, The",1986,87,NA,6,46,4.5,4.5,0,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Adventures of the Flying Cadets",1943,265,NA,6.3,9,0,0,14.5,0,0,34.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Adventures of the Masked Phantom, The",1939,60,NA,3.9,7,14.5,14.5,24.5,14.5,0,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Adventures of the Road-Runner",1962,26,NA,8,35,0,0,0,0,0,14.5,4.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Adventures of the Wilderness Family, The",1975,100,NA,5.9,174,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Adventurous Blonde, The",1937,61,NA,6.7,44,0,4.5,0,4.5,4.5,24.5,34.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Adversaire, L'",2002,129,NA,6.7,442,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Advice From a Caterpillar",1999,90,NA,5.4,108,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Advice and Dissent",2002,21,NA,8.2,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,1,0,0,0,1 -"Advice to the Lovelorn",1933,62,NA,5.5,11,0,0,4.5,4.5,4.5,24.5,44.5,0,0,0,"",0,0,1,1,0,1,0 -"Advise and Consent",1962,142,NA,7.7,611,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Advocaat van de Hanen",1996,109,NA,5.8,19,0,0,0,14.5,24.5,44.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Adwa",1999,90,NA,8.8,10,0,0,0,0,0,34.5,0,0,0,74.5,"",0,0,0,0,1,0,0 -"Aeg maha",1984,9,NA,7.6,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Aelan",1989,105,NA,3.2,7,45.5,0,24.5,0,0,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Aelita",1924,67,NA,6.5,181,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Aenigma",1987,85,NA,4.4,149,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Aerial Gunner",1943,78,NA,5.9,21,4.5,4.5,0,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Aerobisex Girls",1983,85,NA,4.9,12,4.5,0,4.5,0,0,4.5,4.5,0,34.5,34.5,"",0,0,0,0,0,0,0 -"Aerograd",1935,82,NA,7.2,20,4.5,0,0,14.5,0,24.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Aeroplane Flight and Wreck (Piloted by M. Cody)",1910,4,NA,5.6,58,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Aetbaar",2004,152,NA,5.1,47,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Affair in Havana",1957,77,NA,5.2,18,0,0,4.5,14.5,34.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Affair in Reno",1957,75,NA,5.8,6,0,0,0,0,14.5,45.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Affair in Trinidad",1952,98,NA,6.2,122,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Affair of the Necklace, The",2001,118,NA,6,963,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Affair play",1995,95,NA,5.9,15,0,0,0,4.5,24.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Affair to Remember, An",1957,119,NA,7.2,3373,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Affair with a Stranger",1953,87,NA,5.8,56,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,0,4.5,"",0,0,1,1,0,1,0 -"Affaire Blum",1948,109,NA,7.2,9,0,0,0,0,0,14.5,44.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Affaire Bronswik, L'",1978,24,NA,7.8,19,0,0,0,0,4.5,14.5,4.5,24.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Affaire Dominici, L'",1973,105,NA,6.5,57,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Affaire Marcorelle, L'",2000,96,NA,7.1,68,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Affaire Maurizius, L'",1954,110,NA,7.5,16,14.5,0,4.5,4.5,4.5,0,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Affaire coffin, L'",1980,107,NA,5.9,17,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Affaire des divisions Morituri, L'",1985,75,NA,7.6,8,24.5,0,0,0,14.5,0,0,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Affaire des poisons, L'",1955,103,NA,6.1,11,4.5,0,0,14.5,4.5,24.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Affaire du collier de la reine, L'",1946,118,NA,8.1,5,0,0,0,0,24.5,0,44.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Affaire du courrier de Lyon, L'",1937,102,NA,7.1,7,0,0,0,0,0,14.5,45.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Affaire est dans le sac, L'",1932,55,NA,8.1,9,0,0,0,0,0,0,24.5,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Affaire, L'",1994,96,NA,3,7,24.5,0,44.5,14.5,14.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Affaires publiques, Les",1934,25,NA,6.8,13,0,0,0,0,4.5,34.5,34.5,4.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Affairs of Anatol, The",1921,117,NA,6.7,66,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Affairs of Annabel, The",1938,68,NA,5.9,49,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Affairs of Cappy Ricks, The",1937,56,NA,5.7,5,0,24.5,24.5,0,0,44.5,24.5,0,0,0,"",0,0,1,1,0,0,0 -"Affairs of Cellini, The",1934,80,549370,5.8,43,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Affairs of Dobie Gillis, The",1953,72,NA,5.9,71,0,4.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Affairs of Janice",1976,72,NA,1.1,7,24.5,0,14.5,0,0,0,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Affairs of Martha, The",1942,66,NA,6.5,27,0,0,0,0,14.5,14.5,44.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Affairs of Susan, The",1945,110,NA,6.4,29,0,0,0,4.5,4.5,24.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Affairs with Bears",2002,27,7000,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,1,0,1 -"Affectionately Yours",1941,88,NA,5.7,50,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Affengeil",1990,87,NA,6.7,9,0,0,0,0,34.5,0,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Affiches en goguette, Les",1904,3,NA,6.5,66,4.5,0,0,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Affittacamere, L'",1976,100,NA,3.5,9,24.5,0,14.5,24.5,24.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Affittasi appartamento",2002,10,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Affliction",1996,45,NA,5.5,6,14.5,0,0,14.5,14.5,0,0,0,14.5,34.5,"",0,0,0,0,1,0,0 -"Affliction",1997,114,6000000,6.9,3679,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Afganistan - The last war bus (L'ultimo bus di guerra)",1989,90,NA,2.9,21,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Afganskiy izlom",1990,140,NA,7,13,0,0,0,0,4.5,14.5,14.5,24.5,34.5,4.5,"",0,0,0,0,0,0,0 -"Afghan Stories",2002,60,NA,7.3,13,0,0,4.5,0,0,14.5,24.5,34.5,0,24.5,"",0,0,0,0,1,0,0 -"Afgrund af frihed, En",1989,90,NA,5.7,19,14.5,14.5,0,14.5,24.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Afgrunden",1910,38,NA,6,37,4.5,4.5,0,0,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Afmagt",1998,50,NA,5.2,18,24.5,0,0,14.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Afonya",1975,92,NA,7.6,112,0,4.5,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Afraid of Everything",2004,80,NA,7.1,12,0,0,0,0,4.5,24.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Afraid of the Dark",1991,91,NA,5.2,192,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Afraid to Dance",1988,87,NA,3.7,12,0,4.5,4.5,4.5,14.5,4.5,0,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Afrance, L'",2001,90,NA,5.6,36,4.5,0,4.5,0,4.5,24.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Africa - Texas Style!",1967,109,NA,5.3,36,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Africa Express",1975,98,NA,4.4,30,0,0,14.5,14.5,24.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Africa Express",1989,94,NA,3.1,8,45.5,0,14.5,24.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Africa Screams",1949,82,NA,5.4,459,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Africa Speaks",1930,75,NA,6.1,6,0,0,0,14.5,34.5,0,14.5,14.5,14.5,0,"",0,0,0,0,1,1,0 -"Africa Speaks -- English",1933,11,NA,6.8,9,0,0,0,14.5,34.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Africa addio",1966,83,NA,6.3,98,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Africa ama",1971,110,NA,6.6,5,0,0,0,44.5,0,0,24.5,0,44.5,0,"",0,0,0,0,1,0,0 -"Africa dolce e selvaggia",1982,96,NA,3.3,20,14.5,24.5,4.5,14.5,4.5,14.5,0,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Africa's Elephant Kingdom",1998,40,NA,7.6,33,0,0,4.5,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Africa: The Serengeti",1994,39,NA,7.3,115,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Africain, L'",1983,101,NA,6.2,88,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"African Diary",1945,6,NA,6.4,53,4.5,4.5,0,4.5,14.5,14.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"African Lion, The",1955,75,NA,7.1,19,4.5,0,0,14.5,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"African Queen, The",1951,105,NA,8.1,13765,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"African Timber",1989,100,NA,3.3,9,44.5,0,24.5,14.5,0,0,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"African Treasure",1952,70,NA,5.4,8,0,0,0,14.5,34.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"African-American Idol: The Search for the Next Black Leader",2003,17,NA,2,9,44.5,14.5,14.5,0,24.5,0,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Africana, L'",1990,105,NA,7.2,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Afrika",2002,112,NA,5,43,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Afrique, je te plumerai",1993,88,NA,6,8,0,0,0,14.5,14.5,34.5,34.5,0,0,0,"",0,0,0,0,1,0,0 -"Afrit merati",1968,100,NA,6,5,0,0,0,0,44.5,24.5,0,44.5,0,0,"",0,0,1,0,0,0,0 -"Afrita hanem",1947,97,NA,4.7,7,0,0,0,14.5,0,0,44.5,24.5,14.5,0,"",0,0,1,0,0,1,0 -"Afro Deutsch",2002,13,NA,7.1,7,14.5,14.5,0,0,0,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Afrodite, dea dell'amore",1958,86,NA,5,11,0,0,4.5,14.5,0,34.5,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Afropunk: The 'Rock n Roll Nigger' Experience",2003,66,NA,7.4,23,0,4.5,0,0,0,14.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Afsane-ye-ah",1991,105,NA,5.2,11,14.5,4.5,4.5,0,0,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Afsaneh-e eshgh",2000,87,NA,6.9,6,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Afskedens time",1973,79,NA,5.9,5,0,0,0,0,44.5,64.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Afsporet",1942,102,NA,8.1,9,0,0,0,0,0,0,24.5,64.5,0,14.5,"",0,0,0,1,0,1,0 -"Afsporet",2000,37,NA,5.9,8,0,0,0,0,34.5,45.5,0,14.5,0,0,"",0,0,0,1,0,0,1 -"Afta",2000,24,NA,7.3,16,4.5,0,0,0,4.5,34.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Aftenland",2003,27,NA,5.2,8,0,0,0,14.5,14.5,34.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Aftenlandet",1977,109,NA,5.5,8,0,0,0,0,34.5,24.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"After",1990,45,NA,6.3,22,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"After Alice",1999,100,NA,5.3,446,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"After Dark, My Sweet",1990,114,NA,6.3,527,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"After Darkness",1985,104,NA,4.7,29,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"After Death",1988,84,NA,4.3,202,24.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"After Freedom",2002,87,NA,7.4,11,4.5,0,0,4.5,0,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"After Grad with Dad",1980,25,NA,7.1,13,4.5,4.5,0,0,4.5,24.5,24.5,24.5,4.5,0,"",0,0,0,0,0,0,1 -"After Hours",1984,26,NA,6.5,121,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"After Hours",1985,96,4500000,7.4,5630,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"After Image",2001,92,1200000,3.9,60,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"After Midnight",1927,70,NA,8.7,12,0,0,0,0,0,0,4.5,14.5,45.5,24.5,"",0,0,0,1,0,0,0 -"After Midnight",1989,90,3000000,5.1,160,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"After Midnight with Boston Blackie",1943,64,NA,6.9,16,0,0,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"After Office Hours",1935,72,NA,6.3,63,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"After Party",2002,94,NA,2.3,52,94.5,4.5,0,4.5,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"After School",1989,89,NA,4,16,4.5,14.5,14.5,14.5,34.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"After School Special, The",2000,90,NA,8.6,38,4.5,4.5,4.5,0,0,4.5,0,4.5,4.5,74.5,"",0,0,1,0,0,0,0 -"After Sex",2000,96,5000000,4.5,205,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"After Stonewall",1999,88,NA,7.6,30,0,4.5,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"After Tonight",1933,71,NA,5.4,11,0,0,0,0,44.5,4.5,24.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"After the Apocalypse",2004,72,NA,6.8,32,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"After the Dance",1935,60,NA,2.2,5,44.5,24.5,0,0,24.5,24.5,0,0,0,0,"",0,0,0,0,0,1,0 -"After the Rain",2000,87,NA,2.8,29,14.5,14.5,14.5,24.5,4.5,4.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"After the Sunset",2004,97,58000000,6,3431,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"After the Thin Man",1936,112,NA,7.5,1209,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"After-School Special",2004,15,NA,8.3,22,0,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,1 -"AfterLife",2003,100,NA,6,16,4.5,14.5,0,0,0,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Afterglow",1997,113,NA,6.1,1169,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Afterlife",1978,7,NA,8.4,8,0,0,0,0,0,0,0,64.5,0,34.5,"",0,1,0,0,0,0,1 -"Afterman, The",1985,90,NA,3.4,10,14.5,0,34.5,0,0,0,0,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Aftermath",1994,30,NA,5.4,160,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Aftermath",2002,83,NA,4.7,51,4.5,14.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Aftermath, The",1982,81,NA,3.7,61,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Aftermath: The Remnants of War",2001,74,NA,8.1,14,0,0,0,0,0,0,24.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Afternoon Delights",1980,80,NA,4.6,15,14.5,0,14.5,0,0,34.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Afternoon of a Champion",1972,80,NA,6.8,10,0,0,14.5,14.5,0,0,34.5,24.5,0,34.5,"",0,0,0,0,1,0,0 -"Afterschool Delight",2003,10,5000,6.3,5,0,0,0,0,0,64.5,24.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Aftershock",1990,91,NA,3.5,52,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Afti i nihta meni",2000,112,NA,7.4,55,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Afula Express",1997,95,NA,6.7,52,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Afurika monogatari",1981,120,NA,4.7,24,4.5,14.5,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Against All Flags",1952,83,NA,6.7,239,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Against All Odds",1984,128,NA,5.6,1897,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Against a Crooked Sky",1975,89,NA,5.3,67,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Against the Dying of the Light",2001,10,NA,5.8,40,4.5,0,0,0,0,4.5,14.5,14.5,14.5,45.5,"",0,0,0,0,1,0,1 -"Against the Law",1997,81,NA,3.7,73,14.5,14.5,4.5,4.5,14.5,14.5,14.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Against the Ropes",2004,111,NA,5.2,1058,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Against the Wind",1948,96,NA,6.4,68,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Agantuk",1991,97,NA,8,140,0,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Agapi einai elefantas, I",2000,86,NA,5,16,4.5,14.5,4.5,14.5,4.5,34.5,14.5,0,14.5,0,"",0,0,1,0,0,1,0 -"Agapi kai aima",1968,105,NA,6.7,9,24.5,0,0,0,14.5,0,44.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Agapi mas, I",1968,95,NA,5.5,13,14.5,4.5,4.5,14.5,14.5,0,34.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Agapi mou oua-oua...",1974,96,NA,5.3,9,0,24.5,0,0,14.5,0,45.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Agapi mou paliogria",1972,97,NA,5.9,14,4.5,4.5,4.5,14.5,14.5,24.5,24.5,0,0,4.5,"",0,0,1,0,0,1,0 -"Agapisa mia polithrona",1971,92,NA,4.9,14,4.5,0,24.5,14.5,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Agata e la tempesta",2004,120,NA,6.2,123,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Agatha",1979,105,NA,5.7,383,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Age Isn't Everything",1991,90,NA,5.2,26,14.5,14.5,4.5,0,4.5,14.5,0,0,4.5,44.5,"",0,0,1,1,0,0,0 -"Age of Consent",1969,98,NA,6.3,148,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Age of Consent, The",1932,63,NA,5.2,30,0,4.5,14.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Age of Innocence",1977,101,850000,6.1,47,4.5,0,0,4.5,24.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Age of Innocence, The",1934,81,NA,5.7,33,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Age of Innocence, The",1993,139,34000000,7.1,6049,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Age to Age",1999,76,NA,5,11,0,0,14.5,4.5,4.5,14.5,0,24.5,14.5,0,"",1,0,0,1,0,0,0 -"Agee",1980,98,NA,5,5,0,24.5,0,24.5,44.5,0,24.5,0,0,0,"",0,0,0,0,1,0,0 -"Agency",1980,94,NA,5.3,76,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Agenda 187",1999,82,NA,5.3,32,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Agent 69 Jensen - I skorpionens tegn",1977,89,NA,4.7,32,0,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Agent 69 Jensen - I skyttens tegn",1978,91,NA,4.6,32,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Agent Cody Banks",2003,102,26000000,5.5,2655,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Agent Cody Banks 2: Destination London",2004,100,26000000,3.8,919,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Agent Orange",2004,5,NA,5.3,124,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Agent Sinikael",2002,78,NA,7.5,28,4.5,4.5,0,14.5,4.5,4.5,14.5,24.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Agent for H.A.R.M.",1966,84,NA,2.4,279,44.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Agent nr 1",1972,97,NA,3.1,5,0,24.5,0,44.5,0,0,24.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Agent on Ice",1985,96,2500000,4.4,15,14.5,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Agent trouble",1987,90,NA,5.8,50,4.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Agente 077 dall'oriente con furore",1965,94,NA,4.4,5,24.5,0,0,0,0,44.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Agente 077 missione Bloody Mary",1965,104,NA,5.6,6,14.5,0,0,0,0,45.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Agente 3S3, massacro al sole",1966,106,NA,4.6,9,0,0,14.5,14.5,24.5,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Agente Logan - missione Ypotron",1966,92,NA,4.8,5,44.5,0,0,0,0,0,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Agente XU 777",1963,110,NA,6.1,10,14.5,0,0,0,14.5,24.5,34.5,0,24.5,14.5,"",0,0,1,0,0,0,0 -"Agents secrets",2004,109,NA,5.5,479,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Agentti 000 ja kuoleman kurvit",1983,88,NA,2.9,44,34.5,14.5,4.5,14.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Agenty KGB tozhe vlyublyayutsya",1991,88,NA,5.5,11,0,4.5,4.5,0,4.5,45.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Agenzia Riccardo Finzi, praticamente detective",1978,92,NA,4.7,13,4.5,0,0,24.5,4.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Aggie Appleby Maker of Men",1933,73,NA,5.6,26,0,4.5,4.5,4.5,14.5,14.5,44.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Agi Murad il diavolo bianco",1959,91,NA,4.3,30,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Agigongryong Doolie",1996,80,NA,8.2,8,0,0,0,0,0,0,0,34.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Agimat, anting-anting ni Lolo, Ang",2002,115,NA,5.3,7,14.5,0,0,0,24.5,24.5,0,0,24.5,0,"",1,0,0,0,0,0,0 -"Agios Prevezis, O",1982,92,NA,8.6,9,14.5,0,0,0,0,14.5,0,0,0,74.5,"",0,0,0,1,0,0,0 -"Agir roman",1997,120,NA,6.8,151,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Agit",1972,82,NA,5.2,13,14.5,0,0,0,14.5,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Agneepath",1990,174,NA,8.4,162,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,45.5,"",1,0,0,1,0,0,0 -"Agnes",1995,106,NA,7.4,64,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Agnes Browne",1999,92,NA,6,572,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Agnes of God",1985,98,NA,6.4,1561,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Agni Nakshatram",1988,146,NA,7.8,40,0,4.5,0,0,4.5,4.5,24.5,14.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Agni Varsha",2002,126,NA,4.6,56,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Agoniya",1981,148,NA,6.3,85,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Agony and the Ecstasy, The",1965,138,NA,6.6,689,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Agony of Love, The",1966,83,NA,3.4,12,14.5,0,4.5,4.5,24.5,0,34.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Agoria stin porneia",1985,86,NA,1.3,11,45.5,0,0,0,4.5,0,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Agostino",1962,105,NA,5.9,6,0,0,0,14.5,0,14.5,34.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Agostino d'Ippona",1972,121,NA,8.3,10,0,0,0,0,14.5,14.5,14.5,24.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Agosto",1987,90,NA,5.8,7,0,0,0,0,24.5,0,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Agowa gongpo",1978,83,NA,3.2,37,44.5,14.5,14.5,14.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Agression, L'",1975,101,NA,5.6,44,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Agria niata",1982,110,NA,3.3,10,24.5,14.5,24.5,0,0,34.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Agronomist, The",2003,90,NA,7.3,146,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,0,1,0,0 -"Aguas bajan negras, Las",1948,100,NA,4.5,7,14.5,0,0,0,24.5,14.5,0,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Aguas bajan turbias, Las",1952,82,NA,8.1,12,0,0,0,0,0,0,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Aguirre, der Zorn Gottes",1972,100,NA,8,3926,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Agujetas en el alma",1998,93,NA,3.6,11,24.5,14.5,0,0,14.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Ah Fu",2000,105,NA,6,70,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Ah Ying",1983,110,NA,7.8,7,0,0,0,0,14.5,0,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Ah haru",1998,100,NA,6.9,10,0,0,14.5,14.5,24.5,14.5,34.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Ah! Afti i gynaika mou",1967,89,NA,6.8,27,4.5,0,0,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ah! Kai na'moun adras",1966,88,NA,6.9,5,0,0,0,0,64.5,0,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Ah! Les belles bacchantes",1954,95,NA,5.3,45,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ah! Nomugi toge",1979,154,NA,7.2,6,0,0,0,0,0,0,34.5,34.5,34.5,0,"",0,0,0,0,0,0,0 -"Ah, L'Amour",1995,2,NA,7.6,211,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Ah, Pook Is Here",1994,6,NA,6.1,23,0,0,0,0,24.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Ah, Sweet Mouse-Story of Life",1965,6,NA,5.5,38,4.5,4.5,14.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Ah, Wilderness!",1935,98,NA,6.8,96,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Ah-chung",1996,97,NA,8.5,17,0,0,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Ahava Tzeira",1987,86,NA,3.9,57,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ahlam Hind we Kamilia",1989,109,NA,6.8,13,0,0,0,4.5,24.5,0,24.5,34.5,0,4.5,"",0,0,0,0,0,0,0 -"Ahlam Saghira",1993,80,NA,5.2,12,4.5,0,4.5,0,4.5,4.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Ahora soy rico",1952,110,NA,7.2,11,0,4.5,0,0,0,24.5,14.5,4.5,34.5,0,"",0,0,0,1,0,0,0 -"Ahortagos, O",1967,98,NA,5.4,12,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ahot Zara",2000,124,NA,5.8,7,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Ai Iran",1990,110,NA,6.2,17,14.5,0,4.5,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Ai ching lai le",1997,113,NA,8.5,32,0,0,0,0,0,4.5,4.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Ai ni ai wo",2001,105,NA,6.4,135,0,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Ai ni tsuite, Tokyo",1992,110,NA,6.4,8,14.5,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ai no borei",1978,104,NA,6.3,230,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Ai no corrida",1976,101,NA,6.4,1601,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Ai no shinsekai",1994,115,NA,6.5,46,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Ai nu",1972,90,NA,7.5,127,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Ai o kou hito",1998,135,NA,7.4,15,0,0,0,0,0,24.5,14.5,44.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ai shang wo ba",2001,101,NA,8.5,8,0,0,0,0,0,34.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Ai to heisei no iro - Otoko",1989,96,NA,6.1,8,14.5,0,0,0,0,14.5,0,0,24.5,45.5,"",0,0,1,1,0,0,0 -"Ai to kibo no machi",1959,62,NA,7,12,4.5,0,0,0,4.5,14.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Ai to nikushimi no kanata e",1951,107,NA,9.2,7,24.5,0,0,0,0,0,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Ai xuoi van ly",1998,90,NA,4.5,10,0,0,14.5,24.5,34.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Ai zai hei she hui de ri zi",1993,93,NA,6.4,7,0,0,0,0,24.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ai zhi sha",1993,87,NA,6.1,7,0,14.5,0,0,24.5,0,44.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Ai zuozhan",2004,96,NA,6.9,37,0,4.5,0,0,4.5,0,24.5,44.5,14.5,4.5,"",1,0,0,0,0,1,0 -"Ai-Fak",2004,110,NA,9.4,14,0,0,0,0,0,14.5,0,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Aida",1953,102,NA,5.5,33,14.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Aida degli alberi",2001,75,7000000,4.3,16,24.5,4.5,0,14.5,4.5,0,14.5,24.5,0,4.5,"",0,1,0,0,0,0,0 -"Aien kyo",1937,88,NA,9.2,5,0,0,0,0,0,0,0,24.5,44.5,44.5,"",0,0,0,0,0,0,0 -"Aiki",2002,119,NA,7.5,28,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Aile ou la cuisse, L'",1976,104,NA,6.8,731,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Aileen Wuornos: The Selling of a Serial Killer",1992,87,NA,7,180,4.5,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"R",0,0,0,0,1,0,0 -"Aileen: Life and Death of a Serial Killer",2003,89,NA,7.2,430,4.5,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"R",0,0,0,0,1,0,0 -"Ailes de la colombe, Les",1981,95,NA,6.4,17,0,4.5,0,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Ailsa",1994,75,NA,5,11,0,0,4.5,4.5,0,0,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Aimants, Les",2004,91,NA,7.2,65,0,0,4.5,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Aimee Semple McPherson",2004,112,500000,8.4,8,14.5,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Aimez-vous les femmes?",1964,90,NA,8.2,7,0,14.5,0,14.5,14.5,14.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Ain't Misbehavin'",1955,82,NA,5.7,19,4.5,0,0,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Ain't No Way Back",1990,90,NA,1.6,10,34.5,14.5,0,0,24.5,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Ain't She Sweet",1933,8,NA,5.7,6,0,14.5,0,0,0,14.5,45.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Ain't She Tweet",1952,7,NA,7.4,48,0,0,0,4.5,4.5,14.5,24.5,44.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Ain't That Ducky",1945,7,NA,7.5,38,0,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Ain't We Got Fun",1937,8,NA,6.5,22,4.5,0,4.5,0,14.5,34.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Ainsi soient-elles",1995,106,NA,5.6,21,14.5,0,0,4.5,14.5,14.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Aiqing mala tang",1998,109,NA,6.9,74,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Aiqing wansui",1994,120,NA,7.5,402,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Air",2003,3,NA,2,14,64.5,4.5,0,4.5,0,0,0,14.5,0,4.5,"",0,0,0,1,0,0,1 -"Air America",1990,115,NA,5.2,3793,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Air Bud",1997,98,3000000,4.7,1276,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"Air Bud: Golden Receiver",1998,90,NA,4.2,423,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Air Cadet",1951,94,NA,5.3,18,0,0,4.5,4.5,14.5,34.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Air Force",1943,124,NA,7.2,291,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Air Force One",1997,124,85000000,6.3,26156,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Air Fright",1933,19,NA,3.6,6,0,14.5,14.5,14.5,0,0,34.5,0,0,14.5,"",0,0,1,0,0,0,1 -"Air Hawks",1935,68,NA,5.1,6,0,0,0,14.5,14.5,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Air Hostess",1933,67,NA,4.5,10,0,14.5,0,0,24.5,34.5,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Air Marshal",2003,90,500000,3,81,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Air Raid Wardens",1943,67,NA,5.4,93,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Air Strike",1955,67,NA,6,7,0,0,0,0,44.5,0,24.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Air Up There, The",1994,107,NA,5.2,1276,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Air de Paris, L'",1954,110,NA,7.1,22,4.5,0,0,0,0,4.5,44.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Air de rien, L'",1989,87,NA,4.8,5,24.5,0,0,0,24.5,0,0,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Airbag",1997,112,NA,6.1,617,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Airborne",1962,80,NA,5.8,5,24.5,0,0,0,24.5,44.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Airborne",1993,91,2600000,5.2,1047,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Airboss II: Preemptive Strike",1998,88,NA,1.8,14,45.5,14.5,4.5,4.5,0,0,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Airboss III: The Payback",1999,92,NA,2.5,6,34.5,14.5,34.5,0,14.5,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Aire libre",1996,96,NA,2.9,18,14.5,14.5,0,0,0,4.5,44.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Airheads",1994,92,NA,5.5,6105,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Airmail",1932,84,305000,6,76,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Airman's Letter to His Mother, An",1941,5,NA,8.3,18,0,0,0,0,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Airplane II: The Sequel",1982,85,NA,5.7,6622,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Airplane!",1980,88,3500000,7.8,23369,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Airport",1970,137,10000000,6.4,2918,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Airport '77",1977,114,NA,5.1,1440,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Airport 1975",1974,107,3000000,4.9,1385,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Airspeed",1998,93,NA,3,386,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",1,0,0,1,0,0,0 -"Airtime",1998,10,NA,3.1,11,24.5,4.5,0,0,14.5,0,4.5,0,4.5,24.5,"",0,0,0,0,0,0,1 -"Aishite imasu (Mahal kita) 1941",2004,107,NA,5.8,19,4.5,4.5,0,4.5,0,14.5,4.5,0,14.5,45.5,"",0,0,0,1,0,1,0 -"Aisiodoxos, O",1973,90,NA,4,5,0,0,44.5,44.5,0,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Aisuru",1997,114,NA,4.3,21,14.5,0,0,0,0,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Aitanic",2000,92,NA,4.1,12,0,14.5,4.5,4.5,4.5,24.5,0,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Aitsu to watashi",1961,105,NA,5,5,0,24.5,0,24.5,0,0,0,44.5,24.5,0,"",0,0,1,0,0,0,0 -"Aizea: City of the Wind",2001,29,NA,6.9,16,24.5,0,0,0,0,0,0,34.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Ajans-E Shisheh-I",1997,100,NA,5.2,61,4.5,0,0,0,0,4.5,14.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Ajantrik",1958,120,NA,6.9,18,0,0,0,0,4.5,0,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Ajax: Daar hoorden zij engelen zingen",2000,91,NA,6.7,172,14.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Aje aje bara aje",1989,134,NA,5.9,15,4.5,4.5,0,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Aji",2003,134,NA,5.3,8,0,0,14.5,0,0,0,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Ajji appa",1995,102,NA,4.6,9,24.5,0,24.5,14.5,0,24.5,14.5,14.5,0,0,"",0,0,0,0,0,1,0 -"Ajlawju",1999,87,NA,4.1,27,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Ajnabi",1974,147,NA,7.5,22,4.5,0,0,0,4.5,0,4.5,45.5,24.5,0,"",0,0,0,0,0,1,0 -"Ajooba",1991,178,NA,3.1,28,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ajutoare umanitare",2002,17,NA,6,5,0,0,0,0,0,24.5,0,0,44.5,44.5,"",0,0,0,0,0,0,1 -"AkaTaMuS",1988,101,NA,8,5,0,0,0,0,24.5,0,0,44.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Akademiya pana Kleksa",1984,166,NA,6.3,46,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Akage",1969,115,NA,7.1,48,0,0,0,4.5,14.5,4.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Akahige",1965,185,NA,7.8,1214,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Akai hashi no shita no nurui mizu",2001,119,NA,6.6,557,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Akai kami no onna",1979,73,NA,5.1,20,4.5,0,14.5,4.5,34.5,14.5,0,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Akai satsui",1964,150,NA,7.8,41,4.5,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Akai tenshi",1966,95,NA,9.1,23,0,0,0,0,0,14.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Akaler Sandhane",1980,115,NA,7.3,11,0,0,4.5,0,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Akame shijuya taki shinju misui",2003,159,NA,7.2,9,0,0,0,14.5,0,24.5,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Akarui mirai",2003,92,NA,6.5,242,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Akasen chitai",1956,87,NA,7.7,165,0,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Akasen tamanoi: Nukeraremasu",1974,78,NA,8.2,16,0,0,0,0,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Akash Kusum",1965,115,NA,4.4,8,0,0,34.5,0,0,24.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Akasha",2001,82,1500,7.3,29,24.5,0,4.5,0,0,0,4.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Akatsuki no dasso",1950,116,NA,9.6,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,0,1,0,0,0 -"Akayla",1991,180,NA,6.1,21,4.5,0,0,0,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Akce bororo",1973,90,NA,5.6,14,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Akcija stadion",1977,90,NA,5,7,0,0,0,14.5,14.5,44.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Akelarre",1984,109,NA,3.7,11,14.5,0,24.5,0,4.5,4.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Akele Hum Akele Tum",1995,160,NA,7.7,106,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Akenfield",1974,95,NA,5.4,10,0,0,0,14.5,14.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Akhalgazrda kompozitoris mogzauroba",1984,105,NA,7.5,6,0,0,0,0,14.5,14.5,14.5,0,45.5,0,"",0,0,1,1,0,0,0 -"Akibiyori",1960,128,NA,7.8,135,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Akira",1988,124,NA,7.7,14840,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",1,1,0,1,0,0,0 -"Akitsu onsen",1962,113,NA,8.2,8,0,0,0,0,0,14.5,0,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Akkareakkareakkare",1990,156,NA,9.1,10,14.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,0,0,0,0 -"Ako-Jo danzetsu",1978,159,NA,5.6,8,0,0,0,0,34.5,34.5,0,14.5,14.5,0,"",1,0,0,1,0,0,0 -"Akoibon",2005,95,NA,4.8,35,4.5,4.5,14.5,14.5,14.5,14.5,0,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Akrebin yolculugu",1997,118,NA,5.1,22,14.5,4.5,0,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,1,0 -"Akrovates tou kipou, Oi",2001,110,NA,6.7,19,14.5,4.5,0,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Akseleratka",1987,88,NA,4.9,6,0,14.5,0,0,34.5,34.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Akseli ja Elina",1970,137,NA,7.9,48,4.5,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Aktorzy prowincjonalni",1980,108,NA,7.1,30,4.5,0,0,14.5,14.5,24.5,4.5,44.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Aktrisa",1943,76,NA,8.1,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,1,0,0,1,0 -"Aku ingin menciummu sekali saja",2002,90,NA,6.8,15,4.5,4.5,0,0,4.5,4.5,0,45.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Akuma no temari-uta",1977,144,NA,6.3,10,14.5,0,14.5,0,0,14.5,0,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Akumulator 1",1994,102,2000000,7.1,272,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Akuryo-To",1981,131,NA,6.2,8,0,0,0,0,24.5,34.5,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Akwarium",1996,145,NA,5.1,12,0,0,4.5,14.5,4.5,4.5,4.5,14.5,0,34.5,"",1,0,0,0,0,0,0 -"Al Adamson: Drive-In Monster",1996,20,NA,1.2,9,64.5,14.5,14.5,0,0,0,14.5,0,0,0,"",0,0,0,0,1,0,1 -"Al Capone",1959,104,NA,6.4,226,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Al Dente",1998,2,NA,5.5,23,0,0,4.5,24.5,4.5,34.5,14.5,4.5,0,0,"",0,1,1,0,0,0,1 -"Al Jennings of Oklahoma",1951,79,NA,7,25,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Al Lewis in the Flesh",1993,21,NA,2.1,17,24.5,34.5,14.5,0,4.5,0,0,4.5,0,14.5,"",0,0,0,0,1,0,1 -"Al Loves Trees",2000,2,NA,4.5,8,24.5,0,0,14.5,24.5,24.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Al Qods Fee Yom Akhar",2002,90,NA,6.6,79,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Al este del oeste",1984,82,NA,5.2,30,14.5,24.5,4.5,0,0,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Al filo de la ley",1992,90,NA,4.1,5,0,24.5,44.5,24.5,24.5,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Al filo del hacha",1988,90,NA,3.2,36,24.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Al lupo, al lupo",1992,125,NA,4.9,94,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Al momento giusto",2000,95,NA,4.8,13,24.5,4.5,0,0,34.5,34.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Al ponerse el sol",1967,92,NA,7.2,6,14.5,0,0,0,0,14.5,14.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Al primo soffio di vento",2002,85,NA,4.7,20,24.5,4.5,0,0,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Al sur de Granada",2003,111,NA,6.5,116,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Al tropico del cancro",1972,95,NA,6.2,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Ala-Arriba!",1942,94,NA,8.1,7,0,0,0,14.5,0,0,24.5,0,14.5,44.5,"",0,0,0,1,1,1,0 -"Alaap",1977,160,NA,8.5,43,0,4.5,0,0,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Alabama's Ghost",1973,96,NA,4.3,19,24.5,4.5,14.5,14.5,14.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Alabama: 2000 Light Years From Home",1969,21,NA,8.1,7,0,0,0,0,14.5,0,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Aladdin",1992,90,28000000,7.6,22499,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Aladdin & His Magic Lamp",1983,70,NA,4.7,15,14.5,0,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Aladdin and His Lamp",1952,67,NA,5.2,17,0,0,4.5,14.5,44.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Aladdin and His Wonderful Lamp",1939,22,NA,7.4,69,4.5,0,0,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",1,1,1,0,0,0,1 -"Aladin et la lampe merveilleuse",1969,71,NA,5.7,6,0,0,0,0,34.5,34.5,0,14.5,0,14.5,"",0,1,0,0,0,0,0 -"Aladin ou la lampe merveilleuse",1906,12,NA,7.7,30,4.5,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Alaecheung yeojawa wicheung namja",1992,102,NA,2.2,5,64.5,24.5,0,24.5,0,0,0,0,0,0,"",0,0,0,0,0,1,0 -"Alageyik",1969,90,NA,8.5,7,0,0,0,0,0,14.5,0,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Alai Payuthey",2000,156,NA,6.3,77,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Alaloum",1982,116,NA,7.9,28,0,0,4.5,4.5,0,4.5,4.5,24.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Alambrado",1991,90,NA,7.4,12,4.5,0,0,0,4.5,0,14.5,44.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Alambrista!",1977,110,NA,8.3,26,0,0,0,0,4.5,4.5,14.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Alamo Bay",1985,98,NA,5.8,220,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Alamo, The",1960,192,12000000,6.6,2083,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Alamo, The",2004,137,95000000,5.9,3060,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Alamo: The Price of Freedom",1988,37,NA,5.8,59,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,1 -"Alan & Naomi",1992,96,NA,6,125,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Alan Smithee Film: Burn Hollywood Burn, An",1997,86,10000000,3.2,1262,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Alanis Morissette: We're with the Band",2004,25,NA,7.6,7,14.5,0,0,0,0,14.5,0,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Alarium",2003,8,NA,9,12,4.5,0,0,0,0,0,4.5,0,0,84.5,"",0,0,0,1,0,0,1 -"Alarm",2002,66,NA,7.8,13,14.5,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Alas de mariposa",1991,108,NA,7.4,114,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Alas rotas",2002,95,NA,2.7,6,64.5,14.5,0,0,0,0,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Alaska",1989,45,NA,8.3,12,0,0,0,14.5,0,0,14.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Alaska",1996,109,NA,5.6,891,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Alaska Patrol",1949,65,NA,5.8,7,0,0,0,14.5,14.5,44.5,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Alaska Seas",1954,78,NA,5.5,15,4.5,0,0,14.5,24.5,44.5,0,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Alaska: Spirit of the Wild",1997,40,NA,6.5,112,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Alba, L'",1990,80,NA,5.7,6,14.5,0,0,34.5,0,14.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Albatros, L'",1971,92,NA,6.2,11,4.5,0,4.5,4.5,14.5,0,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Albatross",1996,104,NA,5.8,6,0,0,0,0,14.5,64.5,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Albero degli zoccoli, L'",1978,186,NA,8.1,411,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Albero delle pere, L'",1998,105,NA,6.7,63,4.5,0,0,0,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Albert",1998,80,NA,5,34,4.5,4.5,14.5,4.5,14.5,24.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Albert Pinto Ko Gussa Kyon Ata Hai",1980,110,NA,5.3,10,0,0,0,24.5,0,44.5,0,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Albert R.N.",1953,88,NA,5.7,21,0,0,4.5,0,34.5,4.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Albert souffre",1992,105,NA,3.3,20,14.5,4.5,14.5,4.5,4.5,4.5,0,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Alberto Express",1990,92,NA,6.9,52,0,4.5,0,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Albino",1976,97,NA,5,31,4.5,0,4.5,14.5,24.5,24.5,14.5,0,4.5,4.5,"",1,0,0,1,0,0,0 -"Albino Alligator",1996,97,5000000,6,2077,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Albuquerque",1948,90,NA,6.5,17,0,0,0,0,4.5,44.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alcatraz Avenue",2000,93,NA,2.6,20,14.5,0,0,14.5,0,0,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Alcatraz Island",1937,63,NA,5.5,17,0,0,4.5,14.5,14.5,24.5,24.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Alchemist, The",1984,86,NA,3.3,109,14.5,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Alchimie",2002,18,NA,5.1,7,14.5,0,0,0,0,24.5,14.5,0,14.5,24.5,"",0,0,1,0,0,1,1 -"Alchimiste Parafaragamus ou La cornue infernale",1906,3,NA,5.7,43,4.5,4.5,0,4.5,24.5,34.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Alcohol Years, The",2000,50,NA,7.9,6,0,0,0,0,0,34.5,0,34.5,0,34.5,"",0,0,0,0,1,0,0 -"Alcova, L'",1984,88,NA,4.8,23,14.5,0,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Alcune signore per bene",1990,91,NA,2.8,6,14.5,14.5,0,14.5,45.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Aldeia da Roupa Branca",1938,92,NA,5.9,28,4.5,0,0,4.5,4.5,24.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Aldous Huxley: The Gravity of Light",1996,70,NA,4.9,16,0,0,14.5,4.5,14.5,24.5,4.5,0,4.5,24.5,"",0,0,0,0,1,0,0 -"Alefbay-e afghan",2002,45,NA,7.2,31,4.5,0,0,4.5,0,24.5,24.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Alegre divorciado, El",1976,98,NA,2.6,24,34.5,14.5,14.5,4.5,14.5,4.5,0,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Alegre ma non troppo",1994,97,NA,6.8,106,4.5,0,4.5,4.5,4.5,14.5,4.5,44.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Aleksandr Nevskiy",1938,112,NA,7.8,1748,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Aleluia Gretchen",1976,118,NA,6.8,11,0,0,0,4.5,4.5,14.5,24.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Alert Today - Alive Tomorrow",1956,16,NA,4.3,5,0,0,44.5,0,24.5,44.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Alesha Popovich i Tugarin Zmey",2004,72,NA,6.2,58,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Aletta Jacobs, het hoogste streven",1995,65,NA,3.2,11,44.5,0,4.5,4.5,4.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Alex",1993,93,NA,6,72,4.5,4.5,0,0,0,4.5,34.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Alex & Emma",2003,96,NA,5.3,2176,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Alex & the Gypsy",1976,100,NA,5,57,14.5,0,4.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Alex Holeh Ahavah",1986,88,NA,6.8,69,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Alex in Wonder",2001,96,NA,6.3,30,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,0,14.5,"R",0,0,0,1,0,0,0 -"Alex in Wonderland",1970,110,NA,4.6,116,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Alex l'ariete",2000,122,NA,2.4,95,74.5,4.5,4.5,4.5,0,4.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Alex's Apartment",1992,80,45000,6.8,6,0,0,0,0,14.5,34.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Alexa",1988,81,NA,4.4,7,24.5,0,0,44.5,14.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Alexander",2004,175,150000000,5.5,11254,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Alexander Hamilton",1931,70,NA,6.2,28,0,4.5,0,14.5,4.5,34.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Alexander the Great",1956,141,NA,5.8,386,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Alexander's Ragtime Band",1938,106,2000000,7.5,204,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Alexandra",1983,99,NA,7.6,5,0,0,0,24.5,0,0,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Alexandra's Project",2003,103,NA,6.9,704,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Alexandre le bienheureux",1967,100,NA,7.5,203,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Alexandria",2001,110,NA,6.8,20,0,0,0,0,0,24.5,34.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Alexandrie... New York",2004,128,NA,4.8,49,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Alexandrophagie, L'",2000,27,NA,7.3,5,0,0,24.5,24.5,0,0,24.5,24.5,24.5,0,"",0,0,1,0,0,0,1 -"Alexei to izumi",2002,104,NA,7.7,36,0,0,0,0,0,14.5,24.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Alexis Zorbas",1964,142,NA,7.6,1722,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Alf Garnett Saga, The",1972,90,NA,5.3,24,14.5,4.5,0,0,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Alf's Button Afloat",1938,89,NA,6.5,16,14.5,0,0,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Alfa Tau!",1942,80,NA,8.6,5,0,0,0,24.5,0,0,0,0,24.5,64.5,"",0,0,0,0,0,0,0 -"Alfalfa",1987,9,NA,6.3,6,0,0,34.5,0,0,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Alferd Packer: The Musical",1996,97,125000,7,2298,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,1,0,0,1,0 -"Alfie",1966,114,800000,7.1,1644,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Alfie",2004,103,60000000,6,3492,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Alfie Darling",1975,102,NA,4.6,43,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Alfons Zitterbacke",1966,68,NA,6.7,6,0,0,0,14.5,0,14.5,14.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Alfred Hitchcock's Psycho",1998,17,NA,4.2,69,24.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Alfred Stieglitz: The Eloquent Eye",2001,88,NA,7.5,9,0,0,0,0,0,24.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Alfred the Great",1969,122,NA,5.6,242,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Alfredo, Alfredo",1972,98,NA,5.8,120,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Algeria",2002,91,NA,8.4,8,0,0,0,14.5,24.5,0,14.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Algiers",1938,95,NA,7.1,242,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Ali",2001,165,107000000,6.4,9294,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Ali Baba",1907,8,NA,6.1,24,4.5,0,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Ali Baba",1936,7,NA,6.5,10,0,0,0,14.5,14.5,14.5,44.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Ali Baba Bunny",1957,7,NA,7.9,175,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Ali Baba Goes to Town",1937,80,NA,6.3,28,0,0,4.5,4.5,14.5,24.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Ali Baba and the Forty Thieves",1944,90,NA,6.2,125,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ali G Indahouse",2002,88,NA,5.8,4496,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Ali Zaoua, prince de la rue",2000,95,NA,7.4,307,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ali-Baba Bound",1940,7,NA,6.7,22,0,0,0,4.5,0,24.5,24.5,34.5,4.5,0,"",0,1,1,0,0,0,1 -"Ali-Baba et les quarante voleurs",1954,92,NA,5.9,86,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Alias",1999,13,NA,3,14,24.5,0,24.5,0,0,4.5,34.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Alias",2002,98,1500000,5.7,266,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Alias 'La Gringa'",1991,100,NA,6.3,20,4.5,0,0,0,14.5,34.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Alias Billy the Kid",1946,56,NA,6.7,12,0,0,0,0,14.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Alias Boston Blackie",1942,67,NA,6.8,22,0,0,0,0,4.5,34.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Alias French Gertie",1930,66,NA,4.5,10,0,14.5,14.5,14.5,24.5,24.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Alias Jesse James",1959,92,NA,6.7,128,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Alias Jimmy Valentine",1915,50,NA,7.1,45,0,4.5,0,0,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Alias John Preston",1956,66,NA,5,8,0,0,0,45.5,14.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Alias Nick Beal",1949,93,NA,7.4,60,0,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Alias St. Nick",1935,10,NA,5.2,14,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Alias Will James",1988,83,NA,7.5,9,0,0,0,14.5,0,0,24.5,34.5,0,34.5,"",0,0,0,0,1,0,0 -"Alias a Gentleman",1948,76,NA,5.8,9,0,0,0,0,34.5,34.5,24.5,0,0,14.5,"",0,0,1,0,0,1,0 -"Alias the Doctor",1932,69,NA,5.4,20,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Alias: Slayer",2001,25,NA,5.7,7,0,0,0,14.5,14.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Alias: The Lost Episode",2002,15,NA,3.4,11,24.5,4.5,4.5,4.5,0,0,4.5,0,4.5,24.5,"",0,0,1,0,0,0,1 -"Alibaba Aur 40 Chor",1980,153,NA,5.7,42,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",1,0,0,0,0,0,0 -"Alibi",1929,90,NA,6,34,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Alibi",1955,103,NA,6,10,0,0,0,0,14.5,64.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Alibi Bye Bye",1935,20,NA,3.7,5,0,0,24.5,0,0,44.5,0,24.5,0,24.5,"",0,0,1,0,0,0,1 -"Alibi Ike",1935,72,NA,5.9,67,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Alibi Racket",1935,18,NA,5.7,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Alibi na vode",1965,95,NA,4.7,7,0,24.5,0,0,0,24.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Alibi perfetto",1992,100,NA,5.1,8,0,0,14.5,0,24.5,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Alibi zerbricht, Ein",1963,97,NA,4.9,6,0,0,14.5,0,14.5,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Alibi, L'",1937,84,NA,5.5,14,0,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alibi, The",1998,11,NA,6.8,9,0,0,0,14.5,0,14.5,24.5,0,0,45.5,"",0,0,1,0,0,0,1 -"Alice",1990,102,12000000,6.4,1706,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Alice",2002,50,NA,6.7,6,0,0,14.5,0,14.5,0,45.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Alice",2003,18,NA,3.4,8,34.5,24.5,0,0,24.5,0,0,0,0,14.5,"",0,0,0,1,0,0,1 -"Alice & Viril",1993,2,NA,4.7,25,14.5,14.5,0,0,24.5,14.5,0,4.5,0,34.5,"",0,0,0,1,0,0,1 -"Alice Adams",1935,99,NA,7.2,430,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Alice Cooper: Welcome to My Nightmare",1975,84,NA,7.1,70,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Alice Doesn't Live Here Anymore",1974,112,85000,7.3,2231,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Alice Goodbody",1974,80,NA,4.6,18,4.5,14.5,24.5,14.5,14.5,4.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Alice Solves the Puzzle",1925,7,NA,5.5,7,0,0,0,14.5,24.5,0,14.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Alice et Martin",1998,124,NA,6.4,604,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Alice et moi",2004,19,NA,8,18,0,0,24.5,0,0,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Alice in Wonderland",1903,8,NA,5.7,33,14.5,4.5,0,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Alice in Wonderland",1915,52,NA,6.4,20,4.5,0,0,14.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Alice in Wonderland",1931,55,NA,5.6,20,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Alice in Wonderland",1933,76,NA,6.4,230,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Alice in Wonderland",1949,96,NA,6.6,141,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Alice in Wonderland",1951,75,3000000,7.2,4656,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Alice in Wonderland",1988,51,NA,5.4,14,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,0,14.5,"",0,1,0,0,0,0,0 -"Alice the Fire Fighter",1926,9,NA,6.2,5,0,0,0,0,24.5,24.5,64.5,0,0,0,"",0,1,0,0,0,0,1 -"Alice the Toreador",1925,11,NA,4.7,5,0,24.5,0,44.5,0,24.5,0,0,24.5,0,"",0,1,0,0,0,0,1 -"Alice's Adventures in Wonderland",1972,95,2500000,5.6,165,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Alice's Balloon Race",1926,8,NA,5,5,0,0,0,24.5,44.5,0,0,44.5,0,0,"",0,1,1,0,0,0,1 -"Alice's Egg Plant",1925,9,NA,5.7,13,4.5,0,0,0,24.5,34.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Alice's Restaurant",1969,111,NA,6.4,726,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Alice's Wonderland",1923,12,NA,6.1,33,0,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Alicia",1974,104,NA,6,5,24.5,24.5,0,0,0,0,0,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Alicia",1994,8,NA,6.2,23,4.5,0,0,4.5,24.5,4.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Alicia en el pueblo de maravillas",1991,90,NA,6.9,21,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Alicja",1982,90,NA,5,24,4.5,14.5,4.5,0,4.5,0,14.5,14.5,4.5,34.5,"",0,0,0,0,0,1,0 -"Alien",1979,116,11000000,8.3,63400,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,0,0,0,0 -"Alien 2 sulla Terra",1980,92,NA,3.7,116,24.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Alien Abduction",2005,90,600000,1.9,73,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Alien Adventure",1999,35,NA,5.1,44,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Alien Agenda: Under the Skin",1997,75,NA,1.5,15,84.5,4.5,4.5,0,0,0,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Alien Blood",1999,80,NA,3,60,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Alien Dead",1980,69,12000,2.4,112,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alien Encounters, The",1979,92,NA,3.3,8,24.5,14.5,0,24.5,0,0,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Alien Escape",1997,85,1000000,5.6,23,14.5,0,4.5,4.5,0,14.5,14.5,0,14.5,34.5,"R",0,0,0,0,0,0,0 -"Alien Factor 2: The Alien Rampage",2001,75,NA,2.7,7,45.5,14.5,14.5,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Alien Factor, The",1977,80,NA,4.2,61,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Alien Hunter",2003,92,NA,5,563,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Alien Intruder",1993,120,NA,3.7,103,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alien Love Triangle",2002,30,NA,4.1,40,14.5,24.5,0,0,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Alien Nation",1988,91,16000000,6,2171,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Alien Predator",1987,90,NA,3.1,137,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alien Private Eye",1987,90,NA,6,9,44.5,0,0,0,14.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Alien Seed",1989,88,NA,3.4,23,24.5,24.5,14.5,4.5,4.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Alien Space Avenger",1989,80,NA,4.4,37,14.5,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Alien Terminator",1996,80,NA,3.3,100,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alien Thunder",1974,93,NA,4.7,35,4.5,4.5,24.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alien Warrior",1985,100,NA,3.5,30,34.5,14.5,14.5,4.5,4.5,4.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Alien Zone",1978,90,NA,3.9,19,14.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Alien degli abissi",1989,90,NA,2.8,85,24.5,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alien from L.A.",1988,87,NA,2.2,491,44.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alien: Resurrection",1997,116,70000000,6,24358,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Alienator",1989,93,NA,2.8,119,45.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Aliens",1986,154,18500000,8.3,63961,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",1,0,0,0,0,0,0 -"Aliens",1993,13,NA,7.3,18,0,0,4.5,4.5,0,14.5,14.5,44.5,0,14.5,"",0,0,0,0,0,0,1 -"Aliens From Spaceship Earth",1977,70,NA,4,5,44.5,0,0,0,24.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Aliens in the Wild Wild West",1999,90,NA,2.9,58,34.5,14.5,14.5,14.5,4.5,4.5,4.5,0,0,4.5,"PG",1,0,0,0,0,0,0 -"Aliens of the Deep",2005,47,NA,4.4,88,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Aliens: Ride at the Speed of Fright",1996,4,NA,4.6,13,24.5,0,4.5,0,14.5,4.5,0,4.5,0,34.5,"",1,0,0,0,0,0,1 -"Aligato",2003,11,NA,6.8,6,0,0,0,0,0,45.5,45.5,0,0,0,"",0,0,0,0,0,0,1 -"Aliki dictator, I",1972,117,NA,3.3,16,24.5,14.5,14.5,0,14.5,14.5,4.5,0,0,0,"",0,0,1,1,0,0,0 -"Aliki sto Naftiko, I",1961,90,NA,6.2,69,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Alila",2003,123,NA,6.3,90,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Alimono stous neous",1961,87,NA,8.6,47,0,0,0,0,0,0,4.5,24.5,34.5,44.5,"",0,0,1,0,0,1,0 -"Alison's Birthday",1979,97,NA,4.3,60,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alissa",1998,95,NA,5.2,17,0,14.5,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Alithini zoi",2004,118,NA,5.9,28,14.5,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Alive",1993,127,32000000,6.7,5786,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Alive",2004,85,NA,3.9,32,24.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,0,4.5,"R",0,0,1,1,0,0,0 -"Alive Tribe, The",1997,90,NA,5.2,5,24.5,0,0,24.5,0,24.5,24.5,24.5,0,0,"",1,0,1,0,0,1,0 -"Alive and Kicking",1959,94,NA,6.6,15,0,0,0,4.5,24.5,24.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Alive: 20 Years Later",1993,51,NA,5.4,23,4.5,0,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Alkali Ike's Auto",1911,11,NA,5.7,21,4.5,0,4.5,4.5,14.5,44.5,4.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Alkali, Iowa",1996,17,NA,8.5,55,4.5,0,0,0,0,14.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"All Aboard",1917,9,NA,6.3,7,0,0,0,14.5,14.5,44.5,0,0,0,24.5,"",0,0,1,0,0,0,1 -"All About Annette",1982,72,NA,4.7,5,0,0,0,24.5,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"All About Eve",1950,138,NA,8.5,13038,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"All About Gloria Leonard",1978,90,NA,4.3,10,14.5,0,24.5,14.5,0,34.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"All About Lurleen",1992,19,NA,8.6,111,4.5,0,0,0,0,0,0,4.5,0,94.5,"",0,0,0,0,0,0,1 -"All About People",1967,30,NA,1.9,5,24.5,24.5,0,0,0,24.5,0,0,0,44.5,"",0,0,0,0,0,0,1 -"All About You",2001,100,NA,6.2,30,4.5,0,0,0,4.5,4.5,4.5,34.5,4.5,44.5,"PG",0,0,1,1,0,1,0 -"All About the Benjamins",2002,95,14000000,5.4,1250,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"All Amateur Ecstasy",2002,2,NA,5.6,17,0,14.5,4.5,14.5,14.5,34.5,14.5,0,0,14.5,"",0,0,1,0,0,0,1 -"All American",1953,83,NA,5.5,34,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,0,0,"",0,0,0,1,0,1,0 -"All American Co-Ed",1941,53,NA,5.1,12,0,4.5,24.5,4.5,14.5,4.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"All American Fairytale, An",2001,74,NA,5.6,19,44.5,0,0,0,0,0,0,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"All American Hero",1999,8,NA,8.9,14,0,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,1,0,0,1 -"All Ashore",1953,80,NA,4.6,20,4.5,0,14.5,24.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"All Babes Want to Kill Me",2004,82,NA,8.1,47,4.5,4.5,0,0,0,0,4.5,4.5,34.5,45.5,"PG-13",0,0,0,0,0,0,0 -"All Coppers Are...",1972,87,NA,4.7,12,0,0,4.5,14.5,24.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"All Creatures Great and Small",1974,92,NA,6.3,193,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"All Dogs Christmas Carol, An",1998,73,NA,3.4,59,24.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"All Dogs Go to Heaven",1989,89,NA,5.5,1769,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,1,0,0,0,0,0 -"All Dogs Go to Heaven 2",1996,82,NA,4.5,331,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"All Eyes On Sharon Tate",1967,11,NA,5.6,33,4.5,0,0,4.5,24.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"All Fall Down",1962,111,NA,6.5,207,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"All Forgotten",2000,106,NA,4.5,139,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"All Fowled Up",1955,7,NA,6.5,31,4.5,0,0,4.5,24.5,14.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"All Girl Revue",1940,8,NA,4.5,17,14.5,4.5,0,14.5,0,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"All Gummed Up",1947,18,NA,7.8,48,0,0,0,4.5,4.5,14.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"All Hands on Deck",1961,100,NA,5.6,50,0,0,4.5,14.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"All Hands on Dick",1992,84,NA,8.6,5,0,0,0,0,24.5,0,0,0,44.5,44.5,"",0,0,0,0,0,0,0 -"All I Desire",1953,79,NA,6.1,111,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"All I Want for Christmas",1991,92,NA,5,491,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"All In Good Taste",1983,85,NA,3.3,43,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"All Jokes Aside",2000,76,NA,3.7,8,0,24.5,14.5,34.5,14.5,0,0,0,0,14.5,"",0,0,1,0,1,0,0 -"All Men Are Mortal",1995,93,NA,4.6,48,4.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"All Mine to Give",1957,103,NA,6.1,150,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"All My Life",1966,3,NA,6.8,20,4.5,0,0,0,14.5,0,14.5,14.5,24.5,44.5,"",0,0,0,0,0,0,1 -"All My Life",2004,110,NA,8.4,13,0,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"All My Sons",1948,95,NA,6.8,174,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"All Neat in Black Stockings",1968,96,NA,7.3,9,0,0,0,14.5,0,0,34.5,14.5,0,44.5,"",0,0,1,1,0,0,0 -"All New Adventures of Laurel & Hardy: For Love or Mummy, The",1999,85,NA,3.1,112,34.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"All Night",1918,58,NA,6,9,0,0,0,14.5,24.5,24.5,24.5,0,0,24.5,"",0,0,1,1,0,0,0 -"All Night Bodega",2002,90,NA,5.7,24,4.5,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"All Night Long",1924,19,NA,6.1,18,0,0,0,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"All Night Long",1981,87,NA,5.3,278,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"All Over Again",2001,99,NA,4.2,33,24.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"All Over Brazil",2003,10,NA,5.7,21,4.5,0,4.5,4.5,24.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,1 -"All Over Me",1997,90,NA,6.9,600,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"All Over Town",1937,63,NA,4.5,9,0,0,24.5,34.5,14.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"All Over the Guy",2001,95,NA,6.4,1039,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"All Quiet on the Western Front",1930,147,1200000,8.2,6835,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"All Shook Up",1999,90,NA,4.8,37,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"All Souls' Day",1997,78,NA,2.8,11,24.5,0,0,4.5,0,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"All Stars",1997,115,NA,7.4,470,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"All That Heaven Allows",1955,89,NA,7.4,970,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"All That Jazz",1979,123,NA,7.5,3895,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"All That You Love Will Be Carried Away",2004,30,NA,6.4,14,0,0,0,0,14.5,4.5,14.5,4.5,4.5,45.5,"",0,0,0,1,0,0,1 -"All Things Bright and Beautiful",1994,93,NA,7.5,25,0,0,0,4.5,4.5,4.5,24.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"All This and Rabbit Stew",1941,7,NA,6.7,80,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"All This and World War II",1976,88,NA,6.2,27,4.5,4.5,4.5,0,4.5,14.5,0,14.5,14.5,44.5,"",0,1,0,0,1,0,0 -"All This, and Heaven Too",1940,141,1370000,7.4,441,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"All Through the Night",1942,107,750000,7,361,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,1,1,0,0,0 -"All Together",1942,3,NA,5.8,32,0,0,4.5,14.5,24.5,24.5,24.5,4.5,0,4.5,"",0,1,0,0,0,0,1 -"All Tomorrow's Parties",2003,96,NA,5.9,37,4.5,4.5,4.5,14.5,14.5,24.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"All Water Has a Perfect Memory",2002,19,NA,7.8,13,4.5,0,4.5,0,4.5,0,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,1 -"All You Got",2004,93,NA,2.6,14,14.5,24.5,14.5,4.5,14.5,0,0,0,4.5,24.5,"",0,0,1,0,0,0,0 -"All You Need",2001,105,NA,7.3,44,4.5,0,0,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"All a Bir-r-r-rd",1950,7,NA,6.7,53,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"All by Myself",1982,97,NA,7.6,6,0,0,0,14.5,14.5,0,0,0,14.5,45.5,"",0,0,0,0,1,0,0 -"All for Mary",1955,79,NA,5.7,14,0,14.5,0,14.5,14.5,24.5,0,4.5,0,24.5,"",0,0,1,0,0,0,0 -"All in a Night's Work",1961,94,NA,5.9,103,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"All in a Nutshell",1949,7,NA,8,41,0,0,4.5,0,0,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"All of It",1998,85,NA,6.2,29,4.5,0,4.5,4.5,4.5,24.5,14.5,4.5,24.5,14.5,"",0,0,1,1,0,1,0 -"All of Me",1934,70,NA,6.2,12,0,4.5,0,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"All of Me",1984,93,NA,6.6,3381,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"All of Me",1991,76,NA,6.6,9,0,0,0,24.5,0,34.5,34.5,0,0,14.5,"",0,0,0,1,0,1,0 -"All the Brothers Were Valiant",1953,101,NA,6.2,114,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"All the Cats Join In",1946,4,NA,6.4,17,4.5,0,0,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"All the Fine Young Cannibals",1960,112,NA,5.3,166,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"All the Girls I've Loved Before",2003,49,NA,4.1,5,24.5,0,0,24.5,0,0,0,44.5,24.5,0,"",0,0,0,0,1,0,0 -"All the Great Operas in 10 Minutes",1992,9,NA,8.7,10,34.5,0,0,0,0,0,0,0,0,74.5,"",0,1,1,0,1,0,1 -"All the King's Horses",1934,87,NA,4.6,6,0,0,14.5,14.5,14.5,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"All the King's Horses",1977,80,NA,5.7,8,14.5,0,0,0,14.5,14.5,24.5,0,0,34.5,"",0,0,0,0,0,0,0 -"All the King's Men",1949,109,NA,7.6,1406,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"All the Little Animals",1998,112,NA,6.6,289,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"All the Love You Cannes!",2002,108,NA,6.5,51,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"All the President's Men",1976,138,8500000,8,12724,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"All the Pretty Horses",2000,116,45000000,5.6,3133,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"All the Queen's Men",2001,105,25000000,5,353,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",1,0,1,1,0,0,0 -"All the Rage",1997,105,NA,6.4,110,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"All the Rage",1999,99,NA,5.7,670,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"All the Real Girls",2003,108,1000000,6.8,1745,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"All the Right Moves",1983,91,NA,5.7,2171,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"All the Right Noises",1969,92,NA,4.2,16,4.5,4.5,0,14.5,14.5,4.5,4.5,0,4.5,34.5,"",0,0,1,1,0,0,0 -"All the Stage Is a World",2005,89,12000,7,7,14.5,0,0,0,14.5,0,14.5,24.5,0,24.5,"",0,0,1,1,1,0,0 -"All the Vermeers in New York",1990,87,250000,5.9,126,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"All the Way Home",1963,97,NA,7.3,83,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"All the Way In!",1984,85,NA,3.5,19,34.5,0,0,0,0,14.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"All the World's a Stooge",1941,17,NA,6.6,74,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"All the Wrong Places",2000,95,NA,6.2,10,14.5,14.5,0,0,14.5,14.5,34.5,0,34.5,0,"",0,0,1,0,0,1,0 -"All the Young Men",1960,90,NA,5.9,70,4.5,0,14.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"All'ombra di una colt",1965,79,NA,3.3,10,14.5,14.5,0,0,14.5,34.5,14.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"All's Fair",1989,89,NA,3.3,39,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"All's Fair at the Fair",1947,7,NA,5.3,6,0,0,0,0,45.5,45.5,0,0,0,0,"",0,1,1,0,0,0,1 -"All's Fair in Love & War",1996,103,NA,6,6,34.5,0,0,0,0,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"All's Well",1941,6,NA,4.7,6,0,0,14.5,0,14.5,14.5,34.5,0,0,14.5,"",0,1,0,0,0,0,1 -"All-American Alphabet, The",2002,3,NA,7.1,8,0,0,14.5,0,0,34.5,0,34.5,14.5,0,"",0,1,0,0,0,0,1 -"All-American Boy, The",1973,118,NA,4,22,14.5,14.5,4.5,4.5,24.5,4.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"All-American Drawback",1935,11,NA,5.8,5,0,24.5,0,24.5,24.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"All-American Girl, The",1972,76,NA,3.7,15,0,14.5,0,4.5,0,24.5,0,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"All-American Girls",1982,87,NA,4.1,24,4.5,0,4.5,0,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"All-American Girls 2: In Heat",1983,85,NA,3.8,17,24.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"All-American Toothache",1936,20,NA,7.4,8,0,0,0,0,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"All-Colored Vaudeville Show, An",1935,11,NA,6.4,14,0,0,0,0,4.5,34.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"All-Star Bond Rally, The",1945,18,NA,7,17,4.5,0,0,0,14.5,4.5,4.5,14.5,4.5,44.5,"",0,0,1,0,1,0,1 -"Alla ricerca del piacere",1972,85,NA,5.9,35,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Alla ricerca dell'impero sepolto",1987,94,NA,4.1,11,34.5,0,24.5,0,0,4.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Alla ricerca di Tadzio",1970,30,NA,7.5,10,0,0,0,0,14.5,14.5,24.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Alla rivoluzione sulla due cavalli",2001,100,NA,6.1,74,0,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Alla vi barn i Bullerbyn",1986,90,NA,6.6,139,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Allan Quatermain and the Lost City of Gold",1987,99,NA,3.8,1777,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Allanamiento de morada",1998,16,NA,8.1,45,4.5,0,4.5,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,1 -"Alle dagen feest",1976,95,NA,5.8,17,0,0,0,24.5,4.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Alle tiders kupp",1964,87,NA,4.9,6,0,0,0,34.5,34.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Allegheny Uprising",1939,81,NA,6.2,207,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Allegoria",1979,12,NA,5.6,6,0,0,0,14.5,0,0,84.5,0,0,0,"",0,0,0,0,0,0,1 -"Allegretto",1936,3,NA,8,25,4.5,0,4.5,0,4.5,14.5,4.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Allegro ma non troppo",1985,8,NA,9.5,11,0,4.5,0,0,0,0,0,4.5,44.5,34.5,"",0,0,0,0,1,0,1 -"Allegro non troppo",1977,75,NA,7.3,516,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Allegro s ognyom",1979,91,NA,8.2,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",1,0,0,0,0,0,0 -"Allein",2004,88,NA,7,21,0,0,0,4.5,4.5,14.5,14.5,34.5,24.5,0,"",0,0,0,1,0,0,0 -"Alleinseglerin, Die",1987,102,NA,6.4,5,0,0,0,0,0,64.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Alleluja e Sartana figli di... Dio",1972,90,NA,1.8,13,34.5,34.5,0,14.5,4.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Alleman",1963,90,NA,8,62,0,0,0,4.5,0,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Allenatore nel pallone, L'",1984,98,NA,7.3,222,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Aller simple pour Manhattan",2002,78,NA,7.4,29,14.5,4.5,0,4.5,0,4.5,24.5,34.5,0,24.5,"",0,0,1,1,0,1,0 -"Allerd Fishbein's in Love",1999,21,NA,6.2,25,0,0,0,0,4.5,24.5,4.5,4.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Allerzielen",2005,90,NA,6.4,14,0,0,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Alles Bob!",1999,99,NA,5.8,58,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Alles auf Anfang",1994,90,NA,4.1,22,14.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Alles auf Zucker!",2004,90,NA,7,171,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Alles moet weg",1996,105,NA,7.3,196,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Alles nur Tarnung",1996,90,NA,4.8,24,14.5,14.5,14.5,4.5,4.5,24.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Alles wird gut",1998,88,NA,7.8,58,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Alley Cat",1982,82,NA,6.1,24,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Alley Cat, The",1941,9,NA,5.8,7,0,0,0,0,44.5,24.5,14.5,0,14.5,0,"",0,1,1,0,0,0,1 -"Alley Cats, The",1966,83,NA,4.9,29,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Alley Tramp",1968,75,NA,1.4,15,64.5,4.5,0,0,4.5,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Allez France!",1964,90,NA,6.1,32,4.5,4.5,4.5,0,4.5,24.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Allez Oop",1934,20,NA,6.1,19,0,0,4.5,4.5,14.5,44.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Alliance cherche doigt",1997,90,NA,2.9,15,24.5,4.5,24.5,0,4.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Alliance, L'",1971,90,NA,5.9,23,4.5,4.5,0,0,14.5,24.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Allie & Me",1997,85,NA,4.8,38,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Alligator",1980,89,1000000,5.5,1032,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Alligator Alley",2000,108,NA,6.3,6,0,0,0,14.5,0,34.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Alligator Eyes",1990,101,NA,5.1,49,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Alligator II: The Mutation",1991,92,3000000,2.7,282,34.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alligator Named Daisy, An",1955,85,NA,5.8,35,4.5,4.5,0,14.5,14.5,34.5,24.5,4.5,0,0,"",0,0,1,0,0,1,0 -"Alligator People, The",1959,74,NA,4.5,184,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alligator Shoes",1981,99,NA,3.7,10,14.5,14.5,24.5,14.5,0,14.5,14.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Allnighter, The",1987,108,NA,3.6,246,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Allo Berlin? Ici Paris!",1932,89,NA,6.8,9,0,14.5,0,0,14.5,24.5,0,14.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Allonsanfan",1973,115,NA,6.6,116,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Allos gia to ekatommyrio",1964,90,NA,5.7,6,0,0,0,14.5,14.5,34.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Allotment Wives",1945,80,NA,5.5,14,0,0,0,24.5,24.5,24.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Allotria",1936,94,NA,5.7,22,4.5,0,0,0,14.5,4.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Allotria in Zell am See",1963,89,NA,3.7,5,24.5,0,0,44.5,24.5,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Alluda Mazaaka...!",1995,161,NA,6.9,9,14.5,14.5,0,14.5,0,0,14.5,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Allure",1999,19,NA,6.4,15,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Allures",1961,8,NA,6.7,16,0,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Alluri Seetharama Raju",1972,187,NA,6.3,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",1,0,0,1,0,0,0 -"Allvarsamma leken, Den",1945,106,NA,2.7,6,64.5,0,14.5,0,0,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Allvarsamma leken, Den",1977,100,NA,6,5,0,0,24.5,0,0,0,24.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Allyn McBeal",1999,12,NA,9,6,0,0,0,0,0,14.5,0,14.5,0,64.5,"",0,0,0,0,0,0,1 -"Allyson Is Watching",1997,90,NA,4.7,105,4.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Alma",1997,94,NA,4.9,8,0,14.5,0,0,14.5,0,0,45.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Alma Mater",2002,80,NA,8.6,26,14.5,14.5,0,0,4.5,4.5,4.5,0,14.5,44.5,"",0,0,0,1,0,0,0 -"Alma gitana",1996,95,NA,5.7,28,4.5,4.5,0,14.5,4.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Alma's Rainbow",1994,85,NA,5.6,20,4.5,0,14.5,0,14.5,14.5,14.5,14.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Almafuerte",1949,92,NA,6.2,5,0,0,0,0,24.5,24.5,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Almejas y mejillones",2000,92,NA,6.1,74,14.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Almendros - Plaza nueva -, Los",2000,25,NA,7.6,7,0,0,0,0,0,0,24.5,14.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Almonds and Raisins",1984,90,NA,4.7,7,0,14.5,0,14.5,0,0,14.5,44.5,0,14.5,"",0,0,0,0,1,0,0 -"Almost Angels",1962,93,NA,5.5,82,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Almost Blue",2000,86,NA,5.3,136,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Almost Dead",1994,92,NA,4.3,111,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Almost Famous",2000,162,60000000,8,38648,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Almost Guys, The",2004,98,NA,7.9,39,0,0,4.5,0,4.5,0,4.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Almost Heroes",1998,90,NA,4.5,1944,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Almost Hollywood",1994,100,NA,2.9,13,34.5,4.5,0,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Almost Perfect Affair, An",1979,93,NA,5.3,63,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Almost Pregnant",1992,90,NA,4.7,157,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Almost Salinas",2001,92,NA,6.4,81,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"PG",0,0,1,1,0,0,0 -"Almost Summer",1978,88,NA,5.1,51,4.5,0,4.5,4.5,24.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Almost You",1985,96,1000000,4.9,44,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Almost a Gentleman",1939,64,NA,5.2,20,0,0,4.5,4.5,44.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Almost an Angel",1990,96,NA,4.9,727,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Aloha Hooey",1942,8,NA,6.4,11,0,0,0,24.5,4.5,24.5,4.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Aloha Summer",1988,98,NA,5.3,59,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Aloha, Bobby and Rose",1975,85,60000,5,90,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Aloma of the South Seas",1941,77,NA,5.7,18,4.5,4.5,24.5,0,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Alona on the Sarong Seas",1942,7,NA,5.6,9,0,0,0,0,44.5,45.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Alone",2002,110,NA,4.6,232,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Alone Across Australia",2003,52,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Alone in the Dark",1982,92,NA,5.2,243,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alone in the Dark",2005,96,20000000,2.1,2880,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Alone in the T-Shirt Zone",1986,81,NA,4.8,16,34.5,4.5,0,0,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Alone in the Woods",1996,92,NA,3.6,48,14.5,24.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Alone with a Stranger",2000,90,NA,5.3,60,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Alone. Life Wastes Andy Hardy",1998,15,NA,8,39,0,0,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Along Came Auntie",1926,23,NA,5.4,15,0,4.5,0,24.5,24.5,14.5,24.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Along Came Daffy",1947,7,NA,8.1,50,0,4.5,0,0,4.5,4.5,14.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Along Came Jones",1945,90,NA,6.5,175,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Along Came Polly",2004,90,42000000,5.8,9785,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Along Came a Spider",2001,104,28000000,6.1,9456,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Along Flirtation Walk",1935,6,NA,5.5,15,0,0,4.5,4.5,4.5,45.5,24.5,0,0,0,"",0,1,1,0,0,0,1 -"Along for the Ride",2000,99,150000,7.6,15,0,0,0,0,0,0,24.5,34.5,0,44.5,"",0,0,0,0,0,0,0 -"Along the Great Divide",1951,88,NA,6.7,154,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Along the Navajo Trail",1945,66,NA,6,17,14.5,0,0,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Along the Rio Grande",1941,64,NA,4.8,23,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Alouette",1944,3,NA,6,9,0,0,0,14.5,24.5,44.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Alouette, je te plumerai",1988,93,NA,6.3,13,0,0,14.5,4.5,24.5,24.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Alpagueur, L'",1976,110,NA,6.1,246,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Alpha Beta",1973,70,NA,8.5,9,0,0,0,0,0,0,14.5,24.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Alpha City",1985,101,NA,4.8,7,0,14.5,0,14.5,44.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Alpha Dead",2004,11,5000,8,6,14.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Alpha Incident, The",1978,95,200000,4,40,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Alphabet City",1984,85,NA,4.2,86,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alphabet Soup",1995,30,NA,7.7,7,0,14.5,0,0,0,0,0,44.5,0,44.5,"",0,0,1,0,0,0,1 -"Alphabet, The",1968,4,NA,7.1,421,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Alphonse and Gaston, No. 3",1903,1,NA,4.1,9,0,0,34.5,14.5,44.5,14.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Alpine Antics",1936,7,NA,6.6,7,0,0,0,0,0,44.5,44.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Alpine Climbers",1936,10,NA,7.1,58,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Alpine for You",1951,6,NA,6.2,10,0,0,0,14.5,24.5,14.5,44.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Alpsee",1995,15,NA,6.5,19,0,0,4.5,4.5,14.5,14.5,24.5,34.5,14.5,0,"",0,0,0,0,0,0,1 -"Alquimista impaciente, El",2002,111,NA,6.5,97,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alraune",1928,108,NA,8.2,24,0,0,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Alraune",1952,92,NA,5.8,15,4.5,0,0,24.5,0,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Als Hitchcock in Auerstedt auf Eiermanns Else traf",1999,15,NA,3.2,9,14.5,0,44.5,14.5,0,14.5,0,0,0,24.5,"",0,0,0,0,1,0,1 -"Als Mutter streikte",1974,90,NA,3.7,20,4.5,14.5,14.5,14.5,14.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Als es Nacht wurde in Deutschland",1999,8,NA,7.7,7,24.5,0,14.5,0,0,0,14.5,14.5,0,24.5,"",1,0,0,1,0,0,1 -"Als geheilt entlassen",1960,86,NA,5.6,6,14.5,0,0,0,34.5,34.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Als je begrijpt wat ik bedoel",1983,84,2000000,7.5,224,4.5,0,4.5,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Als twee druppels water",1963,119,NA,7.2,125,4.5,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Alt Heidelberg",1959,108,NA,6.3,11,4.5,4.5,4.5,0,4.5,0,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Alt for Egil",2004,90,NA,4.9,97,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Alt for Norge",2005,92,NA,6.1,32,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,1,0,0 -"Alt for kvinden",1964,90,NA,4.7,9,0,0,24.5,24.5,24.5,14.5,24.5,0,0,0,"",0,0,1,0,0,1,0 -"Alt om min far",2002,75,NA,6.8,156,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Altair",1994,10,NA,7.2,9,0,0,0,0,0,0,44.5,0,24.5,34.5,"",0,1,0,0,0,0,1 -"Alte Affe Angst, Der",2003,92,NA,7.8,85,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Altered Species",2001,91,NA,2.7,80,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Altered States",1980,102,NA,6.5,3398,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Alternate, The",2000,91,NA,2.9,189,44.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Alternative Miss World, The",1980,90,NA,6.8,5,0,0,0,0,0,24.5,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Alternative Therapy",1998,10,NA,5.9,8,24.5,0,14.5,0,0,0,24.5,14.5,0,24.5,"",0,0,1,1,0,0,1 -"Altovaya sonata. Dmitriy Shostakovich",1988,80,NA,8.8,15,0,0,0,0,0,14.5,4.5,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Altr'anno e poi cresco, Un",2001,83,NA,4.4,8,24.5,0,0,24.5,14.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Altra vita, Un'",1992,95,NA,7.3,17,0,0,0,0,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Altri tempi",1952,100,NA,6.2,6,0,0,0,0,14.5,34.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Altri uomini",1997,100,NA,5.7,10,0,0,0,24.5,14.5,34.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Altrimenti ci arrabbiamo",1974,101,NA,6.2,557,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",1,0,1,0,0,0,0 -"Altro inferno, L'",1980,88,NA,4.1,56,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Altyn Kyrghol",2001,81,NA,5.9,26,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Alucarda, la hija de las tinieblas",1978,85,NA,4.7,132,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Alvarez Kelly",1966,116,NA,6.2,234,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Alvin Purple",1973,87,NA,5.3,53,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Alvin Purple Rides Again",1974,89,NA,4.3,32,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Always",1985,105,NA,6.4,130,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Always",1989,106,29500000,6.2,4913,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Always Crashing in the Same Car",2004,16,NA,6.4,15,4.5,0,0,0,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Always Goodbye",1938,75,NA,5.8,12,0,0,14.5,0,0,24.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Always Late",2004,6,1000,5.8,8,0,0,0,0,24.5,14.5,14.5,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Always Leave Them Laughing",1949,108,NA,6.2,76,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Always Say Goodbye",1996,98,NA,5.7,15,14.5,0,0,0,0,4.5,4.5,4.5,24.5,44.5,"",0,0,1,0,0,1,0 -"Always Something Better",1996,90,NA,5.1,7,0,0,24.5,0,44.5,0,14.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Always Together",1947,78,NA,5.6,32,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Always a Bride",1940,58,NA,5.7,36,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Always a Bride",1953,82,NA,5.7,15,0,0,0,4.5,24.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Always a Bridesmaid",2000,98,NA,6.9,26,4.5,0,4.5,0,4.5,4.5,34.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Always for Pleasure",1978,58,NA,7.4,11,0,0,0,0,4.5,0,4.5,14.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Always in My Heart",1942,92,NA,5.3,67,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Alye parusa",1961,90,NA,8.6,22,0,0,0,0,4.5,0,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Alyonka",1961,86,NA,8.2,10,14.5,0,0,0,0,0,14.5,14.5,0,74.5,"",0,0,1,0,0,0,0 -"Am I Normal?: A Film About Male Puberty",1979,22,NA,5.8,21,4.5,4.5,4.5,4.5,0,0,0,4.5,4.5,64.5,"",0,1,1,0,1,0,1 -"Am See",2001,45,NA,6.4,10,14.5,0,0,0,0,45.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Am Tag als Bobby Ewing starb",2005,92,NA,8.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Am Tag, als der Regen kam",1959,88,NA,7,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Amadeus",1984,180,18000000,8.3,36955,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Amalfi Way",1955,10,NA,6.2,11,0,0,0,14.5,14.5,14.5,24.5,4.5,4.5,0,"",0,0,0,0,1,0,1 -"Amanda by Night",1981,95,NA,5.7,56,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Amandla! A Revolution In Four Part Harmony",2002,108,NA,7.3,162,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"PG-13",0,0,0,0,1,0,0 -"Amanece, que no es poco",1989,74,NA,7.5,234,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Amant de cinq jours, L'",1961,85,NA,4.2,7,0,0,14.5,14.5,0,14.5,14.5,0,0,44.5,"",0,0,1,1,0,0,0 -"Amant de poche, L'",1978,95,NA,5.1,20,0,14.5,14.5,0,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Amant, L'",1992,111,NA,6.5,2046,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Amante Muito Louca",1973,95,NA,3.9,6,14.5,0,0,0,14.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Amante del vampiro, L'",1960,85,NA,2.4,23,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Amante di Gramigna, L'",1969,108,NA,5.7,5,0,0,0,24.5,0,24.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Amante di Paride, L'",1954,97,NA,3.8,13,0,4.5,24.5,14.5,14.5,34.5,0,0,4.5,0,"",0,0,0,1,0,0,0 -"Amante perduto, L'",1999,97,NA,5.4,55,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Amantes",1991,107,NA,7.3,408,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Amantes del diablo, Las",1971,89,NA,5.7,20,4.5,0,24.5,4.5,14.5,24.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Amanti",1968,88,NA,4.7,43,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Amanti d'oltretomba, Gli",1965,101,NA,5.3,157,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amantide - Scirocco",1987,100,NA,5.5,23,14.5,0,0,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Amants criminels, Les",1999,96,NA,6.5,642,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Amants de Montparnasse (Montparnasse 19), Les",1958,108,NA,7.4,72,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Amants de Teruel, Les",1962,90,NA,9.4,9,0,0,0,0,0,0,0,24.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Amants du Nil, Les",2002,90,NA,4.9,31,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Amants du Pont-Neuf, Les",1991,125,NA,7.4,1564,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Amants du Tage, Les",1955,109,NA,7.4,11,0,0,0,4.5,0,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Amants et voleurs",1935,90,NA,6.2,8,0,0,14.5,0,24.5,0,34.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Amants, Les",1958,90,NA,7,251,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Amar",1954,149,NA,6.2,17,4.5,0,0,4.5,4.5,0,14.5,14.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Amar Akbar Anthony",1977,184,NA,7.4,182,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",1,0,1,1,0,0,0 -"Amar te duele",2002,104,NA,7.1,102,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Amaram",1991,150,NA,8.5,6,0,0,0,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,1,0,1,0 -"Amarcord",1973,127,NA,7.9,4503,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Amarelo manga",2002,100,NA,6.9,183,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Amargosa",2000,93,NA,6.6,69,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Amarillo by Morning",1998,29,NA,6.3,33,4.5,4.5,0,0,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Amarilly of Clothes-Line Alley",1918,67,NA,6.8,78,4.5,0,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Amarsi un po'",1984,93,NA,5,19,0,0,14.5,24.5,14.5,0,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Amasian: The Amazing Asian",2004,26,NA,7.7,7,0,24.5,0,0,0,0,0,0,0,74.5,"",0,0,1,0,0,0,1 -"Amateur",1994,105,NA,6.9,1686,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Amateur Hour",1985,85,NA,6,16,24.5,0,0,0,4.5,4.5,4.5,4.5,0,45.5,"",0,0,1,0,0,0,0 -"Amateur, El",1999,101,NA,6.4,27,0,0,0,4.5,14.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Amateur, The",1981,112,NA,5,197,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amateurs, Les",2003,93,NA,5.2,40,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amati Girls, The",2000,91,NA,3.4,161,14.5,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Amato: A Love Affair with Opera",2001,66,NA,8.8,6,0,0,0,0,0,0,14.5,0,64.5,14.5,"",0,0,0,0,1,0,0 -"Amator",1979,112,NA,7.8,249,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Amaxaki, To",1957,106,NA,8.6,8,0,0,0,14.5,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Amazing Adventures of Spider-Man, The",1999,5,NA,6.7,49,4.5,0,4.5,4.5,4.5,0,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Amazing Colossal Man, The",1957,80,NA,4.1,522,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amazing Dobermans, The",1976,96,NA,4.6,101,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Amazing Dr. Clitterhouse, The",1938,87,NA,6.5,233,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Amazing Grace",1974,99,NA,4.6,31,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Amazing Grace and Chuck",1987,114,NA,5.4,415,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Amazing Grace: Jeff Buckley",2004,60,NA,8.1,9,0,0,0,0,14.5,14.5,24.5,14.5,0,44.5,"",0,0,0,0,1,0,0 -"Amazing Journeys",1999,40,NA,6,12,0,0,4.5,14.5,24.5,14.5,14.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Amazing Mr. Bickford, The",1987,60,NA,7,28,0,0,0,4.5,4.5,14.5,4.5,4.5,4.5,45.5,"",0,1,0,0,0,0,0 -"Amazing Mr. Blunden, The",1972,99,NA,6.5,137,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Amazing Mr. Nordill, The",1947,11,NA,6,9,0,0,14.5,0,24.5,24.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,1 -"Amazing Mr. Williams, The",1939,80,NA,5.9,11,0,4.5,0,4.5,24.5,4.5,34.5,0,4.5,0,"",0,0,1,1,0,0,0 -"Amazing Mr. X, The",1948,78,NA,7.1,53,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Amazing Mrs. Holliday, The",1943,96,NA,6.1,29,4.5,0,4.5,0,14.5,34.5,4.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Amazing Panda Adventure, The",1995,81,NA,5.5,304,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Amazing Quest of Ernest Bliss, The",1936,61,NA,5.9,172,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Amazing Tails 1",1987,70,NA,4.8,5,0,0,24.5,44.5,0,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Amazing Transparent Man, The",1960,57,NA,3.2,203,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amazing World of Ghosts",1978,91,NA,5.1,8,14.5,0,24.5,0,14.5,0,0,0,0,45.5,"",0,0,0,0,1,0,0 -"Amazing World of Psychic Phenomena, The",1976,93,NA,5.4,16,0,4.5,4.5,0,14.5,14.5,0,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Amazon",1997,38,NA,6.3,39,4.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Amazon Quest",1949,75,NA,4.3,10,14.5,0,44.5,24.5,0,14.5,24.5,0,0,0,"",1,0,0,1,0,0,0 -"Amazon Warrior",1998,83,NA,4.6,17,14.5,4.5,14.5,0,14.5,4.5,14.5,0,24.5,4.5,"",1,0,0,0,0,0,0 -"Amazon Women on the Moon",1987,85,NA,5.6,2540,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Amazone",2000,88,NA,5,119,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Amazones",2004,100,NA,5.5,28,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,0,"",1,0,1,0,0,0,0 -"Amazones 2000",2000,52,NA,9.2,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,0,0,1,0,0 -"Amazones du temple d'or, Les",1986,85,NA,4.5,18,14.5,14.5,4.5,14.5,14.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Amazons",1986,76,NA,4.2,70,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Amazons and Gladiators",2001,89,NA,4,233,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Amazzoni - donne d'amore e di guerra, Le",1973,100,NA,4.5,35,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Ambassade, L'",1973,20,NA,6.7,9,14.5,0,0,0,14.5,0,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,1 -"Ambassador Bill",1931,68,NA,5.8,17,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ambassador's Daughter, The",1956,103,NA,5.5,76,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ambassador, The",1984,97,NA,5.3,81,4.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ambavi Suramis tsikhitsa",1984,88,NA,7.7,92,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Amber",2004,3,NA,8.9,17,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Ambizioso, L'",1975,102,NA,8.6,8,0,0,0,0,14.5,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Amblin'",1968,26,NA,7,70,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Ambrose's Nasty Temper",1915,11,NA,6,8,0,14.5,0,14.5,0,45.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Ambrose's Sour Grapes",1915,20,NA,6.5,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Ambulance, The",1990,91,NA,5.3,427,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ambush",1949,90,NA,6.2,51,0,0,0,4.5,24.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ambush Bay",1966,109,NA,5.1,72,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Ambush Trail",1946,60,NA,4.7,9,14.5,0,14.5,0,44.5,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Ambush at Cimarron Pass",1958,73,NA,5.1,62,4.5,0,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ambush at Tomahawk Gap",1953,73,NA,5.4,36,0,0,4.5,14.5,14.5,44.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Ambushed",1998,109,NA,6,201,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ambushers, The",1967,109,NA,4.5,226,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Amdaeng Muen kab nai Rid",1994,125,NA,5.1,8,0,0,14.5,0,14.5,0,0,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Ame agaru",1999,91,3800000,7.8,448,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Amei um bicheiro",1952,90,NA,7,10,0,0,0,0,14.5,24.5,24.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Amen.",2002,132,NA,7.3,1747,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"America",1924,93,NA,6.7,60,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"America 101",2005,86,NA,9.5,31,4.5,4.5,0,0,0,0,0,4.5,4.5,74.5,"",0,0,1,0,0,0,0 -"America 3000",1986,84,2000000,3.7,123,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"America Is Waiting",1981,4,NA,5.4,19,0,4.5,0,4.5,14.5,34.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"America So Beautiful",2001,91,NA,5.5,40,14.5,4.5,4.5,0,14.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"America a Roma, L'",1998,78,NA,8.1,5,0,0,0,0,0,0,24.5,24.5,64.5,0,"",0,0,0,0,1,0,0 -"America at the Movies",1976,116,NA,5.5,37,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"America the Beautiful",1958,16,NA,4.2,6,0,0,14.5,0,14.5,0,0,34.5,0,34.5,"",0,0,0,0,1,0,1 -"America the Beautiful",1967,20,NA,8.3,10,0,0,0,0,0,0,0,34.5,24.5,45.5,"",0,0,0,0,1,0,1 -"America the Beautiful",1975,20,NA,9.4,9,0,14.5,0,0,0,0,0,14.5,34.5,44.5,"",0,0,0,0,1,0,1 -"America's Heart and Soul",2004,84,NA,4.1,317,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"America's Hidden Weapon",1944,10,NA,3.3,5,24.5,0,24.5,0,0,0,0,0,64.5,0,"",0,0,0,0,1,0,1 -"America's Sweetheart: The Mary Pickford Story",1978,73,NA,9.3,7,0,0,0,14.5,0,0,0,0,0,84.5,"",0,0,0,0,1,0,0 -"America's Sweethearts",2001,102,48000000,5.8,11849,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"America, America",1963,174,NA,7.5,485,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"America, Preferred",1941,7,NA,5.9,5,0,0,0,24.5,44.5,0,24.5,24.5,0,0,"",0,0,0,0,1,0,1 -"American Adobo",2001,104,NA,4.3,78,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"American Angels: Baptism of Blood",1989,99,NA,3.3,39,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"American Anthem",1986,102,NA,3.7,255,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"American Aristocracy",1916,50,NA,7.3,8,14.5,0,0,0,14.5,0,24.5,34.5,14.5,0,"",0,0,1,1,0,0,0 -"American Astronaut, The",2001,91,NA,7.7,316,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"American Beauty",1999,121,15000000,8.5,109991,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"American Beauty Pie",2000,8,NA,7.8,6,34.5,0,0,0,0,0,0,14.5,34.5,14.5,"",0,0,1,0,0,0,1 -"American Beer",1996,85,NA,5.5,41,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"American Beer",2004,105,NA,9.4,19,14.5,0,4.5,0,0,4.5,0,0,14.5,45.5,"",0,0,0,0,1,0,0 -"American Bickman Burger, The",2001,18,100000,5.7,13,24.5,0,0,0,0,4.5,34.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"American Blonde",1994,84,NA,4.4,24,14.5,0,0,4.5,14.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"American Blue Note",1989,97,NA,6,37,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"American Born",1991,96,NA,4.8,10,14.5,0,14.5,34.5,14.5,24.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"American Boy: A Profile of: Steven Prince",1978,55,155000,7.2,69,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"American Boyfriends",1989,90,NA,5.1,47,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"American Buffalo",1996,88,NA,5.7,888,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"American Chai",2001,92,NA,6.1,148,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,1,1,0,0,0 -"American Commandos",1985,88,NA,4.4,20,34.5,14.5,0,14.5,14.5,0,4.5,4.5,0,24.5,"",1,0,0,0,0,0,0 -"American Cowboy",1998,52,NA,1.4,11,24.5,4.5,0,0,0,0,4.5,0,34.5,14.5,"",0,0,0,0,1,0,0 -"American Cyborg: Steel Warrior",1994,94,NA,3.3,167,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"American Daylight",2004,98,NA,6.1,14,14.5,0,4.5,4.5,4.5,4.5,34.5,0,0,24.5,"",0,0,0,0,0,1,0 -"American Desi",2001,100,250000,6.8,291,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"American Desire",1981,79,NA,4.5,11,0,0,0,4.5,4.5,0,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"American Detective",1999,87,NA,5.2,16,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"American Dragons",1998,91,NA,4.3,173,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"American Dream",1991,98,NA,7.9,174,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"American Dream Girls",1987,80,NA,5.2,6,0,14.5,14.5,0,34.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"American Dream, An",1966,103,NA,5.3,36,4.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"American Dreamer",1984,105,NA,5.9,361,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"American Dreamer, The",1971,90,NA,6.2,9,0,14.5,0,0,14.5,0,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"American Drive-In",1985,92,10000000,4.1,25,14.5,14.5,14.5,24.5,4.5,24.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"American Dummy",2002,28,NA,6.3,10,14.5,14.5,0,14.5,0,24.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"American Eagle",1989,92,NA,3.3,17,4.5,4.5,24.5,14.5,14.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"American Empire",1942,82,NA,7,27,0,0,4.5,0,4.5,24.5,44.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"American Eunuchs",2003,80,NA,7.2,19,14.5,0,4.5,0,0,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"American Exile",2001,26,NA,9.1,10,14.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,0,1,0,1 -"American Fabulous",1991,103,NA,5.5,29,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"American Fame Pt. 1: Drowning River Phoenix",2004,11,NA,7.1,7,24.5,0,0,0,0,0,0,14.5,0,45.5,"",0,0,0,0,1,0,1 -"American Flatulators",1995,3,NA,1,5,100,0,0,0,0,0,0,0,0,0,"",0,1,0,0,0,0,1 -"American Flyers",1985,113,NA,6,1044,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"American Friends",1991,95,NA,6.5,186,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"American Gigolo",1980,117,4800000,5.7,2469,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"American Gothic",1988,90,NA,4.1,429,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"American Graffiti",1973,110,777000,7.6,12758,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"American Guerrilla in the Philippines",1950,105,NA,6.3,117,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"American Gun",2002,89,NA,6,267,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"American Heart",1992,113,NA,6.6,435,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"American History",1992,5,NA,4.2,25,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,0,44.5,"",0,1,1,0,1,0,1 -"American History X",1998,119,10000000,8.4,59677,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"American History: Resettlement of Japanese Americans in Greater Cleveland, An",2000,53,NA,8.9,11,0,0,0,0,0,0,24.5,0,24.5,44.5,"",0,0,0,0,1,0,0 -"American Hollow",1999,90,NA,6.6,101,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"American Hot Wax",1978,91,NA,6.3,332,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"American Intellectuals",1999,100,NA,6.9,7,24.5,0,0,0,0,14.5,0,0,0,45.5,"",0,0,1,0,0,0,0 -"American Jedi",2002,8,2000,7.9,9,0,14.5,0,0,0,14.5,14.5,0,44.5,24.5,"",0,0,1,0,0,0,1 -"American Journeys",1984,21,NA,7.6,12,0,0,0,0,0,4.5,24.5,34.5,34.5,0,"",0,0,0,0,1,0,1 -"American Kickboxer",1991,92,NA,3.4,67,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"American Made",2003,25,NA,6.4,29,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"American Madness",1932,75,NA,7.3,99,0,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"American March",1941,3,NA,4.8,18,14.5,14.5,4.5,14.5,4.5,4.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"American Me",1992,125,16000000,6.6,697,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"American Mod",2002,18,NA,5.2,15,0,0,0,44.5,14.5,0,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"American Movie: The Making of Northwestern",1999,107,NA,7.5,3421,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,0,1,0,0 -"American Mullet",2001,52,NA,6.4,55,4.5,0,0,14.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"American Mythologies",1981,104,NA,3.4,7,14.5,24.5,14.5,0,14.5,0,0,14.5,0,14.5,"",0,0,0,0,1,0,0 -"American Nightmare",1983,88,NA,3.2,32,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"American Nightmare, The",2000,73,NA,6.8,306,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"American Ninja 2: The Confrontation",1987,90,350000,3.7,641,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"American Ninja 3: Blood Hunt",1989,89,NA,2.4,474,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"American Ninja 4: The Annihilation",1991,99,NA,2.9,316,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"American Ninja V",1993,102,NA,2.4,259,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"American Nutria",2004,11,NA,6.8,8,0,0,0,14.5,0,0,14.5,45.5,14.5,14.5,"",0,0,0,0,0,0,1 -"American Outlaws",2001,94,35000000,5.5,2878,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,0,1,0,0,0,0 -"American Passport",1999,82,NA,4.9,13,0,0,0,24.5,24.5,0,14.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"American Perfekt",1997,100,NA,5.9,433,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"American Pi",2002,9,NA,5.6,6,0,0,14.5,0,14.5,14.5,14.5,0,0,34.5,"",0,0,1,0,0,0,1 -"American Pictures",1984,115,NA,9.1,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,1,0,0 -"American Pie",1980,86,NA,6.6,27,0,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"American Pie",1999,95,11000000,6.8,41126,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"American Pie 2",2001,105,30000000,6.3,22752,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"American Pop",1981,96,NA,6.1,606,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,1,0,1,0,0,0 -"American President, The",1995,114,62000000,6.9,11834,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"American Psycho",2000,102,8000000,6.8,21639,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"American Raspberry",1977,75,50000,5.5,17,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"American Rhapsody, An",2001,106,NA,7,732,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"American Road, The",1953,37,NA,2.1,5,44.5,24.5,24.5,24.5,0,0,0,0,0,0,"",0,0,0,0,1,0,1 -"American Romance, An",1944,151,NA,6.2,51,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"American Roulette",1988,102,NA,4.6,40,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"American Saint",2001,90,NA,4.3,30,4.5,0,24.5,4.5,0,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"American Scream, The",1988,85,NA,2.5,17,34.5,0,14.5,14.5,14.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"American Shaolin",1991,106,NA,4.4,129,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"American Short",2004,35,NA,1.5,24,74.5,0,14.5,0,4.5,4.5,0,0,0,4.5,"",0,0,0,1,1,0,1 -"American Splendor",2003,101,NA,7.8,8530,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,1,1,0,0,0 -"American Spoken Here",1940,11,NA,7.1,11,0,0,0,0,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"American Standoff",2002,95,NA,7.5,34,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"American Storytellers",2003,90,NA,6,11,0,0,4.5,0,0,4.5,0,4.5,0,74.5,"",0,0,0,0,1,0,0 -"American Strays",1996,97,NA,5.2,238,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"American Success Company, The",1980,91,NA,4.8,82,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"American Summer, An",1991,100,NA,4.7,49,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,1,1,0,0,0 -"American Taboo",1982,94,NA,3.1,32,14.5,4.5,0,24.5,4.5,0,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"American Tail, An",1986,80,NA,6.5,3219,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,1,0,0,0 -"American Tail: Fievel Goes West, An",1991,75,NA,5.8,1772,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,1,1,0,0,0,0 -"American Tickler",1976,77,NA,2.7,13,34.5,24.5,4.5,0,0,24.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"American Tigers",1996,95,NA,3,18,14.5,4.5,14.5,14.5,24.5,4.5,14.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"American Tragedy, An",1931,96,NA,6.5,53,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"American Vampire Story, An",1997,99,NA,2.1,149,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"American Virgin",2000,88,NA,3.7,506,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"American Waitress, New Mexico",2002,66,NA,8,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"American Wedding",2003,103,55000000,6.3,13590,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"American Werewolf in London, An",1981,92,10000000,7.2,8347,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"American Werewolf in Paris, An",1997,105,22000000,5,4302,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"American Yakuza",1993,96,NA,5.2,308,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"American Yearbook",2004,90,500000,9.3,23,0,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"American in Paris, An",1951,113,2723903,7.4,3736,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Americaner Shadchen",1940,87,NA,6,15,0,4.5,0,4.5,0,44.5,14.5,24.5,0,0,"",0,0,1,0,0,1,0 -"Americanization of Emily, The",1964,115,NA,7.3,559,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Americano",2005,95,NA,8.1,31,4.5,0,0,0,4.5,0,4.5,0,4.5,74.5,"",0,0,1,0,0,1,0 -"Americano a Roma, Un",1954,94,NA,6.5,127,4.5,4.5,0,0,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Americano in vacanza, Un",1946,110,NA,3.6,5,24.5,24.5,0,24.5,24.5,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Americano rosso",1991,98,NA,5.6,21,4.5,0,4.5,0,14.5,14.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Americano, The",1916,50,NA,7.3,13,0,0,0,0,14.5,4.5,34.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Americano, The",1955,85,NA,5.1,50,0,4.5,14.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Americanos: Latino Life in the United States",2000,81,NA,7,11,0,0,0,0,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Americathon",1979,86,NA,3.4,220,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ameriikan raitti",1990,120,NA,5.2,42,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Amerika",1994,90,NA,4.6,54,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Amerika",2000,60,NA,5.6,5,24.5,0,0,24.5,0,0,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Amerikai anzix",1975,91,NA,8.6,9,0,0,0,34.5,0,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Amerikanische Freund, Der",1977,127,NA,7.1,1045,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Amerikanische Soldat, Der",1970,80,NA,6.5,162,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Amerikanskaya doch",1995,98,NA,5.7,48,0,4.5,0,4.5,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Amerikanskiy dedushka",1993,80,NA,4.8,7,14.5,14.5,14.5,0,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Ameta",1903,1,NA,4.9,11,0,4.5,14.5,4.5,14.5,44.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Ami de Vincent, L'",1983,90,NA,6.1,22,4.5,0,4.5,4.5,4.5,34.5,34.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Ami de mon amie, L'",1987,103,NA,7.4,369,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Amic/Amat",1999,90,NA,7.6,150,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Amiche del cuore, Le",1992,110,NA,6.4,22,4.5,0,4.5,0,4.5,44.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Amiche, Le",1955,104,NA,7.1,108,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Amici ahrarara",2001,95,NA,5.5,15,24.5,14.5,4.5,24.5,4.5,0,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Amici miei",1975,140,NA,8.1,361,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Amici miei atto II",1982,130,NA,7.8,170,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Amici miei atto III",1985,110,NA,5.6,67,0,4.5,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amici per la pelle",1955,94,NA,5.2,26,0,0,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Amico d'infanzia, L'",1994,100,NA,4.7,24,14.5,4.5,0,4.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Amico del cuore, L'",1998,100,NA,4.8,62,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Amico del padrino, L'",1972,90,NA,6.9,10,0,0,24.5,24.5,0,0,34.5,34.5,0,0,"",1,0,0,1,0,0,0 -"Amida-do dayori",2002,127,NA,7.5,18,0,0,0,0,0,4.5,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Amies de ma femme, Les",1993,90,NA,3.3,13,14.5,4.5,4.5,14.5,0,24.5,24.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Amiga, La",1988,110,NA,5.4,19,4.5,0,0,4.5,14.5,44.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Amigos",1999,21,NA,6.3,14,0,0,4.5,0,4.5,34.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,1 -"Amigos, Los",1972,91,NA,4.7,52,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amis, Les",1970,100,NA,8.2,6,0,0,0,0,0,34.5,0,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Amistad",1997,152,40000000,7,10543,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Amityville 3-D",1983,105,NA,3.2,598,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amityville Horror, The",1979,117,NA,5.3,3279,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Amityville Horror, The",2005,90,18000000,5.8,2945,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Amityville II: The Possession",1982,100,NA,4.1,953,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amleto di meno, Un",1973,70,NA,8.6,13,0,0,4.5,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Ammazzali tutti e torna solo",1968,89,NA,9.2,8,0,0,0,0,0,24.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Ammoru",1995,129,NA,6.9,16,0,0,0,0,4.5,14.5,4.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"AmnesiA",2001,90,NA,7.4,187,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Amnesia",1994,90,NA,6.3,42,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Amnesia",2000,14,NA,6.6,20,0,4.5,0,0,4.5,34.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Amo tu cama rica",1992,95,NA,6.7,109,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Amok",1934,92,NA,2.7,6,0,14.5,0,0,0,0,0,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Amok",1993,90,NA,5.7,7,0,0,0,0,24.5,0,0,14.5,0,45.5,"",0,0,1,1,0,0,0 -"Amok",1998,100,NA,6,13,0,0,4.5,14.5,4.5,14.5,24.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Amoklauf",1992,65,NA,3.3,38,44.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Among Giants",1998,93,NA,5.4,334,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Among Men",1991,80,NA,7.8,12,0,0,0,0,0,0,44.5,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Among Others",2000,18,NA,7.4,16,0,0,4.5,0,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Among Thieves",2004,27,NA,9.1,7,0,0,0,0,0,0,24.5,0,0,74.5,"",0,0,0,1,0,0,1 -"Among Those Present",1921,35,NA,7.4,32,4.5,0,0,0,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Among the Cinders",1983,104,NA,5.4,20,0,4.5,0,4.5,14.5,24.5,24.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Among the Living",1941,67,NA,6.2,31,0,0,0,4.5,14.5,14.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Amongst Friends",1993,86,NA,5,191,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Amor",2000,12,NA,9.4,6,0,0,0,0,0,0,0,34.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Amor & Alquimia",1995,22,NA,8.1,36,0,0,0,4.5,4.5,0,4.5,14.5,4.5,74.5,"",0,0,1,0,0,1,1 -"Amor & Cia",1998,102,NA,8.1,81,4.5,4.5,0,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Amor - primera parte, El",2004,110,NA,6.1,20,0,0,0,0,14.5,14.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Amor Natural, O",1997,76,NA,7.5,28,0,0,0,0,0,0,34.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Amor a la vuelta de la esquina",1985,95,NA,5.9,6,0,0,0,14.5,0,34.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Amor bandido",1979,95,NA,6.3,85,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Amor brujo, El",1967,103,NA,6.1,13,4.5,0,4.5,0,14.5,14.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Amor brujo, El",1986,108,NA,6.9,99,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Amor de Don Juan, El",1956,93,NA,4.2,16,14.5,0,14.5,4.5,4.5,4.5,14.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Amor en concreto",2003,102,NA,6,5,24.5,0,0,0,0,24.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Amor en el aire",1967,100,NA,5.5,8,14.5,0,0,0,14.5,0,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Amor es una mujer gorda, El",1987,82,NA,6.1,27,0,0,4.5,4.5,0,14.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Amor estranho Amor",1982,120,NA,6.7,105,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Amor idiota",2004,104,NA,4.9,26,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Amor libre",1978,97,NA,5.7,10,0,14.5,0,24.5,14.5,14.5,34.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Amor nello specchio",1999,104,NA,6.7,16,0,0,0,0,14.5,34.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Amor perjudica seriamente la salud, El",1996,117,NA,7.2,340,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Amor propio",1994,111,NA,5.3,18,4.5,14.5,0,4.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Amor vertical",1997,100,NA,6.1,42,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amor y el espanto, El",2001,110,650000,7,7,0,14.5,0,0,0,0,45.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Amor y sexo",1964,110,NA,3.9,9,34.5,14.5,0,0,14.5,0,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Amor!",1994,14,NA,6.1,7,0,0,0,0,14.5,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Amor, curiosidad, prozak y dudas",2001,99,NA,6,49,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Amore a Roma, Un",1960,113,NA,5.9,9,0,0,0,0,44.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,1,0 -"Amore amaro",1974,106,NA,3.1,9,34.5,0,0,0,24.5,14.5,0,34.5,0,0,"",0,0,0,0,0,0,0 -"Amore di Marja, L'",2002,102,NA,6.3,6,0,0,14.5,0,0,34.5,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Amore difficile, L'",1962,125,NA,5.6,5,0,24.5,0,0,24.5,44.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Amore imperfetto, L'",2002,92,NA,6.6,5,0,0,0,24.5,24.5,0,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Amore in prima classe",1979,95,NA,5,5,24.5,0,0,24.5,0,24.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Amore in quattro dimensioni",1964,105,NA,3.1,5,0,24.5,44.5,0,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Amore mio aiutami",1969,124,NA,5.3,20,4.5,0,0,4.5,24.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Amore molesto, L'",1995,104,NA,6.7,67,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Amore necessario, L'",1991,90,NA,3.3,9,45.5,0,0,24.5,0,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Amore primitivo, L'",1964,83,NA,5.5,21,14.5,4.5,4.5,4.5,4.5,14.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Amore probabilmente, L'",2001,107,NA,5,32,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Amore ritorna, L'",2004,111,NA,7,34,0,0,0,4.5,0,24.5,44.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Amore ritrovato, L'",2004,98,NA,4.7,40,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Amore sporco",1988,95,NA,2.4,10,34.5,24.5,14.5,0,24.5,0,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Amore tossico",1983,90,NA,8,24,4.5,0,0,0,0,4.5,24.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Amore!",1993,90,NA,4.4,41,14.5,0,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Amore, L'",1948,79,NA,6.7,90,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Amore, piombo e furore",1978,98,NA,4.9,104,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Amores",1998,100,NA,8.7,30,0,4.5,0,0,4.5,0,14.5,24.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Amores de Kafka, Los",1988,98,NA,5.8,14,0,0,0,14.5,24.5,4.5,24.5,34.5,0,0,"",0,0,0,1,0,1,0 -"Amores perros",2000,153,2000000,8.2,15079,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Amores que matan",1996,90,NA,7.8,33,0,0,0,4.5,14.5,4.5,14.5,34.5,24.5,0,"",0,0,0,0,0,0,0 -"Amores que matan",2000,20,NA,6.4,7,0,0,0,14.5,0,14.5,44.5,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Amori di Ercole, Gli",1960,98,NA,3.1,60,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Amori in corso",1989,82,NA,8.2,14,0,0,0,0,14.5,0,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Amorosa",1986,117,NA,4.9,27,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Amorosas, As",1968,100,NA,6.2,8,0,0,0,0,0,45.5,0,24.5,0,24.5,"",0,0,0,1,0,1,0 -"Amorous Adventures of Don Quixote and Sancho Panza, The",1976,104,NA,1.9,12,24.5,34.5,4.5,0,0,0,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Amorous Adventures of Moll Flanders, The",1965,126,NA,5.6,117,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Amorous Prawn, The",1962,89,NA,5.8,27,0,4.5,0,14.5,24.5,14.5,24.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Amors bilar",1988,65,NA,5.7,5,0,24.5,0,0,24.5,44.5,0,0,0,24.5,"",0,0,0,0,1,0,0 -"Amos & Andrew",1993,92,NA,5.2,1879,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Amour Infinity",2000,85,NA,7,10,34.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Amour aux sports d'hiver, L'",1981,73,NA,4.7,10,0,14.5,0,14.5,14.5,24.5,14.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Amour avec des si, L'",1962,85,NA,7.3,13,4.5,0,4.5,4.5,0,0,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Amour braque, L'",1985,101,NA,4.2,72,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Amour c'est gai, l'amour c'est triste, L'",1971,95,NA,5.4,14,0,0,4.5,0,24.5,14.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Amour d'enfance",2001,102,NA,5.7,33,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Amour d'une femme, L'",1954,104,NA,6.5,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Amour de la vie - Artur Rubinstein, L'",1969,89,NA,7.5,9,0,0,0,0,0,14.5,14.5,14.5,44.5,24.5,"",0,0,0,0,1,0,0 -"Amour en douce, L'",1985,100,NA,5.6,64,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Amour en fuite, L'",1979,94,NA,7.1,649,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Amour en question, L'",1978,100,NA,5.2,10,14.5,0,0,24.5,0,34.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Amour et confusions",1997,105,NA,4.4,56,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Amour existe, L'",1960,21,NA,7.6,29,0,0,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Amour fou, L'",1969,252,NA,7.9,27,0,0,0,0,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Amour par terre, L'",1984,125,NA,7.4,25,0,0,0,0,0,14.5,24.5,34.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Amour, L'",1970,88,NA,5.9,8,14.5,0,0,24.5,14.5,45.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Amour, L'",1990,80,NA,5.9,10,0,0,14.5,14.5,0,14.5,44.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Amour, l'argent, l'amour, L'",2000,137,NA,6.3,58,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Amoureuse",1992,99,NA,6.1,30,4.5,0,0,14.5,14.5,14.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Amoureuse, L'",1987,98,NA,4.2,8,0,14.5,0,0,0,14.5,45.5,0,14.5,14.5,"",0,0,0,1,0,1,0 -"Amoureuses, Les",1993,99,NA,5.5,11,0,0,0,4.5,0,44.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Amoureux sont seuls au monde, Les",1948,105,NA,5.9,11,0,4.5,0,4.5,14.5,0,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Amoureux, Les",1994,90,NA,6.1,29,4.5,4.5,0,4.5,4.5,0,24.5,24.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Amphitryon",1935,105,NA,7.6,20,0,0,0,4.5,0,4.5,14.5,34.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Amplifier",1999,10,NA,5.3,29,14.5,0,0,14.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Amputee, The",1974,9,NA,6.3,268,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Amsterdam Affair",1968,100,NA,5.7,8,0,14.5,0,14.5,14.5,24.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Amsterdam Global Village",1996,245,NA,6.2,18,4.5,14.5,0,0,14.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Amsterdam Kill, The",1977,90,NA,4.9,61,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Amsterdamned",1988,114,NA,6.3,1014,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Amu",2005,102,NA,6.6,19,0,14.5,14.5,4.5,4.5,14.5,0,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Amuleto de Ogum, O",1974,112,NA,6.3,17,0,4.5,0,14.5,0,14.5,4.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Amulett des Todes, Das",1975,80,NA,4.8,35,4.5,4.5,14.5,14.5,4.5,24.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Amuse-gueule",1984,28,NA,6.4,9,14.5,0,0,0,14.5,24.5,34.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Amy",1981,100,NA,6.6,53,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Amy",1997,9,NA,4.5,9,34.5,0,0,14.5,0,14.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Amy",1998,104,NA,7,252,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Amy Muller",1896,1,NA,4.3,27,14.5,4.5,24.5,4.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,1,0,1 -"Amy's Orgasm",2001,87,NA,5.3,519,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"An 01, L'",1973,90,NA,4.4,74,74.5,4.5,0,0,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"An Bloem",1983,83,NA,5.8,7,0,0,0,0,14.5,44.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"An eheis tyhi",1964,95,NA,7.2,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"An heiligen Wassern",1960,109,NA,6,9,0,0,0,0,14.5,34.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"An itan to violi pouli",1984,78,NA,5,7,0,0,14.5,14.5,24.5,14.5,0,0,24.5,0,"",0,0,1,0,0,0,0 -"An ju",1997,100,NA,8.5,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"An-Magritt",1969,100,NA,5.3,24,4.5,0,4.5,4.5,34.5,24.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Ana y los lobos",1973,102,NA,7.1,83,4.5,0,4.5,0,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ana y los otros",2002,80,NA,7.1,102,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Anacardium",2001,94,NA,8.2,15,4.5,0,4.5,0,0,0,14.5,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Anaconda",1997,89,45000000,4.1,10510,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Anacondas: The Hunt for the Blood Orchid",2004,97,25000000,4.2,2258,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Anacoreta, El",1976,108,NA,5.4,10,0,0,14.5,0,24.5,0,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Anahy de las Misiones",1997,107,NA,8.2,32,4.5,0,0,4.5,4.5,0,4.5,44.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Anak",2000,120,NA,7.4,33,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Anal Intruder 2",1988,69,NA,4.3,5,0,0,24.5,0,0,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Anal Intruder 3",1989,73,NA,6.9,6,0,0,0,34.5,0,0,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Analfabeto, El",1961,128,NA,6.5,31,0,0,4.5,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Analyze That",2002,96,NA,5.5,6863,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Analyze This",1999,109,30000000,6.6,24521,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Anam",2001,86,NA,6.8,23,0,0,0,4.5,0,34.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Ananas",1984,76,NA,4.6,6,0,0,0,14.5,0,14.5,14.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Anand",1970,122,NA,8.3,251,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Anansi",2002,80,NA,5.5,14,0,0,4.5,4.5,24.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Anantaram",1987,125,NA,9.1,7,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Anaparastassi",1970,100,NA,7.7,49,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Anarchist Cookbook, The",2002,101,NA,5.5,318,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Anarchy TV",1998,87,NA,4.7,84,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Anari",1959,166,NA,8.1,24,0,4.5,0,0,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Anarkali",1953,175,NA,8.5,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Anastasia",1956,105,NA,7.2,1042,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Anastasia",1997,94,53000000,6.5,4896,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Anastasia - Die letzte Zarentochter",1956,107,NA,5,12,4.5,0,4.5,0,24.5,14.5,14.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Anastasia mio fratello ovvero il presunto capo dell'Anonima Assassini",1973,87,NA,5.8,11,4.5,0,0,0,24.5,34.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Anata-ga suki desu, dai suki desu",1994,58,NA,7.6,21,4.5,0,0,0,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Anatahan",1954,94,NA,7.2,58,0,0,4.5,4.5,4.5,14.5,4.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Anatomia milosci",1972,92,NA,7,6,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Anatomie",2000,103,NA,6.1,2501,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Anatomie 2",2003,101,NA,5.5,582,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Anatomie de l'enfer",2004,87,NA,4.2,340,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anatomist, The",1961,73,NA,7,16,0,0,0,4.5,24.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Anatomy of Desire",1995,48,NA,7,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Anatomy of a Fight",2003,80,17000,6.5,24,4.5,0,0,0,0,4.5,4.5,24.5,44.5,24.5,"",0,0,1,1,0,0,0 -"Anatomy of a Murder",1959,160,NA,8,3901,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Anatomy of a Psycho",1961,75,NA,3.2,44,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anatra all'arancia, L'",1975,105,NA,5.5,26,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Anayurt Oteli",1987,110,NA,7.5,59,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Anazahevun",2000,132,NA,6.1,211,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Anazapta",2001,105,NA,5.2,78,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anazitisi",1972,89,NA,4,9,14.5,0,0,44.5,14.5,0,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Anbe Sivam",2003,160,NA,7.6,53,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Anche gli angeli mangiano fagioli",1973,111,NA,5.5,142,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Anche gli angeli tirano di destro",1974,111,NA,5,20,4.5,14.5,0,4.5,14.5,24.5,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Anche i commercialisti hanno un'anima",1994,110,NA,4.8,12,14.5,0,4.5,14.5,24.5,14.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Anche nel west c'era una volta Dio",1968,105,NA,2.9,14,24.5,4.5,4.5,4.5,24.5,4.5,0,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Anchor Zone",1994,82,NA,2.6,16,44.5,14.5,0,14.5,0,4.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Anchoress",1993,106,NA,4.9,69,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Anchorman: The Legend of Ron Burgundy",2004,104,26000000,6.5,11553,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Anchors Aweigh",1945,143,NA,6.8,784,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Anciens de Saint-Loup, Les",1950,90,NA,6.1,17,4.5,0,4.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ancient Evil: Scream of the Mummy",2000,96,NA,1.9,276,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Ancient Fistory",1953,7,NA,5,14,0,0,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Ancient Warriors",2001,93,NA,3.8,42,34.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"And Baby Makes Three",1949,84,700000,5.3,22,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"And But So Then",2002,27,NA,4.1,7,24.5,24.5,0,14.5,0,0,0,0,14.5,14.5,"",0,0,0,1,0,0,1 -"And God Created Woman",1988,100,NA,4.1,430,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"And I Lived",2005,107,20000,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,1,0,0,0 -"And Now Miguel",1966,95,NA,6.2,26,4.5,4.5,0,0,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"And Now Tomorrow",1944,86,NA,6.1,48,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"And Now for Something Completely Different",1971,85,100000,7.4,3539,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"And Now the Screaming Starts!",1973,91,NA,5.1,211,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"And Now... Ladies and Gentlemen...",2002,122,NA,5.8,413,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"And One Was Beautiful",1940,70,NA,5.8,28,4.5,4.5,4.5,4.5,14.5,24.5,34.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"And She Learned About Dames",1934,9,NA,5.8,8,0,0,0,0,45.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"And She Smiled",1996,21,NA,7,5,0,24.5,0,0,0,24.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,1 -"And So It Goes...",2002,20,NA,8.7,16,4.5,0,0,14.5,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"And Soon the Darkness",1970,94,NA,5.9,141,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"And Then Came Summer",2000,115,2300,4.1,60,24.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"And Then There Were None",1945,97,NA,7.7,1476,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"And Then There Were None",1974,98,NA,5.1,305,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"And Then You Die",1987,115,NA,5.8,24,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"And You Thought Your Parents Were Weird",1991,92,NA,4.4,87,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"And the Angels Sing",1944,96,NA,6.2,17,0,0,4.5,4.5,4.5,24.5,14.5,4.5,0,34.5,"",0,0,1,0,0,1,0 -"And the Same to You",1960,70,NA,8.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Anda, corre, vuela",1995,90,NA,8,8,0,0,0,0,0,0,14.5,74.5,14.5,0,"",0,0,0,0,0,0,0 -"Andalousie",1951,94,NA,9.2,5,0,0,0,0,0,24.5,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Andanggaman",2000,90,NA,6.4,40,4.5,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Andaz",1949,142,NA,7.5,30,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Andaz",1971,166,NA,5.1,15,4.5,0,0,4.5,24.5,4.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Andaz Apna Apna",1994,160,NA,7.4,234,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Andel Exit",2000,100,NA,5.9,48,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Andelske oci",1993,90,NA,4.9,15,0,4.5,14.5,24.5,4.5,24.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Ander Eta Yul",1989,90,NA,7.5,8,14.5,0,0,0,0,14.5,0,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Anderland",2003,25,NA,6.8,5,24.5,0,0,0,0,0,24.5,24.5,44.5,0,"",0,0,0,1,0,0,1 -"Anders als du und ich",1957,91,NA,3.7,40,84.5,0,4.5,0,4.5,0,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Anderson Tapes, The",1971,98,NA,6.4,730,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anderson Unbound",1999,17,NA,6.2,12,0,0,4.5,0,4.5,0,0,4.5,4.5,64.5,"",1,0,1,0,0,0,1 -"Anderssonskans Kalle",1950,87,NA,4.2,15,4.5,0,24.5,14.5,24.5,24.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Anderssonskans Kalle",1972,102,NA,5.2,27,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Anderssonskans Kalle i busform",1973,85,NA,5.3,22,0,4.5,4.5,4.5,24.5,4.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Andi Ommsen ist der letzte Lude",2003,90,NA,5.7,117,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Andjele moj dragi",1996,100,NA,6.6,5,0,0,0,0,0,64.5,0,0,44.5,0,"",0,0,0,0,0,0,0 -"Andjeo cuvar",1987,90,NA,7.3,12,0,0,0,4.5,0,4.5,14.5,44.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ando volando bajo",1959,110,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Andoromedeia",1998,109,NA,4.6,72,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Andra dansen",1983,95,NA,4.2,5,0,0,0,24.5,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Andra sidan",2003,11,NA,8.6,14,4.5,0,0,0,0,0,4.5,14.5,0,74.5,"",0,0,0,1,0,0,1 -"Andre",1994,94,NA,5.4,561,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Andre skiftet, Det",1978,77,NA,4.7,7,14.5,0,14.5,44.5,24.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Andrea - Wie ein Blatt auf nackter Haut",1968,90,NA,5.3,7,0,0,0,14.5,24.5,14.5,0,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Andreaskorset",2004,103,NA,3.5,15,4.5,4.5,44.5,4.5,0,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"Andrew and Jeremy Get Married",2004,75,NA,7.1,13,0,14.5,0,0,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Androcles and the Lion",1952,98,NA,6.1,111,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Android",1983,80,NA,5.5,364,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Andromeda Strain, The",1971,131,NA,7.1,4042,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Andromina: The Pleasure Planet",1999,92,NA,3.4,62,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Andy",1965,86,NA,7.1,14,0,0,0,0,0,24.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Andy",1985,73,125000,8.1,12,4.5,0,0,14.5,0,0,0,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Andy Colby's Incredible Adventure",1988,75,NA,3.6,34,45.5,4.5,0,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Andy Hardy Comes Home",1958,80,NA,5.1,61,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Andy Hardy Gets Spring Fever",1939,85,NA,5.8,62,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Andy Hardy Meets Debutante",1940,88,NA,6.4,116,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Andy Hardy's Blonde Trouble",1944,107,NA,6.7,54,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Andy Hardy's Dilemma: A Lesson in Mathematics... and Other Things",1938,19,NA,7.1,25,0,0,0,0,4.5,14.5,34.5,24.5,0,14.5,"",0,0,0,0,0,0,1 -"Andy Hardy's Double Life",1942,92,NA,6,79,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Andy Hardy's Private Secretary",1941,101,NA,6.2,52,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Andy Warhol",1987,76,NA,6.3,17,4.5,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Andy in Love",2004,11,4000,8.2,5,0,0,0,0,0,0,0,84.5,24.5,0,"",0,0,0,1,0,0,1 -"Andy, bloed en blond haar",1979,90,NA,4.1,38,14.5,4.5,0,4.5,14.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Anekdoty",1990,78,NA,4,7,0,0,45.5,0,14.5,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Ang wan nyn mung",1999,83,NA,6,6,0,0,0,34.5,0,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ang.: Lone",1970,97,NA,4.7,17,4.5,0,4.5,0,45.5,14.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Angae",1967,95,NA,9.1,7,0,0,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Ange de Goudron, L'",2001,100,NA,7.1,112,4.5,0,0,4.5,4.5,14.5,44.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ange et la femme, L'",1977,88,NA,6.1,26,4.5,0,0,24.5,0,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ange noir, L'",1994,95,NA,5.9,49,14.5,4.5,0,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ange, L'",1982,70,NA,6.2,16,0,4.5,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Angel",1937,91,NA,7,177,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Angel",1966,7,NA,7.3,7,0,0,0,14.5,0,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Angel",1984,94,NA,4.8,343,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Angel 4: Undercover",1993,94,NA,3.2,67,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Angel Above, the Devil Below, The",1975,83,NA,2.8,8,24.5,34.5,0,24.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Angel Baby",1961,97,NA,5.9,40,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Angel City",1976,75,NA,5.5,6,45.5,14.5,0,14.5,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Angel Express",1999,82,NA,4.3,28,34.5,0,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Angel Eyes",1993,84,NA,3.3,30,24.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Angel Eyes",2001,102,38000000,5.6,4829,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Angel Face",1952,91,NA,7.2,423,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Angel Heart",1987,113,17000000,7.1,8335,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Angel Hill: l'ultima missione",1988,80,NA,3.6,11,4.5,24.5,0,45.5,4.5,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Angel III: The Final Chapter",1988,100,NA,4,79,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Angel Mine",1978,66,NA,3.2,9,0,44.5,14.5,0,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Angel Puss",1944,7,NA,6.9,13,0,0,0,4.5,14.5,14.5,0,34.5,0,34.5,"",0,1,1,0,0,0,1 -"Angel Rising",1988,72,NA,7.3,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Angel Square",1990,104,NA,5.4,25,4.5,0,4.5,14.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Angel Town",1990,102,NA,4.2,90,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Angel Unchained",1970,92,NA,4.7,39,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,0,4.5,"PG-13",1,0,0,1,0,0,0 -"Angel Who Pawned Her Harp, The",1954,76,NA,5.1,12,14.5,0,4.5,14.5,24.5,4.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Angel Wore Red, The",1960,99,NA,5.3,91,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Angel and Big Joe",1975,27,NA,4.6,7,14.5,0,0,0,0,0,0,14.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Angel and the Badman",1947,100,NA,6.6,647,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Angel at My Table, An",1990,158,NA,7.4,1101,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Angel for May, An",2002,95,NA,6.4,91,4.5,0,4.5,4.5,14.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Angel from Texas, An",1940,69,NA,4.9,36,14.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Angel in Exile",1948,60,NA,6.1,9,0,14.5,0,14.5,0,34.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Angel in My Pocket",1969,105,NA,6.2,105,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Angel in Training",1999,89,NA,4.1,38,14.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Angel of Destruction",1994,86,NA,3.8,45,14.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Angel of Fury",1992,77,NA,3.2,38,24.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Angel of H.E.A.T.",1982,93,NA,3.6,81,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Angel of Mercy",1939,10,NA,6.9,5,0,0,0,0,24.5,0,0,64.5,0,24.5,"",0,0,0,1,0,0,1 -"Angel of the Island",1989,50,NA,4.9,5,0,0,24.5,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Angel on Fire",1974,75,NA,4.2,8,0,14.5,0,14.5,0,14.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Angel on My Shoulder",1946,100,NA,7.1,284,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Angel on My Shoulder",1997,85,NA,8.6,9,24.5,14.5,0,0,0,14.5,0,0,0,45.5,"",0,0,0,0,1,0,0 -"Angel on the Amazon",1948,60,NA,5.4,9,14.5,0,0,24.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Angel with the Trumpet, The",1950,98,NA,6.7,14,0,0,0,0,14.5,14.5,34.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Angel's Dance",1999,101,NA,5.8,333,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Angel, Angel, Down We Go",1969,93,NA,4.1,52,34.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Angela",1978,91,NA,5.1,17,0,0,0,24.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Angela",1995,99,NA,6,157,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Angela",2000,28,NA,6.1,8,14.5,0,0,0,0,45.5,24.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Angela",2002,91,NA,5.8,79,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Angela & Viril",1993,2,NA,4.3,32,24.5,4.5,0,0,24.5,14.5,4.5,4.5,0,24.5,"",0,0,0,1,0,0,1 -"Angela Mooney",1996,86,NA,5.1,21,14.5,0,4.5,14.5,14.5,0,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Angela's Ashes",1999,145,25000000,6.8,4347,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Angelfist",1993,80,NA,3.7,73,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Angeli",2002,15,NA,7.1,11,0,0,0,0,0,14.5,0,45.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Angeli bianchi... angeli neri",1970,82,NA,5.1,10,0,0,24.5,14.5,0,0,34.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Angelic Conversation, The",1985,78,NA,6.8,63,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Angelitos negros",1948,100,NA,8.5,24,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Angelitos negros",1970,105,NA,6.8,5,0,24.5,24.5,0,0,0,0,0,24.5,44.5,"",0,0,0,1,0,1,0 -"Angelo Anda Sumido",1997,17,NA,5.6,6,0,0,0,0,14.5,45.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Angelo My Love",1983,115,NA,5.9,68,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Angelo con la pistola, L'",1992,111,NA,4.9,6,14.5,14.5,14.5,0,14.5,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Angelo per Satana, Un",1966,90,NA,6.5,16,0,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Angelo, Fredo et Romeo",1996,82,NA,1.7,120,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Angelochek sdelay radost",1993,88,NA,4,5,0,0,0,44.5,24.5,0,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Angelos",1982,126,NA,5.4,26,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Angels",1976,90,NA,3.1,15,14.5,24.5,24.5,4.5,0,24.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Angels & Insects",1995,116,NA,6.9,1357,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,1,0 -"Angels Die Hard",1970,86,NA,5.6,29,14.5,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Angels Don't Sleep Here",2001,90,NA,3.8,60,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Angels Hard as They Come",1971,85,NA,4.8,33,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Angels Over Broadway",1940,78,NA,6.4,83,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Angels Wash Their Faces, The",1939,86,NA,5.2,75,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Angels from Hell",1968,86,NA,3.5,16,14.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Angels in Disguise",1949,63,NA,6.1,24,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Angels in the Attic",1998,86,NA,5.4,73,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Angels in the Outfield",1951,99,NA,6.9,286,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Angels in the Outfield",1994,102,NA,5.3,2735,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Angels of the City",1990,89,NA,4.6,10,14.5,24.5,14.5,14.5,24.5,14.5,14.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Angels with Broken Wings",1941,53,NA,7,6,0,0,0,14.5,0,34.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Angels with Dirty Faces",1938,97,NA,7.7,2108,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Angels!",2000,86,NA,3.7,9,24.5,14.5,14.5,14.5,14.5,14.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Angels' Alley",1948,67,NA,6.3,20,4.5,0,0,4.5,14.5,34.5,4.5,14.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Angels' Brigade",1979,97,NA,2,285,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Angels' Wild Women",1972,82,NA,2.3,32,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Angelus",2000,110,NA,8,28,4.5,0,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Angeluz",1998,100,NA,3.5,11,44.5,0,4.5,14.5,0,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Angely v rayu",1993,122,NA,5.2,5,24.5,0,0,24.5,24.5,0,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Anger Management",2003,106,75000000,6,14280,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Anges gardiens, Les",1995,110,NA,5.2,454,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Angi Vera",1979,96,NA,7.2,44,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Angie",1993,93,NA,5.4,30,4.5,14.5,0,14.5,24.5,24.5,14.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Angie",1994,107,NA,5.1,638,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Angkor: Cambodia Express",1982,90,NA,6.1,13,24.5,0,14.5,0,24.5,4.5,4.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Anglaise et le duc, L'",2001,125,NA,6.8,604,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Angoisse",1998,5,NA,3.4,7,44.5,0,0,24.5,0,14.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Angora Love",1929,21,NA,6.5,47,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Angry Breed, The",1968,89,NA,5.2,23,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Angry Hills, The",1959,105,NA,5.5,111,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Angry Red Planet, The",1960,83,190000,4.7,406,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Angry Silence, The",1960,95,NA,6.9,77,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Angry and Moist: An Undead Chronicle",2004,25,NA,2.2,10,14.5,14.5,0,0,0,24.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Angst",2000,86,NA,6,62,4.5,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Angst des Tormanns beim Elfmeter, Die",1972,101,NA,6.5,189,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Angst essen Seele auf",1974,94,NA,7.8,1038,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Anguilla da trecento milioni, Un'",1971,109,NA,6.1,5,0,0,0,0,0,64.5,24.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Angus",1995,90,NA,6.3,1419,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Angustia",1987,89,NA,6.3,260,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ani Ohev Otach Rosa",1972,77,NA,7,21,4.5,0,0,0,4.5,4.5,4.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Aniel",1998,23,NA,4.7,5,0,0,24.5,24.5,0,0,0,44.5,0,24.5,"",0,0,0,0,0,0,1 -"Anijam",1984,10,NA,6,9,0,0,0,14.5,14.5,14.5,0,34.5,0,34.5,"",0,1,0,0,0,0,1 -"Anima",1998,90,NA,7.2,37,4.5,4.5,0,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Anima",2003,26,50000,7.9,12,4.5,0,4.5,0,0,0,14.5,4.5,4.5,45.5,"",0,0,0,1,0,0,1 -"Anima Mundi",1992,28,NA,7.9,162,4.5,4.5,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Anima divisa in due, Un'",1993,127,NA,6,42,4.5,0,0,0,4.5,14.5,24.5,34.5,14.5,0,"",0,0,0,0,0,1,0 -"Anima gemella, L'",2002,98,NA,6.6,62,4.5,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Anima nera",1962,97,NA,5.6,11,0,0,0,4.5,34.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Anima persa",1977,100,NA,6.2,43,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Animal",1999,9,NA,5,7,0,14.5,0,24.5,14.5,0,14.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Animal Behavior",1989,85,NA,3.5,58,14.5,14.5,14.5,14.5,24.5,4.5,4.5,0,4.5,4.5,"",0,0,1,0,0,1,0 -"Animal Crackers",1930,97,NA,7.6,2250,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Animal Factory",2000,94,NA,6.5,2118,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Animal Farm",1954,72,NA,7,1066,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,1,0,0,0 -"Animal House",1978,109,3000000,7.5,17609,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Animal Instincts",1992,95,NA,4.4,219,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Animal Instincts II",1994,95,NA,4.1,173,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Animal Instincts III",1996,96,NA,3.7,99,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Animal Kingdom, The",1932,85,NA,6.3,93,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Animal Room",1995,98,NA,5.4,70,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Animal World, The",1956,82,NA,5.6,12,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,1,0,0 -"Animal, L'",1977,91,NA,6.1,335,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Animal, The",1968,88,NA,6.7,5,0,0,0,24.5,24.5,24.5,0,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Animal, The",2001,84,22000000,4.8,5605,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Animalada",2001,92,NA,6.4,16,0,4.5,14.5,0,0,14.5,24.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Animales racionales",1983,91,NA,5.2,5,24.5,24.5,0,0,0,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Animali che attraversano la strada",2000,91,NA,2.5,7,44.5,14.5,0,14.5,0,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Animali pazzi",1939,72,NA,5,6,14.5,0,0,0,14.5,64.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Animals",1999,90,NA,4.3,23,34.5,0,4.5,0,14.5,0,0,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Animals Are Beautiful People",1974,92,NA,8,304,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,1,0,0 -"Animals Film, The",1981,136,NA,8.3,10,0,0,0,0,14.5,0,0,14.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Animals and the Tollkeeper",1998,103,NA,6.3,115,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Animals, The",1970,86,NA,4.4,29,4.5,0,34.5,4.5,24.5,0,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Animalympics",1980,78,NA,5.7,309,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Animated Motion #5",1978,8,NA,6.3,10,0,0,0,14.5,14.5,34.5,14.5,44.5,0,0,"",0,1,0,0,1,0,1 -"Animated Self-Portraits",1989,8,NA,7.2,9,14.5,0,0,0,14.5,0,0,14.5,44.5,24.5,"",0,1,0,0,0,0,1 -"Animation Show 2005, The",2005,85,NA,8.2,32,0,0,0,0,4.5,0,24.5,24.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Animation Show, The",2003,94,NA,7.8,121,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,1,1,0,0,0,0 -"Animato",1988,7,NA,7.3,9,14.5,0,0,0,14.5,0,14.5,14.5,34.5,24.5,"",0,1,0,0,0,0,1 -"Animatrix: Final Flight of the Osiris, The",2003,11,5000000,7.6,1536,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",1,1,0,0,0,0,1 -"Animaux, Les",1963,90,NA,8,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Anime fiammeggianti",1994,91,NA,6.8,6,0,0,14.5,0,0,14.5,14.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Anino",2000,13,NA,8.6,12,0,0,0,14.5,0,4.5,4.5,24.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Aniol w Krakowie",2002,89,NA,6.6,66,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Anita",1987,89,NA,7.7,25,4.5,4.5,4.5,0,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Anita",1994,85,NA,5.3,27,14.5,4.5,0,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Anita Liberty",1997,15,NA,4.7,15,4.5,24.5,0,14.5,14.5,14.5,0,4.5,0,24.5,"",0,0,1,0,0,0,1 -"Anita and Me",2002,92,NA,6.2,281,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Anita no perd el tren",2001,89,NA,7.4,124,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Anja",2001,28,NA,5.7,10,0,0,14.5,14.5,45.5,0,14.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Anja & Viktor",2001,90,NA,5.7,213,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Anjaam",1994,170,NA,4.3,56,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Anji",2004,148,NA,6.6,7,0,0,14.5,14.5,14.5,14.5,0,0,24.5,14.5,"",1,0,0,1,0,0,0 -"Anjo Nasceu, O",1969,90,NA,8.3,10,14.5,0,0,0,0,0,24.5,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Anjo-ke no Butokai",1947,89,NA,7.1,6,0,0,0,14.5,0,34.5,0,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Anjos da Noite",1987,110,NA,6.5,12,14.5,0,0,14.5,4.5,4.5,4.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Anjos do Arrabalde",1987,90,NA,7.7,23,0,0,0,0,14.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Anklaget",2005,103,NA,6.7,33,0,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ankokugai no bijo",1958,87,NA,7.3,35,0,0,0,0,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ankor, eshchyo ankor!",1992,104,NA,5.6,37,4.5,4.5,4.5,4.5,4.5,14.5,0,14.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Ankur",1974,131,NA,7.4,64,0,4.5,4.5,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Ankuram",1993,131,NA,9,5,0,0,0,0,0,0,0,24.5,64.5,24.5,"",0,0,0,1,0,0,0 -"Ankush",1986,149,NA,7.2,11,0,0,0,0,0,4.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Anleitung zur sexuellen Unzufriedenheit",2000,99,NA,8,23,0,0,0,4.5,0,0,4.5,44.5,34.5,4.5,"",0,0,1,0,0,0,0 -"Anlian taohuayuan",1992,107,NA,5.3,28,4.5,0,4.5,4.5,0,0,4.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Ann Vickers",1933,76,303000,6.1,46,0,0,4.5,4.5,14.5,24.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anna",1951,107,NA,6.4,50,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Anna",1970,82,NA,7.6,11,0,0,0,0,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anna",1987,101,NA,6,145,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Anna & Bella",1984,8,NA,7.8,41,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Anna - annA",1993,76,NA,7.7,7,0,0,0,0,0,44.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Anna Boleyn",1920,133,NA,6.9,18,0,0,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anna Christie",1923,96,NA,7.2,11,0,0,0,14.5,0,0,24.5,44.5,4.5,0,"",0,0,0,1,0,0,0 -"Anna Christie",1930,89,376000,6.6,252,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anna Christie",1931,85,NA,7.3,64,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Anna Is Being Stalked",2002,7,NA,6.8,38,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Anna Karenina",1934,89,NA,5.6,5,24.5,0,0,0,0,24.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Anna Karenina",1935,95,1152000,7.3,476,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Anna Karenina",1948,111,NA,6.2,211,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anna Karenina",1967,145,NA,6.9,36,4.5,0,0,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Anna Karenina",1997,108,NA,5.6,706,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Anna Lans",1943,120,NA,7.9,5,0,0,0,24.5,0,24.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Anna Lucasta",1949,86,NA,5.9,18,0,0,0,24.5,14.5,14.5,34.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Anna Lucasta",1959,97,NA,5.9,37,0,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Anna Obsessed",1977,75,NA,5.8,16,4.5,0,4.5,4.5,4.5,34.5,0,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Anna Oz",1996,98,NA,5.6,57,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Anna Pavlova",1983,133,NA,6.3,26,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Anna Wunder",2000,98,NA,6,18,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Anna and the King",1999,148,75000000,6.6,6739,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Anna and the King of Siam",1946,128,NA,7.1,271,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Anna di Brooklyn",1958,101,NA,4.8,11,4.5,0,4.5,0,14.5,24.5,4.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Anna in the Sky",1997,10,NA,3.9,19,14.5,4.5,0,0,34.5,24.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,1 -"Anna na shee",1954,82,NA,6,15,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Anna, De",1983,90,NA,4.6,8,14.5,0,0,14.5,14.5,34.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Anna: Ot shesti do vosemnadtsati",1993,100,NA,7.6,134,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Annabel Takes a Tour",1938,67,NA,5.1,28,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Annapolis Salute",1937,65,NA,5.4,16,0,0,14.5,14.5,4.5,4.5,34.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Annapolis Story, An",1955,81,NA,5.1,30,4.5,14.5,0,14.5,44.5,14.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Annas Sommer",2001,107,NA,5.8,37,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Annas dag",2003,30,NA,5.7,8,0,0,0,0,24.5,24.5,14.5,0,34.5,0,"",0,0,0,0,0,0,1 -"Anne Frank's Diary",1999,88,NA,6.6,35,0,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Anne Trister",1986,103,NA,6.4,40,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Anne no nikki",1995,102,NA,7.5,7,14.5,0,0,0,0,0,44.5,14.5,0,24.5,"",0,1,0,0,0,0,0 -"Anne of Green Gables",1919,60,NA,9.1,19,14.5,0,0,0,4.5,0,0,0,14.5,64.5,"",0,0,1,1,0,0,0 -"Anne of Green Gables",1934,78,NA,7.1,146,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Anne of Windy Poplars",1940,86,NA,6,27,0,0,4.5,4.5,14.5,14.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Anne of the Indies",1951,87,NA,6.5,64,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,1,0 -"Anne of the Thousand Days",1969,145,NA,7.2,785,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Anni ribelli",1996,109,NA,5.6,11,4.5,0,0,0,24.5,34.5,14.5,0,0,4.5,"",0,0,0,1,0,1,0 -"Anni ruggenti",1962,110,NA,6.1,20,14.5,0,0,0,0,4.5,34.5,34.5,0,24.5,"",0,0,1,0,0,0,0 -"Annibale",1960,103,NA,4.8,63,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Annie",1982,126,50000000,5.7,3475,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Annie Brocoli dans les fonds marins",2003,78,NA,4.2,12,45.5,0,0,0,4.5,0,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Annie Get Your Gun",1950,107,3768785,7.2,529,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Annie Hall",1977,93,4000000,8.3,21462,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Annie Oakley",1935,92,NA,6.7,128,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Annie Was a Wonder",1948,11,NA,6.3,14,0,0,0,0,24.5,14.5,24.5,24.5,4.5,0,"",0,0,0,0,0,0,1 -"Annie's Coming Out",1984,96,NA,5.7,34,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Annigoni: Portrait of an Artist",1995,94,NA,8.2,6,14.5,0,0,0,0,0,0,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Annihilation of Fish, The",1999,108,NA,5.5,47,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"R",0,0,0,0,0,1,0 -"Annihilators, The",1985,84,NA,3,44,34.5,4.5,14.5,14.5,14.5,4.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Anniversary",1989,12,NA,5.9,6,0,0,14.5,14.5,14.5,14.5,14.5,0,14.5,0,"",0,1,0,0,0,0,1 -"Anniversary Party, The",2001,115,NA,6.4,3057,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Anniversary, The",1968,95,NA,6.6,226,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Anniversary, The",2003,27,NA,8.2,12,0,0,0,0,0,4.5,0,4.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Anno 2020 - I gladiatori del futuro",1982,91,NA,3.9,68,24.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Anno 79: La distruzione di Ercolano",1962,113,NA,4.6,6,0,14.5,0,14.5,34.5,0,0,0,34.5,0,"",0,0,0,1,0,0,0 -"Anno uno",1974,115,NA,5.3,14,0,0,14.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Anno zero - guerra nello spazio",1977,89,NA,3.2,23,34.5,4.5,24.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Annonsera!",1936,76,NA,6,13,0,0,0,0,4.5,44.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Announcement, The",2000,90,NA,6,8,0,14.5,0,0,0,24.5,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Ano natsu, ichiban shizukana umi",1991,101,NA,7.5,558,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Anolit",2002,25,NA,6.2,16,4.5,0,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Anonimo veneziano",1970,91,NA,6.3,46,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Anonymous",1993,71,NA,7.5,7,14.5,0,0,0,14.5,14.5,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Anonymous",2004,82,NA,6.1,20,14.5,14.5,14.5,14.5,4.5,4.5,14.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Anonymously Yours",2002,90,NA,6.9,13,0,0,0,0,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Another 48 Hrs.",1990,93,NA,5.1,4569,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Another Bad Day for Philip Jenkins",1994,3,NA,3.5,6,14.5,0,0,34.5,14.5,14.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Another Chance",1989,99,NA,5,51,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Another Country",1984,90,NA,7.1,845,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Another Dawn",1937,73,NA,5.8,62,0,4.5,4.5,14.5,4.5,44.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Another Day at the Races",1975,88,NA,3.8,11,0,14.5,0,14.5,14.5,4.5,0,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Another Day in Paradise",1998,101,NA,6.3,1872,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Another Day, Another Man",1966,70,NA,4,45,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Another Face",1935,69,NA,6.1,16,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,0,0,"",0,0,1,1,0,0,0 -"Another Fine Mess",1930,28,NA,7.5,188,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Another Froggy Evening",1995,9,NA,7.1,23,0,4.5,0,0,14.5,14.5,14.5,4.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Another Girl Another Planet",1992,62,NA,4.8,30,0,14.5,14.5,0,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Another Language",1933,77,272297,6.6,12,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Another Life",2001,101,NA,6.9,71,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Another Man's Poison",1952,90,NA,6.5,230,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Another Part of the Forest",1948,107,NA,6.9,44,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Another Planet",1999,93,NA,7.2,8,0,0,0,14.5,0,14.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Another Stakeout",1993,105,NA,5.2,2332,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Another State of Mind",1984,78,NA,8,67,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Another Thin Man",1939,103,NA,7.4,653,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Another Time, Another Place",1958,98,NA,5,57,4.5,0,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Another Time, Another Place",1983,118,NA,5.6,50,4.5,0,0,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Another Woman",1988,84,10000000,7.2,1380,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Another You",1991,94,26000000,4.4,398,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ansatsu",1964,104,NA,7.2,9,0,0,0,14.5,0,14.5,34.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Ansichten eines Clowns",1976,111,NA,6.4,27,0,4.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ansikte mot ansikte",1976,136,NA,7.1,218,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ansiktet",1958,107,NA,7.5,571,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Ant Pasted",1953,7,NA,7.3,27,0,0,0,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Antagonia",2003,9,NA,7.8,10,0,0,0,0,0,24.5,14.5,64.5,14.5,0,"",0,1,0,0,0,0,1 -"Antarctica",1991,40,NA,7.3,78,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Antares",2004,119,NA,6.8,46,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Antarjali Jatra",1987,130,NA,3,5,0,0,24.5,0,0,0,0,0,44.5,44.5,"",0,0,0,0,0,0,0 -"Ante",1977,86,NA,5.8,13,4.5,0,0,0,14.5,44.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Ante geia",1990,93,NA,6.9,10,0,0,0,0,14.5,34.5,34.5,24.5,14.5,0,"",0,0,0,1,0,1,0 -"Antebios",1998,14,NA,7.3,25,0,0,0,0,4.5,24.5,4.5,24.5,24.5,24.5,"",1,0,0,0,0,0,1 -"Antenneforeningen",1999,50,NA,5.7,67,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Antes llega la muerte",1964,98,NA,4.6,6,0,0,0,34.5,14.5,0,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Anthar l'invincibile",1964,114,NA,5,23,14.5,0,14.5,24.5,4.5,4.5,0,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Anthem",1994,9,NA,5.3,6,0,14.5,0,0,45.5,34.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Anthem",1997,124,NA,5.1,36,14.5,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Anthony Adverse",1936,141,1050500,6.7,203,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Anthony Zimmer",2005,90,NA,6.5,67,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Anthony's Desire",1993,90,NA,3.2,37,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Anthracite",1980,90,NA,6,7,0,0,0,0,24.5,14.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Anthrakitis",1998,10,NA,7.2,7,14.5,0,14.5,0,0,0,0,45.5,0,14.5,"",0,0,0,0,0,0,1 -"Anthrax",2001,90,2500000,4.1,49,14.5,4.5,14.5,14.5,24.5,14.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Anthropaki, To",1969,81,NA,6.2,13,4.5,0,0,4.5,0,14.5,34.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Anthropophagous 2000",1999,80,NA,4.1,56,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Anthropos gia oles tis douleies, O",1966,118,NA,5.9,7,0,14.5,0,14.5,14.5,14.5,0,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Anthropos me to garyfallo, O",1980,125,NA,7.5,26,4.5,0,0,0,14.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Anthropos pou espage plaka, O",1972,94,NA,5.4,12,0,4.5,0,4.5,24.5,34.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Anthropos pou etrehe poly, O",1973,81,NA,7.4,10,0,0,0,0,14.5,14.5,14.5,45.5,24.5,0,"",0,0,1,0,0,0,0 -"Anthropos pou gyrise apo tin zesti, O",1972,89,NA,5.9,11,0,4.5,4.5,0,4.5,34.5,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Anti Glamour",1990,15,NA,8.8,12,0,0,4.5,0,0,0,4.5,4.5,24.5,45.5,"",0,0,0,0,1,0,1 -"Anticipating Sarah",1997,8,NA,4.6,30,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Anticipation of the Night",1962,42,NA,7.2,26,4.5,4.5,0,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Anticristo, L'",1974,112,NA,4.3,124,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Antidote, L'",2005,107,NA,4.8,23,4.5,0,4.5,4.5,34.5,4.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Antigone/Rites of Passion",1991,85,NA,2.2,11,84.5,4.5,0,0,0,0,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Antigoni",1961,93,NA,6.5,22,0,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Antikiller",2002,114,5000000,5.4,231,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Antikiller 2: Antiterror",2003,114,NA,5.5,33,24.5,4.5,0,4.5,14.5,24.5,14.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Antilles sur Seine",2000,104,NA,4.4,56,4.5,14.5,14.5,14.5,14.5,14.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Antipoden",2001,7,NA,7.1,7,0,0,0,0,24.5,14.5,0,24.5,24.5,0,"",0,1,0,0,0,0,1 -"Antique Shop, The",1931,9,NA,7.6,14,0,0,0,4.5,24.5,0,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Antitrust",2001,108,30000000,6,7326,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Antman, The",2002,94,800000,7.2,53,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Antoine et Antoinette",1947,78,NA,8.1,50,0,4.5,0,0,0,4.5,14.5,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Anton",1973,77,NA,4.2,6,0,45.5,0,0,0,0,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Anton",1996,80,NA,6.4,31,4.5,0,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Anton Ivanovich serditsya",1941,80,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,1,0,0,0,0 -"Anton Spelec, ostrostrelec",1932,85,NA,7.8,35,0,0,0,0,4.5,14.5,24.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Anton, der Letzte",1939,91,NA,6.1,8,0,0,0,0,14.5,34.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Anton, der Zauberer",1978,102,NA,7.3,14,0,4.5,0,0,14.5,0,24.5,44.5,14.5,0,"",0,0,1,1,0,1,0 -"Antonia",1995,102,NA,7.4,2320,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Antonia",2001,100,NA,7.5,10,34.5,0,0,14.5,0,45.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Antonia and Jane",1991,71,NA,7.2,144,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Antonieta",1982,104,NA,5.9,72,24.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Antonio",1973,82,NA,4.7,9,24.5,0,0,0,14.5,34.5,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Antony and Cleopatra",1972,160,1600000,4.9,84,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Antropophagus",1980,82,NA,4.7,363,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ants in the Pantry",1936,17,NA,8,88,4.5,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Ants in the Plants",1940,7,NA,6.6,13,0,0,0,34.5,24.5,14.5,0,0,24.5,4.5,"",0,1,0,0,0,0,1 -"Ants!",2002,14,NA,8.5,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Antwone Fisher",2002,117,12500000,7.4,4472,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Antychryst",2002,27,NA,6.5,16,4.5,4.5,0,0,4.5,4.5,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,1 -"Antz",1998,83,60000000,7,16312,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG",0,1,1,0,0,0,0 -"Anubhav",1971,139,NA,6.7,14,0,0,0,0,0,24.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Anupama",1966,148,NA,8.2,15,0,0,0,0,0,0,4.5,4.5,44.5,44.5,"",0,0,0,1,0,0,0 -"Anuradha",1960,141,NA,9.2,6,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,0,1,0,0,0 -"Anus Magillicutty",2003,70,5000,1.8,488,74.5,4.5,4.5,0,4.5,0,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Anvil Chorus Girl, The",1944,7,NA,8.3,5,0,0,0,0,0,24.5,24.5,24.5,44.5,0,"",0,1,1,0,0,0,1 -"Any Bonds Today?",1942,3,NA,6.9,43,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Any Given Sunday",1999,156,62000000,6.4,19531,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Any Little Girl That's a Nice Little Girl",1931,7,NA,5.2,9,0,0,14.5,14.5,45.5,14.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Any Man's Death",1988,105,NA,3.3,19,24.5,4.5,24.5,4.5,24.5,14.5,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Any Number Can Play",1949,112,1465641,6.3,67,4.5,0,0,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Any Old Port!",1932,20,NA,7.3,84,4.5,0,4.5,4.5,4.5,4.5,44.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Any Rags",1932,6,NA,7.4,11,4.5,0,0,0,4.5,4.5,14.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Any Time, Any Place",1981,92,NA,7.2,22,4.5,4.5,4.5,0,4.5,0,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Any Time, Any Play",1989,96,NA,1.9,6,14.5,64.5,14.5,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Any Way the Wind Blows",2003,127,NA,7.1,559,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Any Wednesday",1966,109,NA,5.6,146,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Any Which Way You Can",1980,116,NA,5.3,1958,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Anyangde guer",2001,84,NA,6.8,88,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Anybody's Son Will Do",1983,57,NA,8.6,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Anybody's Woman",1930,80,NA,6,17,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anyone",2004,8,1000,9.6,7,0,0,0,0,0,0,0,0,44.5,45.5,"",0,0,0,1,0,0,1 -"Anything Can Happen",1952,107,NA,5.6,17,0,4.5,0,0,24.5,24.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Anything Else",2003,108,18000000,6.5,3678,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Anything Goes",1936,92,1100000,6,44,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Anything Goes",1956,106,NA,5.5,83,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Anything Once",1997,23,NA,4.1,33,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Anything for John",1995,64,NA,7.2,17,0,0,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Anything for Love",1993,91,NA,5.2,285,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Anywhere But Here",1999,114,23000000,5.9,4007,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Anzio",1968,117,NA,5.6,332,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Anzuelo, El",1996,85,NA,7.3,35,4.5,4.5,0,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ao Fim da Noite",1991,95,NA,6.8,11,0,0,0,4.5,0,24.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ao no hono-o",2003,116,NA,7.1,78,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Aoi haru",2001,83,NA,7.7,267,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Aoud rih",2002,88,NA,6.3,7,0,0,0,0,24.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Ap to Hioni",1993,90,NA,5.9,24,0,4.5,4.5,0,14.5,14.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Apa",1966,95,NA,6.7,54,4.5,0,4.5,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Apache",1954,91,NA,6.3,391,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Apache Ambush",1955,68,NA,5.8,17,4.5,14.5,0,14.5,14.5,24.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Apache Blood",1975,86,NA,3.9,10,44.5,0,24.5,14.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Apache Chief",1949,60,NA,4.4,7,0,0,24.5,24.5,0,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Apache Country",1952,62,NA,4.8,10,0,14.5,14.5,24.5,34.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Apache Drums",1951,75,NA,5.1,62,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Apache Kid's Escape, The",1930,58,NA,5.4,10,0,0,0,34.5,34.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Apache Rifles",1964,92,NA,5.1,30,4.5,0,14.5,14.5,24.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Apache Rose",1947,75,NA,5.6,12,0,0,0,14.5,44.5,4.5,4.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Apache Territory",1958,72,NA,4.9,18,4.5,0,14.5,24.5,34.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Apache Trail",1942,66,NA,6.2,20,0,0,0,14.5,24.5,34.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Apache Uprising",1966,90,NA,4.9,46,4.5,4.5,4.5,24.5,34.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Apache War Smoke",1952,67,NA,5.1,22,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Apache Warrior",1957,74,NA,5,16,4.5,0,14.5,14.5,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Apache Woman",1955,69,80000,4,23,14.5,4.5,4.5,14.5,24.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Apachen",1973,94,NA,7.2,20,4.5,0,4.5,4.5,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Apando, El",1976,83,NA,7,34,0,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Aparajito",1957,110,NA,7.9,654,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Aparelho Voador a Baixa Altitude",2002,80,NA,5.5,41,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Apariencias",2000,94,NA,7.2,88,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Apart from Hugh",1994,87,NA,5.2,9,14.5,0,0,14.5,14.5,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Apartado de correos 1001",1950,90,NA,6.7,7,0,0,0,0,0,24.5,44.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Apartamento, O",1997,14,NA,2,11,24.5,0,0,0,0,24.5,0,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Aparte",2002,91,90000,8.5,24,0,4.5,4.5,0,4.5,0,14.5,14.5,24.5,34.5,"",0,0,0,1,1,0,0 -"Apartman",2004,24,NA,6.6,5,0,0,0,24.5,24.5,0,44.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Apartment #5C",2002,88,NA,6.2,50,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Apartment 206",2004,29,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,0,0,0,1 -"Apartment Zero",1988,124,4000000,6.2,933,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Apartment for Peggy",1948,96,NA,7.1,151,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Apartment, The",1960,125,3000000,8.4,11214,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Apartment, The",2000,11,NA,3.5,8,0,24.5,0,24.5,0,34.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Apasionados",2002,105,NA,5.8,97,24.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Apassionata",1952,96,NA,6.4,8,0,0,0,14.5,0,14.5,45.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Ape",1976,87,NA,1.8,212,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ape Man, The",1943,64,NA,4.1,129,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ape Suzette",1966,6,NA,5.9,10,0,0,0,14.5,24.5,24.5,14.5,44.5,0,0,"",0,1,0,0,0,0,1 -"Ape regina, L'",1963,85,NA,6.3,41,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Ape, The",1940,62,NA,3.9,150,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Apenanti, Oi",1981,110,NA,6.9,19,0,0,14.5,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Apenas un delincuente",1949,88,NA,8,9,0,0,0,0,0,0,14.5,34.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Apes of Wrath",1959,7,NA,6.9,56,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Apetta Giulia e la signora Vita, L'",2003,76,NA,4.3,13,34.5,14.5,0,4.5,14.5,4.5,4.5,0,4.5,4.5,"",0,1,0,0,0,0,0 -"Apfel ist ab, Der",1948,105,NA,8.8,7,14.5,0,14.5,0,14.5,0,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Aphrodesia's Diary",1984,85,NA,7.5,6,0,0,0,0,14.5,14.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Aphrodite",1982,88,NA,3.9,92,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Apinajuttu",2003,57,NA,7.6,6,0,0,0,0,0,0,45.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Apo pou pane gia tin havouza?",1978,94,NA,5.5,9,0,14.5,0,14.5,14.5,0,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Apo tin akri tis polis",1998,94,NA,6.8,200,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Apocalypse Now",1979,202,31500000,8.5,64785,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"R",1,0,0,1,0,0,0 -"Apocalypse domani",1980,91,NA,5.1,248,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Apocalypse, The",1997,96,NA,2.5,106,34.5,24.5,14.5,4.5,4.5,4.5,4.5,0,0,4.5,"R",0,0,0,0,0,0,0 -"Apollo 13",1995,140,62000000,7.5,41098,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Apology for Murder",1945,67,NA,5.9,10,0,0,14.5,14.5,14.5,24.5,24.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Apontes, I",1997,115,NA,5.1,31,4.5,0,0,4.5,0,0,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Apoorva Sahodarargal",1989,157,NA,8.5,13,0,0,0,0,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Apostle, The",1997,134,5000000,7.2,4231,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Apothekerin, Die",1997,108,NA,5.6,305,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Apotheosis",1970,18,NA,7,5,24.5,0,0,0,0,0,0,64.5,0,24.5,"",0,0,0,0,0,0,1 -"Appaloosa, The",1966,98,NA,5.9,221,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Apparatspott - Gerangel in Ruum un Tied",2003,93,NA,9,6,0,0,0,0,0,14.5,0,0,34.5,45.5,"",0,0,0,0,0,0,0 -"Appartement, L'",1996,116,NA,7.6,1810,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Appassionata",1944,93,NA,6.3,12,0,0,4.5,0,24.5,14.5,44.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Appassionata",1974,96,NA,5.4,18,0,14.5,0,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Appassionate",1999,95,NA,5.8,15,4.5,14.5,0,24.5,14.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Appetite",1998,97,NA,4.4,52,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Applause",1929,80,NA,7.7,94,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Apple Dumpling Gang Rides Again, The",1979,88,NA,5.1,311,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Apple Dumpling Gang, The",1975,100,NA,5.7,735,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Apple a Day, An",2003,7,NA,8.7,6,0,0,0,0,0,14.5,14.5,0,14.5,45.5,"",0,0,0,1,0,0,1 -"Apple, The",1980,90,NA,3.5,200,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Apples & Oranges",2001,16,NA,5.2,8,24.5,0,14.5,0,14.5,24.5,14.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Appointment for Love",1941,89,NA,5.9,10,0,0,0,24.5,14.5,34.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Appointment in Berlin",1943,77,NA,6.6,16,0,0,0,14.5,4.5,24.5,45.5,0,0,0,"",0,0,0,1,0,0,0 -"Appointment in Honduras",1953,79,NA,5.3,64,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Appointment in London",1952,96,NA,6.1,57,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Appointment in Tokyo",1945,56,NA,7,25,4.5,0,0,0,24.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Appointment with Crime",1946,90,NA,6.2,8,0,0,14.5,0,14.5,14.5,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Appointment with Danger",1951,89,NA,6.7,68,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Appointment with Death",1988,102,NA,5.1,311,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Appointment with Fear",1987,96,NA,3.8,111,64.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Appointment with Murder",1948,67,NA,5.3,7,0,0,0,24.5,0,24.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Appointment with Venus",1951,90,NA,5.7,39,0,0,0,14.5,14.5,24.5,14.5,4.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Appointment, The",1969,115,NA,4.7,77,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Appointment, The",1981,90,NA,4.9,39,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Appointment, The",1996,89,45000,5.3,8,0,0,0,0,24.5,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Appointments of Dennis Jennings, The",1988,26,NA,7.3,73,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Appreciating Your Parents",1950,10,NA,2.1,31,34.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,0,0,"",0,0,0,1,0,0,1 -"Apprenti salaud, L'",1977,98,NA,6.3,10,0,0,14.5,0,34.5,14.5,24.5,0,24.5,14.5,"",0,0,1,0,0,0,0 -"Apprentice",1999,90,NA,6.4,5,24.5,0,0,0,24.5,0,0,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Apprentice to Murder",1988,97,NA,4.6,77,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Apprentice, The",1991,9,NA,5.6,23,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Apprenticeship of Duddy Kravitz, The",1974,120,NA,6.6,435,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Apprentis, Les",1995,95,NA,7.1,241,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Appu Chesi Pappu Koodu",1958,176,NA,6.9,10,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Appuntamento a Ischia",1960,99,NA,5.7,6,14.5,14.5,0,0,14.5,14.5,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Appuntamento a Liverpool",1988,99,NA,4.3,8,14.5,0,34.5,0,0,0,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Appuntamento col disonore",1970,100,NA,4.8,11,4.5,0,0,34.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Appunti per un'Orestiade africana",1975,73,NA,7.1,32,4.5,0,0,0,0,14.5,34.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Aprel",2002,105,NA,4.7,17,14.5,0,14.5,4.5,4.5,14.5,4.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Aprikoser",1996,12,NA,8.8,6,14.5,0,0,0,0,14.5,14.5,0,34.5,14.5,"",0,1,0,0,0,0,1 -"April Fool",1924,12,NA,6.2,13,0,0,0,0,34.5,24.5,34.5,0,4.5,0,"",0,0,1,0,0,0,1 -"April Fools, The",1969,95,NA,5.9,247,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"April Love",1957,97,NA,5.6,113,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"April Showers",1948,94,NA,6.1,32,0,4.5,0,4.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"April in Paris",1952,94,NA,5.5,150,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"April's Fool",2001,97,NA,6.7,9,14.5,0,14.5,0,0,24.5,0,34.5,0,24.5,"",0,0,0,0,0,0,0 -"April's Shower",2003,98,NA,4.2,18,4.5,0,14.5,4.5,0,0,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"April, April!",1935,82,NA,2.7,6,14.5,14.5,0,0,14.5,0,0,45.5,0,0,"",0,0,1,0,0,0,0 -"Aprile",1998,78,NA,6.8,566,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Aprilkinder",1998,85,NA,7.7,23,0,0,0,0,4.5,4.5,24.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Aprimi il cuore",2003,93,NA,4.5,32,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Apsolutnih sto",2001,93,NA,7.2,118,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Apt Pupil",1998,112,14000000,6.4,6728,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Apt. 310",2002,9,NA,7.9,14,14.5,0,0,0,0,0,0,45.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Apur Sansar",1959,117,NA,8,652,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Aqua Duck",1963,6,NA,7.1,20,4.5,0,0,14.5,4.5,4.5,34.5,44.5,0,4.5,"",0,1,1,0,0,0,1 -"Aquamania",1961,8,NA,6.8,43,0,0,4.5,0,14.5,14.5,14.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Aquanoids",2003,78,NA,2.2,46,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Aquarela do Brasil",1942,7,NA,5.4,20,4.5,0,0,14.5,24.5,14.5,24.5,0,4.5,24.5,"",0,1,0,0,0,0,1 -"Aquarios",2001,23,NA,4.4,11,4.5,0,0,4.5,0,0,4.5,34.5,24.5,4.5,"",0,0,0,0,0,1,1 -"Aquarium, L'",2001,8,NA,7.1,10,0,0,0,14.5,0,14.5,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Aquatic Wizards",1955,10,NA,2.6,23,34.5,34.5,14.5,0,4.5,4.5,0,0,4.5,0,"",0,0,0,0,1,0,1 -"Aquel ritmillo",1995,15,NA,6.3,36,4.5,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Aquella casa en las afueras",1980,95,NA,8,10,0,0,0,14.5,0,14.5,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Aquesta nit o mai",1991,95,NA,8.1,29,4.5,4.5,0,0,14.5,4.5,0,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Aqui jaz Helena",1997,78,NA,3,11,14.5,0,0,0,0,0,4.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Aqui na Terra",1993,105,NA,4.8,8,0,0,0,24.5,45.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Arabella",1967,88,NA,4.5,16,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Arabesk",1989,105,NA,8.4,134,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Arabesque",1966,105,NA,6.6,718,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Arabian Adventure",1979,98,NA,5,93,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Arabian Gun Twirler",1899,1,NA,3.9,19,4.5,0,24.5,34.5,34.5,4.5,0,0,0,4.5,"",0,0,0,0,1,0,1 -"Arabian Knight",1995,72,NA,6.3,191,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Arabian Nights",1942,86,NA,6.4,100,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Araburu tamashii-tachi",2001,150,NA,5.7,132,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Arachnid",2001,102,NA,3.6,444,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Arachnophobia",1990,103,31000000,6.1,8608,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Aradhana",1969,169,NA,6.9,49,4.5,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Aragami",2003,70,NA,7,348,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Aragosta a colazione",1979,92,NA,5.1,20,14.5,0,14.5,4.5,34.5,24.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Arahan jangpung daejakjeon",2004,114,NA,6.7,333,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Arajin to maho no ranpu",1982,65,NA,6.9,18,4.5,0,0,4.5,0,24.5,0,0,14.5,45.5,"",0,1,0,0,0,0,0 -"Arak el-balah",1998,110,NA,7.3,26,0,0,0,0,0,24.5,4.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Arakimentari",2004,85,NA,8.2,11,0,0,0,0,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Arakure",1969,87,NA,5.1,11,0,0,0,4.5,44.5,4.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Aram",2002,90,NA,5.7,44,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Aramesh dar Hozur Deegaran",1973,86,NA,7.2,7,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Aranyember, Az",1962,75,NA,6.6,21,0,0,0,4.5,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,1,0,1,0 -"Aranyer Din Ratri",1970,115,NA,8.1,104,4.5,4.5,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Ararat",2002,115,NA,7.1,3594,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"R",0,0,0,1,0,0,0 -"Arashi ga oka",1988,143,NA,8.5,6,0,0,0,0,0,14.5,14.5,0,34.5,34.5,"",0,0,0,0,0,0,0 -"Araya",1959,90,NA,7.9,16,0,0,0,0,0,14.5,0,14.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Arbitro, L'",1974,108,NA,4.6,15,4.5,14.5,4.5,0,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Arbor Day",1936,20,NA,6.6,32,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Arbre au chien pendu, L'",2000,13,NA,6.6,11,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Arbre de Guernica, L'",1975,110,NA,3.7,9,24.5,0,14.5,0,24.5,0,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Arbre de les cireres, L'",1998,94,NA,7.1,30,0,4.5,0,4.5,0,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Arbre mort, L'",1999,11,NA,2.3,5,0,24.5,84.5,0,0,0,0,0,0,0,"",0,1,0,0,0,0,1 -"Arbres",2002,50,NA,8,8,0,0,0,0,0,0,14.5,74.5,14.5,0,"",0,0,0,0,1,0,0 -"Arc",2004,30,9000,9.4,10,0,0,0,0,0,14.5,0,0,24.5,74.5,"",0,0,0,0,0,0,1 -"Arc, The",1991,96,NA,4.1,10,0,0,0,14.5,0,0,0,0,34.5,64.5,"",0,0,0,0,0,0,0 -"Arcadian Maid, An",1910,16,NA,3.7,5,24.5,24.5,0,0,44.5,0,24.5,0,0,0,"",0,0,0,1,0,0,1 -"Arcandiers, Les",1991,95,NA,6.5,10,0,0,0,0,0,34.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Arcano incantatore, L'",1996,96,NA,6.6,71,4.5,0,0,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Arch of Triumph",1948,133,5000000,5.6,169,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Archangel",1990,90,NA,7.2,143,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Arche Noah Prinzip, Das",1984,100,NA,3.9,240,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Archer's Adventure",1985,128,NA,5.2,48,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Archibald the Rainbow Painter",1998,105,NA,4.8,10,0,24.5,0,14.5,14.5,14.5,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Architekten",1990,97,NA,6.1,7,0,0,0,0,0,44.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Arcidiavolo, L'",1966,97,NA,5.7,21,0,0,0,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Arciere di Sherwood, L'",1970,103,NA,5,16,0,0,14.5,4.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Arctic Antics",1930,7,NA,6.4,9,0,0,0,14.5,14.5,34.5,14.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Arctic Blue",1993,95,NA,4.8,208,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Arctic Flight",1952,78,NA,6.1,7,0,0,0,0,14.5,44.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Arctic Giant, The",1942,9,NA,6.5,55,0,14.5,4.5,0,4.5,4.5,44.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Ard al-Khof",1999,142,NA,6.1,44,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Ard, al-",1969,130,NA,7.3,44,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Arde, amor",1999,90,NA,5.7,13,14.5,4.5,0,4.5,34.5,4.5,4.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Ardena",1997,103,NA,3.8,17,24.5,0,0,0,0,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ardh Satya",1983,130,NA,8.4,81,4.5,0,4.5,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Ardiente paciencia",1983,80,NA,6.8,42,0,4.5,0,0,4.5,24.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ardilla roja, La",1993,114,NA,7.3,942,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Are Crooks Dishonest?",1918,13,NA,6,11,0,0,0,0,4.5,64.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"Are Parents People?",1925,60,NA,6.5,17,4.5,0,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Are These Our Children",1931,84,400000,6,26,14.5,0,4.5,4.5,4.5,34.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Are We Civilized?",1934,70,NA,3.8,5,0,24.5,24.5,24.5,0,44.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Are We Still Married",1992,3,NA,7.5,47,0,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Are We There Yet?",2005,95,32000000,3.5,1043,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Are You Being Served?",1977,95,NA,5.4,240,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Are You Cinderella?",2000,20,NA,4.3,10,14.5,0,14.5,24.5,24.5,0,14.5,0,0,34.5,"",0,0,0,0,0,0,1 -"Are You Feeling Lonely?",2003,14,NA,7.7,6,0,0,0,0,14.5,34.5,0,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Are You Listening?",1932,73,NA,6,7,0,0,0,14.5,14.5,24.5,0,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Are You Popular?",1947,10,11000,4.3,18,4.5,14.5,24.5,14.5,24.5,14.5,0,0,4.5,0,"",0,0,0,1,0,0,1 -"Are You Ready for Marriage?",1950,14,NA,2.6,32,34.5,24.5,14.5,4.5,4.5,4.5,4.5,0,0,0,"",0,0,0,1,0,0,1 -"Are You a Serial Killer",2002,20,NA,4.6,9,14.5,0,14.5,0,14.5,0,0,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Are You with It?",1948,93,NA,6.2,11,4.5,0,4.5,4.5,0,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Arena",1953,83,NA,5.2,33,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Arena",1991,115,NA,4.6,203,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Arena, The",1974,83,NA,4.8,121,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Arena, The",2001,92,NA,2.8,119,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Aretz Hadasha",1994,105,NA,6.8,9,0,14.5,0,0,0,14.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Areumdawoon sheejul",1998,120,NA,6.5,67,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Argent content",2000,18,NA,5.5,31,4.5,4.5,0,0,4.5,4.5,4.5,14.5,4.5,44.5,"",1,0,0,0,0,0,1 -"Argent de poche, L'",1976,104,NA,7.3,908,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Argent des autres, L'",1978,105,NA,6.8,36,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Argent, L'",1928,195,NA,8.1,23,0,0,0,0,4.5,0,14.5,24.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Argent, L'",1983,87,NA,7.8,383,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Argentine Nights",1940,75,NA,6.1,8,0,0,0,24.5,0,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Argentino en New York, Un",1998,95,3000000,4.2,49,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,1,1,0,0,0 -"Arguing the World",1998,106,NA,5.9,27,14.5,0,4.5,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Argyle Secrets, The",1948,64,NA,6.2,7,0,0,0,0,24.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,1,0 -"Arhontissa kai o alitis, I",1969,109,NA,5.7,26,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Ari-Baba to yonjuppiki no tozoku",1971,55,NA,8.6,10,24.5,0,14.5,0,0,0,0,14.5,24.5,44.5,"",0,1,0,0,0,0,0 -"Aria",1987,90,NA,5.3,683,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Aria dla atlety",1980,108,NA,6.8,15,0,0,0,0,4.5,24.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Aria serena dell'ovest, L'",1990,110,NA,6.3,32,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Arie prerie",1949,23,NA,6.7,20,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Ariel",1988,73,NA,7.4,442,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Arimpara",2003,90,NA,8.8,17,0,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Arisan!",2003,129,NA,7.6,61,4.5,4.5,4.5,0,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Arise, My Love",1940,110,NA,7.2,87,4.5,0,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Aristo-Cat, The",1943,7,NA,7,34,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Aristocats, The",1970,78,4000000,6.6,2972,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,0,0,0,1,0 -"Arithmimenoi, Oi",1998,102,NA,4.6,16,14.5,0,0,4.5,14.5,24.5,4.5,34.5,0,4.5,"",0,0,0,0,0,0,0 -"Arizona",1931,70,NA,5.2,22,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Arizona",1940,121,2000000,6.8,67,4.5,0,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Arizona Bad Man",1935,58,NA,4.1,10,14.5,14.5,24.5,14.5,34.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Arizona Bound",1941,57,NA,4.8,14,0,0,4.5,14.5,24.5,24.5,24.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Arizona Bushwhackers",1968,87,NA,4.5,46,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Arizona Colt",1966,118,NA,4.9,18,0,0,4.5,4.5,14.5,24.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Arizona Cowboy",1950,67,NA,4.8,11,14.5,0,0,24.5,14.5,14.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Arizona Days",1937,57,NA,5,12,0,0,4.5,4.5,45.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Arizona Dream",1993,142,NA,7,3578,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Arizona Gunfighter",1937,58,NA,5.9,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Arizona Heat",1988,85,NA,3.8,37,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Arizona Kid, The",1930,88,NA,4.9,8,0,0,14.5,24.5,24.5,14.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Arizona Kid, The",1939,61,NA,6.2,14,0,0,4.5,4.5,4.5,44.5,4.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Arizona Legion",1939,58,NA,6.2,15,0,0,0,14.5,24.5,44.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Arizona Mahoney",1936,58,NA,5.5,10,0,14.5,14.5,14.5,34.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Arizona Raiders",1965,88,NA,5.3,53,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Arizona Ranger, The",1948,64,NA,6.7,20,0,4.5,0,0,0,24.5,34.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Arizona Stage Coach",1942,58,NA,4.8,7,0,0,14.5,24.5,24.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Arizona Territory",1950,56,NA,4.2,5,0,0,0,44.5,24.5,0,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Arizona Whirlwind",1944,59,NA,6.4,8,0,0,0,14.5,14.5,14.5,45.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Arizonian, The",1935,75,NA,6.5,23,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Arkansas Traveler, The",1938,85,NA,6,7,0,0,0,0,24.5,44.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Arlette",1997,100,NA,4.4,107,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Arlington Road",1999,117,21500000,7.1,17189,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Arm van Jezus, De",2003,71,NA,5.9,43,4.5,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Arma, l'ora, il movente, L'",1973,105,NA,6.3,5,0,0,0,0,0,44.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Armaan",2003,158,NA,6.7,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Armadio, L'",2002,7,NA,5.4,37,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Armageddon",1998,153,140000000,5.7,45330,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Armageddon: The Final Challenge",1994,85,NA,3.1,8,45.5,0,0,14.5,0,0,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Armaguedon",1977,95,NA,5.9,111,4.5,4.5,4.5,4.5,4.5,14.5,45.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Armario del tiempo, El",1971,79,NA,5.8,22,14.5,0,0,0,0,4.5,14.5,4.5,4.5,45.5,"",0,1,1,0,0,0,0 -"Armario, El",2001,77,NA,3.5,10,14.5,24.5,0,0,14.5,0,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Armata Brancaleone, L'",1966,120,NA,8.3,390,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Armchair Hacker, The",1985,114,NA,7.9,10,14.5,0,0,0,14.5,0,0,34.5,14.5,44.5,"",1,0,1,0,0,0,0 -"Arme, syndige menneske",1980,167,NA,6.1,8,14.5,14.5,14.5,14.5,14.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Armed Response",1986,86,1500000,4.2,70,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Armed and Dangerous",1986,88,NA,4.8,1737,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Armed for Action",1992,88,NA,3.9,14,45.5,4.5,4.5,0,14.5,0,4.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Armee Gretchen, Eine",1973,95,NA,5.6,26,14.5,4.5,14.5,0,4.5,44.5,14.5,4.5,0,0,"",1,0,0,1,0,0,0 -"Armee der Liebenden oder Revolte der Perversen",1979,107,NA,6.7,10,14.5,0,0,0,14.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Armoire volante, L'",1948,90,NA,6.9,22,4.5,0,0,4.5,0,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Armored Car Robbery",1950,67,NA,7,152,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Armored Command",1961,99,NA,5.1,40,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Armstrong",1998,99,NA,3.2,75,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Army Brat",1987,80,NA,4.8,18,14.5,0,4.5,14.5,14.5,34.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Army Champions",1941,11,NA,5.6,7,0,0,14.5,0,0,44.5,24.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Army Mascot, The",1942,7,NA,6.5,47,0,0,0,4.5,24.5,4.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Army Medicine in Vietnam",1970,29,NA,7.2,6,0,0,0,0,34.5,0,34.5,0,14.5,14.5,"",0,0,0,0,1,0,1 -"Army Pack Train Bringing Supplies",1906,2,NA,4,10,0,0,45.5,14.5,14.5,24.5,0,14.5,0,0,"",0,0,0,0,1,0,1 -"Army of Darkness",1993,96,11000000,7.4,22118,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,1,0,0,0,0 -"Army of One",2003,69,NA,9.6,9,24.5,0,0,0,0,14.5,0,44.5,0,24.5,"",0,0,0,0,1,0,0 -"Arna's Children",2003,84,NA,8.8,28,4.5,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Arnelo Affair, The",1947,86,NA,5.3,36,0,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Arnold",1973,94,NA,4.7,84,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Arnulf Rainer",1960,7,NA,7.2,9,24.5,14.5,0,0,14.5,14.5,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Aro Tolbukhin. En la mente del asesino",2002,95,NA,6.8,124,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Around the Bend",2004,85,NA,6,388,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Around the Fire",1999,106,1200000,5.3,254,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Around the World",1943,80,NA,5.3,24,0,4.5,0,4.5,24.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Around the World Under the Sea",1966,110,NA,5.1,95,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Around the World in 80 Days",2004,120,110000000,5.7,3887,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG",1,0,1,0,0,1,0 -"Around the World in Eighty Days",1956,175,6000000,6.8,2589,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Around the World in Eighty Ways",1987,91,NA,5.2,23,0,4.5,0,24.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Around the World of Mike Todd",1968,50,NA,2.8,5,24.5,0,24.5,0,0,24.5,0,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Aroused",1966,78,NA,5.5,9,0,14.5,0,0,34.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Arousi-ye Khouban",1989,75,NA,8.3,32,0,0,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Arpa colla",1982,104,NA,6.8,38,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Arpenteur, L'",2002,45,NA,6.8,6,0,0,0,0,34.5,0,14.5,14.5,34.5,0,"",0,0,0,1,0,0,1 -"Arrache-coeur, L'",1979,92,NA,7.1,6,0,0,0,0,0,14.5,14.5,64.5,0,0,"",0,0,0,1,0,0,0 -"Arranged Marriage",1996,88,NA,3.4,20,14.5,4.5,34.5,14.5,14.5,0,0,0,14.5,14.5,"R",0,0,0,1,0,0,0 -"Arrangement",1999,95,NA,6.5,14,4.5,0,0,0,14.5,24.5,0,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Arrangement",2004,109,3200000,9.2,23,4.5,0,0,0,0,0,4.5,4.5,24.5,64.5,"",0,0,1,0,0,1,0 -"Arrangement, The",1969,125,NA,5.6,281,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Arrangement, The",1999,95,NA,5.2,52,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Arrangiatevi!",1959,105,NA,8.3,24,0,0,0,0,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Arrapaho",1984,98,NA,4.5,40,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Arrebato",1980,105,NA,7.2,143,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Arrest Bulldog Drummond",1939,57,NA,6,28,0,0,4.5,4.5,14.5,45.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Arresting Gena",1997,90,NA,2.7,22,14.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Arriva Dorellik",1967,96,NA,4.8,18,14.5,0,14.5,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Arriva Sabata!",1970,87,NA,2.5,8,0,14.5,34.5,0,14.5,0,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Arriva la bufera",1993,110,NA,4,32,4.5,0,4.5,24.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Arrival of McKinley's Funeral Train at Canton, Ohio",1901,1,NA,4.4,31,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Arrival, The",1990,103,NA,4.5,81,14.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Arrival, The",1996,115,NA,6,4723,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Arrivano Joe e Margherito",1974,105,NA,4.5,13,0,4.5,4.5,14.5,0,24.5,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Arrivano i gatti",1980,95,NA,5.1,21,0,4.5,0,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Arrivano i titani",1962,120,NA,5.3,47,0,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Arrivederci Roma",1958,107,NA,5.8,53,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,1,0 -"Arriving Tuesday",1986,84,NA,5.4,7,24.5,0,0,0,14.5,0,44.5,0,0,14.5,"",0,0,0,0,0,1,0 -"Arrow In the Dust",1954,79,NA,5.9,29,0,0,14.5,0,14.5,44.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Arrowhead",1953,105,NA,5.5,165,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Arrowhead",1994,30,NA,5.8,21,0,0,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Arrowsmith",1931,108,NA,5.8,125,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Arruza",1972,73,NA,7.5,6,0,0,14.5,0,14.5,14.5,14.5,0,0,34.5,"",0,0,0,0,1,0,0 -"Ars amandi",1983,92,NA,5,13,24.5,4.5,4.5,0,14.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Arsenal",1928,70,NA,7.5,85,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Arsenal Stadium Mystery, The",1940,84,NA,6.1,87,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Arson, Inc.",1949,63,NA,5.3,5,0,0,0,0,44.5,24.5,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Arsonist's Riddle, The",2002,4,NA,4.7,20,4.5,0,14.5,24.5,24.5,4.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Art Heist",2004,98,NA,3.8,59,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Art History",2003,22,NA,6.2,17,14.5,24.5,0,0,4.5,0,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Art House",1998,93,NA,5.4,104,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"R",0,0,1,1,0,0,0 -"Art Pepper: Notes from a Jazz Survivor",1982,48,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Art Thief Musical!",2004,20,25000,8.5,6,0,14.5,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Art Trouble",1934,21,NA,5.8,20,0,4.5,14.5,4.5,24.5,4.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Art for Teachers of Children",1995,82,NA,5.5,30,14.5,4.5,0,4.5,4.5,34.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Art of Dying, The",1991,90,NA,4.4,24,4.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Art of Love, The",1965,99,NA,6,107,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Art of Mirrors",1973,6,NA,5.2,13,14.5,0,14.5,4.5,4.5,0,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Art of Revenge",2003,88,NA,4.6,51,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Art of Salesmanship, The",1997,12,NA,8.2,21,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Art of Self Defense, The",1941,8,NA,6.7,54,4.5,0,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Art of Skiing, The",1941,8,NA,6.8,76,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Art of Woo, The",2001,97,NA,4,51,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Arte de morir, El",2000,102,NA,6,305,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Arte di arrangiarsi, L'",1955,95,NA,6.9,6,0,0,0,0,0,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Artemisia",1997,98,NA,7,579,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Arth",1982,138,NA,8.9,54,0,4.5,0,0,0,4.5,4.5,14.5,44.5,34.5,"",0,0,0,1,0,1,0 -"Arthur",1981,97,7000000,6.6,4595,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Arthur",1998,4,NA,6.7,13,0,0,0,0,14.5,4.5,14.5,24.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Arthur 2: On the Rocks",1988,107,NA,3.6,1646,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Arthur's Dyke",2001,106,NA,5.6,65,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Arthur's Hallowed Ground",1986,71,NA,5.6,17,0,0,0,14.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Article 99",1992,100,NA,5.8,649,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Articolo 2, L'",1994,98,NA,2.6,10,34.5,14.5,24.5,0,0,0,0,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Artie Shaw and His Orchestra",1939,10,NA,7.1,19,4.5,0,0,4.5,4.5,14.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Artie Shaw: Time Is All You've Got",1985,114,250000,7.9,18,0,0,0,0,0,0,34.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Artifacts",2001,90,NA,5.8,11,4.5,24.5,0,0,0,14.5,0,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Artificial Intelligence: AI",2001,146,90000000,6.8,36623,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Artificial Lies",2000,92,NA,4.7,58,4.5,14.5,4.5,24.5,14.5,24.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Artist's Dilemma, The",1901,2,NA,5.7,17,4.5,0,0,14.5,0,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Artista, dolarii si Ardelenii",1979,97,NA,8.1,31,14.5,0,4.5,0,0,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Artisten in der Zirkuskuppel: Ratlos, Die",1968,103,NA,6,28,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Artistic Temper",1932,20,NA,4.6,6,0,14.5,0,0,0,14.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Artists & Models",1937,97,NA,5.8,16,4.5,4.5,4.5,0,14.5,34.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Artists and Models",1955,109,1500000,6.2,433,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Artists and Models Abroad",1938,90,NA,5.9,20,4.5,0,0,24.5,14.5,14.5,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Artus, Merlin a Prchlici",1995,75,NA,4,7,0,0,44.5,14.5,24.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Artworks",2003,96,NA,6.1,68,4.5,0,4.5,4.5,4.5,24.5,14.5,4.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Aru eiga-kantoku no shogai",1975,132,NA,9.4,11,14.5,0,0,0,0,4.5,0,4.5,0,64.5,"",0,0,0,0,1,0,0 -"Aru kengo no shogai",1959,111,NA,6.6,8,0,0,14.5,0,14.5,14.5,0,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Aru koroshiya",1967,82,NA,7.4,7,0,0,0,0,0,14.5,14.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Aru machikado no monogatari",1962,38,NA,7.4,8,0,0,0,0,0,0,24.5,45.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Aruanda",1960,20,NA,6.3,6,0,0,0,0,0,14.5,45.5,14.5,14.5,0,"",0,0,0,0,1,0,1 -"Aruku-hito",2001,103,NA,6,13,0,0,4.5,0,0,4.5,24.5,34.5,24.5,0,"",0,0,1,1,0,0,0 -"Arunachalam",1997,166,NA,3.8,19,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Arven",1979,95,NA,3.7,17,4.5,44.5,0,0,24.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Arven",2003,107,NA,7.5,806,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Arvottomat",1982,105,NA,8.2,130,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Aryan Couple, The",2004,120,NA,7.4,13,4.5,4.5,4.5,0,0,4.5,0,4.5,34.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Arzt von St. Pauli, Der",1968,101,NA,5.5,7,0,0,14.5,0,24.5,24.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Arzt von Stalingrad, Der",1958,110,NA,5.8,16,4.5,4.5,0,4.5,4.5,24.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"As Boys Grow...",1957,16,NA,4.7,11,0,4.5,4.5,14.5,14.5,14.5,0,0,4.5,14.5,"",0,0,0,0,1,0,1 -"As Cute as They Cum",1990,75,NA,8.4,6,0,0,0,0,14.5,0,0,0,14.5,64.5,"",0,0,0,0,0,0,0 -"As Good as It Gets",1997,139,50000000,7.7,47441,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"As I Was Moving Ahead Occasionally I Saw Brief Glimpses of Beauty",2000,320,NA,9.1,26,4.5,0,4.5,0,0,4.5,4.5,4.5,24.5,45.5,"",0,0,0,0,1,0,0 -"As It Is in Life",1910,16,NA,4.7,5,24.5,0,0,24.5,24.5,0,24.5,0,24.5,0,"",0,0,0,1,0,0,1 -"As Long As He Lives",1998,7,NA,6.6,9,14.5,0,0,14.5,44.5,0,0,0,0,34.5,"",0,0,0,0,0,0,1 -"As Long as They're Happy",1955,74,NA,5,21,4.5,4.5,4.5,4.5,34.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"As Seen Through a Telescope",1900,1,NA,4.9,41,4.5,4.5,0,14.5,14.5,34.5,24.5,4.5,0,0,"",0,0,1,0,0,0,1 -"As Time Goes by",1988,96,NA,5,36,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,4.5,"",0,0,1,0,0,0,0 -"As You Desire Me",1932,70,460733,6,107,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"As You Like It",1936,96,NA,6.4,115,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"As Young as We Are",1958,76,NA,4.1,8,0,14.5,14.5,24.5,24.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"As Young as You Feel",1951,77,NA,6.6,80,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"As des as, L'",1982,100,NA,6.4,373,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"As perimenoun oi gynaikes",1998,87,NA,6.2,17,14.5,4.5,4.5,4.5,0,14.5,4.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"As the Sea Rages",1960,74,NA,5.2,8,0,0,0,24.5,34.5,0,0,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Asa Branca",1980,90,NA,6.2,11,0,0,0,4.5,14.5,4.5,34.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Asa Nu Maan Watna Da",2004,179,NA,6.2,6,34.5,0,0,0,0,0,14.5,14.5,0,34.5,"",0,0,0,1,0,1,0 -"Asadito, El",2000,71,NA,7.7,38,4.5,0,0,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Asakusa Kid",2002,111,NA,6.8,26,0,0,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Asaltar los cielos",1996,96,NA,7.6,28,0,0,4.5,0,14.5,0,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Asambhav",2004,139,NA,4.7,23,14.5,4.5,4.5,24.5,14.5,14.5,4.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Asburied",2002,8,2000,8.7,7,0,0,0,14.5,0,0,14.5,0,0,74.5,"",0,0,0,0,0,0,1 -"Ascension",2004,85,5500,8.8,12,4.5,0,0,0,0,0,0,14.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Ascent, The",1994,96,NA,5.7,32,0,0,0,24.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Asesinato a distancia",1998,103,NA,6.2,18,0,0,0,14.5,14.5,14.5,4.5,24.5,34.5,0,"",0,0,0,1,0,0,0 -"Asesinato en febrero",2001,84,NA,7.5,18,14.5,0,0,0,0,14.5,14.5,24.5,34.5,4.5,"",0,0,0,0,1,0,0 -"Asesino de Pedralbes, El",1978,86,NA,8.5,6,0,14.5,0,0,0,0,0,64.5,14.5,0,"",0,0,0,0,1,0,0 -"Asesino en serio",2002,84,2500000,5.8,90,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Asessorin naishuolet",1958,89,NA,5.5,9,14.5,0,0,0,24.5,0,45.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Asfalto",2000,90,NA,6.7,175,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Asfalttilampaat",1968,78,NA,5.1,12,0,0,4.5,0,14.5,4.5,4.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Asfour Stah",1990,98,NA,6.8,132,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Asfour, al-",1972,105,NA,6.8,19,14.5,0,14.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Ash Wednesday",1973,99,NA,3.5,110,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ash Wednesday",2002,98,NA,5.5,625,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Ash Wednesday",2005,23,4999,8.6,12,4.5,4.5,0,0,0,0,0,0,0,84.5,"",0,0,1,1,0,1,1 -"Ashani Sanket",1973,101,NA,8,85,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ashanti",1979,118,NA,4.6,203,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ashes and Embers",1982,120,NA,5.4,8,14.5,0,0,14.5,14.5,24.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Ashes and Flames",1998,90,NA,2,17,45.5,14.5,0,0,14.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Ashes and Sand",2002,108,NA,3.2,22,14.5,14.5,4.5,4.5,0,4.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Ashita",1995,141,NA,6.4,7,0,14.5,0,0,0,0,44.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Ashita ga aru sa: The Movie",2002,118,NA,7.2,5,24.5,0,0,0,24.5,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Ashugi Qaribi",1988,78,NA,7.8,107,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Ashura no gotoku",2003,135,NA,7.9,22,4.5,0,0,0,0,14.5,0,45.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Asian Pride Porn",2000,3,NA,4.8,25,24.5,4.5,4.5,4.5,0,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Asignatura aprobada",1987,94,NA,4,21,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Asignatura pendiente",1977,109,NA,6.2,49,4.5,0,4.5,0,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Asini",1999,103,NA,5.8,63,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ask Any Girl",1959,98,NA,6.3,147,0,4.5,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ask Dad",1929,20,NA,5.3,10,0,14.5,34.5,24.5,14.5,14.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"Ask Father",1919,13,NA,7.1,38,0,0,0,4.5,0,34.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Ask a Policeman",1938,83,NA,7.3,110,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Askeladden og de gode hjelperne",1961,15,NA,8.6,134,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Aslan Adam",1975,109,NA,6.1,29,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Asmali konak: Hayat",2003,120,NA,3.9,75,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Asobi",1971,90,NA,6.6,8,0,0,0,0,14.5,24.5,14.5,24.5,0,24.5,"",0,0,0,1,0,1,0 -"Asobi no jikan wa owaranai",1991,111,NA,7.7,8,0,0,14.5,0,0,0,0,14.5,34.5,34.5,"",0,0,1,0,0,0,0 -"Asoka",2001,169,NA,6.5,555,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"R",1,0,0,1,0,1,0 -"Asombroso mundo de Borjamari y Pocholo, El",2004,90,NA,2.6,75,44.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Asonot Shel Nina, Ha-",2003,110,NA,7.4,109,4.5,0,4.5,0,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,1,1,0,0,0 -"Asparagus",1979,20,NA,6.7,10,14.5,0,0,0,0,24.5,24.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Aspen Extreme",1993,113,NA,5.1,697,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Asphalt",1929,94,NA,7.1,68,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Asphalt Jungle, The",1950,112,NA,7.8,2523,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Asphalt Tango",1993,100,NA,7.7,145,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Asphalte",1981,100,NA,4.6,12,4.5,0,4.5,14.5,4.5,4.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Asphaltflimmern",1994,81,NA,5.6,9,0,0,0,0,14.5,44.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Asphaltnacht",1980,90,NA,7.3,6,0,14.5,0,0,0,0,34.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Asphalto",1998,42,NA,3.5,11,4.5,0,0,4.5,0,4.5,0,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Asphyx, The",1973,99,NA,5.9,226,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Asrar el-banaat",2001,91,NA,7.1,16,0,4.5,4.5,0,4.5,0,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Assa",1988,153,NA,8.6,157,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Assalto ao Trem Pagador, O",1962,102,NA,6,56,4.5,4.5,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Assam Garden, The",1985,92,NA,7.6,40,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Assassin",1973,83,NA,4.6,11,0,4.5,4.5,0,24.5,24.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Assassin a peur la nuit, L'",1942,100,NA,5.4,5,0,0,0,24.5,44.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Assassin habite... au 21, L'",1942,79,NA,7.8,150,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Assassin jouait du trombone, L'",1991,96,NA,6.3,79,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Assassin of Youth",1937,80,NA,5.2,36,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Assassin(s)",1997,128,NA,6.4,428,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Assassinage",2001,3,NA,4.3,7,0,14.5,0,14.5,0,0,14.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Assassinat du duc de Guise, L'",1908,15,NA,5.2,14,4.5,0,4.5,0,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Assassination",1987,105,NA,4.4,322,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Assassination Bureau, The",1969,110,NA,6.2,329,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Assassination Tango",2002,114,NA,6.1,611,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Assassination of Richard Nixon, The",2004,95,NA,7.1,1624,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Assassination of Trotsky, The",1972,103,2500000,5,148,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Assassini dei giorni di festa",2002,95,NA,8,7,0,0,0,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Assassini sono nostri ospiti, Gli",1974,87,NA,7.9,10,0,0,0,0,0,0,34.5,0,45.5,24.5,"",0,0,0,0,0,0,0 -"Assassinio sul Tevere",1979,96,NA,6.3,14,0,0,0,4.5,0,24.5,34.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Assassino, L'",1961,83,NA,5.4,31,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Assassins",1995,132,50000000,5.7,7354,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Assassins de l'ordre, Les",1971,107,NA,5.3,20,0,0,14.5,4.5,34.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Assassins et voleurs",1957,85,NA,6.2,23,4.5,0,0,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Assassins...",1992,14,NA,4.7,59,24.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Assault Platoon",1992,92,NA,1.6,5,64.5,44.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Assault and Flattery",1956,6,NA,4.5,24,4.5,4.5,4.5,24.5,24.5,24.5,0,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Assault and Peppered",1965,6,NA,6.3,24,0,0,4.5,0,14.5,44.5,14.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Assault of the Killer Bimbos",1988,85,250000,4,149,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Assault of the Party Nerds 2: The Heavy Petting Detective",1995,86,NA,2.5,35,45.5,4.5,4.5,4.5,4.5,4.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Assault on Agathon",1975,96,NA,5.1,10,0,0,0,14.5,34.5,24.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Assault on Precinct 13",1976,91,100000,7.3,4093,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Assault on Precinct 13",2005,109,20000000,6.3,2960,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Assault on a Queen",1966,106,NA,5.4,129,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Assault, The",1996,85,NA,3.4,48,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Assedio dell'Alcazar, L'",1940,112,NA,7.3,7,14.5,0,0,14.5,0,0,0,0,45.5,14.5,"",0,0,0,0,0,0,0 -"Assedio di Siracusa, L'",1960,115,NA,5.1,14,0,0,0,14.5,24.5,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Assembling a Generator",1904,3,NA,3.8,18,24.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Assembling and Testing Turbines",1904,3,NA,3.5,19,24.5,14.5,24.5,4.5,24.5,4.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Assicurazione, L'",1998,90,NA,9,10,0,14.5,0,0,0,0,0,14.5,0,84.5,"",0,0,0,0,0,0,0 -"Assifa, Al",2000,100,NA,4,12,4.5,0,24.5,0,0,14.5,14.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Assignment Berlin",1982,94,NA,2.3,7,84.5,0,0,0,0,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Assignment Berlin",1998,90,NA,2.4,18,24.5,0,14.5,14.5,0,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Assignment K",1968,97,NA,4.7,19,0,4.5,4.5,34.5,24.5,4.5,14.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Assignment Redhead",1956,67,NA,4.4,8,0,14.5,0,24.5,14.5,14.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Assignment in Brittany",1943,96,NA,6.1,14,0,0,0,0,14.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Assignment to Kill",1968,102,NA,5.7,34,0,0,4.5,4.5,24.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Assignment, An",2003,23,NA,8.2,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,0,1,0,0,1 -"Assignment: Paris",1952,85,NA,5.4,10,0,0,14.5,14.5,14.5,64.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Assignment: Venezuela",1956,24,NA,1.1,17,64.5,14.5,14.5,4.5,0,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Assisi Underground, The",1985,115,NA,5.2,62,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Assistant, The",1997,116,NA,5.3,81,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Assisted Living",2003,78,500000,7.4,56,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Asso",1981,90,NA,5.5,83,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Associate, The",1996,114,NA,5.5,1341,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Association de malfaiteurs",1987,104,NA,6.3,76,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Assunta Spina",1915,50,NA,5.5,23,14.5,4.5,0,14.5,4.5,4.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Assunta Spina",1947,91,NA,8.9,7,0,0,0,0,0,0,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Asta e",2001,92,NA,8.9,8,0,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Astenicheskiy sindrom",1989,153,NA,7.6,37,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Asterix in Amerika",1994,85,12500000,5.4,394,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Astero",1959,73,NA,5.6,5,24.5,0,0,24.5,0,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Astillero, El",2000,88,NA,2.9,9,0,24.5,24.5,14.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Astitva",2000,109,NA,6.2,37,14.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Astonished Heart, The",1949,85,NA,5.7,33,0,4.5,14.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Astor Tramp, The",1899,2,NA,3.6,13,4.5,14.5,34.5,14.5,14.5,0,0,0,0,4.5,"",0,0,1,0,1,0,1 -"Astoria",2000,103,NA,4.7,17,14.5,4.5,0,14.5,14.5,0,0,14.5,0,24.5,"R",0,0,0,1,0,0,0 -"Astounding She-Monster, The",1957,62,NA,2.6,114,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Astragale, L'",1969,103,NA,6.3,7,0,0,0,0,14.5,14.5,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Astrapoyannos, O",1970,116,NA,8.4,5,0,0,0,24.5,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Astro-Zombies, The",1969,91,NA,2.3,253,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Astroduck, The",1966,6,NA,6,33,0,0,4.5,14.5,14.5,34.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Astronaut's Wife, The",1999,109,34000000,4.8,7253,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Astronauta, El",1970,86,NA,5.9,30,0,0,0,14.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Astronautas",2003,86,NA,6.1,60,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Astronautes, Les",1959,14,NA,7.1,8,0,0,0,14.5,14.5,14.5,34.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Asu o tsukuru hitobito",1946,82,NA,7.8,22,4.5,4.5,4.5,0,0,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Asunder",1998,101,NA,4.3,69,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Asunto privado, Un",1996,98,NA,4.1,10,44.5,0,0,14.5,24.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Aswang",1994,82,70000,4.6,89,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Asylum",1972,88,NA,6.1,451,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Asylum",1997,90,NA,5.1,88,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Asylum",1998,78,NA,8.6,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Asylum Days",2001,100,NA,4.7,21,14.5,0,14.5,14.5,14.5,4.5,0,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Asylum of Satan",1975,80,50000,2.9,78,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Asylum, The",2000,99,NA,5.2,34,34.5,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Aszparuh",1981,113,NA,6.4,59,4.5,0,4.5,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"At Close Range",1986,111,6500000,6.6,1650,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"At Dawning",2001,10,NA,7.8,24,0,0,0,4.5,0,4.5,24.5,44.5,14.5,14.5,"",0,0,0,0,0,0,1 -"At Death's Door",1999,14,NA,5.3,26,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"At First Sight",1999,128,40000000,5.7,3441,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"At Ground Zero",1994,117,NA,7.6,10,0,0,14.5,14.5,14.5,0,14.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"At Gunpoint",1955,81,NA,5.9,42,0,0,4.5,4.5,14.5,44.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"At Land",1944,15,NA,7.4,123,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"At Long Last Love",1975,105,6000000,4.3,193,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"At Night with No Curtains",2004,87,8000,2.7,23,4.5,0,4.5,4.5,4.5,0,0,0,4.5,74.5,"",0,0,0,1,0,0,0 -"At Play in the Fields of the Lord",1991,189,NA,6.5,913,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"At Sachem Farm",1998,106,NA,5.9,164,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"At Sword's Point",1952,81,NA,6,84,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"At War with the Army",1950,93,NA,5.5,261,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"At Your Service Madame",1936,7,NA,6.6,9,0,0,0,0,44.5,14.5,0,24.5,24.5,0,"",0,1,1,0,0,0,1 -"At kende sandheden",2002,98,NA,7.9,150,4.5,4.5,4.5,4.5,0,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"At the Altar",1909,11,NA,5,9,14.5,0,14.5,14.5,34.5,0,24.5,0,14.5,0,"",0,0,0,1,0,0,1 -"At the Circus",1939,87,NA,6.8,745,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"At the Earth's Core",1976,89,NA,5.1,393,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"At the Foot of the Flatiron",1903,3,NA,4.6,17,4.5,0,14.5,14.5,24.5,24.5,0,14.5,0,0,"",0,0,0,0,1,0,1 -"At the French Ball",1908,7,NA,4.9,7,24.5,0,0,0,24.5,0,24.5,0,0,14.5,"",0,0,1,0,0,0,1 -"At the Max",1991,89,NA,7.3,88,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"At the Quinte Hotel",2002,8,NA,6.5,9,0,0,0,14.5,0,34.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"At the River I Stand",1993,56,NA,8.6,7,0,0,0,0,0,0,14.5,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"At' zije Republika",1965,134,NA,7.2,13,0,0,0,0,14.5,0,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Atacan las brujas",1968,76,NA,8.3,8,0,0,0,34.5,0,0,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Atalante, L'",1934,89,NA,7.7,1172,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Atalia",1984,90,NA,6.9,6,0,14.5,0,0,0,45.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Atama-yama",2002,10,NA,6.8,142,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Atanarjuat",2001,168,NA,7.3,1921,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Ataque de los muertos sin ojos, El",1973,91,NA,4,217,14.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ataque verbal",1999,81,NA,6.2,62,0,4.5,4.5,4.5,4.5,4.5,34.5,34.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Atarashii kamisama",1999,99,NA,9,9,0,0,0,0,0,0,14.5,24.5,24.5,44.5,"",0,0,1,0,1,0,0 -"Atarashiki tsuchi",1937,114,NA,3,6,0,14.5,0,0,45.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Atash",2001,109,NA,8.4,5,0,0,0,0,0,24.5,0,44.5,0,44.5,"",0,0,0,0,0,0,0 -"Athaku Yamudu Ammayiki Mogudu",1989,140,NA,7.8,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",1,0,1,1,0,1,0 -"Athena",1954,119,NA,5.5,68,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Athens, Ga.: Inside/Out",1987,82,NA,7.1,41,4.5,0,0,0,4.5,4.5,4.5,24.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Atlanten",1995,96,NA,6.9,18,0,0,0,4.5,14.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Atlantic",1929,87,NA,5.2,20,14.5,14.5,4.5,24.5,0,24.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Atlantic Adventure",1935,68,NA,5.2,8,0,0,14.5,14.5,34.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Atlantic City",1944,60,NA,5.7,14,0,4.5,4.5,0,24.5,24.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Atlantic City",1980,104,7200000,7.5,2384,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Atlantic Convoy",1942,66,NA,6,5,0,0,0,0,24.5,44.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Atlantic Ferry",1941,91,NA,5.9,17,0,0,0,14.5,24.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Atlantida",2002,93,1000000,7.6,9,0,0,14.5,14.5,14.5,0,0,24.5,0,44.5,"",0,0,0,1,0,1,0 -"Atlantide, L'",1920,136,NA,7.5,6,0,0,0,0,34.5,0,14.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Atlantide, L'",1932,89,NA,6.8,16,14.5,0,0,0,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Atlantide, L'",1961,105,NA,6.8,11,4.5,4.5,4.5,4.5,0,14.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Atlantide, L'",1992,107,NA,5.2,13,4.5,0,0,24.5,14.5,4.5,4.5,4.5,34.5,0,"",0,0,0,1,0,0,0 -"Atlantis",1913,121,NA,6.4,15,0,4.5,0,4.5,0,14.5,44.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Atlantis",1991,78,NA,6.7,364,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Atlantis, the Lost Continent",1961,90,NA,4.5,210,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Atlantis: The Lost Empire",2001,95,90000000,6.4,6323,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",1,1,0,0,0,0,0 -"Atlas",1961,79,70000,4,26,14.5,4.5,14.5,34.5,14.5,0,0,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Atlas",1976,5,NA,6.9,8,0,0,0,14.5,0,24.5,34.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Atlas Gets a Drink",1999,3,NA,6.1,13,0,0,0,4.5,4.5,24.5,14.5,0,4.5,34.5,"",0,1,1,0,0,0,1 -"Atoll K",1951,82,NA,5.1,178,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Atolladero",1995,95,NA,4.2,55,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Atom Man Vs. Superman",1950,252,NA,6.5,55,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Atomic Attack",1950,50,NA,4.9,9,14.5,0,0,24.5,14.5,14.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Atomic Cafe, The",1982,92,NA,7.6,724,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Atomic City, The",1952,85,NA,6.3,22,4.5,0,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Atomic Kid, The",1954,86,NA,4.7,59,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Atomic Rulers",1964,101,NA,4.4,19,4.5,4.5,14.5,14.5,14.5,0,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Atomic Sake",1999,32,NA,6.3,13,0,0,0,4.5,0,14.5,0,44.5,24.5,4.5,"",0,0,0,1,0,0,1 -"Atomic Submarine, The",1959,72,135000,3.9,94,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Atomic Tabasco",1999,10,NA,7.7,63,4.5,0,0,4.5,0,4.5,14.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Atomik Circus - Le retour de James Bataille",2004,92,NA,5.6,173,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ator l'invincibile",1982,98,NA,2.4,263,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ator l'invincibile 2",1984,92,NA,1.9,715,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Atracadores, Los",1962,109,NA,5.7,6,0,0,14.5,0,0,14.5,14.5,14.5,34.5,0,"",0,0,0,0,0,0,0 -"Atraco a las 3... y media",2003,99,NA,3.9,30,14.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Atraco a las tres",1962,92,NA,7.1,155,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Atraco, El",2004,126,NA,7.2,16,4.5,4.5,0,14.5,0,0,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Atraksion",2001,10,NA,6.8,22,0,24.5,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Atrapados",1999,26,3500,9.4,7,0,0,0,0,0,14.5,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Atrocity Exhibition, The",2000,105,NA,7.9,10,14.5,0,0,0,0,14.5,0,34.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Atsidas, O",1962,83,NA,9.1,10,0,0,0,0,0,0,24.5,0,14.5,74.5,"",0,0,1,0,0,0,0 -"Attack",1956,107,NA,7.7,510,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Attack Force Z",1982,84,NA,5,371,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Attack from Space",1964,76,NA,4,12,14.5,0,14.5,14.5,4.5,14.5,4.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Attack of the 50 Foot Chihuahua From Outer Space",1998,2,NA,8.2,7,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,1,0,0,0,1 -"Attack of the 50 Foot Woman",1958,65,88000,4.5,521,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Attack of the 60 Foot Centerfold",1995,84,NA,3.5,175,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Attack of the Bat Monsters",2000,92,NA,5.1,33,14.5,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Attack of the Crab Monsters",1957,62,70000,4,207,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Attack of the Giant Leeches",1959,62,70000,2.8,426,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Attack of the Giant Mousaka, The",2000,90,NA,4.4,73,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Attack of the Hungry Hungry Nipples",1997,4,NA,4.2,14,4.5,0,4.5,0,0,0,0,4.5,24.5,45.5,"",0,1,0,0,0,0,1 -"Attack of the Killer Tomatoes!",1978,87,NA,3.9,2094,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Attack of the Puppet People",1958,79,NA,4.5,199,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Attack on a China Mission",1900,4,NA,4.2,25,4.5,4.5,4.5,24.5,24.5,4.5,24.5,4.5,0,0,"",0,0,0,1,0,0,1 -"Attack on the Iron Coast",1968,89,NA,5,65,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Attack! Battle of New Britain",1944,51,NA,6.5,16,0,0,0,4.5,14.5,14.5,34.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Attendant, The",1992,8,NA,5.9,7,0,0,0,24.5,0,24.5,24.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Attende, Den",1996,100,NA,6.2,48,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Attentat",1980,97,NA,5.6,12,0,4.5,24.5,0,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Attentat, L'",1972,120,NA,7.6,43,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Attentato ai tre grandi",1967,96,NA,4.1,25,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Attenti al buffone",1976,100,NA,6.2,5,44.5,0,0,0,0,0,0,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Attention bandits!",1986,111,NA,6.6,73,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Attention danger travail",2003,109,NA,7.8,24,0,0,0,0,4.5,4.5,34.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Attention!",1999,5,NA,7.5,6,0,14.5,0,0,0,14.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Attention! Une femme peut en cacher une autre",1983,110,NA,6.3,41,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Attention, les enfants regardent",1978,103,NA,6.2,107,0,0,0,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Attic Expeditions, The",2001,100,1000000,5.4,384,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Attic Man",2004,10,6000,8.7,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Attic, The",1979,91,NA,4.6,110,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Attila",1954,100,900000,5.2,67,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Attila flagello di Dio",1982,91,NA,7.1,246,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Attilas '74",1975,103,NA,6,30,24.5,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Atto di dolore",1991,108,NA,5.6,5,24.5,24.5,0,0,0,24.5,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Attraction",2000,95,NA,4.8,238,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Attrazione selvaggia",1990,83,NA,3.7,5,24.5,24.5,0,0,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Attwengerfilm",1994,87,NA,7.8,10,0,0,0,0,14.5,24.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Aty-baty, shli soldaty...",1976,87,NA,8.5,24,4.5,0,0,0,0,0,4.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Au Pair",1994,92,NA,6.3,15,0,0,4.5,14.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Au Pair Girls",1972,86,NA,5.2,62,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Au bagne",1905,8,NA,4.8,7,14.5,0,0,0,24.5,14.5,14.5,0,24.5,0,"",0,0,0,1,0,0,1 -"Au bonheur des dames",1930,85,NA,6.5,8,14.5,0,0,0,0,34.5,24.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Au bonheur des dames",1943,88,NA,6.3,19,0,0,0,4.5,24.5,14.5,34.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Au bout du bout du banc",1979,105,NA,3.7,17,74.5,0,0,0,0,14.5,0,0,0,14.5,"",0,0,1,1,0,0,0 -"Au bout du fil",1974,10,NA,7.6,14,0,0,0,14.5,0,4.5,4.5,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Au bout du monde",1999,8,NA,7.2,60,0,0,4.5,4.5,0,14.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Au clair de la lune",1983,92,NA,7.2,39,4.5,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Au coeur du mensonge",1999,113,NA,6.6,402,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Au hasard Balthazar",1966,95,NA,8.4,504,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Au nom de la loi",1932,77,NA,5.2,11,0,0,4.5,4.5,4.5,45.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Au nom de tous les miens",1983,145,NA,6.3,80,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Au pays des Juliets",1992,92,NA,6.5,8,14.5,0,0,14.5,24.5,14.5,24.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Au petit Marguery",1995,95,NA,7,129,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Au revoir M. Grock",1950,107,NA,4.9,5,0,0,24.5,0,24.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Au revoir les enfants",1987,104,NA,7.9,3368,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Au secours!",1924,40,NA,7.3,14,0,0,0,0,14.5,4.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Au secours, j'ai trente ans!",2004,93,NA,3.3,33,14.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Au sud des nuages",2003,85,NA,7.8,18,0,0,0,0,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Au suivant!",2002,12,NA,4.7,8,0,0,0,45.5,0,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Auberge du bon repos, L'",1903,5,NA,4.8,5,24.5,24.5,0,0,0,0,44.5,0,24.5,0,"",0,0,1,0,0,0,1 -"Auberge espagnole, L'",2002,117,NA,7.3,4273,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Auberge rouge, L'",1923,80,NA,8.8,8,0,0,0,0,0,0,0,34.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Auberge rouge, L'",1951,98,NA,7.3,122,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Auch Fummeln will gelernt sein",1972,75,NA,2.4,8,24.5,14.5,14.5,0,0,0,0,0,0,45.5,"",0,0,1,0,0,0,0 -"Auch Zwerge haben klein angefangen",1970,96,200000,7.2,330,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Audace colpo dei soliti ignoti",1959,100,NA,7.2,92,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Audacious",1995,25,NA,7.4,5,0,0,0,0,24.5,24.5,0,24.5,44.5,0,"",0,0,0,0,0,0,1 -"Audioscopiks",1935,8,NA,7,7,0,0,0,0,24.5,24.5,14.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Audition",1997,104,NA,6.5,102,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Audition, The",1933,9,NA,5,8,14.5,0,0,14.5,45.5,24.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Audition, The",1996,97,NA,7.5,18,4.5,0,0,14.5,0,0,4.5,24.5,0,45.5,"",0,0,0,1,0,0,0 -"Auditions",1978,82,NA,4.7,26,4.5,14.5,14.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Audrey Rose",1977,113,NA,5.5,616,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Auf Wiedersehen Amerika",1994,85,NA,4.9,21,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Auf Wiedersehen, Franziska!",1941,89,NA,8.4,7,0,0,0,0,0,14.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,1,0 -"Auf allen Meeren",2002,95,NA,5.6,9,0,0,0,14.5,34.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Auf der Couch",2001,15,NA,7.8,5,0,0,24.5,0,0,0,0,44.5,0,44.5,"",0,0,0,0,0,0,1 -"Auf der Reeperbahn nachts um halb eins",1954,111,NA,5.9,32,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Auf der Reeperbahn nachts um halb eins",1969,106,NA,4.1,8,14.5,0,0,45.5,0,0,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Auf der Suche nach der verlorenen Zeit. Andrej Tarkowskijs Exil und Tod",1988,131,NA,7.6,10,0,0,0,0,14.5,0,24.5,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Auf immer und ewig",1986,97,NA,5.3,7,0,0,0,14.5,14.5,14.5,14.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Auf ins blaukarierte Himmelbett",1974,70,NA,3,5,0,0,64.5,0,0,0,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Aufbruch, Der",2003,89,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,0,0,0,0 -"Aufenthalt, Der",1983,102,NA,8.4,30,4.5,0,0,0,0,0,14.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Auferstehung",1958,106,NA,4.8,10,0,0,14.5,14.5,34.5,24.5,14.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Aufruhr im Schlaraffenland",1957,80,NA,5.5,7,0,0,14.5,0,14.5,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Aufschneider, Die",2000,14,NA,6,10,0,24.5,0,0,0,34.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Augen der Mumie Ma, Die",1918,63,NA,5.2,86,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Auggie Rose",2000,109,NA,6.3,367,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Auguri professore",1997,105,NA,7.2,54,0,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"August",1996,94,NA,5.2,154,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"August: A Moment Before the Eruption",2002,72,NA,5.2,11,0,0,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Augustin",1995,61,NA,6.3,38,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Augustin, roi du Kung-fu",1999,89,NA,6.1,109,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Auguszta etet",1985,4,NA,7.3,5,0,0,0,0,0,44.5,0,0,44.5,24.5,"",0,1,0,0,0,0,1 -"Aujourd'hui madame",2003,5,NA,6.8,9,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Aujourd'hui ou jamais",1998,106,NA,4.3,11,4.5,4.5,0,4.5,4.5,24.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Aullido del diablo, El",1987,97,NA,2.8,18,34.5,4.5,24.5,0,0,0,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Aunque la hormona se vista de seda...",1971,83,NA,2,15,64.5,4.5,4.5,4.5,14.5,0,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Aunt Clara",1954,84,NA,6.1,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Aunt Luisa",2002,3,NA,5.7,13,0,4.5,0,14.5,14.5,24.5,14.5,0,14.5,4.5,"",0,1,1,0,0,0,1 -"Aunt Peg",1980,80,NA,5.4,28,4.5,0,4.5,24.5,0,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Aunt Sallie's Wonderful Bustle",1901,1,NA,4.3,12,0,4.5,14.5,14.5,45.5,4.5,0,0,0,0,"",0,0,1,0,0,0,1 -"Aunt Sally",1933,84,NA,4.3,12,0,4.5,4.5,4.5,44.5,4.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Auntie Lee's Meat Pies",1993,100,NA,3.2,51,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Auntie Mame",1958,143,NA,7.5,2357,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Aura",2002,22,19000,8.5,6,0,14.5,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Aurelia Steiner (Melbourne)",1979,28,NA,9.3,7,0,0,0,0,0,0,0,14.5,44.5,44.5,"",0,0,0,0,0,0,1 -"Aurora",1998,87,90000,4.5,59,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,1,0,0 -"Aurora Encounter, The",1986,90,NA,3.8,70,24.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Aurora de esperanza",1937,90,NA,6.7,6,0,0,0,0,0,45.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Aurora: Operation Intercept",1995,94,NA,2.7,80,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,1,0,0,0 -"Aus dem Leben der Marionetten",1980,104,NA,7.2,261,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Aus dem Tagebuch der Josefine Mutzenbacher",1981,93,NA,4.4,9,14.5,14.5,14.5,0,0,24.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Aus der Tiefe des Raumes - ...mitten ins Netz!",2004,88,NA,6.6,25,14.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Aus einem deutschen Leben",1977,145,NA,6.9,56,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ausgestorben",1995,15,NA,7.5,20,0,0,0,0,34.5,4.5,24.5,0,24.5,14.5,"",0,0,0,0,0,0,1 -"Auslandstournee",2000,91,NA,8.8,33,0,4.5,4.5,0,4.5,4.5,14.5,4.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Austeria",1983,109,NA,6.6,23,4.5,0,0,0,14.5,24.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Austerlitz",1960,122,4000000,5.1,82,14.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Austernprinzessin, Die",1919,47,NA,8,71,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Austin Powers in Goldmember",2002,94,63000000,6.2,22870,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Austin Powers: International Man of Mystery",1997,94,17000000,7,33755,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Austin Powers: The Spy Who Shagged Me",1999,95,33000000,6.5,37019,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Austin Prowler",1999,99,NA,7.8,8,0,0,0,0,0,0,24.5,45.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Australia",1989,140,NA,6.8,45,14.5,0,4.5,0,14.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Australia: Land Beyond Time",2002,40,NA,8.9,11,0,0,0,0,0,4.5,14.5,24.5,0,44.5,"",0,0,0,0,1,0,1 -"Australian Dream",1987,85,NA,4.9,11,0,4.5,0,14.5,4.5,14.5,4.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Australian Rules",2002,95,NA,7,180,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ausverkauft!",1999,9,NA,6.6,19,0,0,0,0,4.5,24.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Auteur Theory, The",1999,79,70000,4.5,76,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Author! Author!",1982,110,NA,5.7,948,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Auto Boat Race On the Hudson",1904,3,NA,3.6,7,0,0,44.5,24.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Auto Focus",2002,105,7000000,6.7,3276,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Auto da Compadecida, O",2000,104,NA,8.5,452,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,1,0 -"Auto, L'",1998,5,NA,8.2,6,14.5,0,0,0,0,0,0,0,34.5,45.5,"",0,0,0,0,0,0,1 -"Auto-stoppeuses en chaleur",1979,90,NA,4.9,7,0,0,0,14.5,14.5,24.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Autobahn",1979,12,NA,9,12,4.5,0,0,0,4.5,0,0,4.5,4.5,64.5,"",0,1,0,0,0,0,1 -"Autobahnraser",2004,87,NA,3.8,255,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Autobank",2002,2,NA,6.8,9,0,0,0,14.5,14.5,14.5,0,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Autobiographia Dimionit",1994,87,NA,7.4,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Autobiography of a 'Jeep', The",1943,9,NA,5.9,25,0,0,0,4.5,34.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Autobiography of a Flea, The",1976,90,NA,5.6,30,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Autobiography of a Princess",1975,55,NA,5.7,27,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Autogramm, Das",1984,92,NA,5.8,5,0,0,0,24.5,24.5,0,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Autograph Hound, The",1939,8,NA,7.1,51,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Automania",1994,6,NA,6,10,0,0,0,0,24.5,24.5,44.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Automat Kalaschnikow",2000,95,NA,6.9,14,0,0,4.5,0,0,4.5,45.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Automatic",1994,90,NA,5,203,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Automation",2004,26,41000,6.1,13,0,0,0,0,0,4.5,4.5,0,24.5,64.5,"",0,0,0,0,0,0,1 -"Automne",2004,110,NA,4.3,21,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Automobile Race for the Vanderbilt Cup",1904,3,NA,3.4,6,0,14.5,14.5,34.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Autoportret z kochanka",1997,90,NA,5.6,19,4.5,14.5,0,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Autopsia",1973,85,NA,4.8,11,4.5,0,4.5,4.5,24.5,24.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Autopsia de un fantasma",1968,95,NA,2.7,9,14.5,24.5,0,14.5,0,0,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Autopsy Room Four",2003,22,NA,6.6,53,4.5,0,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Autorequiem",2002,12,NA,9.2,12,0,4.5,0,0,0,0,0,0,4.5,84.5,"",0,0,0,0,0,0,1 -"Autostop rosso sangue",1977,98,NA,6.3,166,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Autour de l'argent",1929,40,NA,7.7,6,0,0,0,0,0,14.5,14.5,14.5,45.5,0,"",0,0,0,0,1,0,1 -"Autour de la maison rose",1999,92,NA,4,16,14.5,4.5,0,0,14.5,14.5,14.5,14.5,0,24.5,"",0,0,1,1,0,0,0 -"Autre monde, L'",2001,95,NA,6.3,20,4.5,0,0,4.5,14.5,24.5,44.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Autre nuit, L'",1988,91,NA,7.1,5,0,0,24.5,0,0,44.5,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Autre, L'",1999,105,NA,5.5,71,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Autre, L'",2003,71,NA,6.9,18,0,0,0,14.5,4.5,14.5,24.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Autres filles, Les",2000,96,NA,6.4,41,4.5,0,0,4.5,4.5,34.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Autres, Les",1974,127,NA,5.3,9,0,0,0,24.5,14.5,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Autrichienne, L'",1990,98,NA,7.7,9,0,0,0,0,0,14.5,24.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Autruches",1896,1,NA,5.4,74,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Autsch!!!",1996,90,NA,5.6,6,14.5,0,0,14.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Autumn",1930,6,NA,7.6,8,0,0,0,0,0,24.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Autumn Born",1979,74,NA,3.8,36,24.5,14.5,4.5,14.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Autumn Heart",2003,15,NA,8.3,9,14.5,0,0,0,14.5,0,0,0,14.5,64.5,"",0,0,0,1,0,0,1 -"Autumn Heart, The",1999,110,NA,6.1,74,14.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Autumn Leaves",1956,107,NA,6.4,150,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Autumn in New York",2000,103,40000000,4.7,3731,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Autumnal",1993,5,NA,5.9,7,24.5,0,0,0,0,14.5,0,44.5,14.5,0,"",0,0,0,0,0,0,1 -"Autunno",1999,95,NA,4.9,19,24.5,4.5,4.5,14.5,14.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Aux yeux du monde",1990,95,NA,6.1,107,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ava & Gabriel - Un historia di amor",1990,100,NA,4.3,7,0,0,0,44.5,0,14.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Avalanche",1946,70,NA,4.9,6,0,0,0,45.5,34.5,0,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Avalanche",1978,91,NA,4,155,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Avalanche",1999,109,NA,3.7,126,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Avalanche Express",1979,88,NA,4.1,210,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Avaleuses, Les",1973,72,NA,4.7,269,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Avalon",1990,126,NA,7.3,1641,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Avalon",2001,106,8000000,6.8,2723,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,1,0,1,0,0,0 -"Avanim",2004,107,NA,7.5,48,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Avant qu'il ne soit trop tard",2005,84,NA,4.9,17,14.5,4.5,14.5,4.5,14.5,4.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Avantazh",1977,138,NA,9.3,18,0,0,0,0,0,0,4.5,4.5,14.5,74.5,"",0,0,0,1,0,0,0 -"Avanti a lui tremava tutta Roma",1946,98,NA,6,7,0,0,0,0,0,45.5,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Avanti popolo",1986,84,60000,8.8,51,0,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Avanti!",1972,140,2750000,7.2,1043,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Avanture Borivoja Surdilovica",1980,88,NA,7.4,8,0,0,0,14.5,0,0,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Avare, L'",1980,105,NA,6.3,245,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Avariya - doch menta",1989,99,NA,4.9,15,14.5,4.5,4.5,0,14.5,24.5,34.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Avaro, L'",1990,117,NA,5,28,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Avassaladoras",2002,93,NA,6.2,125,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Avatar",2003,9,NA,6.7,6,34.5,0,0,0,0,0,0,0,34.5,34.5,"",1,0,0,0,0,0,1 -"Avatars",2001,5,20000,3.3,7,14.5,14.5,0,0,0,14.5,0,24.5,0,24.5,"",1,0,0,0,0,0,1 -"Avatars Offline",2002,78,NA,5.7,26,4.5,0,4.5,0,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Ave ano",1998,15,NA,3.5,5,24.5,0,44.5,0,0,44.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Avec la peau des autres",1966,90,NA,6.7,14,0,0,0,14.5,4.5,4.5,24.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Avec mon mari",1999,95,NA,5.4,9,0,0,0,14.5,34.5,0,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Avec tout mon amour",2001,88,NA,3,15,24.5,4.5,14.5,24.5,0,0,4.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Avengers, The",1998,89,60000000,3.4,11499,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Avenging Angel",1985,93,NA,3.7,184,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Avenging Angelo",2002,96,NA,4.6,877,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Avenging Conscience; Thou Shalt Not Kill, The",1914,78,NA,6.4,30,4.5,0,0,4.5,4.5,44.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Avenging Force",1986,104,NA,4.7,203,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Avenging Rider, The",1943,55,NA,6,13,0,0,14.5,0,14.5,14.5,14.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Avenging Waters",1936,56,NA,4.9,10,0,14.5,14.5,34.5,0,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Avenging, The",1982,100,NA,4.2,14,0,4.5,34.5,4.5,24.5,0,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Aventis",1989,120,NA,7.2,54,4.5,0,4.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Aventura llamada Menudo, Una",1982,90,NA,4.3,7,14.5,0,0,24.5,44.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Aventuras com Tio Maneco",1971,102,NA,5.3,6,14.5,0,14.5,14.5,0,0,0,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Aventuras de Dios, Las",2000,84,NA,6.3,34,14.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Aventuras de Enrique y Ana, Las",1981,91,NA,2.6,23,24.5,4.5,14.5,4.5,0,4.5,0,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Aventuras de Juan Quin Quin, Las",1967,113,NA,6.3,9,0,0,0,24.5,0,24.5,24.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Aventuras de Robinson Crusoe, Las",1954,90,NA,7.5,167,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Aventuras de Zipi y Zape, Las",1981,93,NA,2,20,45.5,14.5,24.5,4.5,4.5,0,0,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Aventure de Catherine C.",1990,100,NA,4,12,14.5,24.5,4.5,0,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Aventure est au coin de la rue",1944,98,NA,5,31,0,74.5,0,0,14.5,0,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Aventure malgache",1944,30,NA,6.2,129,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Aventure, c'est l'aventure, L'",1972,120,NA,7,264,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Aventurera",1950,101,NA,7.9,46,4.5,0,4.5,0,0,4.5,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Aventures d'une jeune veuve, Les",1974,95,NA,5.9,13,4.5,0,0,4.5,24.5,14.5,34.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Aventures de Rabbi Jacob, Les",1973,91,NA,7.2,1046,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Aventures galantes de Zorro, Les",1972,85,NA,1.1,8,74.5,14.5,0,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Aventuriers, Les",1967,112,NA,7.3,316,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Avere vent'anni",1978,94,NA,5.6,46,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Avetik",1992,100,NA,5.9,11,0,0,0,14.5,4.5,24.5,0,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Aveu, L'",1970,135,NA,7.4,165,4.5,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Aveux de l'innocent, Les",1996,90,NA,7,25,0,4.5,14.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Aviation Vacation",1941,6,NA,5.5,19,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Aviator, The",1985,96,NA,5.3,164,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Aviator, The",2004,170,116000000,7.5,16217,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Aviso aos Navegantes",1950,111,NA,6.6,11,0,0,0,0,0,24.5,44.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Aviso inoportuno, El",1969,80,NA,5.1,7,0,0,14.5,0,14.5,0,14.5,45.5,0,0,"",0,0,1,0,0,0,0 -"Aviv",2003,80,NA,8,8,0,0,0,0,0,0,24.5,45.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Avondale Dogs",1994,15,NA,5.6,20,14.5,0,0,4.5,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Avonden, De",1989,125,NA,6.8,115,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Avonturen van Pietje Bell",1964,85,NA,5.8,6,0,0,0,0,14.5,0,45.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Avrio tha xeroume, Dharma Blue Bums",1997,110,NA,7.5,6,0,0,14.5,0,14.5,0,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Avskedet",1982,90,NA,5.9,6,0,0,0,34.5,0,14.5,0,0,0,45.5,"",0,0,0,1,0,0,0 -"Avtomobil, skripka i sobaka Klyaksa",1974,101,NA,7.5,11,0,0,0,0,4.5,4.5,4.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Avtostop",1990,56,NA,8.2,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,1,0,0,0,0 -"Avventura di Salvator Rosa, Un'",1939,92,NA,6.6,7,0,0,0,0,0,24.5,44.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Avventura, L'",1960,145,NA,7.5,1727,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Avventure dell'incredibile Ercole, Le",1985,88,NA,2.2,76,44.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Avventure di Cartouche, Le",1954,85,NA,5.7,8,0,0,0,14.5,24.5,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Avventure di Mary Read, Le",1961,87,NA,5.6,8,0,0,0,34.5,0,24.5,14.5,14.5,0,14.5,"",1,0,0,1,0,1,0 -"Avventuriero della tortuga, L'",1965,97,NA,4.6,7,0,0,14.5,14.5,24.5,0,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Avventuriero, L'",1967,103,NA,4.5,27,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Awaara",1951,82,NA,8.3,140,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Awaargi",1990,149,NA,7.2,9,0,0,0,0,0,0,34.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Awakening of Annie, The",1973,106,NA,4.3,6,34.5,34.5,0,0,0,14.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Awakening of Gabriella, The",1999,93,NA,3.5,53,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Awakening, The",1909,8,NA,3.7,5,44.5,0,0,0,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Awakening, The",1980,101,NA,4.2,325,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Awakenings",1990,121,NA,7.4,11835,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Awantura o Basie",1959,96,NA,6.5,9,0,0,0,0,24.5,0,14.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Away All Boats",1956,114,NA,6.1,255,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Awful Moment, An",1908,12,NA,4.3,9,24.5,0,0,14.5,34.5,24.5,0,14.5,0,0,"",0,0,0,1,0,0,1 -"Awful Normal",2004,76,NA,6.5,13,4.5,0,0,4.5,0,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Awful Orphan",1949,7,NA,6.9,94,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Awful Truth, The",1937,91,NA,7.8,1729,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Awfully Big Adventure, An",1995,112,4000000,5.8,608,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Ax Fight, The",1975,30,NA,5,6,14.5,0,34.5,0,0,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Axe Me Another",1934,7,NA,6.3,13,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Axel Munthe - Der Arzt von San Michele",1962,125,NA,5.2,83,4.5,4.5,0,4.5,4.5,84.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Axis of Evil: Perforated Praeter Naturam",2004,84,NA,8.6,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,0,0,1,0,0 -"Ay Juancito",2004,115,NA,4.1,25,14.5,14.5,0,4.5,4.5,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Ay del amor, ciego, eterno y fantasmal cual abandono",2003,10,NA,1.7,6,14.5,14.5,0,0,0,0,0,0,64.5,0,"",0,0,0,1,0,0,1 -"Aya",1990,95,NA,4.1,5,24.5,0,0,44.5,0,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Ayam El-Sadat",2001,165,NA,7.2,42,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,44.5,"",1,0,0,1,0,0,0 -"Aybolit-66",1966,99,NA,7.6,41,0,0,0,4.5,4.5,14.5,24.5,4.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Aydi el naema, El",1963,75,NA,4.9,5,0,24.5,0,0,0,24.5,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Aye zohaye zamin",2001,81,NA,4.9,8,0,0,0,24.5,14.5,0,34.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Ayn Rand: A Sense of Life",1997,145,NA,6.1,139,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Ayneh",1997,95,NA,7.5,156,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ayoub",1983,100,NA,3.8,10,14.5,0,0,0,0,14.5,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Aytoi poy milisan me to thanato",1970,94,NA,7.5,6,0,0,0,14.5,0,14.5,0,45.5,14.5,0,"",0,0,0,1,0,0,0 -"Ayurveda: Art of Being",2001,102,300000,7.2,52,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Ayyam al-tawila, al-",1980,150,NA,6.1,7,45.5,0,0,0,14.5,0,0,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Az kenar-e ham migozarim",2001,86,NA,8.1,7,0,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Az prijde kocour",1963,91,NA,7.9,56,4.5,0,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Azit Hakalba Hatzanhanit",1972,89,NA,7.3,6,14.5,0,0,0,14.5,0,0,0,34.5,34.5,"",0,0,0,0,0,0,0 -"Aziza",1980,95,NA,5.3,5,0,0,0,24.5,0,0,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Azucena",2000,87,NA,5.3,18,14.5,4.5,0,0,0,0,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Azumanga daioh",2001,6,NA,8.3,26,0,0,0,0,4.5,4.5,0,4.5,14.5,64.5,"",0,1,1,0,0,0,1 -"Azumi",2003,142,NA,7,1347,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Azzurro",2000,84,NA,6.6,46,4.5,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"B gai waak",1998,95,NA,6.6,69,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"B'Glal Hamilhamah Hahi",1988,90,NA,8.8,10,0,0,14.5,14.5,14.5,14.5,0,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"B'Hinat Bagrut",1983,90,NA,6.1,7,14.5,0,0,0,14.5,24.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"B*A*P*S",1997,91,NA,3.5,572,24.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"B-52",2001,122,NA,6.4,22,24.5,0,0,0,4.5,24.5,4.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"B-Happy",2003,90,NA,7.2,97,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"B. Monkey",1998,93,NA,6.1,833,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"B.B. e il cormorano",2003,89,NA,6.4,5,0,0,0,24.5,24.5,24.5,24.5,0,0,24.5,"",0,0,1,1,0,0,0 -"B.F.'s Daughter",1948,108,NA,5.2,78,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"B.O.R.N.",1988,92,NA,4.9,22,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"B.S. I Love You",1971,99,NA,5.3,18,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"BASEketball",1998,103,NA,6.1,7096,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"BFG, The",1989,87,NA,6.1,213,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"BMW Vermelho",2000,15,NA,8.3,56,4.5,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,34.5,"",0,0,1,0,0,0,1 -"BMX Bandits",1983,88,NA,4.5,458,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"BUtterfield 8",1960,109,2500000,6,717,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ba Shan Ye Yu",1980,86,NA,8.2,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,0,0,0,0 -"Ba Xian fan dian zhi ren rou cha shao bao",1992,96,NA,6.5,297,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ba cai Lin Ya Zhen",1982,86,NA,4.4,19,14.5,14.5,4.5,0,4.5,4.5,14.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Ba liang jin",1989,100,NA,8.1,17,0,0,0,0,4.5,0,14.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Ba wang bie ji",1993,171,NA,7.7,3098,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"R",0,0,0,1,0,1,0 -"Ba wong fa",1988,91,NA,5.6,48,4.5,4.5,0,14.5,24.5,24.5,14.5,4.5,0,24.5,"",1,0,0,0,0,0,0 -"Ba'al Ba'al Lev",1997,35,NA,6.5,15,0,0,0,0,4.5,4.5,0,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Baader",2002,115,NA,5.6,125,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Baadshah",1999,175,NA,5.9,83,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Baak fan baak ngam 'Feel'",1996,100,NA,5.8,35,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Baara",1978,90,NA,5.6,7,24.5,0,0,0,24.5,0,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Baau lit ying ging",1999,92,NA,5.9,110,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",1,0,0,0,0,1,0 -"Baazi",1951,143,NA,6.9,15,0,0,0,0,0,4.5,34.5,34.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Baazi",1995,183,NA,6.2,27,14.5,0,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Baazigar",1993,175,NA,7.1,161,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Bab Al-Sama Maftuh",1989,107,NA,6.7,11,0,4.5,0,4.5,14.5,0,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Bab El-Oued City",1994,93,NA,6.2,35,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Bab el hadid",1958,76,NA,7.6,62,4.5,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Bab el shams",2004,278,NA,8.6,51,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Bab el web",2005,99,NA,4.6,8,14.5,14.5,14.5,24.5,0,0,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Baba",1971,96,NA,7.5,20,4.5,0,0,4.5,4.5,0,14.5,34.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Baba",2000,96,NA,5.8,14,4.5,0,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Baba",2002,179,NA,5.8,20,14.5,4.5,14.5,24.5,0,24.5,4.5,0,14.5,24.5,"",1,0,0,0,0,0,0 -"Baba Yaga",1973,81,NA,5.8,128,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Babae sa Breakwater",2004,124,NA,5.1,16,14.5,0,4.5,0,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Babam Askerde",1995,86,NA,8.9,9,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,1,0,0,0 -"Babaouo",2000,70,NA,6.1,11,0,4.5,0,0,0,34.5,14.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Babar: King of the Elephants",1999,80,NA,5,49,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Babar: The Movie",1989,70,NA,6.1,73,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Babas Cool, Les",1981,90,NA,4.8,55,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Babbitt",1934,74,NA,5.8,14,0,0,0,4.5,4.5,45.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Babbling Book, The",1932,11,NA,8.2,8,0,0,0,0,14.5,0,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Babe",1995,89,30000000,7.4,16988,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Babe Ruth Story, The",1948,106,NA,5.1,248,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Babe, The",1992,115,NA,5.5,1399,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Babe: Pig in the City",1998,97,80000000,6.5,3827,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Babel",1999,95,20000000,4.5,53,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Babes Boobs and Bikes",1996,60,NA,8.8,7,0,0,24.5,0,0,0,0,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Babes in Arms",1939,93,748000,6.5,239,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Babes in Bagdad",1952,79,NA,4.7,11,4.5,0,4.5,24.5,14.5,4.5,0,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Babes in Toyland",1934,77,NA,7.3,708,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Babes in Toyland",1961,106,NA,5.7,466,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Babes in Toyland",1997,74,NA,3.6,44,14.5,0,24.5,4.5,34.5,4.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Babes in the Woods",1932,8,NA,6.9,66,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Babes on Broadway",1941,118,940068,6.5,171,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Babette s'en va-t-en guerre",1959,106,NA,6.6,30,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Babette's Feet",1999,17,NA,7.3,19,4.5,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Babies Quarrel",1896,1,NA,6.2,70,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Babiy Yar",2003,112,NA,7.7,34,4.5,0,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Babnik",1990,74,NA,4.4,20,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Babnik-2",1992,74,NA,1.9,7,24.5,14.5,14.5,0,14.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Babo 73",1964,57,NA,1,7,84.5,0,0,0,14.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Babo seoneon",1983,87,NA,6.8,6,14.5,0,0,0,14.5,0,14.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Babs",2000,90,NA,4.4,38,34.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Babusya",2003,97,NA,7.3,70,4.5,0,0,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Baby Be Good",1935,8,NA,5.1,12,0,0,4.5,14.5,14.5,34.5,14.5,0,0,4.5,"",0,1,1,0,0,0,1 -"Baby Bedlam",2000,86,NA,4.8,36,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Baby Blood",1990,82,NA,4.7,114,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Baby Blue",2001,119,2500000,6.4,98,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Baby Blue Marine",1976,90,NA,5.1,110,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Baby Blues",1988,91,NA,4.7,8,14.5,0,14.5,14.5,14.5,34.5,14.5,0,0,0,"",0,0,1,0,0,1,0 -"Baby Blues",2002,87,NA,5.6,15,34.5,4.5,4.5,0,0,0,0,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Baby Boom",1987,110,NA,5.7,2151,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Baby Bottleneck",1946,7,NA,7.5,60,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Baby Boy",2001,130,16000000,6.2,1476,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Baby Brother",1927,20,NA,8.6,5,0,0,0,0,24.5,0,24.5,44.5,24.5,0,"",0,0,1,0,0,0,1 -"Baby Brown",1990,85,NA,3,12,0,0,14.5,0,0,0,0,0,0,84.5,"",1,0,0,0,0,0,0 -"Baby Buggy Bunny",1954,7,NA,7.6,77,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Baby Butch",1954,7,NA,7.1,26,0,0,4.5,0,14.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Baby Cat",1983,80,NA,3.8,9,0,14.5,34.5,14.5,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Baby Doll",1956,115,NA,7.3,530,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Baby Doll",1988,78,NA,4.7,13,0,0,14.5,0,45.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Baby Doll",1998,11,NA,6.3,16,0,0,0,4.5,14.5,34.5,34.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Baby Doll Murders, The",1993,90,NA,3.5,28,24.5,4.5,24.5,14.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Baby Doom",1998,81,NA,5.3,98,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Baby Eat Baby",2004,12,NA,7,6,0,0,14.5,0,14.5,0,34.5,0,0,34.5,"",0,1,0,0,0,0,1 -"Baby Face",1933,71,187000,6.4,260,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Baby Face",1977,103,NA,5.8,38,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Baby Face 2",1986,80,NA,7.4,21,4.5,0,0,0,0,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Baby Face Harrington",1935,61,NA,4.9,17,0,4.5,4.5,14.5,24.5,24.5,4.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Baby Face Morgan",1942,63,NA,4.3,9,0,0,34.5,0,34.5,24.5,14.5,0,0,0,"",0,0,1,1,0,0,0 -"Baby Face Nelson",1957,85,NA,6.1,56,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Baby Face Nelson",1995,93,NA,4.7,60,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Baby Geniuses",1999,97,13000000,2.4,3142,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Baby It's You",1983,105,3000000,6.3,435,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Baby Love",1968,93,NA,6.4,30,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Baby Maker, The",1970,102,NA,5.2,48,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Baby Puss",1943,8,NA,6.8,42,0,0,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Baby Rose Marie the Child Wonder",1929,8,NA,7.4,14,0,0,0,0,0,14.5,0,44.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Baby Rosemary",1976,79,NA,4.4,7,24.5,0,14.5,14.5,14.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Baby Sitters' Jitters",1951,16,NA,6.5,49,0,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Baby Snakes",1979,166,NA,6,171,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,1,1,0,1,0,0 -"Baby Steps",1999,25,NA,3.9,51,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,1 -"Baby Take a Bow",1934,76,NA,5.8,98,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"PG",0,0,1,1,0,0,0 -"Baby Wants Spinach",1950,6,NA,5.5,11,0,0,4.5,0,14.5,14.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Baby and the Battleship, The",1956,96,NA,5,42,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Baby on Board",1991,86,NA,4.9,57,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Baby ryazanskie",1927,67,NA,8.5,7,0,0,0,0,0,0,0,45.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Baby the Rain Must Fall",1965,100,NA,6.2,162,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Baby's Breath",2003,103,NA,6.1,20,14.5,0,0,0,0,14.5,0,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Baby's Day Out",1994,99,50000000,4.4,1856,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Baby, The",1973,89,NA,5.1,172,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Baby-Sitters Club, The",1995,90,NA,5,607,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Baby: Secret of the Lost Legend",1985,51,NA,4.4,683,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Babyface",1998,112,NA,3.5,25,24.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Babyfever",1994,110,NA,5.3,40,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Babylon",1980,95,NA,4.8,22,0,0,0,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Babylon",1985,15,NA,5.6,22,0,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Babylon Gold",1983,80,NA,5.4,6,0,14.5,0,0,0,45.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Babylon Pink",1979,77,NA,5.9,17,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Babylonsjukan",2004,90,NA,4.8,73,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Babymother",1998,82,NA,3.1,29,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Babyphoned",2002,10,NA,6.9,21,0,0,0,4.5,0,4.5,14.5,24.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Babysitter, The",1995,90,NA,4.1,879,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Babysitter, The",2003,17,NA,7,14,0,4.5,0,0,0,4.5,34.5,0,0,45.5,"",0,0,1,0,0,0,1 -"Bacall to Arms",1946,7,NA,6.9,49,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Baccanti, Le",1961,100,NA,3.6,7,0,14.5,24.5,24.5,14.5,0,14.5,0,0,0,"",1,0,0,0,0,0,0 -"Bacchae, The",2002,90,NA,6.6,28,44.5,4.5,4.5,0,4.5,0,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bacchanale",1970,70,NA,5.7,13,14.5,14.5,4.5,0,4.5,0,0,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Bach Cello Suite #1: The Music Garden",1997,60,NA,3.1,11,14.5,0,0,0,0,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bach Cello Suite #2: The Sound of Carceri",1997,55,NA,2.8,13,24.5,4.5,4.5,0,4.5,0,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Bach Cello Suite #3: Falling Down Stairs",1997,55,NA,2.9,13,24.5,0,0,0,0,0,0,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bach Cello Suite #4: Sarabande",1997,56,NA,6.4,66,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bach Cello Suite #5: Struggle for Hope",1997,55,NA,2.5,18,34.5,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Bach Cello Suite #6: Six Gestures",1997,58,NA,2.1,15,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Bach et bottine",1986,88,NA,5.8,110,4.5,4.5,0,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bacheh-haye naft",2001,90,NA,7.5,6,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,0,0,1,0,0,0 -"Bacheha-Ye aseman",1997,89,180000,7.6,1499,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Bachelor Apartment",1931,76,NA,6.2,37,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Bachelor Bait",1934,74,NA,5.2,39,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Bachelor Father, The",1931,90,502000,5.5,35,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Bachelor Flat",1962,91,NA,5.7,68,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bachelor Mother",1939,81,NA,7.5,344,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Bachelor Party",1984,105,NA,5.6,4938,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bachelor Party, The",1957,92,NA,7,69,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bachelor Tom Peeping",1962,61,NA,9.1,8,0,0,14.5,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,0 -"Bachelor and the Bobby-Soxer, The",1947,95,NA,7.2,923,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bachelor in Paradise",1961,109,NA,5.8,201,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bachelor of Hearts",1958,94,NA,5.2,27,4.5,0,0,14.5,14.5,34.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Bachelor's Daughters, The",1946,88,NA,6.4,16,0,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Bachelor, The",1999,101,21000000,5,4183,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"BachelorMan",2003,87,NA,5.1,101,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Baci e abbracci",1999,104,NA,6.3,79,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bacio di Tosca, Il",1984,87,NA,6.9,20,0,0,0,4.5,0,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Back Against the Wall",2002,94,NA,5.3,16,34.5,24.5,0,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Back Alley Oproar",1948,7,NA,7.8,62,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Back Door to Heaven",1939,85,NA,7,18,14.5,0,4.5,4.5,4.5,14.5,4.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Back Door to Hell",1964,75,NA,5.2,47,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Back From the Front",1943,19,NA,7.5,56,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Back Lot Murders, The",2002,90,NA,3.7,119,24.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Back Pay",1930,55,NA,5.1,5,0,0,24.5,0,44.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Back Roads",1981,94,NA,5.3,131,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Back Room",1999,14,NA,7.8,65,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Back Stab",1990,91,NA,4.9,43,4.5,4.5,14.5,14.5,14.5,34.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Back Stage",1919,17,NA,7.4,44,4.5,0,0,4.5,0,4.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Back Street",1932,93,NA,7.2,47,0,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Back Street",1941,89,NA,6.9,87,0,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Back Street",1961,107,NA,6,154,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Back Up, Please",2003,12,NA,7,10,0,14.5,0,0,0,0,0,34.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Back and Forth",1969,52,NA,8,14,14.5,4.5,0,0,14.5,0,14.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Back at the Front",1952,87,NA,6.3,14,0,0,0,0,4.5,45.5,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Back from Eternity",1956,100,NA,5.8,133,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Back from the Dead",1957,79,NA,3.7,9,24.5,14.5,0,24.5,24.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Back in Action",1994,93,NA,4.9,79,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Back in Business",1997,93,NA,4.1,93,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Back in Circulation",1937,81,NA,6.8,34,4.5,0,0,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Back in Trouble",1997,95,NA,4,18,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,0,14.5,"",1,0,1,0,0,0,0 -"Back in the Saddle",1941,73,NA,5.3,21,4.5,0,4.5,4.5,24.5,14.5,4.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Back in the U.S.S.R.",1992,87,NA,4.6,108,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Back of Beyond",1995,85,NA,5.2,67,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Back to Back",1990,95,NA,4,24,24.5,4.5,14.5,4.5,4.5,24.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Back to Bataan",1945,95,NA,6.3,398,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Back to Even",1998,89,NA,3.9,40,24.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Back to Gaya",2004,91,NA,5.4,149,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Back to God's Country",1919,73,67000,6.4,66,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Back to God's Country",1953,78,NA,5.8,38,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Back to One",2002,10,NA,7.2,5,24.5,0,0,0,24.5,0,0,0,0,64.5,"",0,0,1,0,0,1,1 -"Back to School",1986,96,NA,6,4245,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Back to the Beach",1987,92,NA,4.8,637,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Back to the Future",1985,111,19000000,8.1,68647,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Back to the Future Part II",1989,108,40000000,7,28547,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Back to the Future Part III",1990,118,40000000,6.7,24682,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Back to the Future... The Ride",1991,4,40000000,7.3,655,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Back to the Secret Garden",2001,100,NA,5.6,69,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Back to the USSR - takaisin ryssiin",1992,94,NA,4.6,31,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Back to the Woods",1937,19,NA,6.5,61,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Back-Room Boy",1942,82,NA,5.4,18,4.5,0,4.5,0,14.5,4.5,4.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Backbeat",1994,100,NA,6.5,1222,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Backdoor Brides Part 2",1986,87,NA,6.9,5,0,0,0,0,24.5,0,24.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Backdraft",1991,132,NA,6.6,12637,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Backfire",1950,91,NA,5.7,17,0,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Backfire",1987,92,NA,5.2,100,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Backfire!",1995,93,NA,3.2,79,34.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Backgammon",2001,95,NA,6.7,7,14.5,14.5,0,0,0,0,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Background to Danger",1943,80,NA,6.7,106,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Backjumping",2003,9,NA,9.3,6,0,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,1,0,0,0,1 -"Backlash",1947,66,NA,6.2,10,0,0,0,14.5,34.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Backlash",1956,84,NA,6.3,109,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Backlash",1986,89,NA,5.3,32,4.5,4.5,4.5,14.5,4.5,24.5,14.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Backlash",1998,34,NA,5.9,13,14.5,14.5,14.5,0,0,0,0,4.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Backpackers, The",1990,71,NA,7.1,7,14.5,0,0,0,14.5,0,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Backroads",1977,60,NA,7.4,31,0,0,0,4.5,0,14.5,24.5,24.5,24.5,4.5,"",1,0,0,1,0,0,0 -"Backsliding",1991,88,NA,4.3,24,14.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Backstage",2000,86,NA,5,57,14.5,0,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,1,0,0 -"Backstreet Dreams",1990,96,NA,4.7,33,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Backstreet Justice",1994,91,NA,3.7,66,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Backtrack!",1969,95,NA,5.4,37,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Backward Writing",2000,1,NA,6.8,15,14.5,0,0,0,4.5,14.5,44.5,0,14.5,14.5,"",0,1,1,0,0,0,1 -"Backwoods Bunny",1959,7,NA,6.3,44,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Backyard",1984,40,NA,7,7,0,14.5,0,0,14.5,14.5,24.5,0,0,24.5,"",0,0,0,0,1,0,1 -"Backyard Dogs",2000,96,NA,1.9,1304,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"Backyard Movie",1991,9,NA,7.1,7,0,0,0,0,0,0,44.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Backyard, The",2002,80,NA,7.8,312,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Bacon Grabbers",1929,20,NA,7.1,41,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Bad",1977,105,NA,6.9,150,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Bad Animals",2001,5,NA,5.4,10,14.5,0,14.5,14.5,24.5,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Bad Baby",1997,79,NA,3.4,8,14.5,0,0,14.5,0,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Bad Bascomb",1946,112,NA,6.3,65,0,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bad Behaviour",1993,104,NA,5.4,66,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Bad Blood",1981,105,NA,6.5,36,0,4.5,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bad Blood",1989,104,NA,5.3,24,0,4.5,4.5,4.5,24.5,14.5,0,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Bad Bosses Go to Hell",1997,6,NA,4.6,35,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Bad Boy",1925,18,NA,7,13,0,0,0,0,0,34.5,34.5,34.5,4.5,0,"",0,0,1,0,0,0,1 -"Bad Boy",1949,86,NA,7.4,17,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bad Boy",2004,59,NA,8.2,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,0,0,1,0,0 -"Bad Boy Bubby",1993,112,750000,7,1033,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Bad Boys",1983,123,NA,6.7,1658,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bad Boys",1995,118,23000000,6.4,15326,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Bad Boys II",2003,145,130000000,6.1,13087,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Bad Bunch, The",1976,82,NA,5.4,23,14.5,0,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Bad Channels",1992,88,NA,3.4,119,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bad City Blues",1999,96,NA,4.6,36,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Bad Company",1931,76,NA,5.8,23,0,4.5,0,4.5,4.5,34.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Bad Company",1972,93,NA,7.1,321,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bad Company",1986,92,NA,4.9,12,24.5,4.5,0,0,24.5,0,0,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bad Company",2002,116,70000000,5.4,6175,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Bad Day On the Block",1997,104,NA,4.8,356,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Bad Day at Black Rock",1955,81,NA,7.7,2217,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bad Day at Cat Rock",1965,6,NA,5.1,40,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Bad Dreams",1988,84,4000000,4.2,309,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bad Eggs",2003,98,NA,6.2,296,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bad Faith",2000,97,NA,4.7,41,14.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Bad Georgia Road",1977,86,NA,5.7,28,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Bad Girl",1931,90,NA,6.6,20,14.5,0,0,4.5,4.5,14.5,4.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Bad Girls",1981,82,NA,6.4,59,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bad Girls",1994,99,NA,4.8,2150,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bad Girls Go to Hell",1965,71,NA,4.4,78,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bad Girls IV",1986,102,NA,4.6,13,34.5,0,0,0,0,34.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bad Girls from Mars",1991,86,52000,3.7,50,14.5,14.5,24.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bad Girls in the Movies",1986,56,NA,5.1,5,0,0,0,24.5,24.5,0,0,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Bad Girls' Dormitory",1984,95,NA,2.6,42,24.5,14.5,24.5,14.5,4.5,4.5,4.5,0,4.5,4.5,"",1,0,1,1,0,0,0 -"Bad Guy",1937,69,NA,5.8,22,4.5,0,4.5,14.5,4.5,34.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Bad Guys",1986,86,NA,2.9,23,34.5,14.5,4.5,14.5,4.5,0,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Bad Habits",1999,13,NA,7,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Bad Influence",1990,99,NA,5.6,1322,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bad Jim",1990,90,NA,4,26,4.5,4.5,24.5,24.5,24.5,0,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Bad Karma",2002,92,NA,4,174,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Bad Lands",1939,70,NA,5.3,31,14.5,4.5,4.5,4.5,0,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bad Lieutenant",1992,98,NA,6.6,4345,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bad Little Angel",1939,72,NA,6.2,22,0,0,0,4.5,0,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bad Lord Byron, The",1949,85,NA,4.8,24,0,4.5,14.5,14.5,14.5,24.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bad Luck Blackie",1949,7,NA,8.7,76,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,45.5,"",0,1,1,0,0,0,1 -"Bad Luck Love",2000,84,NA,6.1,329,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bad Man of Brimstone, The",1937,89,NA,6.2,17,0,0,4.5,0,14.5,24.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bad Man of Deadwood",1941,61,NA,5.7,14,4.5,0,0,4.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bad Man's River",1971,92,NA,4.3,83,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bad Man, The",1941,70,NA,4.1,33,24.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Bad Manners",1997,88,NA,6.3,140,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Bad Medicine",1985,98,NA,3.9,242,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bad Men of Missouri",1941,71,NA,6.6,36,0,0,0,4.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Bad Men of Tombstone",1949,75,NA,6.8,13,4.5,0,0,0,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Bad Money",1999,89,NA,4.8,30,14.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bad Moon",1996,80,7000000,4.4,519,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Bad News Bears Go to Japan, The",1978,91,NA,3.5,462,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bad News Bears in Breaking Training, The",1977,105,NA,4.9,546,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bad News Bears, The",1976,102,NA,6.8,2711,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bad Ol' Putty Tat",1949,7,NA,7.3,48,0,0,0,4.5,0,14.5,34.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Bad Santa",2003,98,18000000,7.2,11189,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Bad Seed, The",1956,129,1000000,7.3,1229,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bad Sister, The",1931,68,NA,6.5,121,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bad Taste",1987,86,150000,6.9,7048,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bad Timing",1980,129,NA,6.7,540,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bad and the Beautiful, The",1952,118,1558000,7.6,1358,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bad auf der Tenne, Das",1943,88,NA,6,5,0,0,0,24.5,24.5,44.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Bad auf der Tenne, Das",1956,88,NA,3.8,6,14.5,0,14.5,14.5,0,0,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Bad boy dak gung",2000,105,NA,5.2,42,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Bad for Each Other",1953,83,NA,5.3,17,4.5,0,4.5,14.5,34.5,4.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Bad ma ra khahad bord",1999,118,NA,7.2,646,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Badal",2000,166,NA,3.9,13,0,4.5,14.5,24.5,4.5,14.5,4.5,0,4.5,14.5,"",1,0,0,1,0,0,0 -"Badarna",1968,98,NA,4,9,0,0,45.5,14.5,0,0,14.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Baddegama",1980,130,NA,9.1,7,0,0,0,0,0,0,0,44.5,0,45.5,"",0,0,0,0,0,0,0 -"Badding",2000,103,NA,5.9,329,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Badge 373",1973,116,NA,5.3,66,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Badge of Marshal Brennan, The",1957,74,NA,5.2,23,4.5,4.5,14.5,4.5,24.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Badge, The",2002,103,6000000,6.3,740,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Badkonake sefid",1995,85,150000,7.4,618,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Badlanders, The",1958,83,NA,6.5,124,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Badlands",1973,94,500000,7.7,4763,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Badlands of Dakota",1941,74,NA,6.8,17,4.5,0,0,0,4.5,24.5,34.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Badlands of Montana",1957,75,NA,4.4,10,0,0,0,44.5,44.5,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Badman's Country",1958,68,NA,5.6,22,0,0,4.5,4.5,24.5,44.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Badman's Territory",1946,97,NA,6.2,65,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Baeus",1987,7,NA,8.6,7,0,0,0,0,0,14.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Bagdad",1949,82,NA,4.9,43,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bager",2003,19,NA,5,5,0,0,0,0,100,0,0,0,0,0,"",0,0,0,1,0,0,1 -"Baggage Buster",1941,8,NA,7.2,45,4.5,0,4.5,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Bagh Bahadur",1989,91,NA,8,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,0,0,0,0 -"Bagland",2003,85,NA,6.3,92,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bagnomaria",1999,90,NA,3.9,26,44.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Bagong buwan",2001,130,NA,6.2,17,4.5,0,0,4.5,0,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Bague, La",1997,7,NA,5.6,5,0,0,0,44.5,0,44.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Bahama Passage",1941,82,NA,5.3,14,0,0,4.5,4.5,24.5,24.5,4.5,0,4.5,24.5,"",0,0,0,0,0,1,0 -"Bai Ganio tragva iz Evropa",1991,94,NA,7.1,20,0,0,4.5,14.5,0,4.5,14.5,14.5,0,45.5,"",0,0,1,0,0,0,0 -"Bai bian xing jun",1995,92,NA,6.2,128,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bai fa mo nu zhuan",1993,92,NA,6.9,719,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,0,0,1,0 -"Bai fa mo nu zhuan II",1993,80,NA,5.8,191,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,1,0 -"Bai ga jai",1982,100,NA,7.7,278,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"R",1,0,1,0,0,0,0 -"Baie des anges, La",1963,79,NA,7.7,158,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Baigneuses, Les",2003,83,NA,5,23,14.5,0,14.5,4.5,24.5,14.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Baiju Bawra",1952,165,NA,9.4,22,4.5,0,0,0,0,4.5,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Bail Jumper",1990,93,NA,5.5,13,14.5,0,4.5,4.5,0,24.5,0,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Baile Perfumado",1997,93,NA,7.9,68,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Baile del pato, El",1989,88,NA,4.1,11,0,14.5,4.5,0,0,24.5,4.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Baile, El",1959,95,NA,5,19,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Bailongas",2001,9,NA,6.5,15,0,0,0,0,4.5,44.5,44.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Bailout at 43,000",1957,78,NA,5.5,10,0,14.5,0,24.5,14.5,34.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Bains-douches",2001,17,NA,7.5,5,0,0,0,0,0,0,44.5,0,44.5,24.5,"",0,0,0,0,0,0,1 -"Baise-moi",2000,74,NA,4.8,3299,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Baisers de secours, Les",1989,90,NA,8.1,12,0,0,0,0,0,0,24.5,45.5,24.5,0,"",0,0,0,1,0,0,0 -"Baisers des autres, Les",2003,14,NA,8,11,0,0,0,4.5,4.5,4.5,0,14.5,44.5,4.5,"",0,0,0,0,0,0,1 -"Bait",1954,79,NA,5.1,12,4.5,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bait",1999,13,NA,4.2,26,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Bait",2000,119,35000000,5.6,1884,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Baja",1995,92,NA,5.6,100,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bajaja",1950,87,NA,6.6,7,0,0,0,14.5,0,24.5,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Bajarse al moro",1989,83,NA,6.4,109,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bajland",2000,90,NA,4.3,7,14.5,0,24.5,0,0,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Bajo Bandera",1997,109,NA,5.1,30,14.5,0,0,14.5,4.5,34.5,24.5,4.5,24.5,0,"",0,0,0,0,0,0,0 -"Bajo la metralla",1983,102,NA,8,5,0,24.5,0,0,0,0,0,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Bajo la piel",1996,110,NA,7.7,74,0,0,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,"",1,0,0,1,0,1,0 -"Bajo un mismo rostro",1962,113,NA,6.2,5,0,0,0,0,64.5,0,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Bak Ging lok yue liu",2001,109,NA,6.2,62,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bak syv hav",1991,87,NA,1,85,84.5,4.5,0,0,4.5,0,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Baka no hakobune",2003,111,NA,7.3,9,0,0,0,14.5,14.5,0,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bakenbardy",1990,100,NA,8.3,23,0,0,0,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,1,0,0,0,0 -"Baker's Hawk",1976,105,NA,5,40,4.5,14.5,14.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Bakha satang",2000,130,NA,8.1,312,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Bakit may kahapon pa?",1996,107,NA,8.9,11,0,4.5,0,0,0,4.5,0,0,0,84.5,"",0,0,0,1,0,0,0 -"Bakom mahognybordet",1996,8,NA,6.8,9,0,0,0,0,0,24.5,14.5,44.5,0,24.5,"",0,0,0,0,0,0,1 -"Bakonja fra Brne",1951,104,NA,6.8,5,0,0,0,24.5,0,24.5,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Bakterion",1976,90,NA,3.3,28,24.5,24.5,14.5,14.5,14.5,4.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Bakumatsu jyunjyoden",1991,105,NA,5.3,12,14.5,0,4.5,0,14.5,4.5,0,4.5,0,44.5,"",0,0,0,0,0,1,0 -"Bakumatsu taiyoden",1957,110,NA,8.7,14,0,0,0,0,0,0,14.5,4.5,34.5,44.5,"",0,0,1,0,0,0,0 -"Bakuretsu toshi",1982,115,NA,9,15,4.5,0,0,0,0,4.5,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Bakuto gaijin butai",1971,93,NA,7.2,51,0,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bal des casse-pieds, Le",1992,99,NA,5.9,104,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bal des pantins, Le",2001,85,NA,5.9,41,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bal du gouverneur, Le",1990,98,NA,7,19,4.5,0,14.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bal, De",1999,90,NA,4.9,41,0,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bal, Le",1983,109,NA,7.5,267,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Bala marcada, Una",1972,87,NA,3.5,5,0,24.5,0,0,0,44.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Bala perdida",2001,105,NA,5.7,16,24.5,0,14.5,0,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Balablok",1972,7,NA,8.8,8,0,0,0,0,0,0,0,24.5,45.5,24.5,"",0,1,0,0,0,0,1 -"Balada o trobenti in oblaku",1961,80,NA,6.9,12,4.5,0,0,0,0,4.5,24.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Balada pro banditu",1978,89,NA,7.9,13,0,0,0,0,0,0,24.5,14.5,24.5,34.5,"",0,0,0,0,0,1,0 -"Balalaika",1939,102,NA,5.7,45,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Balance",1989,7,NA,8.5,211,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,0,1,0,0,1 -"Balance of Power",1996,92,NA,4.3,63,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Balance, La",1982,103,NA,6.7,173,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Balanta",1992,105,NA,7.7,282,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Balarrasa",1951,90,NA,5.1,15,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Balas&Bolinhos",2001,62,NA,7,106,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Balas&Bolinhos - O Regresso",2004,108,NA,7.8,178,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Balash Ha'Amitz Shvartz, Ha-",1973,95,NA,6.8,13,24.5,0,0,0,0,0,4.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Balayeur, Le",1990,6,NA,8.8,8,0,0,0,0,0,14.5,14.5,24.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Balcony, The",1963,84,NA,5.9,83,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bald: The Making of 'THX 1138'",1971,8,NA,6.6,19,0,0,0,0,14.5,34.5,14.5,24.5,0,14.5,"",0,0,0,0,1,0,1 -"Baldwin's Nigger",1968,46,NA,5.6,15,14.5,0,0,0,4.5,0,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Balettprimadonnan",1916,54,NA,4.8,6,0,14.5,0,14.5,45.5,14.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Balgonie Birdman, The",1991,9,NA,8.2,11,0,0,0,0,0,0,4.5,45.5,34.5,0,"",0,1,1,0,0,0,1 -"Balia, La",1999,106,NA,6.4,112,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Balibalo",2001,8,NA,5.9,6,0,0,0,0,45.5,14.5,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Balkan ekspres",1983,102,NA,7.5,59,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Balkanska pravila",1997,116,NA,4.7,23,14.5,4.5,4.5,4.5,14.5,0,4.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Balkanski spijun",1981,95,NA,9,232,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,74.5,"",0,0,1,0,0,0,0 -"Balked at the Altar",1908,12,NA,4.2,9,24.5,0,0,24.5,24.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Ball and Chain",1967,30,NA,7,14,0,0,0,0,4.5,0,0,24.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Ball im Savoy",1955,90,NA,6.5,6,0,0,0,0,14.5,0,34.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Ball in the House",2001,95,NA,5.8,63,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,1,1,0,0,0 -"Ball of Fire",1941,111,NA,7.6,1096,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Ball of Wax",2003,90,NA,4.8,17,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Ball, Der",1982,50,NA,6.4,7,0,0,0,14.5,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Ballad in Blue",1966,89,NA,3.5,10,14.5,24.5,24.5,14.5,14.5,24.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Ballad of Bering Strait, The",2003,98,NA,8.6,11,0,0,0,0,0,4.5,34.5,0,44.5,4.5,"",0,0,0,0,1,0,0 -"Ballad of Cable Hogue, The",1970,121,3716946,7.2,712,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ballad of Courtney & James, The",2001,3,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,0,0,0,0,1 -"Ballad of Jack and Rose, The",2005,112,1500000,6.2,269,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Ballad of Josie, The",1967,102,NA,5.4,117,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ballad of Little Jo, The",1993,121,NA,6.7,323,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ballad of Little Roger Mead, The",2000,9,NA,4.3,22,14.5,0,4.5,14.5,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Ballad of Ramblin' Jack, The",2000,112,NA,7.9,108,0,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,"PG-13",0,0,0,0,1,0,0 -"Ballad of a Gunfighter",1964,84,NA,5,15,14.5,0,14.5,0,14.5,24.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Ballad of the Sad Cafe, The",1991,100,NA,5.5,108,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ballada o doblestnom rytsare Ayvengo",1983,92,NA,6.5,19,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Ballada o soldate",1959,89,NA,8.6,496,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Ballade de Titus, La",1997,90,NA,4.1,6,14.5,0,34.5,0,14.5,0,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Ballade des Dalton, La",1978,82,NA,6.3,112,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Ballade i Nyhavn",1942,91,NA,6.2,6,0,0,0,14.5,14.5,0,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Balladen om Carl-Henning",1969,85,NA,6.1,14,0,0,0,4.5,24.5,0,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Balladen om Holger Danske",1996,82,NA,5.8,5,0,0,0,0,44.5,24.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Ballata dei lavavetri, La",1998,90,NA,4.3,11,0,0,4.5,14.5,4.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ballata per un pistolero",1967,98,NA,3.6,9,24.5,14.5,44.5,0,0,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Ballermann 6",1997,95,NA,3.7,324,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ballerup Boulevard",1986,76,NA,4.4,24,4.5,14.5,0,24.5,24.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ballet",1995,170,NA,8.7,6,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Ballet Adagio",1972,10,NA,6.9,10,0,0,0,0,14.5,34.5,14.5,14.5,0,44.5,"",0,0,0,0,0,0,1 -"Ballet Shoes",1975,25,NA,5.8,14,0,0,0,0,24.5,4.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Ballet for Life",1997,60,NA,9,12,0,0,0,0,4.5,0,4.5,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Ballet gyoseubso",2004,119,NA,6.8,34,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ballett ist ausgefallen",2002,14,NA,6,7,0,0,0,0,0,24.5,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Ballistic",1995,96,NA,4,50,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Ballistic: Ecks vs. Sever",2002,91,70000000,3.4,4556,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Ballo a tre passi",2003,107,NA,6,56,4.5,4.5,0,4.5,24.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ballon d'or, Le",1994,93,NA,6.2,39,0,0,0,14.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Ballon rouge, Le",1956,34,NA,7.6,887,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Balloon",1991,6,NA,5.6,12,4.5,0,0,0,14.5,14.5,4.5,0,24.5,24.5,"",0,1,1,0,0,0,1 -"Balloon Land",1935,7,NA,6.6,30,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Balloonatic, The",1923,27,NA,6.9,247,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,1 -"Ballot Box Bunny",1951,7,NA,7.3,116,4.5,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Ballot Measure 9",1995,72,NA,6.8,25,4.5,0,0,0,14.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Balls",1997,5,NA,8.8,6,0,0,0,14.5,0,0,0,0,14.5,64.5,"",0,1,0,0,0,0,1 -"Balls Bluff",1961,24,NA,1,11,84.5,0,0,0,14.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Balls Deep",2004,89,NA,8.5,19,14.5,0,0,0,0,0,0,24.5,0,64.5,"",1,0,0,0,0,0,0 -"Balmy Swami, A",1949,7,NA,5.4,7,0,0,14.5,0,24.5,24.5,0,14.5,14.5,0,"",0,1,1,0,0,0,1 -"Balnearios",2002,80,NA,6.5,34,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Balra a nap nyugszik",2000,91,NA,7.7,12,0,14.5,0,0,0,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Balsa de piedra, La",2002,103,NA,6.2,127,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Balseros",2002,120,NA,7.2,120,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Balti armastuslood",1992,96,NA,7.7,10,14.5,0,0,0,0,14.5,14.5,24.5,0,45.5,"",0,0,0,1,0,0,0 -"Baltic Storm",2003,113,NA,3,196,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Baltimore Bullet, The",1980,103,NA,5.5,96,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Balto",1995,74,NA,6.2,1054,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Balzac et la petite tailleuse chinoise",2002,116,NA,7.2,622,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Bambai Ka Babu",1960,154,NA,6.3,7,0,0,0,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Bambi",1942,70,NA,7.5,9197,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,1,0,0,0 -"Bambi Meets Godzilla",1969,2,NA,7.3,1814,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Bambini ci guardano, I",1944,79,NA,7.4,118,4.5,4.5,0,0,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bambino e il poliziotto, Il",1989,106,NA,5.5,50,0,0,4.5,14.5,34.5,24.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Bambole, Le",1965,112,NA,5.9,32,4.5,0,0,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bamboleho",2001,14,NA,6.4,30,4.5,4.5,0,4.5,4.5,24.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Bamboo Blonde, The",1946,67,NA,5.8,39,4.5,0,0,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Bamboo Prison, The",1954,79,NA,7,14,0,0,4.5,14.5,4.5,4.5,45.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Bamboo Saucer, The",1968,100,NA,5.3,53,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bamboozled",2000,135,10000000,6.3,2356,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Ban jin ba liang",1976,94,NA,5.9,56,0,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ban wo chuang tian ya",1989,98,NA,6.8,73,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",1,0,0,1,0,1,0 -"Ban zhi yan",1999,101,NA,7,122,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Banana Hashehora, Ha-",1976,85,NA,2.7,5,0,24.5,0,0,24.5,24.5,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Banana Joe",1982,96,NA,5.1,322,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Bananas",1971,82,2000000,7.1,4252,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Banchieri di Dio, I",2002,125,NA,7.1,53,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Banchikwang",2000,112,NA,7.2,237,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Banco de Prince",1951,85,NA,6.9,8,0,0,0,0,0,14.5,84.5,0,0,0,"",0,0,0,0,0,0,0 -"Banco en el parque, Un",1999,77,NA,6,47,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bancos",1999,12,NA,7.9,10,14.5,0,0,0,0,14.5,14.5,44.5,24.5,14.5,"",1,0,0,0,0,0,1 -"Band Beautiful, The",1928,9,NA,6.5,13,0,0,0,0,0,44.5,34.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Band Camp",2003,14,NA,4.1,6,0,0,0,45.5,0,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Band Concert, The",1935,9,NA,8.2,141,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Band Plays On, The",1934,87,NA,6.2,13,0,0,4.5,4.5,24.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Band Waggon",1940,85,NA,5,11,0,0,0,0,45.5,24.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Band Wagon, The",1953,111,2169120,7.5,1207,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Band of Angels",1957,125,NA,6.2,216,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Band of the Hand",1986,109,8700000,4.9,378,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Banda de Ipanema - Folia de Albino",2003,86,NA,8.9,7,0,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,0,0,1,0,0 -"Banda degli onesti, La",1956,106,NA,7.4,79,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Bande des Schreckens, Die",1960,92,NA,6.4,42,0,4.5,0,4.5,4.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bande des quatre, La",1988,160,NA,7.9,70,0,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Bande du Drugstore, La",2002,93,NA,6.1,48,4.5,0,0,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Bandera rota",1979,96,NA,6.7,9,0,0,0,14.5,0,14.5,44.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Bandera, La",1935,96,NA,7.1,82,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bandida, La",1963,110,NA,8.1,9,0,0,0,0,0,24.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Bandido",1956,92,NA,5.7,122,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Bandido da Luz Vermelha, O",1969,92,NA,8.1,65,4.5,0,4.5,0,0,14.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Bandidos",1967,90,NA,5.4,20,14.5,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bandidos",1991,95,NA,6.1,32,4.5,4.5,0,0,4.5,4.5,34.5,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Bandini",1963,157,NA,7.6,40,0,4.5,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Bandit King of Texas",1949,60,NA,5.8,7,0,0,0,0,14.5,44.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bandit Queen",1994,119,NA,7.2,496,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bandit Queen, The",1950,70,NA,5.4,12,4.5,4.5,14.5,4.5,14.5,4.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Bandit Ranger",1942,56,NA,5.3,12,0,0,0,4.5,24.5,14.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Bandit Trail, The",1941,60,NA,5.8,17,4.5,0,0,0,24.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Bandit of Sherwood Forest, The",1946,86,NA,5.6,54,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bandit of Zhobe, The",1959,80,NA,4.2,15,0,4.5,24.5,24.5,14.5,24.5,4.5,0,0,0,"",1,0,0,0,0,0,0 -"Banditen der Autobahn",1955,95,NA,8.6,6,0,0,0,0,0,0,0,45.5,0,45.5,"",0,0,0,1,0,0,0 -"Banditi a Milano",1968,98,NA,5.8,21,4.5,4.5,0,0,4.5,4.5,14.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Banditi a Orgosolo",1960,98,NA,7,17,0,0,0,4.5,4.5,14.5,24.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bandito dagli occhi azzurri, Il",1982,96,NA,5.6,15,4.5,14.5,0,0,14.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Bandito, Il",1946,77,NA,7.7,7,0,0,0,0,24.5,0,0,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bandits",1997,110,NA,6.3,1065,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Bandits",2001,123,80000000,6.7,12382,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Bandits of Corsica, The",1953,81,NA,4.5,13,0,0,14.5,24.5,24.5,24.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Bandits of Dark Canyon",1947,59,NA,3.3,5,64.5,0,0,0,0,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Bandits of El Dorado",1949,54,NA,5.5,9,14.5,0,0,14.5,34.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bandits, The",1967,88,NA,4.5,15,4.5,4.5,4.5,34.5,24.5,14.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Bandmaster, The",1948,7,NA,6.9,7,0,0,24.5,0,0,24.5,14.5,0,24.5,0,"",0,1,1,0,0,0,1 -"Bandolero!",1968,106,NA,6.3,598,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Bandwagon",1996,103,NA,6.7,192,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bandyta",1997,102,NA,5.9,95,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bang",1995,99,NA,6.2,173,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bang Bang",1967,90,NA,3.1,7,0,44.5,0,14.5,14.5,0,24.5,0,0,0,"",0,0,1,0,0,1,0 -"Bang Bang",1973,85,NA,9.2,8,0,0,0,0,0,0,14.5,0,24.5,64.5,"",0,0,1,0,0,0,0 -"Bang Boom Bang - Ein todsicheres Ding",1999,110,NA,7.2,1207,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",1,0,1,0,0,0,0 -"Bang the Drum Slowly",1973,96,NA,7,1010,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bang the Machine",2002,80,NA,4.8,14,0,0,0,14.5,4.5,4.5,4.5,4.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Bang, Bang",1968,87,NA,4.7,13,0,14.5,14.5,0,24.5,14.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bang, You're Dead",1954,88,NA,5.5,5,0,0,24.5,0,24.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Banger Sisters, The",2002,98,10000000,5.6,3189,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Bangers",1999,9,NA,4.7,19,4.5,0,0,14.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Bangiku",1954,101,NA,8.3,37,4.5,0,0,0,0,4.5,14.5,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bangkok Dangerous",1999,105,NA,6.5,651,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"R",1,0,0,0,0,1,0 -"Bangkok Haunted",2001,124,NA,5.2,79,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bangrajan",2000,71,NA,6.6,283,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Bangville Police",1913,8,NA,5.7,99,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Banjo",1947,68,NA,5.2,18,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Banjo on My Knee",1936,95,NA,6.5,30,0,0,0,4.5,24.5,14.5,24.5,24.5,0,14.5,"",0,0,1,0,0,1,0 -"Bank Alarm",1937,61,NA,4.5,5,0,24.5,24.5,0,0,64.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Bank Dick, The",1940,72,NA,7.5,1227,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bank Holiday",1938,86,NA,6.3,28,0,0,4.5,4.5,0,34.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bank Raiders, The",1958,62,NA,4.4,13,0,0,4.5,45.5,14.5,4.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Bank Robber",1993,91,NA,3.7,100,14.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bank Robbery, The",2003,2,1000,5.7,11,14.5,0,0,4.5,0,4.5,0,14.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Bank Shot",1974,83,NA,5,155,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bank, The",1915,33,NA,6.6,162,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Bank, The",2001,103,NA,6.8,723,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Banker, The",1989,92,NA,4.6,38,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Banketten",1948,106,NA,7.4,23,4.5,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Banktresor 713",1956,86,NA,7.1,7,0,0,0,0,14.5,24.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Banlieue 13",2004,85,NA,5.7,196,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Banning",1967,102,NA,5.8,57,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Banoo-Ye Ordibehesht",1998,88,NA,7.5,22,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Banovic Strahinja",1981,105,NA,6.2,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Banqueroute",2000,75,NA,5.4,12,0,0,4.5,14.5,0,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Banshun",1949,108,NA,8.6,407,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Banty Raids",1963,6,NA,6.5,27,0,0,0,14.5,14.5,24.5,14.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Banzai",1997,83,NA,2.6,29,34.5,14.5,24.5,4.5,4.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Banzai Runner",1987,85,NA,4.8,22,4.5,0,4.5,34.5,24.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Bao gio cho den thang muoi",1984,95,NA,6.1,10,0,0,0,0,0,24.5,24.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Bao li xing jing",2000,88,NA,4.6,13,0,0,14.5,34.5,0,24.5,14.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Bao lian deng",1999,85,NA,5.5,28,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,0,4.5,"",0,1,0,0,0,0,0 -"Baptists at Our Barbecue",2004,92,500000,5.9,62,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"PG",0,0,1,0,0,1,0 -"Bar 20",1943,54,NA,6.5,37,4.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Bar 20 Justice",1938,70,NA,7.2,17,4.5,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bar 20 Rides Again",1935,61,NA,6.4,22,0,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Bar Channel, The",1998,3,NA,3.7,12,4.5,34.5,24.5,14.5,4.5,4.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Bar Girls",1994,93,NA,5.4,215,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Bar Salon",1974,84,NA,5.7,24,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Bar des rails",1991,103,NA,5.8,28,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bar imperial",2001,20,NA,5.8,17,0,0,0,4.5,0,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Bar, El Chino",2003,100,NA,6.6,33,0,4.5,0,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Bara du & jag",1994,98,NA,2,7,44.5,24.5,14.5,0,0,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Bara no soretsu",1969,105,NA,7.2,24,0,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bara per lo sceriffo, Una",1965,95,NA,3.7,9,24.5,0,0,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Barabaniada",1993,93,NA,7.9,9,14.5,0,0,0,0,0,0,44.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Barabbas",1962,144,NA,6.5,507,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Barabe!",2001,104,NA,5.1,19,14.5,4.5,4.5,14.5,14.5,4.5,34.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Barak",1999,110,NA,5.9,28,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Baraka",1992,96,NA,7.7,2987,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Baraka",1998,54,NA,8.3,47,4.5,4.5,0,4.5,4.5,0,4.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Baraka sur X 13",1966,97,NA,7.7,6,0,0,0,14.5,0,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Baraka, La",1982,92,NA,4.3,22,4.5,4.5,14.5,14.5,4.5,14.5,24.5,0,0,0,"",0,0,1,1,0,0,0 -"Baraku empororu",1976,91,NA,7.1,13,14.5,4.5,0,0,0,0,4.5,4.5,0,64.5,"",0,0,0,0,1,0,0 -"Baran",2001,94,NA,7.8,733,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,1,0,1,0 -"Barb Wire",1996,109,NA,3.2,5221,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Barbara",1997,143,NA,4.8,125,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Barbara",1998,85,NA,5.2,13,0,14.5,0,0,14.5,34.5,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Barbara Broadcast",1977,87,NA,6,56,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Barbara Dare's Roman Holiday",1987,80,NA,5.2,6,0,0,0,0,34.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Barbarella",1968,98,9000000,5.6,4653,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Barbarian Queen",1985,70,NA,3.5,185,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Barbarian Queen II: The Empress Strikes Back",1989,79,NA,3.7,82,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Barbarian and the Geisha, The",1958,105,3500000,4.7,226,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Barbarian, The",1933,83,444399,6.2,57,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Barbarians, The",1960,84,750000,4.5,18,0,4.5,24.5,14.5,14.5,4.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Barbarians, The",1987,87,4000000,3.5,341,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Barbaric Beast of Boggy Creek, Part II, The",1985,94,NA,1.7,449,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Barbarosa",1982,90,NA,6.3,293,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Barbary Coast",1935,91,778000,6.6,168,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Barbary Coast Gent",1944,87,NA,6.2,18,0,0,4.5,0,14.5,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Barbary-Coast Bunny",1956,7,NA,7.4,61,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Barbe-Bleue",1951,99,NA,7.1,9,0,0,0,14.5,14.5,14.5,34.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Barbecue Brawl",1956,7,NA,6.5,27,0,0,4.5,4.5,4.5,4.5,44.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Barbecue-Pejo",2000,86,NA,6.5,8,0,14.5,0,0,34.5,0,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Barbed Wire",1927,79,NA,8,26,4.5,0,4.5,0,4.5,0,24.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Barbed Wire",1952,61,NA,6.3,12,0,0,0,14.5,24.5,44.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Barber Shop, The",1933,21,NA,7.5,106,0,0,0,0,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Barber Yoshino",2004,96,NA,7.7,6,0,0,0,0,0,14.5,0,84.5,0,0,"",0,0,0,0,0,0,0 -"Barbershop",2002,102,12000000,6.6,4943,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Barbershop 2: Back in Business",2004,106,18000000,5.7,1580,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Barbichette, La",2002,7,NA,7,9,0,0,0,0,0,14.5,44.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Barbie Nation: An Unauthorized Tour",1998,53,NA,5.3,16,14.5,0,0,4.5,0,4.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Barbier von Sevilla, Der",1972,141,NA,6.5,13,0,0,0,0,0,14.5,4.5,4.5,0,64.5,"",0,0,1,0,0,0,0 -"Barbiere di Rio, Il",1996,105,NA,5.7,64,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Barbosa",1988,13,NA,6.7,20,4.5,4.5,0,0,4.5,14.5,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Barbouzes, Les",1964,108,NA,7,199,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Barbra: Yesterday, Today and Forever!",1970,20,NA,1.5,10,74.5,0,0,14.5,0,0,0,0,0,24.5,"",0,0,0,0,1,0,1 -"Barcelona",1994,101,3200000,6.6,1570,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Bardelys the Magnificent",1926,90,NA,5.1,11,4.5,4.5,0,4.5,4.5,14.5,34.5,0,0,4.5,"",0,0,0,1,0,1,0 -"Bardot et Godard",1964,9,NA,4.8,25,4.5,4.5,24.5,14.5,14.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Bare Bea",2004,86,NA,5.6,191,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bare Essence",1989,92,NA,5.2,8,0,0,0,14.5,24.5,0,0,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Bare Exposure",1993,86,NA,3.2,59,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Bare Hick Project, The",2000,11,NA,1.7,7,24.5,14.5,0,0,14.5,14.5,0,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Bare Knees",1928,61,NA,8.2,15,0,0,0,0,0,4.5,14.5,24.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Bare Knuckles",1977,90,NA,5.2,17,4.5,0,4.5,14.5,34.5,14.5,14.5,0,4.5,0,"",1,0,0,0,0,0,0 -"Bare Wench Project, The",2000,76,NA,3.5,220,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bare skyer beveger stjernene",1998,99,NA,6.9,167,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Barefoot Adventure",1960,74,NA,5,10,0,0,0,14.5,24.5,14.5,14.5,24.5,0,34.5,"",0,0,0,0,1,0,0 -"Barefoot Contessa, The",1954,128,NA,6.9,1066,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Barefoot Executive, The",1971,96,NA,5.3,225,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Barefoot Mailman, The",1951,83,NA,6.9,10,0,0,0,14.5,24.5,14.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Barefoot in the Park",1967,104,NA,6.8,1960,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Barenaked in America",1999,89,NA,7.2,171,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Barf",1999,1,NA,6.1,7,0,0,0,0,24.5,44.5,0,24.5,0,0,"",0,1,0,0,0,0,1 -"Barfly",1987,97,NA,6.6,2073,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Barfuss",2005,118,NA,6.9,208,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Bargain Day",1931,20,NA,7,12,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,1 -"Bargain Madness",1951,9,NA,6,18,0,0,0,14.5,24.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Bari Theke Paliye",1958,124,NA,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Bariera",1966,110,NA,6.1,23,0,4.5,0,4.5,0,14.5,24.5,4.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Barierata",1979,148,NA,8.1,13,0,0,0,0,0,0,0,34.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Bariwali",1999,150,NA,6.5,10,0,0,0,0,14.5,24.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Bark!",2002,100,NA,4.3,198,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Barkleys of Broadway, The",1949,109,2325420,6.6,285,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Barlow Affair, The",1992,75,NA,6.3,18,4.5,0,0,4.5,0,14.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Barmherzige Schwestern",1993,94,NA,4.7,7,0,0,0,24.5,44.5,0,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Barn Dance, The",1929,7,5121,5.9,22,0,0,0,4.5,24.5,24.5,4.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Barn of the Blood Llama",1997,79,NA,1.9,37,45.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Barnabo delle montagne",1994,124,NA,5.6,18,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Barnacle Bill",1930,8,NA,5.7,13,0,0,0,14.5,24.5,34.5,24.5,4.5,0,0,"",0,1,0,0,0,0,1 -"Barnacle Bill",1941,90,NA,6.5,15,0,0,0,4.5,4.5,24.5,24.5,34.5,0,14.5,"",0,0,1,1,0,0,0 -"Barnacle Bill",1957,87,NA,6.9,181,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Barndommens gade",1986,90,NA,6.3,49,0,0,0,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Barney Bear's Polar Pest",1944,6,NA,5.6,6,0,0,14.5,34.5,0,14.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Barney Bear's Victory Garden",1942,7,NA,6.5,8,0,0,0,14.5,0,24.5,34.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Barney Oldfield's Race for a Life",1913,13,NA,6.7,29,4.5,0,0,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Barney's Great Adventure",1998,76,15000000,2.9,249,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Barney's Hungry Cousin",1953,7,NA,8,8,24.5,0,0,0,0,24.5,14.5,0,14.5,24.5,"",0,1,1,0,0,0,1 -"Barnvagnen",1963,95,NA,6.5,51,4.5,4.5,0,0,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Barnyard Battle, The",1929,7,NA,6.4,15,0,0,0,14.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Barnyard Broadcast, The",1931,8,NA,5.8,12,0,0,4.5,14.5,4.5,24.5,14.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Barnyard Concert, The",1930,6,NA,6.3,23,0,0,4.5,4.5,14.5,34.5,4.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Barnyard Olympics",1932,7,NA,6.3,10,0,0,0,24.5,14.5,24.5,24.5,0,14.5,24.5,"",0,1,1,0,0,0,1 -"Barocco",1976,110,NA,6.1,129,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Baron of Arizona, The",1950,97,NA,6.1,90,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Baroness and the Butler, The",1938,75,NA,6,19,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,0,4.5,"",0,0,1,1,0,1,0 -"Baroness and the Pig, The",2002,95,NA,6.7,42,4.5,4.5,0,0,4.5,24.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Baronessen fra benzintanken",1960,122,NA,5.4,89,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Baroud",1933,65,NA,5,7,14.5,0,0,24.5,0,0,24.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Barque sortant du port",1895,1,NA,6,48,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Barquero",1970,115,NA,5.5,94,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Barra 68 - Sem Perder a Ternura",2001,80,NA,7.6,11,0,0,4.5,14.5,0,0,4.5,24.5,0,34.5,"",0,0,0,0,1,0,0 -"Barracuda",1978,98,NA,3.1,66,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Barracuda",1997,94,NA,6,127,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Barras bravas, Las",1985,107,NA,3.2,8,34.5,0,24.5,14.5,14.5,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Barravento",1962,78,NA,6.7,24,4.5,4.5,0,4.5,0,0,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Barrela: Escola de Crimes",1990,72,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Barrendero, El",1982,113,NA,7.6,39,0,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Barretts of Wimpole Street, The",1934,110,NA,7.1,174,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Barretts of Wimpole Street, The",1957,105,NA,5.6,71,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Barricade",1939,71,NA,5.9,16,0,0,0,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Barricade",1950,77,NA,5.4,15,0,0,14.5,4.5,44.5,24.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Barricade du Point du Jour, La",1978,110,NA,7.6,5,0,24.5,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Barrier Device",2002,26,NA,7.4,27,0,0,0,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Barriers",1998,96,140000,8,6,0,0,0,0,0,14.5,0,64.5,0,14.5,"",0,0,0,0,0,0,0 -"Barrio",1998,100,NA,7.4,365,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Barrios altos",1987,87,NA,5.2,18,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Barroco",1989,115,NA,5.5,19,4.5,4.5,4.5,4.5,4.5,14.5,0,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Barry Lyndon",1975,184,11000000,8,12285,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Barry McKenzie Holds His Own",1974,93,NA,4.9,48,0,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Bars and Stripes",1937,11,NA,4.9,10,0,0,0,24.5,45.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Barsaat",1949,163,NA,7.5,31,4.5,0,0,0,0,4.5,14.5,14.5,0,64.5,"",0,0,0,1,0,1,0 -"Barschel - Mord in Genf?",1993,74,NA,2.7,30,45.5,0,0,4.5,0,0,4.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Bartender",1997,88,NA,4.7,21,24.5,0,0,0,4.5,4.5,0,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Bartholomew Versus the Wheel",1964,6,NA,7.4,10,0,14.5,0,0,0,14.5,24.5,64.5,0,0,"",0,1,1,0,0,0,1 -"Bartleby",1970,78,NA,5.8,33,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bartleby",2001,83,NA,6.1,434,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Barton Fink",1991,116,9000000,7.5,10223,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Barwy ochronne",1977,106,NA,7.5,61,0,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Baryshnya-krestyanka",1995,110,NA,5.9,19,0,0,4.5,0,4.5,34.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Baryton",1985,95,NA,6.3,8,0,0,0,0,24.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Barzellette, Le",2004,92,NA,4.6,14,34.5,4.5,4.5,4.5,14.5,24.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Bas ya Bahar",1971,120,NA,7.3,35,0,0,0,0,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Bas-fonds, Les",1936,90,NA,7.5,183,0,4.5,4.5,0,4.5,4.5,34.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Baseball Bugs",1946,7,NA,7.3,160,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Baseball Girls",1996,82,NA,4.1,9,45.5,0,0,14.5,0,0,0,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Basement and the Kitchen, The",1999,102,NA,6.1,23,0,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Baseynat",1977,148,NA,8.6,6,0,0,0,0,0,0,34.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Bashful Bachelor, The",1942,78,165000,5.7,7,0,0,0,14.5,14.5,45.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Bashful Buzzard, The",1945,7,NA,7.6,28,4.5,0,4.5,0,0,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bashful Elephant, The",1962,82,NA,3.1,5,44.5,0,0,0,24.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Bashta mi boyadzhiyata",1974,87,NA,9.1,9,0,0,0,0,0,0,0,44.5,0,45.5,"",0,0,0,0,0,0,0 -"Bashtata na yaytzeto",1991,103,NA,2.2,5,44.5,24.5,24.5,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Bashu",1989,121,NA,8.1,110,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Basic",2003,98,50000000,6.2,8370,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Basic Instinct",1992,128,49000000,6.7,19520,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Basic Training",1971,80,NA,6.7,19,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Basic Training",1985,88,NA,3.4,68,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Basil",1998,113,10000000,6.1,367,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Basilischi, I",1963,85,NA,6.8,17,0,0,4.5,4.5,0,4.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Basilisk Stare",2003,13,NA,4.5,15,4.5,0,14.5,4.5,0,4.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,1 -"Basin Street Revue",1956,40,NA,7,6,0,0,0,0,0,0,84.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Basket Case",1982,86,NA,5.7,1028,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Basket Case 2",1990,90,2500000,3.9,310,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Basket Case 3: The Progeny",1992,90,NA,3.7,214,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Basket, The",1999,105,3000000,6.3,200,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"PG",0,0,0,1,0,0,0 -"Basketball Diaries, The",1995,102,NA,6.6,6280,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Basketball Fix, The",1951,65,NA,4.6,12,4.5,4.5,0,0,14.5,44.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Basketball Headliners",1956,15,NA,5.2,8,0,0,24.5,0,24.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Basquiat",1996,108,NA,6.6,3126,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Bass Fishing",1901,1,NA,3.3,5,0,0,64.5,24.5,0,24.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Bass on Titles",1977,32,NA,6.4,14,0,0,0,0,14.5,4.5,24.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Basse cour, La",1992,5,NA,7.6,11,0,4.5,0,0,0,14.5,4.5,24.5,24.5,4.5,"",0,1,0,0,0,0,1 -"Bassin de J.W., Le",1997,125,NA,3.8,43,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Basta de mujeres",1977,90,NA,3.4,8,14.5,0,14.5,0,14.5,14.5,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Basta guardarla",1970,103,NA,6.4,8,0,0,0,0,14.5,0,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Bastard Out of Carolina",1996,97,NA,7.4,805,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Bastardi, I",1968,102,NA,6.3,10,14.5,0,0,0,24.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bastards",1999,98,NA,6,47,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Bastards",2003,99,NA,4.2,14,45.5,0,24.5,0,0,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Bastien, Bastienne",1979,105,NA,3.1,16,14.5,0,4.5,14.5,0,0,0,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Bastille",1984,91,NA,6.9,12,0,0,0,0,14.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Baston, La",1985,85,NA,3.8,6,34.5,14.5,0,14.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Bastoni: The Stick Handlers",2002,97,NA,4.2,14,0,14.5,14.5,14.5,24.5,0,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Bat People, The",1974,95,NA,2,328,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bat Thumb",2001,28,NA,6.6,174,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Bat Whispers, The",1930,83,NA,6.2,100,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Bat sei ching mai",2001,107,NA,6.1,23,0,0,0,0,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Bat*21",1988,105,NA,6.3,1384,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bat, The",1926,86,NA,6.7,64,4.5,0,0,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bat, The",1959,80,NA,5.7,262,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bata, bata... Paano ka ginawa?",1998,109,NA,8.5,20,4.5,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Bataan",1943,113,NA,7,339,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bataashi kingyo",1990,95,NA,5.8,5,0,0,24.5,24.5,0,0,44.5,24.5,0,0,"",0,0,0,0,0,1,0 -"Bataille de San Sebastian, La",1968,111,NA,5.9,211,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bataille de boules de neige",1896,1,NA,7,73,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Bataille du rail, La",1946,85,NA,7.2,50,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bataille, La",1933,90,NA,7.6,5,0,0,0,44.5,0,0,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Bataillon du ciel, Le",1947,130,NA,5.9,6,0,0,0,14.5,0,34.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Batakli damin kizi, Aysel",1934,80,NA,7.6,10,0,0,0,0,0,0,44.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Batalla de Chile: El poder popular, La",1979,100,NA,8.9,30,4.5,4.5,0,0,0,0,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Batalla de los Tres Reyes, La",1990,139,NA,7.6,12,0,0,0,14.5,4.5,0,14.5,4.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Batang PX",1997,113,NA,7.6,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Batang West Side",2002,300,NA,7.3,13,0,0,14.5,0,4.5,14.5,4.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Batch '81",1982,98,NA,8.1,16,0,0,0,0,0,0,14.5,0,14.5,74.5,"",0,0,0,1,0,0,0 -"Bateau sur l'herbe, Le",1971,90,NA,8.6,138,0,0,0,0,0,4.5,14.5,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Bath Day",1946,7,NA,6,17,0,0,4.5,14.5,14.5,4.5,24.5,4.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Bathing Beauty",1944,101,2361000,6.1,143,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Batman",1989,126,35000000,7.4,35927,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Batman & Robin",1997,125,110000000,3.6,28457,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Batman Forever",1995,122,100000000,5.4,24025,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,1,0 -"Batman Returns",1992,126,80000000,6.5,23010,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Batman and Robin",1949,263,NA,5.8,119,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Batman, The",1943,260,NA,6.4,84,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Batman: Dead End",2003,8,30000,7.3,805,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,0,0,0,0,1 -"Batman: Mask of the Phantasm",1993,76,NA,6.9,2419,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,1,0,1,0,0,0 -"Baton Bunny",1959,7,NA,6.8,100,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Batoru rowaiaru",2000,122,4500000,7.9,12138,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Batoru rowaiaru II: Rekuiemu",2003,155,9000000,4.8,2117,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Bats in the Belfry",1942,7,NA,4.4,7,0,24.5,0,14.5,24.5,0,24.5,0,0,0,"",0,1,1,0,0,0,1 -"Bats in the Belfry",1960,6,NA,6.8,6,0,0,14.5,0,0,14.5,14.5,14.5,34.5,0,"",0,1,1,0,0,0,1 -"Bats, The",1999,8,NA,4.2,11,0,0,14.5,24.5,0,0,0,0,14.5,34.5,"",0,1,0,0,0,0,1 -"Battaglia d'Inghilterra, La",1969,100,NA,5.1,46,4.5,0,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Battaglia dei mods, La",1966,97,NA,5.7,7,14.5,14.5,0,14.5,0,0,24.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Battaglia del deserto, La",1969,87,NA,6.3,7,0,0,0,0,14.5,14.5,44.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Battaglia dell'ultimo panzer, La",1969,91,NA,3.5,25,24.5,4.5,14.5,14.5,24.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Battaglia di Algeri, La",1965,117,NA,8.4,2023,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Battaglia di El Alamein, La",1969,96,NA,4.9,70,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Battaglia di Maratona, La",1959,92,NA,5.1,42,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Battaglie negli spazi stellari",1977,95,NA,2.3,51,34.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Battant, Le",1983,121,NA,5.7,127,4.5,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Battellieri del Volga, I",1958,102,NA,4.2,8,0,0,24.5,0,24.5,0,0,0,0,45.5,"",1,0,0,1,0,0,0 -"Battement d'ailes du papillon, Le",2000,97,NA,7.1,1014,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Battement de coeur",1940,97,NA,7,14,0,0,0,4.5,4.5,24.5,24.5,4.5,24.5,0,"",0,0,0,0,0,0,0 -"Battery Film",1985,9,NA,3.7,18,14.5,4.5,4.5,24.5,34.5,4.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Battle Beneath the Earth",1967,91,NA,4.3,132,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Battle Beyond the Stars",1980,104,2000000,4.9,1059,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Battle Circus",1953,90,NA,5.4,158,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Battle Cry",1955,142,NA,6.4,297,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Battle Heater: Kotatsu",1990,96,NA,7,8,14.5,0,0,14.5,0,0,45.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Battle Hymn",1956,108,NA,6.1,127,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Battle Stations",1944,10,NA,4.9,5,0,0,24.5,24.5,24.5,0,24.5,0,0,24.5,"",0,0,0,0,1,0,1 -"Battle Stations",1956,81,NA,6.1,23,0,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Battle Taxi",1955,82,NA,4.8,16,4.5,14.5,0,14.5,4.5,34.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Battle Wizard, The",1977,77,NA,7.4,11,0,0,0,0,0,4.5,34.5,44.5,0,4.5,"",0,0,0,0,0,0,0 -"Battle at Apache Pass, The",1952,85,NA,6.4,40,0,0,0,14.5,14.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Battle at Bloody Beach",1961,83,NA,5.5,56,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Battle at Elderbush Gulch, The",1913,29,NA,7.1,59,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,0,1 -"Battle for the Planet of the Apes",1973,96,1800000,4.9,2335,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Battle of Britain",1969,151,12000000,6.7,1728,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Battle of Britain, The",1943,54,NA,8.6,81,0,4.5,0,0,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Battle of China, The",1944,65,NA,7.9,60,0,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Battle of Gettysburg, The",1955,30,NA,7.1,47,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Battle of Love's Return, The",1971,82,NA,3.6,36,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,1,1,0,0,0 -"Battle of Midway, The",1942,18,NA,6.6,127,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Battle of Rogue River, The",1954,71,NA,4.9,22,0,4.5,4.5,34.5,24.5,14.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Battle of Russia, The",1943,83,NA,8.1,75,0,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Battle of Shaker Heights, The",2003,90,1000000,6,854,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Battle of the Bulge",1965,212,NA,6.5,1423,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Battle of the Bulge... The Brave Rifles, The",1965,52,NA,8.1,13,0,0,0,0,0,14.5,34.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Battle of the Coral Sea",1959,86,NA,6.5,36,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",1,0,0,1,0,1,0 -"Battle of the River Plate, The",1956,106,NA,6.6,380,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Battle of the Sexes",1997,5,NA,5.4,42,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Battle of the Sexes, The",1928,91,NA,6.8,35,4.5,0,0,0,4.5,24.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Battle of the Sexes, The",1959,84,NA,6.6,184,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Battle of the Villa Fiorita, The",1965,111,NA,5.5,37,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Battle, The",1911,19,NA,5.7,26,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,0,14.5,"",1,0,0,1,0,0,1 -"Battle, The",1934,83,NA,5.3,6,0,14.5,14.5,14.5,14.5,0,34.5,0,0,0,"",0,0,0,0,0,1,0 -"BattleGround: 21 Days on the Empire's Edge",2004,82,NA,9.7,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,0,1,0,0 -"BattleQueen 2020",2001,95,NA,2.9,116,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Battlefield Earth: A Saga of the Year 3000",2000,119,73000000,2.4,14970,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Battleground",1949,118,NA,7.5,849,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Battles of Chief Pontiac",1952,72,NA,5.2,24,0,0,0,14.5,14.5,4.5,14.5,4.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Battling Butler",1926,71,NA,7.3,230,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Battling with Buffalo Bill",1931,217,NA,4.1,5,24.5,0,0,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Batty Baseball",1944,7,NA,7.8,30,0,0,0,4.5,0,14.5,14.5,34.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Batwara",1989,201,NA,6.5,9,0,0,0,0,14.5,14.5,44.5,0,0,34.5,"",1,0,0,1,0,0,0 -"Bauernkrieg",1998,84,NA,7,5,0,0,0,24.5,0,24.5,0,44.5,24.5,0,"",0,0,0,0,1,0,0 -"Baunsu ko gaurusu",1997,110,NA,7,203,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bawandar",2000,125,NA,6.8,36,0,0,4.5,4.5,0,4.5,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Bawarchi",1972,130,NA,7.4,47,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,24.5,"",0,0,1,1,0,0,0 -"Bawdy Adventures of Tom Jones, The",1976,94,NA,4.1,47,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Baxter",1989,82,NA,6.7,281,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Baxter!",1973,100,NA,6.6,53,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Baxter, The",2005,91,NA,9.1,19,0,0,0,0,0,14.5,14.5,14.5,0,64.5,"PG-13",0,0,1,1,0,1,0 -"Bay Boy, The",1984,107,NA,6,163,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bay of Love and Sorrows, The",2002,95,NA,6.3,56,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bayan ko: Kapit sa patalim",1984,108,NA,7.4,17,4.5,0,0,4.5,0,4.5,0,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Bayani",1992,82,NA,8.7,7,0,0,0,0,0,0,24.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Bayaning Third World",2000,93,NA,8.3,20,4.5,0,0,0,4.5,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Bayerische Rebell, Der",2004,92,NA,8.2,9,0,0,0,0,0,14.5,14.5,34.5,44.5,0,"",0,0,0,0,1,0,0 -"Bayit Berechov Chelouche, Ha-",1973,110,NA,6.1,11,14.5,0,0,4.5,0,4.5,4.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Baykot",1985,114,NA,5.1,20,0,0,4.5,24.5,24.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Bayo",1985,99,NA,6.1,8,0,0,0,0,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bayou",1957,83,NA,5.3,16,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Baza ludzi umarlych",1959,104,NA,7.8,29,4.5,0,0,0,4.5,0,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Be Big",1931,28,NA,6.8,116,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Be Cool",2005,118,53000000,5.5,4560,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Be Glad for the Song Has No Ending",1970,50,NA,8,7,0,0,0,0,0,0,14.5,74.5,14.5,0,"",0,0,0,0,1,0,0 -"Be Good Daniel",2004,20,4000,5.7,8,14.5,14.5,14.5,0,0,14.5,14.5,0,14.5,24.5,"",0,0,1,0,0,1,1 -"Be Good, Smile Pretty",2003,52,NA,7.9,19,4.5,0,0,4.5,14.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Be Here to Love Me: A Film About Townes Van Zandt",2004,99,NA,8.5,17,0,0,0,0,4.5,0,4.5,14.5,44.5,24.5,"",0,0,0,0,1,0,0 -"Be Human",1936,7,NA,5.8,29,4.5,0,0,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Be Kind to 'Aminals'",1935,6,NA,5.5,22,4.5,0,4.5,24.5,4.5,4.5,4.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Be Kind, Please Rewind",1996,25,NA,1.4,6,45.5,14.5,0,14.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Be My Guest",1965,82,NA,5.7,6,0,0,0,14.5,14.5,14.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Be My Wife",1921,13,NA,8,32,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Be Quiet and Shut the Fuck Up",1998,12,NA,6.5,25,24.5,0,4.5,4.5,4.5,0,0,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Be Yourself!",1930,65,NA,5.1,15,14.5,0,4.5,14.5,34.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Be.Angeled",2001,102,NA,4.5,50,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beach Babes from Beyond",1993,75,NA,3.2,234,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Beach Ball",1965,83,NA,4.6,39,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Beach Balls",1988,77,NA,5.3,28,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Beach Blanket Bango",1975,97,NA,2,5,44.5,0,0,0,0,24.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Beach Blanket Bingo",1965,98,NA,5.2,343,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beach Boys: An American Band, The",1985,103,NA,6.9,63,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Beach Bunnies, The",1976,90,NA,2.3,24,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Beach Fever",1987,90,NA,3.7,33,34.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Beach Girls and the Monster, The",1965,70,NA,3,87,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beach Girls, The",1982,91,NA,3.8,148,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Beach House",1979,76,NA,4.5,8,24.5,24.5,0,14.5,0,14.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Beach House",1995,101,NA,4.2,25,14.5,0,4.5,0,14.5,4.5,14.5,4.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Beach Party",1963,101,350000,5.3,226,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Beach Party, The",1931,8,NA,7.1,16,0,0,4.5,4.5,0,14.5,44.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Beach Peach",1950,6,NA,6.6,7,0,0,0,0,24.5,0,0,0,44.5,24.5,"",0,1,1,0,0,0,1 -"Beach Picnic",1939,8,NA,6.7,39,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Beach Red",1967,105,NA,6.1,144,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beach, The",1995,8,NA,6.6,17,0,0,4.5,0,4.5,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Beach, The",2000,119,50000000,5.8,15020,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Beachcomber, The",1954,82,NA,6.5,45,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Beachcombers",2002,14,NA,8,6,0,0,0,0,14.5,14.5,34.5,0,0,34.5,"",0,0,0,0,0,0,1 -"Beaches",1988,123,NA,6.2,3876,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Beachhead",1954,90,NA,6.2,79,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bead Game, The",1977,6,NA,7.5,22,0,0,0,0,4.5,14.5,14.5,24.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Bean",1997,90,22000000,5.4,9018,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Bean Cake",2001,12,12000,6.8,36,0,4.5,0,0,4.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Beans of Egypt, Maine, The",1994,99,NA,5.1,116,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beanstalk Bunny",1955,7,NA,7.4,116,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bear Country",1953,33,NA,9.5,17,0,0,0,0,0,0,14.5,34.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Bear De Guerre",1968,6,NA,5.7,9,0,0,14.5,0,34.5,24.5,24.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Bear Facts",1938,11,NA,7.1,13,0,0,0,0,14.5,24.5,34.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Bear Feat",1949,7,NA,6.5,29,4.5,0,0,14.5,4.5,24.5,4.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bear Hug",2004,100,NA,8,10,14.5,0,0,0,0,14.5,14.5,44.5,34.5,0,"",0,0,0,1,0,0,0 -"Bear Island",1979,118,NA,4.8,238,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bear Raid Warden",1944,7,NA,6.3,6,0,0,0,14.5,0,34.5,0,45.5,0,0,"",0,1,1,0,0,0,1 -"Bear Shooters",1930,20,NA,5.2,38,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Bear That Couldn't Sleep, The",1939,9,NA,7.7,8,0,0,0,0,14.5,0,34.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Bear That Wasn't, The",1967,10,NA,8.2,43,4.5,0,0,0,4.5,4.5,14.5,14.5,14.5,45.5,"",0,1,1,0,0,0,1 -"Bear Who Slept Through Christmas, The",1973,30,NA,6.5,10,0,0,0,0,0,24.5,14.5,24.5,34.5,24.5,"",0,1,0,0,0,0,1 -"Bear and the Bean, The",1948,7,NA,6,5,0,0,0,0,24.5,84.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Bear and the Beavers, The",1942,8,NA,7,7,0,0,0,14.5,44.5,0,0,0,0,44.5,"",0,1,1,0,0,0,1 -"Bear and the Hare, The",1948,7,NA,6.3,6,0,0,0,0,14.5,45.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Bear for Punishment, A",1951,7,NA,8.1,49,4.5,0,0,4.5,4.5,14.5,14.5,24.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Bear with Me",2000,96,NA,5.3,24,0,4.5,14.5,4.5,14.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bear's Kiss",2002,101,NA,5.2,108,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Bear's Story, A",2003,20,NA,8.4,7,0,0,0,0,0,0,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Bear's Tale, The",1940,9,NA,7.6,16,0,0,0,0,4.5,14.5,14.5,24.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Bear, The",1984,110,221000,5.9,135,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Bear, The",1999,26,NA,5.8,34,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Bearly Asleep",1955,8,NA,7.4,28,0,0,0,4.5,0,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Bears and Bees, The",1932,6,NA,4.8,8,0,14.5,14.5,14.5,0,0,14.5,0,0,45.5,"",0,1,1,0,0,0,1 -"Bears and I, The",1974,89,NA,5,45,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bearskin: An Urban Fairytale",1989,95,NA,5.7,27,14.5,4.5,0,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Beast From 20,000 Fathoms, The",1953,80,210000,6.3,577,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beast Must Die, The",1974,93,NA,5.5,245,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Beast That Killed Women, The",1965,60,NA,3.1,62,34.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Beast Within, The",1982,98,NA,4.3,321,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beast from Haunted Cave",1959,75,NA,4.2,124,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Beast in the Cellar, The",1971,88,NA,4.1,72,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beast of Blood",1971,90,NA,3.7,45,14.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beast of Budapest, The",1958,72,NA,5.2,5,24.5,0,0,0,44.5,0,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Beast of Hollow Mountain, The",1956,81,NA,5,86,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Beast of War, The",1988,111,NA,6.9,1073,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Beast of Yucca Flats, The",1961,54,34000,1.5,594,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beast of the City, The",1932,86,230000,7.3,112,4.5,4.5,4.5,4.5,4.5,4.5,34.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Beast of the Yellow Night",1971,87,NA,3.6,29,14.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Beast with Five Fingers, The",1946,88,NA,5.9,274,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beast with a Million Eyes, The",1956,75,23000,3.2,119,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beaster",2004,10,5000,6.9,9,34.5,0,0,0,0,0,0,0,14.5,45.5,"",0,0,1,0,0,0,1 -"Beastie",1982,5,NA,5.9,198,4.5,0,0,0,4.5,0,4.5,4.5,0,94.5,"",0,0,0,0,0,0,1 -"Beastie Girl",1998,90,NA,7.8,6,14.5,0,0,0,0,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Beasties",1991,83,NA,1.7,15,64.5,14.5,14.5,14.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Beastmaster 2: Through the Portal of Time",1991,107,6000000,3.1,564,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Beastmaster, The",1982,90,NA,5.4,2506,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Beat",1999,13,NA,7.8,14,4.5,0,0,0,0,14.5,4.5,4.5,45.5,4.5,"",0,0,0,0,0,0,1 -"Beat",2000,93,NA,5.3,279,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Beat",2004,70,NA,6.6,11,0,0,4.5,0,0,34.5,4.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Beat Generation, The",1959,95,NA,5.4,28,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Beat Generation: An American Dream, The",1987,86,NA,8,10,0,0,0,0,0,0,14.5,84.5,14.5,0,"",0,0,0,0,0,0,0 -"Beat Girl",1960,83,NA,5.1,76,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Beat Street",1984,105,NA,5.1,417,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Beat the Band",1947,67,NA,6,6,0,0,0,0,14.5,34.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Beat the Devil",1953,100,1000000,6.6,1034,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Beat the Drum",2003,114,1500000,7,26,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Beat the Heat",1990,78,NA,5.1,6,45.5,0,0,14.5,0,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Beat the Meatles",1996,2,NA,6.5,8,0,0,14.5,0,0,0,14.5,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Beat, The",1988,98,NA,4.6,46,14.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Beat, The",2003,85,700000,8.5,22,4.5,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Beatle Fan, The",2002,24,NA,8.7,6,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Beatles Come to Town, The",1963,8,NA,8.9,12,0,0,0,0,0,0,0,44.5,34.5,24.5,"",0,0,0,0,1,0,1 -"Beatles Mod Odyssey, The",1968,7,NA,6.9,17,0,0,0,0,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Beatles and Beyond, The",1977,140,NA,8.9,10,0,0,0,0,0,0,0,34.5,44.5,34.5,"",0,0,0,0,0,0,0 -"Beatles at Shea Stadium, The",1966,48,NA,8.7,90,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Beatniks, The",1960,78,NA,2,105,45.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Beatrice Cenci",1969,84,NA,6,31,4.5,0,0,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Beau Bandit",1930,65,NA,4.4,14,4.5,4.5,14.5,24.5,4.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Beau Geste",1926,101,NA,8.9,43,0,0,4.5,0,4.5,4.5,4.5,14.5,24.5,44.5,"",1,0,0,1,0,0,0 -"Beau Geste",1939,112,NA,7.6,741,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Beau Geste",1966,103,NA,5.6,109,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Beau Hunks",1931,37,NA,7.7,146,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Beau Ideal",1931,82,NA,4.7,15,0,0,4.5,44.5,24.5,4.5,24.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Beau James",1957,105,NA,6.4,105,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beau Serge, Le",1958,98,NA,6.9,176,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Beau fixe",1992,92,NA,6.1,47,4.5,4.5,4.5,0,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Beau mariage, Le",1982,97,NA,7.3,173,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Beau travail",1999,90,NA,6.7,875,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Beauf, Le",1987,102,NA,4.9,30,4.5,0,4.5,24.5,14.5,44.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Beaumarchais, l'insolent",1996,115,NA,7,307,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Beaus Will Be Beaus",1955,6,NA,5.4,6,0,0,0,14.5,14.5,0,14.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Beautician and the Beast, The",1997,118,NA,4.9,1213,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,1,0 -"Beautiful",2000,112,9000000,5.3,991,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Beautiful",2002,12,NA,6.7,13,0,4.5,0,4.5,0,34.5,14.5,14.5,14.5,4.5,"",0,0,1,1,0,0,1 -"Beautiful Blonde from Bashful Bend, The",1949,77,NA,5.9,89,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Beautiful Boxer",2003,118,NA,8,267,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Beautiful Budapest",1938,9,NA,5.7,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,0,1,0,1 -"Beautiful Country, The",2004,137,6000000,6.9,115,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Beautiful Creatures",2000,86,NA,5.8,706,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Beautiful Dreamers",1990,105,NA,6.1,80,4.5,4.5,4.5,0,14.5,4.5,14.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Beautiful Girls",1996,112,NA,7.1,7452,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Beautiful Japan",1918,133,NA,6.3,13,0,0,0,24.5,0,34.5,24.5,14.5,4.5,0,"",0,0,0,0,1,0,0 -"Beautiful Joe",2000,98,NA,5.7,524,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Beautiful Mind, A",2001,135,60000000,7.8,43291,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Beautiful Mistake",2000,75,NA,7.3,6,0,0,14.5,0,0,0,0,64.5,14.5,0,"",0,0,0,0,0,0,0 -"Beautiful People",1999,107,NA,7,906,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Beautiful Stranger",1954,89,NA,5,8,0,14.5,14.5,14.5,24.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Beautiful Sunday",1998,93,NA,6.8,16,14.5,4.5,0,0,14.5,4.5,4.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Beautiful Thing",1996,90,NA,7.5,4409,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"R",0,0,0,1,0,1,0 -"Beautopia",1998,104,NA,6,17,4.5,4.5,0,4.5,0,24.5,14.5,4.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Beauty",1981,87,NA,4.1,11,4.5,14.5,0,0,4.5,34.5,4.5,0,4.5,4.5,"",0,0,0,1,0,1,0 -"Beauty Betrayed",2002,98,NA,3,23,4.5,4.5,14.5,4.5,4.5,4.5,0,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Beauty Jungle, The",1964,82,NA,5.5,19,4.5,0,0,14.5,34.5,24.5,14.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Beauty Shop",2005,104,NA,4.6,518,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Beauty and the Bandit",1946,77,NA,5,6,0,0,0,34.5,0,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Beauty and the Beast",1934,8,NA,5,24,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Beauty and the Beast",1962,77,NA,4.3,32,4.5,4.5,4.5,34.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Beauty and the Beast",1991,90,NA,7.8,25672,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,1,0 -"Beauty and the Boss",1932,66,NA,6.3,29,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Beauty for Sale",1933,87,NA,6.7,36,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Beauty for the Asking",1939,68,NA,5.5,29,0,4.5,14.5,0,14.5,44.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beauty in Chaos",2004,120,30000,8.8,11,4.5,0,0,0,0,0,0,0,34.5,45.5,"",0,0,0,1,0,0,0 -"Beauty's Worth",1922,70,NA,7.9,7,0,0,0,0,14.5,24.5,0,45.5,0,0,"",0,0,0,1,0,0,0 -"Beauville",1995,30,NA,5.8,13,14.5,4.5,14.5,4.5,4.5,0,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Beaux dimanches, Les",1974,93,NA,6.9,9,0,0,0,14.5,14.5,24.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Beaux souvenirs, Les",1981,114,NA,6.8,11,0,0,0,4.5,4.5,4.5,34.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Beaver Trilogy, The",2001,83,NA,7.1,73,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,1,0,0 -"Beavers",1988,31,NA,7.2,45,4.5,0,4.5,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Beavis and Butt-Head Do America",1996,81,12000000,6.2,9491,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,1,1,0,0,0,0 -"Because",1990,34,NA,6.4,42,0,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Because They're Young",1960,102,NA,5.3,61,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Because Why",1993,104,NA,6.5,67,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Because You're Mine",1952,103,NA,5,47,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Because of Eve",1948,72,NA,6.1,9,0,0,14.5,34.5,0,0,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Because of Him",1946,88,NA,6.9,34,4.5,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Because of Mama",2001,19,NA,6.3,16,0,0,0,0,14.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Because of Winn-Dixie",2005,106,14000000,5.9,483,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"PG",0,0,1,1,0,0,0 -"Because of You",1952,95,NA,6.1,40,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Because of the Cats",1973,98,NA,5.3,27,0,4.5,4.5,4.5,44.5,24.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Beccerra",2002,30,3000,7.1,14,14.5,4.5,0,4.5,0,0,4.5,4.5,24.5,34.5,"",1,0,0,1,0,1,1 -"Beck - De gesloten kamer",1993,100,NA,3.6,30,0,14.5,24.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Beck - Sista vittnet",2002,101,NA,6.2,301,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Becket",1964,148,3000000,8,1538,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Becky Sharp",1935,67,950000,6.2,103,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Becoming Colette",1991,97,NA,5.4,72,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bed You Sleep In, The",1993,117,NA,6.4,30,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Bed and Breakfast",2000,23,NA,7.8,8,0,14.5,0,0,24.5,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Bed of Roses",1933,67,NA,6.4,89,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Bed of Roses",1996,87,NA,5.9,2049,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,1,0,1,0 -"Bed, The",2002,12,NA,3.7,12,14.5,0,0,0,14.5,14.5,0,44.5,4.5,0,"",0,0,1,0,0,0,1 -"Bed-Sitting Room, The",1969,90,NA,6.2,232,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bedazzled",1967,104,NA,6.8,1525,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bedazzled",2000,93,48000000,5.9,11439,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Bedelia",1946,83,NA,5.7,10,0,0,14.5,0,14.5,44.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Bedevil",1993,90,NA,4.5,29,14.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bedevilled",1955,85,NA,4.6,31,4.5,4.5,4.5,24.5,24.5,24.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Bedevilled Rabbit",1957,7,NA,7,58,0,4.5,4.5,4.5,14.5,4.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bedford Incident, The",1965,102,NA,7.4,670,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bedhead",1991,8,NA,6.7,482,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Bedknobs and Broomsticks",1971,139,20000000,6.5,2614,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Bedlam",1946,79,NA,6.7,266,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bedlam in Paradise",1955,16,NA,6.6,28,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Bednyy, bednyy Pavel",2003,103,NA,6.9,18,0,0,0,0,14.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bedre enn sitt rykte",1955,87,NA,5.3,6,0,0,0,14.5,0,0,64.5,0,0,14.5,"",0,0,1,0,0,1,0 -"Bedroom Eyes",1984,90,NA,4.7,67,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bedroom Eyes II",1991,87,NA,4.4,60,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bedroom Window, The",1987,112,NA,6.3,729,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bedrooms and Hallways",1998,96,NA,6.6,891,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Bedside",1934,65,NA,7.2,9,0,0,24.5,14.5,0,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bedside Manner",1945,72,NA,5.4,9,0,0,14.5,14.5,24.5,24.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Bedtime Story",1941,85,NA,6.8,15,0,0,0,4.5,4.5,14.5,44.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bedtime Story",1964,99,NA,6.4,185,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bedtime Story, A",1933,87,NA,7.6,9,0,0,0,0,0,14.5,14.5,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bedtime Story, A",1997,13,NA,1.6,16,34.5,24.5,4.5,14.5,0,0,0,0,4.5,14.5,"",0,0,1,0,0,0,1 -"Bedtime for Bonzo",1951,83,NA,4.6,210,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Bedtime for Sniffles",1940,8,NA,6.6,25,0,0,4.5,14.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Bedwin Hacker",2003,98,NA,6,9,14.5,14.5,14.5,0,0,24.5,24.5,14.5,14.5,0,"",0,0,1,1,0,0,0 -"Bee at the Beach",1950,6,NA,7.2,38,4.5,4.5,0,4.5,0,4.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Bee on Guard",1951,7,NA,7.1,37,0,0,0,0,4.5,24.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Bee-Deviled Bruin, The",1949,7,NA,7.2,32,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Beed-o baad",1999,77,NA,6.8,41,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Beef 2",2004,85,NA,6.7,61,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Beefcake",1998,97,NA,7.2,281,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Beefeaters",1989,84,NA,8.4,6,0,0,14.5,14.5,0,14.5,0,14.5,34.5,0,"",0,0,0,0,0,0,0 -"Been Down So Long It Looks Like Up to Me",1971,90,NA,5.4,17,4.5,0,4.5,4.5,14.5,14.5,34.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Beep Prepared",1961,6,NA,7.2,42,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Beep, Beep",1952,7,NA,7.1,86,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Beeper",2002,94,NA,5.3,39,24.5,0,4.5,4.5,14.5,4.5,4.5,14.5,4.5,34.5,"R",0,0,0,0,0,0,0 -"Beer",1985,82,NA,4.6,161,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beer Barrel Polecats",1946,17,NA,6.2,55,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Beer Drinker's Guide to Fitness and Filmmaking, The",1987,84,NA,8.3,18,4.5,0,0,0,0,4.5,14.5,14.5,4.5,45.5,"",0,0,1,0,1,0,0 -"Beer Muscles",2004,90,5000,9.3,11,0,0,0,0,0,0,4.5,14.5,4.5,64.5,"",0,0,1,0,0,0,0 -"Beer and Pretzels",1933,20,NA,6,35,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Beertje Sebastiaan: De geheime Opdracht",1991,79,NA,2.9,10,24.5,24.5,44.5,0,14.5,14.5,0,0,0,0,"",0,1,0,0,0,0,0 -"Bees Saal Baad",1962,158,NA,8,8,0,0,0,0,0,14.5,0,64.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bees in Paradise",1944,72,NA,3.7,13,24.5,4.5,0,14.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Bees, The",1978,93,NA,3,81,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beest, Het",1982,90,NA,4.2,24,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beet",2003,10,NA,7,7,0,0,0,24.5,0,14.5,14.5,24.5,14.5,0,"",0,0,0,0,0,0,1 -"Beethoven",1992,87,NA,5.1,4039,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beethoven's 2nd",1993,89,NA,4.1,1995,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beetle Juice",1988,92,15000000,7.1,20966,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Beezy Bear",1955,7,NA,6.9,27,0,0,0,4.5,0,14.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Before Dawn",1933,60,NA,6.6,22,0,0,4.5,4.5,4.5,34.5,4.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Before I Hang",1940,62,NA,6.1,62,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Before Night Falls",2000,133,NA,7.2,3608,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Before Stonewall",1984,87,NA,7,63,4.5,4.5,0,4.5,14.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Before Sunrise",1995,105,2500000,7.8,9618,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Before Sunset",2004,80,10000000,8.3,8789,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,1,0,1,0 -"Before Winter Comes",1969,103,NA,6.3,29,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Before You Go",2002,94,NA,5.3,99,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Before and After",1996,108,NA,5.9,1444,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Before the Bell Rang",2003,15,NA,7.8,10,0,0,0,14.5,24.5,0,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Before the Nickelodeon: The Cinema of Edwin S. Porter",1982,60,NA,6,16,0,0,0,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Before the Rain",1994,113,NA,7.6,2047,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Befrielsesbilleder",1982,57,NA,2.7,84,44.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Beg",1970,196,NA,7.9,67,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Beg, Borrow or Steal",1937,72,NA,6.1,15,0,0,4.5,0,4.5,44.5,4.5,34.5,0,0,"",0,0,1,0,0,1,0 -"Begegnung mit Fritz Lang",1963,14,NA,5.5,13,4.5,0,14.5,14.5,4.5,34.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Beggar's Opera, The",1953,94,NA,6.4,52,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beggars in Ermine",1934,72,NA,5.4,12,0,4.5,0,4.5,14.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Beggars of Life",1928,100,NA,7.7,56,0,4.5,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Beginner's Luck",2001,84,NA,5.1,13,4.5,0,4.5,0,4.5,34.5,0,34.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Beginning of the End",1957,76,NA,3.3,347,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beginning or the End, The",1947,112,NA,6.4,62,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Begone Dull Care",1949,8,NA,8.8,67,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Begotten",1991,78,33000,5.8,405,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Begstvo mistera Mak-Kinli",1975,162,NA,5.5,22,4.5,0,0,14.5,4.5,24.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Beguiled, The",1971,105,NA,7,1238,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Begushchaya po volnam",1967,93,NA,8.6,5,0,0,0,0,0,0,0,64.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Behave Yourself!",1951,81,NA,5.8,65,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beheaded 1000",1993,124,NA,5.6,16,4.5,0,0,0,14.5,24.5,14.5,14.5,14.5,0,"",1,0,0,0,0,0,0 -"Behemoth, the Sea Monster",1959,72,NA,5.3,144,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Behesht ja-ye digari ast",2003,80,NA,6.1,8,0,0,0,0,0,45.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Behind Enemy Lines",1986,90,NA,4.3,67,14.5,4.5,14.5,4.5,24.5,14.5,4.5,0,4.5,4.5,"",1,0,0,1,0,0,0 -"Behind Enemy Lines",1996,89,NA,4.3,149,14.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Behind Enemy Lines",2001,106,40000000,6.1,10856,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Behind Green Lights",1946,64,NA,7.3,13,0,0,0,0,4.5,24.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Behind Locked Doors",1948,62,NA,6.1,49,0,0,0,14.5,14.5,34.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Behind Locked Doors",1968,79,NA,3.9,30,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Behind Me - Bruno Ganz",2002,85,NA,5.2,12,0,4.5,0,34.5,4.5,0,34.5,0,14.5,0,"",0,0,0,0,1,0,0 -"Behind Office Doors",1931,82,NA,6.4,26,0,0,0,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Behind That Curtain",1929,91,NA,5.1,40,4.5,4.5,4.5,34.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Behind the Eight Ball",1942,60,NA,5,5,0,0,0,0,64.5,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Behind the Green Door",1972,72,NA,5.3,380,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Behind the Green Door, the Sequel",1986,90,NA,3.1,21,14.5,4.5,4.5,4.5,4.5,24.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Behind the Headlines",1937,58,NA,5.7,17,0,0,0,4.5,44.5,14.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Behind the Headlines",1956,65,NA,5.6,14,0,0,0,14.5,24.5,24.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Behind the Make-Up",1930,70,NA,5.3,8,0,0,14.5,24.5,0,14.5,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Behind the Mascot",2004,90,NA,9.4,14,0,0,0,0,0,0,0,24.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Behind the Mask",1932,68,NA,6.1,14,0,0,0,0,24.5,44.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Behind the Mask",1946,68,NA,5.1,10,0,34.5,0,24.5,14.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Behind the Meat-Ball",1945,8,NA,6.8,9,0,0,0,0,14.5,0,64.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Behind the Red Door",2002,105,NA,7,336,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Behind the Rising Sun",1943,88,NA,5.2,35,14.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Behind the Scenes",1908,9,NA,3.8,5,44.5,0,0,0,24.5,0,44.5,0,0,0,"",0,0,0,1,0,0,1 -"Behind the Scenes",1984,90,NA,6.7,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Behind the Screen",1916,30,NA,7.1,195,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Behind the Seams",2000,92,NA,4.7,7,44.5,0,0,14.5,0,0,14.5,0,14.5,14.5,"",0,0,0,0,0,1,0 -"Behold My Wife",1934,79,NA,5.6,8,0,0,0,14.5,14.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Behold a Pale Horse",1964,121,3900000,6.7,114,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bei der blonden Kathrein",1959,88,NA,3.1,9,14.5,24.5,0,14.5,0,24.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Bei kao bei, lian dui lian",1994,138,NA,6.4,17,0,0,0,0,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Bei qi baba shangxue",1998,90,NA,6.9,23,0,0,0,4.5,0,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Beichte der Josefine Mutzenbacher, Die",1978,94,NA,6.8,15,0,0,0,4.5,0,4.5,14.5,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Beichte einer Liebestollen",1971,88,NA,1.8,7,24.5,14.5,24.5,0,14.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Beijing za zhong",1993,88,NA,6.4,23,14.5,0,0,14.5,4.5,14.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Beijo 2348/72",1990,100,NA,6.5,16,4.5,4.5,0,4.5,0,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Beijo No Asfalto, O",1981,80,NA,7.5,14,4.5,0,4.5,0,0,24.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Beijo na Boca",1982,97,NA,6.2,6,0,14.5,0,0,0,64.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Beil von Wandsbek, Das",1951,110,NA,6.5,13,0,0,0,4.5,0,14.5,34.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Beim Jodeln juckt die Lederhose",1974,85,NA,3.9,17,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Beim Nervenarzt",1936,19,NA,4.1,5,0,24.5,0,0,0,0,24.5,24.5,0,44.5,"",0,0,1,0,0,0,1 -"Beine von Dolores, Die",1957,100,NA,5.2,7,0,14.5,0,14.5,0,44.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Being Different",1981,100,NA,5.5,19,14.5,4.5,0,0,14.5,34.5,14.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Being Human",1993,122,30000000,4.8,966,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Being John Malkovich",1999,113,13000000,7.9,55079,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Being Julia",2004,104,18000000,7.2,1671,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Being Light",2001,96,NA,4.4,57,4.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Being Ron Jeremy",2003,40,NA,4.5,53,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Being There",1979,130,NA,8,10521,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Being at Home with Claude",1992,85,NA,6.7,175,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Being, The",1983,82,NA,2.6,93,44.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Beings",1998,89,NA,5.2,35,4.5,0,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beiqing chengshi",1989,157,NA,8.2,283,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Beirut: The Last Home Movie",1987,123,NA,8,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Beispiellose Verteidigung der Festung Deutschkreuz, Die",1967,14,NA,6.5,8,0,0,0,0,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Beit Shean: Seret Milhamah",1996,85,NA,6.3,14,0,0,14.5,0,4.5,0,0,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Beitar Provence",2002,85,NA,5.1,19,0,0,4.5,4.5,14.5,24.5,0,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Bekenntnisse des Hochstaplers Felix Krull",1957,107,NA,7.1,54,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Bekleme odasi",2004,92,NA,7.8,8,0,0,0,14.5,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bel Ami",1939,96,NA,8.2,12,0,0,0,4.5,4.5,0,0,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Bel Ami",1976,104,NA,3.7,23,4.5,14.5,14.5,14.5,24.5,4.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Bela Donna",1998,111,5500000,4.7,127,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Bela Lugosi Meets a Brooklyn Gorilla",1952,74,50000,2.6,161,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Belarmino",1964,80,NA,7.9,21,0,0,4.5,4.5,0,0,4.5,34.5,24.5,14.5,"",0,0,0,1,1,0,0 -"Belaya kost",1988,100,NA,4.6,10,34.5,0,0,14.5,24.5,0,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Belfast, Maine",1999,245,NA,7.2,46,4.5,4.5,4.5,0,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Believe It or Else",1939,8,NA,6.6,18,0,0,4.5,0,14.5,14.5,24.5,34.5,4.5,0,"",0,1,1,0,0,0,1 -"Believe It or Not #1",1930,9,NA,4.7,10,0,0,24.5,14.5,44.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Believe It or Not #2",1930,9,NA,5,11,0,0,0,4.5,64.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Believe It or Not #4",1930,8,NA,5.4,6,0,0,0,14.5,34.5,45.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Believe It or Not #9",1931,9,NA,7.2,5,0,0,0,0,44.5,24.5,0,24.5,24.5,0,"",0,0,0,0,1,0,1 -"Believe in Me",1971,90,NA,5.4,12,0,0,4.5,0,24.5,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Believer, The",2001,98,NA,7.3,3327,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Believers, The",1987,114,NA,5.7,776,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Belinda",1988,97,NA,4.3,6,0,0,0,14.5,14.5,0,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Belizaire the Cajun",1986,103,NA,6.1,145,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bell Book and Candle",1958,106,NA,6.8,1324,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Bell Boy, The",1918,20,NA,7.1,64,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Bell Diamond",1986,96,NA,7,5,0,0,0,0,0,24.5,44.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Bell Hoppy",1954,7,NA,6.9,23,0,0,0,14.5,4.5,4.5,44.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Bell Jar, The",1979,113,NA,5.5,54,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bell Witch Haunting",2004,124,NA,3,16,24.5,14.5,0,0,4.5,0,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bell boy, Le",1998,4,NA,6.5,14,0,0,0,0,24.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Bell for Adano, A",1945,103,NA,7.3,99,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bell'Antonio, Il",1960,95,NA,6.1,93,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bell, Bare and Beautiful",1963,64,NA,1,20,64.5,0,4.5,4.5,0,0,0,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Bell-Bottom George",1944,97,NA,1.5,6,34.5,0,0,0,0,0,0,45.5,14.5,0,"",0,0,1,0,0,0,0 -"Bella Bettien",2002,102,NA,6.6,98,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bella Lola, La",1962,111,NA,7.9,9,0,0,0,0,0,0,14.5,64.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bella Martha",2001,109,NA,7.4,1585,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"PG",0,0,1,1,0,1,0 -"Bella ciao",2001,100,NA,6.2,37,14.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Bella del Alhambra, La",1989,108,NA,7.4,16,0,0,0,0,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bella di Roma, La",1955,99,NA,6.3,6,0,0,0,14.5,14.5,0,45.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Bella mugnaia, La",1955,98,NA,5.5,19,0,0,4.5,0,24.5,24.5,14.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Bella vita, La",1994,97,NA,5.8,59,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bella, min Bella",1996,91,NA,5.9,10,0,0,0,0,45.5,24.5,24.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Belladonna",1981,90,NA,5.1,7,0,0,0,0,45.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Bellaria - So lange wir leben!",2002,100,NA,7.6,39,4.5,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Bellas de noche",1975,98,NA,4.6,6,14.5,0,14.5,14.5,0,0,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Bellboy Donald",1942,7,NA,7.2,46,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Bellboy, The",1960,72,900000,6.1,369,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Belle",1973,96,NA,5.8,17,0,0,0,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Belle Boys",1953,6,NA,5.7,5,0,0,24.5,0,0,24.5,64.5,0,0,0,"",0,1,1,0,0,0,1 -"Belle Le Grand",1951,90,NA,5.9,21,0,0,4.5,14.5,24.5,14.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Belle Starr",1941,87,NA,5.8,65,4.5,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Belle Starr's Daughter",1948,86,NA,5,15,0,0,4.5,14.5,44.5,24.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Belle al bar",1994,110,NA,5.9,50,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Belle captive, La",1983,90,NA,5.5,36,4.5,0,4.5,4.5,14.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Belle de Cadix, La",1953,98,NA,5.2,9,0,0,0,34.5,0,14.5,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Belle de jour",1967,101,NA,7.5,3584,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Belle epoque",1992,109,NA,7.2,2248,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Belle histoire, La",1992,210,NA,6.3,225,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Belle ma povere",1957,99,NA,6.3,13,0,0,0,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Belle maman",1999,102,NA,5.8,216,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Belle noiseuse, La",1991,240,NA,7.5,833,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Belle noiseuse. Divertimento, La",1991,238,NA,7.8,90,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Belle of New York, The",1952,82,2606644,5.7,98,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Belle of Old Mexico",1950,70,NA,4.5,6,0,0,14.5,14.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Belle of the Nineties",1934,73,800000,6.3,84,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Belle of the Yukon",1944,83,NA,5.6,24,4.5,4.5,14.5,4.5,14.5,24.5,4.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Belle verte, La",1996,99,NA,5.5,134,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Belles de nuit, Les",1952,87,NA,6.9,72,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Belles of St. Trinian's, The",1954,91,NA,6.9,323,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Belles on Their Toes",1952,89,NA,6.3,152,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bellifreschi",1987,91,NA,3,16,34.5,4.5,14.5,4.5,4.5,14.5,0,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Bellini e a Esfinge",2001,120,NA,7.4,108,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Bellini's Drive",1998,71,NA,5.4,15,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Bellissima",1951,108,NA,7.5,235,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bellissimo novembre, Un",1969,98,NA,7.1,22,0,4.5,0,4.5,14.5,4.5,14.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bellman and True",1987,150,NA,6.3,79,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bello durmiente, El",1952,75,NA,8.5,12,0,0,0,0,0,0,4.5,24.5,34.5,34.5,"",0,0,1,0,0,0,0 -"Bello, il brutto, il cretino, Il",1967,92,NA,8.2,10,14.5,0,0,0,0,0,14.5,34.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Bello, onesto, emigrato Australia sposerebbe compaesana illibata",1971,107,NA,6.4,73,0,0,4.5,4.5,4.5,24.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Bells Are Ringing",1960,127,2203123,6.8,386,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Bells Go Down, The",1943,90,NA,6.4,23,0,0,0,4.5,14.5,0,24.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bells of Capistrano",1942,78,NA,5.2,13,0,0,0,14.5,24.5,24.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Bells of Coronado",1950,67,NA,5.5,12,0,0,0,4.5,44.5,44.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Bells of Innocence",2003,110,2750000,2.7,82,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Bells of Rosarita",1945,68,NA,6.7,22,0,0,4.5,0,4.5,14.5,44.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Bells of San Angelo",1947,78,NA,4.7,38,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bells of St. Mary's",1937,44,NA,7,11,0,0,0,0,0,14.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Bells of St. Mary's, The",1945,126,NA,7.2,844,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bells, The",1926,92,NA,6.9,42,4.5,0,0,4.5,14.5,24.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Belly",1998,96,10000000,4.5,1034,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Belly of an Architect, The",1987,118,NA,6.4,871,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Belly of the Beast",2003,91,18000000,4.2,638,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Bellyfruit",1999,87,NA,6.2,33,4.5,0,0,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Belma",1995,70,NA,4.3,14,0,4.5,0,4.5,24.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Belmonte",1995,104,NA,7.3,24,4.5,0,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Belo odelo",1999,90,NA,5,43,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Beloe solntse pustyni",1970,85,NA,8.3,290,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,64.5,"",1,0,1,1,0,0,0 -"Belorusskiy vokzal",1970,101,NA,7.1,36,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Beloved",1998,172,53000000,5.6,1934,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Beloved Brat, The",1938,62,NA,6.3,14,0,4.5,0,4.5,0,34.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Beloved Enemy",1936,90,NA,6.3,37,4.5,0,0,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beloved Infidel",1959,123,NA,5.7,100,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beloved Rogue, The",1927,99,NA,7,48,4.5,4.5,0,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Beloved, The",1970,88,NA,3.3,28,34.5,4.5,14.5,14.5,4.5,0,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Belovy",1993,60,NA,8.1,6,0,0,0,0,0,0,0,34.5,45.5,14.5,"",0,0,0,0,1,0,0 -"Below",2002,105,NA,6.3,3175,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Below Utopia",1997,83,NA,4.7,256,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Below Zero",1930,30,NA,7.2,163,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Below the Belt",1971,84,NA,3,11,34.5,4.5,4.5,0,14.5,0,4.5,14.5,0,0,"",1,0,1,0,0,1,0 -"Below the Belt",1980,91,NA,6,14,0,0,0,24.5,24.5,4.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Below the Belt",1999,13,NA,7.1,14,14.5,4.5,0,0,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Below the Belt",2004,95,1500000,7.9,15,0,0,14.5,0,0,0,24.5,0,34.5,24.5,"",0,0,1,0,0,0,0 -"Below the Border",1942,57,NA,5.5,6,0,0,0,34.5,14.5,14.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Below the Sea",1933,78,NA,6.1,5,0,24.5,0,0,0,24.5,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Belstone Fox, The",1973,88,NA,6.2,39,0,0,0,4.5,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Beltenebros",1992,109,NA,5.6,37,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beluga Baby",1978,13,NA,3.3,18,0,45.5,0,0,44.5,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Beluga Speaking Across Time",2002,52,NA,5.7,6,0,0,0,0,34.5,64.5,0,0,0,0,"",0,0,0,0,1,0,0 -"Belva col mitra, La",1977,91,NA,6,76,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Belva dalle calda pelle, La",1982,94,NA,3.8,50,14.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Belye rosy",1983,89,NA,7.3,14,0,0,4.5,0,4.5,0,24.5,4.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Belyy Bim - Chyornoe ukho",1970,182,NA,7.4,66,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Belyy sneg Rossii",1980,91,NA,8.3,7,0,0,0,0,0,14.5,0,24.5,45.5,0,"",0,0,0,1,0,0,0 -"Bem Dotado - O Homem de Itu, O",1979,104,NA,6.8,11,4.5,14.5,0,0,14.5,0,4.5,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Bemani",2002,95,NA,6.8,25,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ben",1972,94,NA,4.6,307,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ben & Arthur",2002,85,NA,1.5,35,64.5,4.5,4.5,0,0,4.5,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ben Harper: Pleasure and Pain",2002,89,NA,6.5,29,0,0,4.5,0,4.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Ben Hur",1907,15,NA,5.5,74,4.5,0,4.5,4.5,0,4.5,14.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Ben Johnson: Third Cowboy on the Right",1996,83,NA,5,26,14.5,0,4.5,0,4.5,14.5,24.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Ben Loke'ah Bat",1982,90,NA,5.7,13,0,4.5,0,0,4.5,34.5,4.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Ben Pollack & His Orchestra",1934,9,NA,5.3,5,0,0,0,0,44.5,24.5,0,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Ben and Me",1953,20,NA,7.4,84,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Ben khong chong",2000,90,NA,5.6,10,0,14.5,0,0,0,34.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ben ming nian",1990,107,NA,7.4,15,0,0,0,0,0,14.5,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ben-Hur",1925,151,3900000,8,848,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Ben-Hur",1959,214,15000000,8.1,21031,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,1,0 -"Bench, The",1995,11,NA,9.2,14,4.5,0,0,0,0,0,4.5,44.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Bend It Like Beckham",2002,115,NA,7.3,14437,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Bend of the River",1952,91,NA,7.4,667,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bende van Hiernaast, De",1980,102,NA,6.2,13,4.5,0,0,0,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bendera",2002,75,NA,6.7,7,0,0,0,0,0,24.5,24.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Beneath Clouds",2002,90,NA,6.6,178,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Beneath Loch Ness",2001,96,NA,2.7,233,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Beneath the 12-Mile Reef",1953,95,NA,5.4,165,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beneath the Planet of the Apes",1970,95,3000000,5.8,3568,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Beneath the Valley of the Ultra-Vixens",1979,93,239000,5.2,402,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Benefit of the Doubt",1993,91,NA,4.7,148,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bengal Brigade",1954,87,NA,5.3,53,0,0,4.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bengazi",1955,79,NA,4.4,23,4.5,4.5,14.5,34.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Bengbulan",1996,82,NA,4.2,30,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bengelchen liebt kreuz und quer",1968,90,NA,1.1,9,64.5,14.5,0,14.5,0,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Beniker Gang, The",1985,87,NA,5.4,66,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Benjamim",2003,109,NA,6,52,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Benjamin",1968,90,NA,6.3,65,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Benjamin Smoke",2000,72,NA,5.7,62,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Benji",1974,86,500000,5.7,679,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Benji the Hunted",1987,88,NA,5.6,296,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Benji: Off the Leash!",2004,97,NA,4.7,93,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"PG",0,0,0,1,0,0,0 -"Benny & Joon",1993,98,NA,6.7,7201,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Benny Goodman Story, The",1955,116,NA,6.3,255,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Benny's Video",1992,105,NA,6.6,299,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bennys badekar",1971,41,NA,7.5,71,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,1,0,0,0,0,1 -"Bensaa suonissa",1970,97,NA,6.2,34,4.5,0,4.5,14.5,4.5,14.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Benson Murder Case, The",1930,65,NA,6,19,4.5,0,4.5,0,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bent",1997,108,NA,6.8,854,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Bent familia",1997,105,NA,5.2,19,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Benvenuta",1983,105,NA,6.6,31,0,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Benzina",2001,90,NA,5.6,63,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beonjijeompeureul hada",2001,107,NA,7.4,222,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Beowulf",1999,99,20000000,3.7,2058,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Bequest to the Nation, A",1973,118,NA,5.8,37,4.5,0,4.5,14.5,4.5,24.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Berdel",1990,85,NA,7.5,22,0,0,4.5,0,0,4.5,0,34.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Beredskapspojkar",1941,93,NA,4.9,11,0,4.5,4.5,24.5,24.5,4.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Bereft",2004,98,NA,6,37,14.5,4.5,4.5,0,14.5,14.5,14.5,4.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Bereg",1984,141,NA,7.3,13,0,4.5,0,0,0,0,34.5,34.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Beregis avtomobilya",1966,94,NA,9,241,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,1,0 -"Beresina oder Die letzten Tage der Schweiz",1999,108,NA,6.7,184,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Beretta's Island",1994,97,NA,2.9,53,44.5,4.5,4.5,4.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Berg ruft!, Der",1938,95,NA,7.1,32,0,0,0,0,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Berg, Der",1990,98,NA,5.7,12,0,0,0,4.5,4.5,14.5,34.5,4.5,24.5,0,"",0,0,0,1,0,0,0 -"Berg-Ejvind och hans hustru",1918,72,NA,7.5,94,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Berge in Flammen",1931,98,NA,9.3,6,14.5,0,0,0,0,0,14.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Bergkatze, Die",1921,79,NA,7.3,50,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Bergkristall",2004,92,NA,6.3,27,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Berkeley Square",1933,84,NA,6.9,24,0,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Berkeley in the '60s",1990,117,NA,7.2,125,4.5,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Berlin",1945,70,NA,7.5,5,24.5,0,0,0,0,0,24.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Berlin - Alexanderplatz",1931,85,NA,7.7,47,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Berlin Affair, The",1985,96,NA,5,67,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Berlin Babylon",2001,88,NA,9,57,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Berlin Berlin",1998,6,NA,9.7,14,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,1,0,0,1 -"Berlin Chamissoplatz",1980,112,NA,7,6,0,0,0,0,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Berlin Correspondent",1942,70,NA,6.1,38,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Berlin Express",1948,87,NA,6.9,236,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Berlin Is In Germany",2001,99,NA,7.9,257,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Berlin Report",1991,100,NA,3.8,9,14.5,14.5,24.5,24.5,24.5,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Berlin in Berlin",1994,99,NA,6.1,77,14.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Berlin um die Ecke",1965,85,NA,6.4,9,0,0,0,0,14.5,44.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Berlin-Cinema",1999,107,NA,4.7,26,14.5,0,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Berlin-Yerushalaim",1989,89,NA,6.4,11,0,0,0,14.5,4.5,4.5,4.5,44.5,4.5,0,"",0,0,0,1,0,0,0 -"Berliner Ballade",1948,89,NA,8.3,15,0,0,0,0,0,14.5,4.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Berliner Bettwurst",1975,90,NA,6.8,6,0,0,0,0,34.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Berlinger - Ein deutsches Abenteuer",1975,115,NA,5.7,20,4.5,0,0,4.5,24.5,24.5,4.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Berlinguer ti voglio bene",1977,95,NA,6.6,76,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bermuda Affair",1956,77,NA,5.9,8,0,0,14.5,0,34.5,14.5,0,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Bermuda Mystery, The",1944,65,NA,5.6,6,0,0,0,0,34.5,45.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Bermuda Triangle, The",1978,80,NA,4.6,45,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Bermuda Triangle, The",1979,93,NA,4.1,43,14.5,14.5,4.5,4.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Bermude: la fossa maledetta",1978,92,NA,2.7,9,24.5,24.5,14.5,0,0,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Bernadette",1988,119,NA,6.6,39,4.5,0,0,4.5,4.5,24.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bernardine",1957,95,NA,6,54,0,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Berndi Broter und der Kasten der Katastrophen",2004,45,NA,7.3,8,0,0,0,0,0,24.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bernie",1996,87,NA,7.4,429,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bersaglio mobile",1967,92,NA,4.9,6,0,0,14.5,0,14.5,0,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Bersaglio sull'autostrada",1988,83,NA,5.3,13,34.5,0,4.5,0,4.5,14.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Berserk!",1968,96,NA,4.6,150,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bert",2002,5,NA,6,20,0,0,4.5,4.5,34.5,14.5,14.5,24.5,0,24.5,"",0,1,0,0,0,0,1 -"Bert - den siste oskulden",1995,100,NA,5.1,181,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bert Rigby, You're a Fool",1989,94,NA,5.5,83,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Berth Marks",1929,20,NA,7.2,75,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Bertoldo, Bertoldino e... Cacasenno",1984,121,NA,5.7,40,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bertolucci secondo il cinema",1975,70,NA,5.8,23,14.5,0,0,0,4.5,34.5,0,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Beruf Neonazi",1993,83,NA,6.1,20,14.5,4.5,0,0,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Besame Mucho",1987,108,NA,8.3,21,0,0,0,0,0,4.5,4.5,64.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Besame Mucho",2000,114,NA,8,18,4.5,0,14.5,0,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Besame mucho",2001,100,NA,5.5,27,0,0,4.5,4.5,14.5,44.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Beschreibung eines Sommers",1963,80,NA,7,6,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,0,0,1,0,1,0 -"Beshkempir",1998,81,NA,7.3,156,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Besieged",1998,93,NA,6.7,995,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Beso de la tierra, El",1999,17,NA,7.6,9,0,24.5,0,0,0,14.5,0,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Beso nocturno",2000,14,NA,6.9,8,0,0,0,0,14.5,24.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,1 -"Besos de gato",2003,82,NA,5.1,30,14.5,4.5,0,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Besos en la frente",1996,95,NA,7.1,43,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Besos en la oscuridad",1991,90,NA,4.5,30,4.5,4.5,4.5,34.5,34.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Besos para todos",2000,101,NA,6.1,102,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Besotted",2001,92,NA,4,13,64.5,0,0,0,0,0,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Bespoke Overcoat, The",1956,33,NA,6.2,19,0,0,0,14.5,0,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Bespredel",1989,102,NA,4.6,5,24.5,0,24.5,0,0,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Bespridannitsa",1937,86,NA,7.5,7,0,0,0,0,14.5,14.5,14.5,24.5,24.5,0,"",0,0,0,1,0,1,0 -"Besser als Schule",2004,90,NA,3.9,63,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Best",2000,102,NA,5.3,130,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Best Boy",1979,111,NA,7.4,130,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Best Defense",1984,94,NA,3.3,1303,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Best Foot Forward",1943,94,1125502,6.2,97,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Best Friends",1975,83,NA,4.7,28,14.5,4.5,4.5,0,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Best Friends",1982,116,NA,5.1,434,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Best Hotel on Skid Row",1990,48,NA,9.4,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,0,0,1,0,0 -"Best House in London, The",1969,97,NA,5,40,4.5,14.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Best Laid Plans",1999,92,7000000,6.3,1795,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Best Little Warehouse in L.A., The",1982,79,NA,8.2,7,0,0,0,0,14.5,14.5,0,24.5,44.5,0,"",0,0,0,0,0,0,0 -"Best Little Whorehouse in Texas, The",1982,114,NA,5,1670,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Best Man Wins, The",1935,75,NA,4.3,7,0,14.5,14.5,24.5,14.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Best Man in Grass Creek",1999,88,NA,5.7,69,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG",0,0,1,0,0,1,0 -"Best Man, The",1964,102,NA,7.7,374,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Best Man: 'Best Boy' and All of Us Twenty Years Later",1997,90,NA,5.2,25,4.5,0,0,0,4.5,14.5,14.5,34.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Best Men",1997,90,NA,5.6,787,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Best Revenge",1982,96,NA,3.6,22,14.5,4.5,24.5,14.5,14.5,4.5,0,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Best Revenge, The",1996,88,NA,4.2,10,0,0,14.5,44.5,14.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Best Seller",1987,95,NA,6.3,714,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Best Thief in the World, The",2004,93,NA,2.7,113,14.5,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Best Things in Life Are Free, The",1956,104,NA,5.8,69,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Best Two Years, The",2003,112,NA,7,174,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"PG",0,0,1,0,0,0,0 -"Best Years of Our Lives, The",1946,172,2100000,8.4,6138,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Best in Show",2000,90,6000000,7.5,11790,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Best of Cinerama",1963,142,NA,8.1,7,0,0,0,0,0,0,0,44.5,0,45.5,"",0,0,0,0,1,0,0 -"Best of Enemies, The",1962,104,NA,6.9,102,0,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Best of Everything, The",1959,121,NA,6.3,266,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Best of Friends, The",1981,97,NA,4.6,7,14.5,0,0,24.5,44.5,14.5,0,0,0,0,"",0,0,1,0,0,1,0 -"Best of Sex and Violence, The",1981,76,NA,4.9,33,4.5,4.5,4.5,0,14.5,4.5,4.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Best of Times, The",1986,104,NA,5.6,956,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Best of Walt Disney's True-Life Adventures, The",1975,89,NA,7.6,12,14.5,0,0,0,0,0,44.5,0,0,44.5,"",0,0,0,0,1,0,0 -"Best of the Badmen",1951,84,NA,6.1,50,4.5,0,0,4.5,14.5,34.5,34.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Best of the Best",1989,97,NA,5.3,1168,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Best of the Best 2",1993,101,NA,4.4,548,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Best of the Best 3: No Turning Back",1995,90,NA,4.4,255,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Best of the Best: Without Warning",1999,90,NA,4.3,96,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Best of the Martial Arts Films, The",1990,90,NA,6.9,109,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",1,0,0,0,1,0,0 -"Bestia desnuda, La",1971,85,NA,4.9,5,24.5,0,0,0,0,24.5,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Bestia in calore, La",1977,86,NA,4.3,86,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bestia nello spazio, La",1978,70,NA,1.9,12,44.5,4.5,14.5,14.5,0,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Bestia uccide a sangue freddo, La",1971,89,NA,5.2,93,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bestiario",2002,86,NA,5.3,6,14.5,34.5,0,0,14.5,0,0,34.5,0,0,"",0,0,0,1,0,0,0 -"Bestije",1977,103,NA,6.8,7,0,0,14.5,0,14.5,14.5,14.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Bestione, Il",1974,100,NA,5,14,24.5,0,0,0,14.5,4.5,34.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Bet, The",1992,21,NA,6.5,17,0,4.5,4.5,0,14.5,14.5,44.5,0,4.5,14.5,"",0,0,0,1,0,0,1 -"Beta",1992,171,NA,7.1,37,0,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Beta Som",1963,99,NA,6.3,5,0,0,0,0,44.5,0,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Betaab",1983,162,NA,7.4,11,0,0,0,0,0,0,24.5,34.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Betaville",2001,99,NA,5.2,5,24.5,24.5,24.5,0,0,0,0,0,0,44.5,"PG-13",0,0,1,0,0,0,0 -"Beth",2002,84,NA,6,7,24.5,0,0,0,14.5,0,14.5,14.5,0,24.5,"",0,0,0,1,0,1,0 -"Bethune: The Making of a Hero",1990,168,NA,6.5,85,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Betrayal",1983,95,NA,7,282,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Betrayal",2003,90,750000,4.7,157,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Betrayal from the East",1945,82,NA,5.2,34,4.5,0,4.5,4.5,34.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Betrayal of the Dove",1993,93,NA,4,150,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Betrayed",1954,108,NA,5.7,151,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Betrayed",1988,126,NA,6,990,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Betrayed Women",1955,70,NA,4.7,7,0,0,14.5,24.5,14.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Betrayed by a Handprint",1908,9,NA,4.1,6,34.5,0,0,0,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Betsy's Wedding",1990,94,NA,5.6,866,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Betsy, The",1978,125,NA,4.4,312,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bettelstudent, Der",1956,90,NA,5,9,0,0,0,24.5,24.5,24.5,0,34.5,0,0,"",0,0,0,0,0,1,0 -"Better 'Ole, The",1926,95,NA,6.1,33,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Better Late Than Never",1982,95,NA,4.7,27,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Better Living",1998,95,NA,3.2,38,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Better Living Through Circuitry",1999,85,NA,6.9,158,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,1,0,0 -"Better Luck Tomorrow",2002,98,250000,7.3,2697,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Better Off Dead...",1985,97,NA,7.2,8109,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Better Place, A",1997,87,100000,5.8,447,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Better Than Chocolate",1999,102,NA,6.3,1513,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Better Than Ever",1997,85,NA,5.2,5,0,0,44.5,0,24.5,0,24.5,24.5,0,0,"",1,0,1,0,0,0,0 -"Better Than Sex",2000,80,NA,6.3,527,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,1,0,0,1,0 -"Better Than Sex",2002,92,300000,6.8,90,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Better Way to Die, A",2000,97,NA,5.6,458,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Better or Worse?",2000,9,NA,5.2,22,4.5,4.5,4.5,4.5,34.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,1 -"Bettie Page: Dark Angel",2004,90,50000,3.4,21,24.5,4.5,4.5,4.5,4.5,0,4.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Betting the Game",2000,12,NA,3.9,59,4.5,4.5,0,4.5,0,0,4.5,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Bettwurst, Die",1971,81,NA,6.2,66,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,1,0 -"Betty",1992,103,NA,6.8,158,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Betty",1997,87,NA,5.4,36,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Betty Blowtorch (And Her Amazing True Life Adventures)",2003,98,NA,7.3,10,0,14.5,0,0,0,0,14.5,24.5,34.5,34.5,"",0,0,0,1,1,0,0 -"Betty Boop Limited, The",1932,7,NA,7.6,6,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Betty Boop and Grampy",1935,7,NA,7.3,26,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Betty Boop and Little Jimmy",1936,6,NA,5.6,22,4.5,0,4.5,0,24.5,34.5,4.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Betty Boop and the Little King",1936,7,NA,7.3,28,0,4.5,4.5,0,4.5,24.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Betty Boop for President",1932,7,NA,6.2,20,14.5,0,0,4.5,14.5,24.5,14.5,4.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Betty Boop with Henry",1935,7,NA,4.9,29,4.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Betty Boop's Bamboo Isle",1932,8,NA,6.7,25,0,0,4.5,4.5,14.5,4.5,14.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Betty Boop's Big Boss",1933,7,NA,6.5,12,0,0,0,14.5,4.5,24.5,4.5,14.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Betty Boop's Birthday Party",1933,7,NA,5.7,13,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,0,"",0,1,0,0,0,0,1 -"Betty Boop's Bizzy Bee",1932,7,NA,5.3,17,14.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Betty Boop's Crazy Inventions",1933,7,NA,6.2,30,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Betty Boop's Halloween Party",1933,7,NA,6.6,14,0,0,0,0,24.5,14.5,14.5,4.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Betty Boop's Ker-Choo",1933,6,NA,6.9,23,0,0,0,0,14.5,34.5,34.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Betty Boop's Life Guard",1934,7,NA,5.2,6,0,0,14.5,14.5,0,34.5,34.5,0,0,0,"",0,1,0,0,0,0,1 -"Betty Boop's Little Pal",1934,7,NA,5.1,5,0,0,0,24.5,64.5,0,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Betty Boop's May Party",1933,7,NA,6.4,11,0,0,0,0,4.5,44.5,4.5,34.5,0,0,"",0,1,0,0,0,0,1 -"Betty Boop's Museum",1932,7,NA,6,14,0,0,0,4.5,24.5,14.5,14.5,24.5,4.5,0,"",0,1,0,0,0,0,1 -"Betty Boop's Penthouse",1933,7,NA,7.2,17,0,0,0,0,14.5,14.5,44.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Betty Boop's Rise to Fame",1934,9,NA,5.7,23,0,4.5,4.5,4.5,14.5,44.5,14.5,0,4.5,4.5,"",0,1,1,0,0,0,1 -"Betty Boop's Trial",1934,7,NA,6.1,6,0,0,0,0,14.5,34.5,45.5,0,0,0,"",0,1,0,0,0,0,1 -"Betty Boop's Ups and Downs",1932,7,NA,6.4,12,0,0,4.5,4.5,4.5,24.5,34.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Betty Boop, MD",1932,7,NA,7.2,10,0,0,0,0,0,14.5,24.5,45.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Betty Fisher et autres histoires",2001,103,NA,7,495,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Betty in Blunderland",1934,7,NA,6.4,31,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Between",2005,90,NA,1.9,36,14.5,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Between Fighting Men",1932,59,NA,4.5,7,0,0,14.5,24.5,24.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Between Friends",1973,91,NA,5.1,7,14.5,0,0,0,14.5,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Between Girls",1998,26,NA,7.2,5,0,0,0,44.5,0,0,0,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Between Heaven and Hell",1956,94,NA,6.4,125,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Between Lovers",1983,85,NA,5.3,5,0,0,0,44.5,0,0,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Between Men",1935,60,NA,5.6,12,0,0,4.5,4.5,4.5,24.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Between Midnight and Dawn",1950,89,NA,5.9,19,0,0,0,0,24.5,24.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Between Showers",1914,15,NA,5.7,62,0,0,4.5,14.5,14.5,34.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Between Strangers",2002,95,NA,6.1,204,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Between Two Women",1937,88,NA,6.3,33,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Between Two Women",1945,83,NA,5.3,7,0,0,0,24.5,24.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Between Two Women",2000,92,NA,3.7,67,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Between Two Worlds",1944,112,NA,7.1,219,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Between Wars",1974,100,NA,5.1,13,4.5,0,0,14.5,24.5,24.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Between the Acts at the Opera",1926,12,NA,4.8,6,0,14.5,0,0,45.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Between the Cheeks",1985,76,NA,7.2,31,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Between the Devil and the Deep Blue Sea",1995,95,NA,7.5,149,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Between the Lies",1997,90,NA,3,20,24.5,14.5,14.5,4.5,14.5,0,14.5,0,14.5,24.5,"R",0,0,0,1,0,0,0 -"Between the Lines",1977,101,NA,6.5,125,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Between the Sheets",1998,102,NA,5.1,12,4.5,0,0,0,24.5,4.5,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Between the Teeth",1994,71,NA,7.3,14,0,0,0,0,14.5,0,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Beuze, La",2003,93,NA,4.7,199,14.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beverly Hillbillies, The",1993,92,NA,4.3,2651,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beverly Hills Bodysnatchers",1989,85,NA,2.7,22,24.5,4.5,14.5,24.5,4.5,4.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Beverly Hills Brats",1989,90,NA,3.7,62,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Beverly Hills Cop",1984,105,15000000,7.1,16360,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Beverly Hills Cop II",1987,100,20000000,5.8,10446,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Beverly Hills Cop III",1994,104,50000000,4.7,6519,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Beverly Hills Cox",1986,85,NA,6.7,13,4.5,0,4.5,0,14.5,4.5,34.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Beverly Hills Exposed",1985,92,NA,6.4,5,0,0,24.5,0,0,24.5,0,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Beverly Hills Ninja",1997,88,NA,4.7,3468,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Beverly Hills Vamp",1988,88,NA,3.6,73,14.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Beware",1946,54,NA,4.6,6,0,0,0,14.5,34.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Beware Spooks!",1939,65,NA,5.6,11,0,0,0,4.5,34.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beware of Barnacle Bill",1935,6,NA,7.9,17,0,0,0,0,4.5,4.5,14.5,24.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Beware of Blondie",1950,64,NA,5.5,35,14.5,4.5,4.5,4.5,34.5,4.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beware of Ladies",1937,53,NA,3.1,6,14.5,0,0,34.5,34.5,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Beware of Pity",1946,105,NA,5.5,20,14.5,0,4.5,14.5,0,45.5,14.5,0,14.5,4.5,"",0,0,0,1,0,1,0 -"Beware! The Blob",1972,91,NA,3.8,220,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beware, My Lovely",1952,77,NA,6.3,156,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beware: Children at Play",1989,94,NA,3.2,125,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Bewegte Mann, Der",1994,93,NA,6.7,1492,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bewitched",1945,65,NA,5.1,49,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bewitched Bunny",1954,7,NA,7.5,89,4.5,0,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Beyond 'JFK': The Question of Conspiracy",1992,90,NA,4.8,107,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Beyond Atlantis",1973,91,200000,3.9,47,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Beyond Barbed Wire",1997,88,NA,7.7,21,0,0,0,0,0,4.5,4.5,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Beyond Bedlam",1993,89,NA,3.3,165,24.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Beyond Borders",2003,127,35000000,5.4,1905,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Beyond Borders: John Sayles in Mexico",2003,56,NA,6.1,11,4.5,14.5,0,0,0,24.5,0,34.5,0,4.5,"",0,0,0,0,1,0,0 -"Beyond Desire",1994,81,NA,5,6,14.5,0,14.5,14.5,0,14.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Beyond Desire",1996,87,NA,4.6,92,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Beyond Evil",1980,94,NA,3.3,45,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beyond Expectations",1998,94,60000,7.6,5,0,0,24.5,0,0,0,24.5,0,44.5,24.5,"",0,0,1,0,0,0,0 -"Beyond Fear",1993,84,NA,5.5,13,14.5,0,0,24.5,0,24.5,14.5,0,14.5,4.5,"",1,0,0,0,0,0,0 -"Beyond Glory",1948,82,NA,6.3,10,0,0,14.5,14.5,14.5,34.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Beyond Grandpa",1998,4,NA,8.8,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Beyond Gravity",1988,48,NA,7,5,0,0,24.5,0,0,0,24.5,44.5,24.5,0,"",0,0,1,0,0,0,0 -"Beyond Justice",1992,113,NA,4.2,76,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Beyond Mombasa",1956,90,NA,5.2,20,0,4.5,14.5,14.5,24.5,14.5,24.5,14.5,4.5,0,"",1,0,0,0,0,0,0 -"Beyond Paradise",1998,105,NA,5,41,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Beyond Rangoon",1995,100,23000000,6.4,1285,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Beyond Re-Animator",2003,96,3000000,6.1,908,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Beyond Reason",1977,88,NA,4.3,15,24.5,4.5,4.5,24.5,0,24.5,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Beyond Reasonable Doubt",1980,129,NA,6.2,41,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Beyond Suspicion",1997,44,NA,1.9,11,24.5,0,4.5,4.5,4.5,24.5,0,0,4.5,4.5,"",0,0,0,0,0,0,1 -"Beyond Therapy",1987,93,NA,3.8,238,14.5,14.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Beyond This Place",1959,90,NA,6.4,24,0,0,0,0,4.5,14.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Beyond Tomorrow",1940,84,NA,6.1,60,0,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Beyond Vanilla",2001,92,NA,6.3,46,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Beyond Victory",1931,70,NA,4.9,12,0,4.5,4.5,4.5,34.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Beyond a Reasonable Doubt",1956,80,NA,6.8,317,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Beyond and Back",1978,93,NA,4,27,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Beyond the 7th Door",1987,83,NA,3.7,13,14.5,14.5,0,14.5,0,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Beyond the Blue Horizon",1942,76,NA,6.2,18,0,0,0,14.5,14.5,4.5,14.5,24.5,0,24.5,"",0,0,1,1,0,0,0 -"Beyond the Call of Duty",1992,85,NA,4.3,31,4.5,14.5,0,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Beyond the City Limits",2001,91,NA,4.5,219,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Beyond the Door III",1989,94,NA,3.3,51,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Beyond the Forest",1949,89,NA,6.3,268,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Beyond the Gates of Splendor",2005,96,NA,8.9,15,0,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"PG-13",0,0,0,0,1,0,0 -"Beyond the Law",1930,60,NA,5.6,5,0,0,0,0,44.5,0,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Beyond the Law",1992,108,NA,5.5,744,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Beyond the Limits",2003,100,NA,3.7,188,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beyond the Line of Duty",1942,22,NA,4.3,42,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Beyond the Mat",1999,108,500000,7.3,2243,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,0,1,0,0 -"Beyond the Next Mountain",1987,97,NA,8.9,7,0,0,0,0,0,0,0,24.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Beyond the Ocean",2000,89,NA,3.8,12,24.5,4.5,4.5,14.5,0,4.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Beyond the Pale",1999,96,350000,6.2,62,4.5,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Beyond the Poseidon Adventure",1979,114,NA,4.4,956,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Beyond the Purple Hills",1950,69,NA,6.1,12,0,0,0,0,34.5,45.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Beyond the Rising Moon",1987,84,NA,4,27,24.5,4.5,4.5,14.5,14.5,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Beyond the Rockies",1932,54,NA,5.5,20,0,0,0,4.5,64.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Beyond the Rocks",1922,81,NA,5.1,13,4.5,0,0,0,4.5,14.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Beyond the Sacramento",1940,58,NA,5.4,6,0,0,14.5,0,0,45.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Beyond the Sea",2004,118,24000000,6.7,1051,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Beyond the Time Barrier",1960,75,125000,4.3,79,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Beyond the Valley of the Dolls",1970,111,900000,5.4,1575,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Beyond the Wall of Sleep",2004,84,NA,1,16,45.5,0,0,0,4.5,0,0,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bez konca",1985,109,NA,7.5,165,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bez milosci",1980,103,NA,6.6,6,0,0,0,0,34.5,14.5,0,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Bez strakha",1971,96,NA,7.8,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Bez svideteley",1983,95,NA,5.8,37,0,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bez znieczulenia",1978,135,NA,7.1,68,4.5,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bezeten - Het gat in de muur",1969,100,NA,5.1,12,4.5,0,14.5,4.5,14.5,4.5,0,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Bezness",1992,100,NA,6.5,22,0,4.5,0,0,4.5,24.5,4.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bhagwat Geeta",1993,140,NA,8.8,5,0,0,0,24.5,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Bhaji on the Beach",1993,100,NA,6.6,275,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Bharatham",1991,147,NA,9.2,11,0,0,0,0,0,0,4.5,4.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Bhavni Bhavai",1980,125,NA,8,12,4.5,0,0,0,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Bhavum",2002,111,NA,6.5,6,0,0,0,14.5,0,34.5,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Bhoot",2003,113,NA,5.3,127,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bhopal Express",1999,100,NA,8,65,4.5,0,0,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Bhowani Junction",1956,110,NA,6,224,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Bhumika: The Role",1977,142,NA,7.8,36,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Bhuvan Shome",1969,96,NA,6.7,13,0,0,0,0,4.5,0,14.5,34.5,0,44.5,"",0,0,0,0,0,0,0 -"Bi and Beyond",1988,77,NA,5.4,5,0,0,44.5,0,24.5,0,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Bi e il Ba, Il",1986,90,NA,5.4,18,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Bi xie lan tian",1998,96,NA,5.5,136,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Bialy smok",1986,89,NA,3.4,24,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bian Lian",1996,96,NA,7.5,808,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Bian zou bian chang",1991,103,NA,6.9,148,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bianca",1983,96,NA,6.8,362,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Bianco Apache",1986,100,NA,4.6,9,14.5,0,24.5,14.5,0,24.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bianco, il giallo, il nero, Il",1975,99,NA,4.4,44,14.5,0,4.5,14.5,24.5,4.5,14.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Bianco, rosso e Verdone",1981,110,NA,7.1,161,4.5,0,0,0,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bianco, rosso e...",1972,94,NA,3.4,15,24.5,14.5,24.5,4.5,4.5,4.5,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Biandan, guniang",1998,90,NA,5.8,57,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bibi Blocksberg",2002,102,NA,5.7,90,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bibi Blocksberg und das Geheimnis der blauen Eulen",2004,119,NA,6.1,21,4.5,4.5,4.5,4.5,0,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bibi Fricotin",1951,89,NA,6.4,5,0,0,24.5,44.5,0,0,0,44.5,0,0,"",0,0,1,0,0,0,0 -"Bible and Gun Club, The",1996,87,NA,7.1,59,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Bible!",1974,84,35000,3.6,11,24.5,0,14.5,0,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,1,0 -"Bible, The",1966,174,18000000,5.2,411,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Biblia negra, La",2001,90,NA,3.4,7,24.5,14.5,24.5,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Bibo per sempre",2000,95,NA,4.9,10,24.5,0,0,24.5,34.5,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Bice bolje",1994,84,NA,5,10,24.5,24.5,0,0,14.5,24.5,14.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Bice skoro propast sveta",1968,84,NA,6.1,21,4.5,0,0,4.5,14.5,14.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bicentennial Man",1999,132,100000000,6.2,8925,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,0,1,0,1,0 -"Bicheongwon",1980,82,NA,5.1,9,24.5,0,0,0,14.5,24.5,14.5,24.5,0,14.5,"",1,0,0,1,0,0,0 -"Biches, Les",1968,105,NA,6.9,278,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bichhoo",2000,160,NA,5.4,27,14.5,0,4.5,14.5,4.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Bicicletas son para el verano, Las",1984,103,NA,7.6,122,4.5,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bicycleran",1987,95,NA,7.4,110,4.5,4.5,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Bicyclettes de Belsize, Les",1969,29,NA,9,10,0,0,0,0,0,14.5,0,34.5,0,64.5,"",0,0,0,0,0,0,1 -"Bidasses au pensionnat, Les",1978,90,NA,4.2,7,24.5,14.5,0,24.5,0,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Bidasses aux grandes manoeuvres, Les",1981,90,NA,2.2,12,24.5,14.5,14.5,14.5,4.5,0,4.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Bidasses en folie, Les",1971,95,NA,3.8,44,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bidasses s'en vont en guerre, Les",1974,90,NA,4.5,67,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bidaya wa nihaya",1960,130,NA,7.8,15,0,0,0,0,0,0,14.5,24.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Bidaya, al-",1986,123,NA,5.9,19,0,0,4.5,0,14.5,0,0,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Bidone, Il",1955,91,NA,7.5,347,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bidoni",1995,95,NA,5.7,7,0,0,0,14.5,24.5,14.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Bien esquivo, El",2001,130,NA,6.1,29,4.5,4.5,4.5,4.5,0,14.5,34.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Bienfaiteur, Le",1942,88,NA,5.8,6,0,0,0,0,34.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bienvenido Mister Marshall",1953,78,NA,8.8,408,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Bienvenido-Welcome",1995,102,NA,5.6,35,4.5,4.5,0,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Bienvenue chez les Rozes",2003,90,NA,5.9,137,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bienvenue en Suisse",2004,105,NA,5.6,45,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bierkampf",1977,85,NA,7.1,20,0,0,0,0,4.5,4.5,34.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Biffen och Bananen",1951,95,NA,4.5,13,0,0,34.5,14.5,34.5,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Big",1988,104,18000000,7.2,18660,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Big Ain't Bad",2002,118,NA,5.9,15,0,24.5,0,0,0,4.5,14.5,0,14.5,44.5,"R",0,0,0,0,0,0,0 -"Big Bad John",1990,92,NA,5.1,31,4.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Big Bad Love",2001,111,NA,5.6,189,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Big Bad Mama",1974,83,NA,5.3,308,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Big Bad Mama II",1987,83,NA,3.9,159,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Big Bad Sindbad",1952,9,NA,5.7,17,0,0,0,4.5,24.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Big Bad Wolf, The",1934,9,NA,7.1,80,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Big Bad Wolfe",1936,7,NA,3.8,8,14.5,24.5,0,0,24.5,14.5,0,24.5,0,0,"",0,1,0,0,0,0,1 -"Big Bang, The",1989,81,NA,5.8,57,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Big Beat, The",1958,81,NA,4.8,16,0,0,14.5,14.5,24.5,14.5,4.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Big Ben: Ben Webster in Europe",1967,31,NA,7.7,7,0,0,14.5,0,0,0,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Big Bird Cage, The",1972,96,NA,4.7,140,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Big Blockade, The",1940,73,NA,4.9,14,24.5,4.5,4.5,4.5,24.5,24.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Big Bluff, The",1955,70,NA,5.5,8,0,14.5,0,14.5,45.5,0,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Big Bonanza, The",1944,70,NA,6,12,0,0,0,4.5,24.5,24.5,34.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Big Boodle, The",1957,84,NA,4.5,20,0,0,14.5,24.5,14.5,14.5,14.5,4.5,24.5,0,"",0,0,0,1,0,0,0 -"Big Bounce, The",1969,102,NA,4.4,54,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Big Bounce, The",2004,88,50000000,4.7,2505,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Big Boy",1930,68,NA,6.5,15,0,0,0,4.5,24.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Big Brass Ring, The",1997,6,NA,4.5,24,4.5,4.5,4.5,34.5,4.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Big Brass Ring, The",1999,104,7000000,5.4,271,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Big Brawl, The",1980,95,NA,5.2,591,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Big Broadcast of 1936, The",1935,97,NA,5.9,34,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Big Broadcast of 1937, The",1936,100,NA,6.7,31,0,0,4.5,4.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Big Broadcast of 1938, The",1938,94,NA,6.3,162,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Big Broadcast, The",1932,80,NA,6.7,42,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Big Brown Eyes",1936,77,NA,5.7,31,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Big Bully",1996,90,15000000,4.2,781,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"Big Bus, The",1976,88,NA,5.1,636,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Big Business",1929,19,NA,8.5,312,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Big Business",1988,97,NA,5.7,1773,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Big Business Girl",1931,75,NA,5.1,11,0,0,4.5,4.5,14.5,34.5,24.5,0,0,0,"",0,0,1,0,0,1,0 -"Big Cage, The",1933,82,NA,4.8,7,0,0,14.5,14.5,24.5,24.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Big Calibre",1935,58,NA,4.2,7,0,14.5,14.5,0,44.5,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Big Canyon",1999,15,NA,6,20,0,0,4.5,14.5,24.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Big Caper, The",1957,84,NA,5.6,14,0,0,4.5,0,24.5,14.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Big Cat, The",1949,75,NA,5.4,27,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Big Chance, The",1933,62,NA,4.6,6,0,0,14.5,45.5,14.5,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Big Chase, The",1954,60,NA,4.4,6,0,14.5,0,14.5,34.5,34.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Big Chief Ugh-Amugh-Ugh",1938,7,NA,6,10,0,0,14.5,24.5,14.5,0,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Big Chill, The",1983,105,NA,7.1,6401,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Big Circus, The",1959,109,NA,6.2,87,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Big City",1937,80,NA,6.3,43,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Big City",1948,103,NA,5.4,36,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Big City Blues",1932,63,NA,6.5,53,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Big City Dick: Richard Peterson's First Movie",2004,129,NA,8.4,8,0,0,0,0,0,14.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Big City Fantasy",1934,10,NA,6.7,9,0,0,0,0,24.5,14.5,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Big Clock, The",1948,95,NA,7.6,642,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Big Combo, The",1955,89,NA,7.5,414,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Big Country, The",1958,165,NA,7.5,1793,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Big Cube, The",1969,98,NA,4,25,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Big Daddy",1999,93,34200000,5.9,18258,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Big Dis, The",1989,84,NA,4.3,10,0,0,24.5,24.5,34.5,0,0,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Big Dog House, The",1930,17,NA,4.9,14,4.5,0,0,0,14.5,4.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Big Doll House, The",1971,95,125000,4.6,194,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Big Durian, The",2003,75,NA,8.2,16,14.5,0,0,0,4.5,0,14.5,14.5,24.5,24.5,"",0,0,0,1,1,0,0 -"Big Easy, The",1987,108,NA,6.6,2956,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Big Eden",2000,117,NA,7.4,842,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG-13",0,0,0,1,0,1,0 -"Big Empty, The",1997,96,NA,5.5,47,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Big Empty, The",2003,94,NA,5.9,696,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Big Fall, The",1996,90,NA,4.1,34,4.5,14.5,4.5,4.5,34.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Big Fat Liar",2002,88,15000000,5.5,2453,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Big Fella",1937,73,NA,6.5,19,0,0,0,14.5,4.5,24.5,34.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Big Finish, The",2000,94,NA,8.5,17,14.5,0,4.5,0,0,0,14.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Big Fish",2003,125,70000000,8.1,31525,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Big Fisherman, The",1959,180,4000000,5.8,54,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Big Fix, The",1978,108,NA,6.3,237,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Big Flash, The",1932,20,NA,4.1,5,0,24.5,24.5,0,0,64.5,0,0,0,0,"",0,0,1,0,0,0,1 -"Big Freeze, The",1993,45,NA,7.4,15,14.5,4.5,0,4.5,0,4.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Big Gamble, The",1961,100,NA,5,25,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Big Game Haunt",1968,6,NA,5.9,11,4.5,0,4.5,14.5,24.5,0,0,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Big Game, The",1936,74,NA,4.7,8,0,0,0,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Big Girls Don't Cry... They Get Even",1992,96,NA,5.5,269,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Big Green, The",1995,100,NA,4.6,610,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Big Guy, The",1939,78,NA,6.7,5,0,0,0,0,0,44.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Big Hand for the Little Lady, A",1966,95,NA,7,559,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Big Hangover, The",1950,82,NA,5.4,32,0,0,4.5,14.5,34.5,4.5,14.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Big Headache, The",2001,12,NA,5.8,8,0,0,14.5,24.5,0,24.5,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Big Heat, The",1953,89,NA,7.8,1645,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Big Heel-Watha",1944,8,NA,7.3,25,0,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Big Helium Dog",1999,89,NA,3.7,196,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Big Hit, The",1998,91,13000000,5.7,6206,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Big House Bunny",1950,7,NA,6.8,91,0,4.5,0,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Big House, The",1930,87,NA,7.5,178,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Big House, The",2000,24,NA,5.1,26,14.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Big House, U.S.A.",1955,83,NA,6.1,56,4.5,0,4.5,4.5,4.5,24.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Big Hurt, The",1985,93,NA,4.2,17,0,4.5,14.5,24.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Big Idea, The",1934,19,NA,6.9,14,0,0,0,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Big Jack",1949,85,NA,6.5,18,0,0,0,0,14.5,34.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Big Jake",1971,110,NA,6.6,1139,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Big Jim McLain",1952,90,826000,4.3,266,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Big Job, The",1965,85,NA,6,69,4.5,0,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Big Kahuna, The",1999,90,NA,6.6,3724,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Big Knife, The",1955,111,NA,7,279,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Big Land, The",1957,92,NA,6.2,46,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Big Leaguer",1953,71,NA,5.7,43,4.5,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Big Lebowski, The",1998,117,15000000,8,50179,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"R",0,0,1,0,0,0,0 -"Big Lift, The",1950,120,NA,6.1,128,4.5,0,4.5,4.5,24.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Big Man on Campus",1989,105,NA,5,339,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Big Man, The",1990,93,NA,5.3,138,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Big Meat Eater",1982,82,NA,5.7,58,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Big Melons 5",1985,60,NA,9,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Big Momma's House",2000,98,30000000,4.7,7509,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Big Monster on Campus",2000,92,NA,4,131,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Big Mouth, The",1967,107,NA,5.4,133,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Big Muddy, The",1998,90,NA,4.4,15,4.5,4.5,4.5,0,0,4.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Big News",1929,75,NA,5.2,14,4.5,4.5,0,4.5,24.5,4.5,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Big Night",1996,107,NA,7.3,4563,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Big Night, The",1951,75,NA,5.9,38,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Big Night, The",1960,74,NA,5.7,6,0,0,0,0,64.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Big Noise, The",1944,74,NA,5.2,75,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Big One, The",1997,91,NA,7.5,2395,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,1,0,1,0,0 -"Big Parade of Comedy, The",1964,90,NA,6.5,71,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,1,0,0 -"Big Parade, The",1925,126,245000,8.7,435,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Big Pickle, The",1997,14,NA,6.2,10,24.5,24.5,0,0,0,0,0,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Big Picture, The",1989,100,5000000,6.4,1124,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Big Pink, The",1994,72,NA,7,6,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,0,0,0,1,0,0 -"Big Pond, The",1930,72,NA,4.9,19,14.5,4.5,0,4.5,14.5,4.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Big Premiere, The",1940,11,NA,5.9,8,0,0,14.5,0,14.5,14.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Big Question, The",2004,60,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Big Rascal",1979,93,NA,6.5,6,0,0,0,0,34.5,0,45.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Big Red",1962,89,NA,5.9,101,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Big Red One, The",1980,158,NA,7.1,1838,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Big Revue, The",1929,8,NA,7.4,12,0,0,0,0,14.5,4.5,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Big Score, The",1983,85,NA,4.4,32,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Big Shakedown, The",1934,64,NA,6.1,90,0,4.5,4.5,4.5,4.5,24.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Big Shave, The",1967,6,NA,6.9,354,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Big Shot, The",1931,66,NA,6.8,11,0,0,0,0,4.5,14.5,64.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Big Shot, The",1937,60,NA,5.9,11,0,0,0,0,4.5,45.5,24.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Big Shot, The",1942,82,NA,6.4,79,0,4.5,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Big Shots",1987,94,NA,4.9,125,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Big Show, The",1936,70,NA,5.5,29,0,4.5,0,24.5,14.5,34.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Big Show, The",1961,113,NA,5.8,36,0,0,4.5,14.5,14.5,24.5,34.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Big Sister, The",1995,10,NA,8.1,7,14.5,0,0,0,0,0,0,14.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Big Sky, The",1952,122,NA,7,413,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Big Sleep, The",1946,116,NA,8.3,9980,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Big Sleep, The",1978,99,NA,5.4,535,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Big Snatch, The",1968,77,11000,4.4,17,14.5,14.5,14.5,0,4.5,4.5,4.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Big Snit, The",1985,10,NA,8.4,189,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,1,0,0,0,1 -"Big Snooze, The",1946,7,NA,7.5,106,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Big Sombrero, The",1949,82,NA,5.8,15,0,0,24.5,0,14.5,14.5,34.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Big Split, The",1999,90,NA,5.8,25,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Big Squeeze, The",1996,98,NA,4.8,105,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Big Stakes",1922,61,NA,5.2,9,0,14.5,0,24.5,24.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Big Stampede, The",1932,54,NA,4.6,52,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Big Steal, The",1949,71,NA,7.2,311,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Big Steal, The",1990,99,NA,6.4,195,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Big Store, The",1941,83,NA,6.4,609,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Big Story, The",1994,2,NA,7.3,41,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Big Street, The",1942,88,NA,5.8,112,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Big Sur, The",1965,9,NA,5.8,17,0,0,0,4.5,44.5,24.5,14.5,0,0,4.5,"",0,0,0,0,1,0,1 -"Big Swap, The",1998,122,NA,5.9,103,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Big Switch, The",1969,68,NA,4,6,14.5,14.5,14.5,14.5,34.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Big Switch, The",1985,90,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Big T.N.T. Show, The",1966,93,NA,7.7,51,4.5,4.5,4.5,4.5,0,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Big Tease, The",1999,86,4000000,6.1,670,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Big Thing, The",2004,9,NA,9,7,0,0,0,0,0,0,24.5,0,14.5,45.5,"",0,0,1,0,0,0,1 -"Big Time",2001,92,NA,6.8,12,0,0,0,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,1,0,0 -"Big Time",2004,29,NA,7.8,14,14.5,4.5,0,0,0,0,0,14.5,4.5,45.5,"R",0,0,0,0,0,0,0 -"Big Tip Off, The",1955,78,NA,5,6,0,0,14.5,0,14.5,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Big Top Bunny",1951,7,NA,6.6,94,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Big Top Pee-wee",1988,86,NA,4.5,1767,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Big Town After Dark",1947,69,NA,5.3,12,0,0,0,14.5,14.5,45.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Big Town Scandal",1948,60,NA,5.8,5,0,0,0,0,24.5,84.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Big Town, The",1987,109,NA,5.5,319,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Big Trail, The",1930,120,NA,6.7,355,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Big Trees, The",1952,89,NA,5.7,165,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Big Trouble",1986,93,NA,4.8,180,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Big Trouble",2002,85,40000000,6.4,4088,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Big Trouble in Little China",1986,99,25000000,6.7,10803,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Big Wash, The",1948,7,NA,6.9,38,0,0,0,14.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Big Wednesday",1978,120,11000000,6.6,819,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Big Wheel, The",1949,92,NA,5.5,63,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Big Zapper",1973,92,NA,3.9,31,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Big-Ass She-Male Adventure, The",1998,120,NA,8,7,0,14.5,0,0,0,0,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Big-Bang, Le",1984,76,NA,6.5,17,4.5,0,0,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"BigLove",2001,10,NA,6.8,42,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Bigamist, The",1953,80,NA,6.5,132,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bigamo, Il",1956,110,NA,6.3,13,0,0,0,0,14.5,4.5,44.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Bigfoot",1967,1,NA,5.2,16,4.5,14.5,0,4.5,4.5,4.5,4.5,4.5,0,45.5,"",0,0,0,0,1,0,1 -"Bigfoot",1970,84,NA,2.4,39,34.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bigfoot: Man or Beast?",1971,90,NA,6,8,0,0,0,24.5,0,24.5,14.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Bigfoot: The Unforgettable Encounter",1994,88,NA,3.5,67,14.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Bigger Splash, A",1974,106,NA,3.9,22,24.5,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Bigger Than Life",1956,91,NA,7.1,260,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bigger Than Tina",1999,90,NA,4.2,18,14.5,0,14.5,14.5,4.5,14.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Bigger Than the Sky",2005,106,750000,7.3,32,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"PG-13",0,0,1,1,0,1,0 -"Biggest Bundle of Them All, The",1968,108,NA,4.9,103,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Biggie and Tupac",2002,108,NA,6.9,465,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Biggles",1986,85,NA,5.6,402,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bij de beesten af",1972,104,NA,7.3,40,0,0,0,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Bijo no harawata",1986,68,NA,5.1,54,4.5,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bijo to Ekitainingen",1958,79,NA,5.8,74,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bijou",1972,77,22000,6.9,6,0,0,0,0,34.5,0,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Bijoutiers du clair de lune, Les",1958,95,NA,5.5,64,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bike Boy",1967,110,NA,5.4,17,14.5,0,0,4.5,0,14.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Bike Ride",2001,6,NA,6.5,14,0,0,0,4.5,0,14.5,34.5,24.5,0,14.5,"",0,1,0,0,0,0,1 -"Bike Squad, The",2002,79,NA,3,44,24.5,24.5,4.5,4.5,4.5,14.5,0,0,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Biker Boyz",2003,110,NA,4,1580,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Biker Dreams",1998,73,NA,7,10,0,14.5,0,0,14.5,0,24.5,0,0,64.5,"",0,0,0,0,1,0,0 -"Bikini Beach",1964,99,600000,4.9,149,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Bikini Bistro",1995,85,NA,2.4,246,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Bikini Carwash Company II, The",1993,89,NA,2.7,212,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bikini Carwash Company, The",1992,87,NA,3.5,361,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Bikini Drive-In",1995,86,NA,3.7,123,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Bikini Hotel",1997,95,NA,2.9,74,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bikini Island",1991,85,NA,3,133,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Bikini Squad",1993,88,NA,3,57,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bikini Summer",1991,87,NA,3.7,72,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bikini Summer II",1992,85,NA,3.1,93,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bikini Summer III: South Beach Heat",1997,87,NA,3.3,55,34.5,14.5,4.5,4.5,4.5,0,4.5,0,4.5,24.5,"R",0,0,1,0,0,0,0 -"Bikini Witness",1995,87,NA,3.1,13,45.5,24.5,0,14.5,0,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Bikinisesongen",1994,97,NA,4.4,5,24.5,0,24.5,0,24.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Bilans kwartalny",1975,98,NA,5.6,25,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Bilbao",1978,89,NA,6.7,81,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bilder der Welt und Inschrift des Krieges",1989,75,NA,6.4,17,14.5,0,0,0,4.5,14.5,0,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Bildnis einer Trinkerin",1979,108,NA,7,16,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Bildnis einer Unbekannten",1954,86,NA,8.5,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Biletas Iki Taj Mahal",1991,88,NA,6.1,7,0,0,0,0,14.5,14.5,0,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bilitis",1977,89,NA,5.2,278,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Bill & Ted's Bogus Journey",1991,93,20000000,5.6,8152,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bill & Ted's Excellent Adventure",1989,90,10000000,6.6,12277,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bill Cosby: Himself",1983,105,NA,7.8,603,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bill Diamond - Geschichte eines Augenblicks",1999,90,NA,4.6,15,0,4.5,0,4.5,24.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bill and Coo",1948,61,NA,6.2,50,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Bill il taciturno",1967,85,NA,5.2,5,0,0,24.5,24.5,24.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Bill of Divorcement, A",1932,70,300000,6.5,183,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bill of Divorcement, A",1940,74,NA,5.4,21,4.5,4.5,0,4.5,34.5,14.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Bill of Hare",1962,7,NA,6.3,29,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Billabong",1968,9,NA,8.4,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Billabong Odyssey",2003,87,NA,5.8,81,0,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",1,0,0,0,1,0,0 -"Billboard Dad",1998,92,NA,4.7,313,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Billboard Frolics",1935,7,NA,5.2,13,0,0,0,4.5,44.5,34.5,4.5,0,0,4.5,"",0,1,1,0,0,0,1 -"Billboard Girl",1932,21,NA,6.1,10,0,0,0,14.5,34.5,14.5,34.5,0,24.5,0,"",0,0,1,0,0,0,1 -"Billet mrk.",1946,101,NA,6.4,5,0,0,0,0,0,44.5,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Billie",1965,87,NA,5.1,67,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Billion Dollar Brain",1967,111,NA,5.7,424,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Billion Dollar Bubble, The",1976,60,NA,5.9,11,0,0,4.5,4.5,4.5,4.5,14.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Billion Dollar Hobo, The",1977,96,NA,4.1,37,0,4.5,24.5,24.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Billion Dollar Limited",1942,9,NA,7,54,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Billposters",1940,8,NA,7.4,40,0,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Billy & Bobby: The Hollywood Years",1998,6,NA,8,6,0,0,0,14.5,14.5,0,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Billy Bathgate",1991,106,NA,5.7,2431,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Billy Blazes, Esq.",1919,13,NA,6.5,23,0,0,0,0,24.5,14.5,34.5,4.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Billy Boy",1954,6,NA,8,38,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Billy Budd",1962,119,NA,7.7,534,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Billy Elliot",2000,110,5000000,7.7,16725,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Billy Frankenstein",1998,100,NA,2,19,44.5,14.5,14.5,0,14.5,4.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Billy Galvin",1986,99,NA,6.4,27,0,4.5,0,0,14.5,24.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Billy Jack",1971,114,800000,5.5,994,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Billy Jack Goes to Washington",1977,155,NA,4.1,117,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Billy Liar",1963,98,NA,7.5,580,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Billy Madison",1995,89,NA,6.1,11626,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Billy Nayer",1992,3,NA,8,8,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,1,0,0,0,0,1 -"Billy Rose's Jumbo",1962,123,NA,5.8,154,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Billy Turf contra Kwel",1982,93,NA,5.6,13,14.5,0,14.5,0,0,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Billy Turf haantje de voorste",1981,90,NA,3.5,7,24.5,14.5,0,44.5,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Billy Turf het dikste studentje ter wereld",1978,94,NA,6.4,9,24.5,0,0,0,0,34.5,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Billy Turner's Secret",1994,26,NA,6.4,7,0,0,0,0,24.5,14.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Billy Twist",1998,10,NA,3.8,7,14.5,0,14.5,14.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Billy Two Hats",1974,99,NA,5.7,89,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Billy and Zorba",1999,20,NA,7.4,5,24.5,0,0,0,0,24.5,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Billy in the Lowlands",1979,88,NA,4.9,12,4.5,0,4.5,24.5,14.5,4.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Billy the Kid",1930,98,NA,6.1,42,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Billy the Kid",1941,94,NA,6,119,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Billy the Kid Returns",1938,53,NA,6.3,13,0,0,0,0,24.5,24.5,24.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Billy the Kid Trapped",1942,59,NA,5.3,7,0,0,0,14.5,24.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Billy the Kid and the Green Baize Vampire",1985,121,NA,4,33,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Billy the Kid in Santa Fe",1941,61,NA,5.2,5,0,0,0,24.5,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Billy the Kid versus Dracula",1966,73,NA,2.7,231,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Billy's Balloon",1998,6,NA,8,288,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Billy's Holiday",1995,92,NA,4.2,68,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Billy's Hollywood Screen Kiss",1998,92,NA,6.5,1129,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Biloxi Blues",1988,106,NA,6.5,3415,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Bilyj ptakh z chornoju oznakoju",1971,99,NA,7.2,12,0,4.5,0,0,4.5,4.5,0,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Bimbo Bowlers from Boston",1990,86,NA,7.2,6,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Bimbo Bowlers from Buffalo",1989,82,NA,5.6,6,0,0,0,14.5,0,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bimbo Movie Bash",1997,90,NA,2.5,93,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Bimbo's Express",1931,7,NA,6,8,0,0,0,0,34.5,34.5,14.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Bimbo's Initiation",1931,6,NA,7.4,42,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Bimboland",1998,90,NA,3.9,147,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bimil",2000,105,NA,5.5,54,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Bimyong tosi",1993,18,NA,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Bin ich sexy?",2004,89,NA,6.9,9,0,0,0,0,0,24.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bin lim mai ching",2002,87,NA,7.2,14,0,0,0,24.5,4.5,0,34.5,24.5,4.5,0,"",1,0,0,1,0,0,0 -"Bin-jip",2004,95,NA,8,886,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,1,0 -"Bindyuzhnik i korol",1989,169,NA,6,12,14.5,0,0,14.5,0,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Bingo",1974,113,NA,5.9,28,4.5,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bingo",1990,85,NA,7.4,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Bingo",1991,89,10000000,4.1,374,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bingo",2003,12,NA,1.9,30,34.5,14.5,4.5,0,4.5,0,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Bingo Bongo",1982,102,NA,4.4,111,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bingo Bus, A",2004,30,4000,6.6,7,0,0,24.5,14.5,0,0,0,14.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Bingo Crosbyana",1936,8,NA,5.4,16,0,0,0,34.5,44.5,24.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Bingo Long Traveling All-Stars & Motor Kings, The",1976,110,NA,6.4,276,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bingo Robbers, The",2000,84,NA,4.1,20,4.5,14.5,14.5,4.5,4.5,4.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Bingo! The Documentary",1999,59,NA,9.2,6,0,0,0,0,0,0,0,14.5,45.5,34.5,"",0,0,0,0,0,0,0 -"Bingueros, Los",1979,88,NA,4.2,129,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Bint El-Harass",1967,100,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Bintou",2001,26,NA,6.6,8,0,0,0,14.5,14.5,14.5,45.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Bio Zombie",1998,94,NA,6.6,370,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bio-Dome",1996,91,NA,3.7,4310,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Bio-Tech Warrior",1996,81,NA,7.4,9,14.5,14.5,0,0,14.5,0,0,0,14.5,45.5,"",1,0,0,0,0,0,0 -"Biography of a Bachelor Girl",1935,82,NA,6.4,20,0,0,0,4.5,4.5,24.5,45.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Biohazard",1984,84,250000,3.2,40,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Biohunter",1995,58,NA,4.8,83,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Biola tak berdawai",2003,99,NA,5.5,22,14.5,0,0,14.5,4.5,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Biological Maintenance Department",1997,10,NA,6.7,24,4.5,0,0,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Bionca on Fire",1988,83,NA,6.9,5,0,0,0,0,44.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Bionda, La",1992,111,NA,4.3,43,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Biquefarre",1983,90,NA,6.1,8,0,0,14.5,0,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bir sonbahar hikayesi",1994,115,NA,4.2,6,34.5,0,14.5,0,0,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Birch Interval",1977,104,NA,6.2,17,0,4.5,0,14.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Bird",1988,161,9000000,7.1,1243,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bird Came C.O.D., The",1942,8,NA,5.8,22,0,4.5,0,14.5,14.5,34.5,24.5,0,0,4.5,"",0,1,1,0,0,0,1 -"Bird Store, The",1932,7,NA,6.8,10,14.5,0,0,14.5,14.5,0,34.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Bird in a Bonnet, A",1958,6,NA,6.3,29,0,0,4.5,4.5,4.5,44.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Bird in a Guilty Cage, A",1952,7,NA,7.2,37,0,0,0,4.5,4.5,4.5,34.5,44.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Bird in the Head, A",1946,16,NA,6.3,65,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Bird of Paradise",1932,82,NA,5.8,100,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Bird of Paradise",1951,100,NA,5.2,92,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Bird of Prey",1995,105,NA,4.3,42,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,0,24.5,"R",0,0,0,0,0,0,0 -"Bird on a Wire",1990,110,NA,5.3,5090,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Bird's-Eye View of Dock Front, Galveston",1900,1,NA,3.4,8,0,14.5,64.5,24.5,0,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Birdcage, The",1996,117,NA,6.5,12429,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Birdman of Alcatraz",1962,147,NA,7.6,2179,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Birds Anonymous",1957,7,NA,8.2,67,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Birds Do It",1966,88,NA,4.4,19,14.5,4.5,14.5,14.5,34.5,0,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Birds Do It, Bees Do It",1974,90,NA,6,22,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Birds and the Bees, The",1956,94,NA,4.7,40,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Birds in the Spring",1933,7,NA,7.2,14,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Birds of Prey",1985,80,NA,6.2,7,0,0,14.5,0,0,24.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Birds of a Father",1961,6,NA,6.4,34,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Birds of a Feather",1931,8,NA,6.2,41,0,0,4.5,4.5,4.5,44.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Birds, The",1963,119,2500000,7.8,20072,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Birdy",1984,120,NA,7.2,3575,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Birdy and the Beast",1944,7,NA,7.1,30,0,0,4.5,4.5,14.5,4.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Birdy in the Cage",2003,9,2000,9,5,0,0,0,0,24.5,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Biriken",1996,100,NA,6.5,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Birth",2004,100,20000000,6,2600,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Birth Control",2004,30,NA,8.2,12,0,0,0,0,0,14.5,24.5,14.5,4.5,34.5,"",1,0,0,0,0,0,1 -"Birth of a Nation, The",1915,125,110000,7.1,2617,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Birth of a Notion",1947,7,NA,6.7,41,0,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Birth of a Rebellion",2003,19,NA,5,10,24.5,14.5,0,0,14.5,24.5,34.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Birth of a Robot",1936,6,NA,9.2,9,14.5,0,0,14.5,0,0,0,24.5,0,45.5,"",0,0,0,0,0,0,1 -"Birth of the Blues",1941,87,857283,6.2,48,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Birthday Blues",1932,20,NA,7.7,28,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Birthday Girl",2001,93,13000000,6.1,5340,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Birthday Party, The",1931,7,NA,6,37,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Birthday Party, The",1968,123,NA,6.1,55,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Birthday Present, The",1957,100,NA,5.6,6,0,0,14.5,0,14.5,14.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Birthday Time",2000,18,NA,5.7,29,4.5,4.5,0,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Birthday, The",2004,100,NA,6.2,34,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Birthmark, The",1987,31,NA,8.2,11,4.5,0,0,0,0,0,0,4.5,45.5,24.5,"",0,0,0,1,0,0,1 -"Biruma no tategoto",1956,116,NA,8.2,243,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Biruma no tatekoto",1985,133,NA,8.3,31,0,0,0,0,4.5,0,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Bis ans Ende der Welt",1991,158,NA,6.5,2065,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bis wir uns wiedersehen",1952,82,NA,3.4,5,0,24.5,0,0,24.5,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Bis zum Horizont und weiter",1999,93,NA,6.1,71,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bisbetico domato, Il",1980,104,NA,5.8,218,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Biscuit Eater, The",1940,81,NA,6.9,63,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Biscuit Eater, The",1972,90,NA,5.3,47,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bishop Misbehaves, The",1935,85,NA,6.8,35,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bishop Murder Case, The",1930,88,NA,5.4,33,0,4.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bishop's Wife, The",1947,109,NA,7.6,2001,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Biskoppen",1944,100,NA,7.8,7,0,0,0,0,0,14.5,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bismarck",1940,118,NA,4.8,11,0,4.5,0,4.5,0,4.5,0,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Bison (et sa voisine Dorine), Le",2003,96,NA,5.7,155,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bit Part, The",1987,87,NA,5,21,4.5,0,0,0,44.5,4.5,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Bit Players",2000,17,NA,7.6,32,4.5,0,0,0,4.5,4.5,4.5,44.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Bit of Scarlet, A",1997,70,NA,5.5,6,14.5,0,0,14.5,34.5,14.5,0,0,0,14.5,"",0,0,0,0,1,0,0 -"Bita",1972,98,NA,6.4,9,0,0,0,0,34.5,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Bitch",1995,26,NA,5.8,5,24.5,0,0,0,24.5,24.5,24.5,0,0,24.5,"",0,0,1,1,0,0,1 -"Bitch Is Back, The",1995,16,NA,4.4,40,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Bitch, The",1979,89,NA,2.8,159,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bitches, The",1992,10,NA,6,33,4.5,4.5,0,14.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Bite",1997,7,NA,9,5,0,0,0,0,24.5,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Bite the Bullet",1975,131,NA,6.7,562,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Biter Bit, The",1897,1,NA,4.7,25,4.5,14.5,4.5,4.5,24.5,34.5,14.5,4.5,0,0,"",0,0,1,0,0,0,1 -"Bitka na Neretvi",1969,102,NA,5.4,173,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Bits and Pieces",1985,85,NA,3.3,12,14.5,4.5,34.5,0,4.5,4.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Bitter Ash, The",1963,80,NA,7.6,9,0,0,0,0,0,14.5,34.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Bitter Creek",1954,74,NA,6.4,11,0,0,0,4.5,14.5,0,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Bitter Harvest",1963,91,NA,4.2,17,0,4.5,14.5,14.5,4.5,44.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Bitter Harvest",1993,98,NA,4.2,224,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bitter Moon",1992,138,NA,6.8,3085,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bitter Old Man",2003,7,2000,8.8,8,0,0,0,0,14.5,14.5,0,0,14.5,64.5,"",0,0,0,1,0,0,1 -"Bitter Springs",1950,89,NA,8.9,7,0,0,14.5,0,0,0,14.5,14.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Bitter Sweat",2003,120,NA,4.7,11,14.5,14.5,14.5,0,4.5,0,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Bitter Sweet",1933,93,NA,5.6,19,4.5,4.5,14.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Bitter Sweet",1940,94,NA,6,61,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Bitter Tea of General Yen, The",1933,88,NA,7.3,247,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"BitterSweet",2004,8,NA,8.4,16,0,0,0,0,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Bittere Ernte",1986,101,NA,7.9,85,4.5,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bittere kruid, Het",1985,89,NA,6,38,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Bittersweet Love",1976,92,NA,3.7,19,0,24.5,14.5,24.5,14.5,0,0,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Bittersweet Motel",2000,82,NA,7.6,242,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Bitva za Moskvu",1985,358,NA,7.9,11,0,0,0,0,0,4.5,0,44.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bix",1981,116,NA,8.7,8,0,0,0,0,0,0,0,45.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Bix",1991,100,NA,6.3,36,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Biya el-Khawatim",1965,95,NA,4.7,11,0,4.5,0,0,0,14.5,0,4.5,0,64.5,"",0,0,1,0,0,0,0 -"Biyaya ng lupa",1959,111,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,1,0,0,0 -"Bizalom",1980,105,NA,7.1,49,4.5,0,0,0,4.5,0,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Bizarre Ones, The",1968,73,NA,8.1,7,0,14.5,0,44.5,0,0,0,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Bizarre Styles",1981,86,NA,5.4,5,24.5,0,0,0,44.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Bizita Q",2001,84,NA,7.1,1327,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Bjergkuller",2002,30,NA,5.2,7,0,0,0,24.5,44.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Bjurra",1970,83,NA,1.9,11,34.5,4.5,4.5,14.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Black",2000,15,NA,2.3,12,14.5,4.5,0,0,0,4.5,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Black",2005,122,NA,8.4,1013,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,74.5,"",0,0,0,1,0,0,0 -"Black & White",1998,97,NA,5.3,363,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black & White & Red All Over",1997,97,NA,2.8,14,24.5,4.5,0,4.5,0,24.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Abbot, The",1934,56,NA,1.8,5,24.5,24.5,0,0,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Black Alley Cats",1974,81,NA,5.4,8,14.5,0,0,14.5,24.5,14.5,0,0,14.5,24.5,"",1,0,0,1,0,0,0 -"Black Angel",1946,81,NA,7.2,185,0,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Arrow, The",1948,76,NA,6.5,33,0,0,4.5,14.5,4.5,14.5,44.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Black Ball",2003,80,NA,6.5,8,14.5,14.5,0,0,0,24.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Black Bart",1948,80,NA,5.8,30,0,0,4.5,4.5,14.5,44.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Black Beauty",1946,74,NA,5.7,25,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Black Beauty",1971,106,NA,5.4,129,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Beauty",1994,88,NA,6.1,610,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Black Belt Jones",1974,87,NA,5.5,299,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Black Bird, The",1975,110,NA,4.8,113,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Black Box BRD",2001,102,NA,7.4,151,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Black Cadillac",2003,93,NA,5.7,346,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Black Caesar",1973,87,NA,6.1,285,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Black Camel, The",1931,71,NA,7.2,52,0,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Black Canyon",2004,25,3000,9.9,9,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,1 -"Black Castle, The",1952,82,NA,5.5,58,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Cat, The",1934,65,95745,7.2,788,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Black Cat, The",1941,70,NA,6,111,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Black Cat, The",1966,73,NA,5.3,40,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Cat, The",1995,18,NA,5.5,6,14.5,0,0,0,34.5,0,14.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Black Cats and Broomsticks",1955,8,NA,5.7,25,0,0,0,14.5,44.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"Black Cauldron, The",1985,80,44000000,6.2,1895,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Black Chicks Talking",2001,52,NA,5.8,9,0,0,0,0,24.5,0,0,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Black Christmas",1974,98,NA,6.7,1292,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Black Circle Boys",1997,101,NA,4,284,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Black Dakotas, The",1954,65,NA,5.8,17,0,0,0,14.5,34.5,24.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Black Dawn",1997,102,NA,3.8,55,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Black Day Blue Night",1995,93,NA,5.8,166,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"Black Days",2001,80,NA,8.7,11,0,0,14.5,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,0 -"Black Diamond Express",1896,1,NA,5,19,4.5,0,0,24.5,24.5,24.5,4.5,4.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Black Diamond Rush",1993,96,NA,6.1,5,0,0,0,0,0,44.5,0,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Black Dju",1996,80,NA,6.7,17,4.5,0,14.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Black Dog",1998,89,NA,4.7,1374,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Black Doll, The",1938,66,NA,5.6,6,0,0,0,0,14.5,34.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Black Door, The",2001,96,NA,8.2,9,14.5,0,0,0,0,0,0,34.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Black Dragons",1942,64,NA,4.2,94,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Eagle",1988,93,NA,3.2,616,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Black Eye",1974,98,NA,4.9,27,4.5,0,14.5,14.5,34.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Black Fist",1975,87,NA,4.9,49,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Black Flamingos - Sie lieben euch zu Tode",1998,95,NA,7.6,12,4.5,0,0,0,4.5,24.5,0,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Black Force",1975,82,NA,4.4,9,34.5,0,0,24.5,24.5,0,0,0,14.5,14.5,"",1,0,0,1,0,0,0 -"Black Fox: The True Story of Adolf Hitler",1962,89,NA,7.2,21,0,0,0,0,14.5,4.5,34.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Black Friday",1940,70,NA,6.1,112,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Friday",2000,95,NA,3.2,59,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Black Friday",2004,161,NA,8.5,21,4.5,0,0,0,0,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Black Fury",1935,94,NA,6.8,92,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Gestapo, The",1975,88,NA,3.7,84,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Girl",1972,97,NA,6,46,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Black Godfather, The",1974,90,NA,3.2,53,24.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Black Gold",1947,90,450000,6,17,4.5,0,0,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Black Gold",1963,98,NA,5.2,15,4.5,0,0,24.5,44.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Black Gulch",2003,15,55000,6,20,4.5,0,0,0,0,4.5,14.5,24.5,0,64.5,"",1,0,0,0,0,0,1 -"Black Gunn",1972,96,NA,4.5,33,4.5,4.5,4.5,4.5,24.5,14.5,14.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Black Hand",1950,92,NA,5.5,85,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Hand, The",1906,7,NA,3.7,5,24.5,0,24.5,24.5,0,0,44.5,0,0,0,"",0,0,0,1,0,0,1 -"Black Harvest",1992,90,NA,8.7,10,0,0,0,0,0,0,14.5,24.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Black Hawk Down",2001,142,90000000,7.6,32530,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Black Heat",1976,94,NA,1.5,19,34.5,14.5,4.5,14.5,24.5,4.5,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Black Hills",1948,60,414000,5.6,10,0,0,14.5,0,64.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Black Hole, The",1979,98,18500000,5.4,3425,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Horse Canyon",1954,81,NA,5.6,13,0,0,4.5,0,14.5,34.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Black Ice",1992,90,NA,4.3,65,4.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Ice",1994,3,NA,7.5,57,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Black Indians: An American Story",2001,60,NA,6.4,5,0,0,44.5,0,0,0,0,24.5,44.5,0,"",0,0,0,0,1,0,0 -"Black Jack",1950,90,NA,5.8,12,0,0,0,0,44.5,44.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Black Jack",1968,89,NA,6,12,0,0,0,0,34.5,14.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Black Jack",1979,105,NA,5,34,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Black Jack",1990,111,NA,5.9,236,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Joy",1977,97,NA,8.6,7,0,0,0,0,0,14.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Black Killer",1971,85,NA,5,19,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Black King, The",1932,72,NA,3.1,5,0,24.5,0,44.5,44.5,0,0,0,0,0,"",0,0,1,1,0,0,0 -"Black Kites",1996,26,NA,5.8,10,0,14.5,0,0,34.5,0,0,0,34.5,34.5,"",0,0,0,0,0,0,1 -"Black Klansman, The",1966,88,NA,3.5,20,34.5,14.5,4.5,4.5,14.5,0,0,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Black Knight",2001,95,50000000,4.1,3822,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Black Lash, The",1952,54,NA,5.9,6,0,0,14.5,0,14.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Black Legion",1937,83,235000,6.8,218,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Light",1998,90,NA,4.2,57,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Like Me",1964,105,NA,6.2,117,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Black Lolita",1975,85,NA,5.4,11,4.5,4.5,14.5,0,34.5,0,0,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Black Love",1972,70,NA,1,8,74.5,0,14.5,0,0,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Black Magic",1949,105,NA,5.9,46,0,4.5,0,4.5,14.5,24.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Black Magic Woman",1991,91,NA,3.6,68,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Magic, The",2002,91,NA,7.4,11,24.5,0,0,0,0,0,0,4.5,0,64.5,"R",0,0,0,0,0,0,0 -"Black Mama, White Mama",1972,83,NA,4.5,215,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Black Mamba",1974,92,NA,4.4,8,0,0,24.5,24.5,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Black Marble, The",1980,113,NA,5.6,111,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Black Market Rustlers",1943,58,NA,5.5,6,0,0,0,14.5,14.5,64.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Black Mask, The",1935,67,NA,1.9,9,14.5,14.5,0,0,14.5,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Black Mic Mac",1986,93,NA,5.2,52,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Black Moon",1934,68,NA,7.7,10,0,0,0,0,24.5,0,34.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Black Moon",1975,95,NA,5.9,83,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Black Moon Rising",1986,100,NA,5.1,571,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Black Narcissus",1947,100,NA,7.9,1725,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Black Network, The",1936,20,NA,8.7,6,0,0,0,0,0,0,34.5,0,34.5,34.5,"",0,0,0,0,0,0,1 -"Black Oak Conspiracy",1977,92,NA,5.4,14,4.5,14.5,0,4.5,14.5,24.5,0,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Black Orchid",1953,58,NA,5.1,15,0,0,4.5,4.5,24.5,24.5,0,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Black Orchid, The",1958,98,NA,5.9,82,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Out",1996,98,NA,4.5,70,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Black Panther, The",1977,102,NA,5.6,17,0,0,0,0,24.5,24.5,34.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Black Patch",1957,82,NA,5.7,21,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Black Pearl, The",1977,95,NA,5.1,10,0,0,14.5,24.5,24.5,24.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Black People Hate Me and They Hate My Glasses",2000,12,NA,7.5,27,4.5,0,4.5,0,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Black Picket Fence",2002,90,NA,6.2,37,0,4.5,4.5,0,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Black Pirate, The",1926,94,NA,7.5,187,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Black Pirates, The",1954,74,NA,5,6,0,0,34.5,0,0,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Black Point",2001,100,NA,5.1,127,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Black Press: Soldiers Without Swords, The",1999,86,NA,4.9,8,24.5,0,0,0,0,14.5,14.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Black Rain",1989,125,14000000,6.3,5636,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Black Rainbow",1989,95,NA,5.9,255,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Raven, The",1943,65,NA,5,42,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Black Rider, The",1954,65,NA,3.9,14,0,24.5,4.5,14.5,4.5,24.5,24.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Black Robe",1991,97,NA,7.1,1181,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Black Room, The",1935,70,NA,6.8,82,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Black Room, The",1984,87,250000,4.5,33,14.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Black Rose of Harlem",1996,87,NA,3.8,23,4.5,4.5,14.5,14.5,4.5,4.5,14.5,0,4.5,24.5,"R",1,0,0,0,0,0,0 -"Black Rose, The",1950,120,NA,5.7,241,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Black Roses",1988,90,NA,3.7,74,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Black Sabbath: Never Say Die",1984,60,NA,8,6,0,0,0,0,0,14.5,0,45.5,34.5,0,"",0,0,0,0,0,0,0 -"Black Samson",1974,98,NA,5.2,38,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Black Samurai",1977,88,NA,3,83,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Black Scorpion II: Aftershock",1997,85,NA,3.3,164,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Black Scorpion, The",1957,88,NA,4.8,238,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Sea Raid",1997,82,NA,2.2,23,44.5,14.5,14.5,4.5,4.5,0,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Black Shampoo",1976,82,NA,4,61,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Black Sheep",1912,17,NA,6.1,16,14.5,0,0,0,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Black Sheep",1935,76,NA,6.3,28,0,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black Sheep",1996,87,NA,5.2,3634,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Black Sheep Boy",1995,37,NA,4.5,13,4.5,4.5,4.5,0,45.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Black Sheep of Whitehall, The",1942,80,NA,6.5,33,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Black Sherlock Holmes, A",1918,12,NA,1,6,100,0,0,0,0,0,0,0,0,0,"",0,0,1,0,0,0,1 -"Black Shield of Falworth, The",1954,99,NA,6,215,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Black Ships, The",1970,8,NA,6.8,8,0,0,0,0,14.5,45.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Black Six, The",1974,94,NA,3.2,57,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Black Sleep, The",1956,82,225000,5.5,72,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Snake",1973,82,300000,3.7,61,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Snow",1989,96,NA,2.8,10,24.5,24.5,24.5,14.5,14.5,0,0,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Black Spurs",1965,81,NA,4.7,19,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Black Stallion Returns, The",1983,103,NA,5.4,307,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Stallion, The",1979,118,2700000,7,1822,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Black Starlet",1974,90,NA,4.7,5,0,0,24.5,44.5,0,0,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Black Sunday",1977,143,NA,6.6,1069,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Black Swan",2002,90,NA,4.3,29,14.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Black Swan, The",1942,85,NA,7.1,380,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Black Tar Heroin: The Dark End of the Street",2000,75,NA,5.3,41,4.5,0,0,4.5,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Black Tent, The",1956,83,NA,5.2,26,0,0,4.5,14.5,34.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Black Thunder",1997,85,NA,3.5,96,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"R",1,0,0,1,0,0,0 -"Black Torment, The",1964,85,NA,4.5,34,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Tower, The",1987,23,NA,8,7,0,0,0,0,0,14.5,0,45.5,24.5,0,"",0,0,0,0,0,0,1 -"Black Tuesday",1954,80,NA,7.8,23,0,0,0,4.5,4.5,4.5,24.5,34.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Black Venus",1983,86,NA,4.1,41,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Watch, The",1929,93,NA,8.3,19,4.5,0,4.5,4.5,0,14.5,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Black Wax",1982,79,NA,5.5,18,0,0,4.5,4.5,0,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Black Whip, The",1956,81,NA,4.9,21,0,4.5,4.5,14.5,24.5,4.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Widow",1954,95,NA,6.2,79,0,0,0,14.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Black Widow",1987,102,NA,6.2,1631,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black Widow Wajah Ayu",1994,120,NA,3.3,6,14.5,14.5,0,45.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Black Widow, The",1947,180,NA,6.8,25,0,0,14.5,0,0,14.5,34.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Black Windmill, The",1974,106,NA,6,197,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Black XXX-Mas",1999,11,NA,4.3,89,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Black and Blue",1980,87,NA,5.3,16,0,0,0,14.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Black and Tan",1929,19,NA,6,41,4.5,0,0,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Black and White",1999,98,10000000,5.2,1699,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Black and White",2002,99,NA,6.8,152,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Black as Hell, Strong as Death, Sweet as Love",1998,81,NA,4.7,10,34.5,24.5,14.5,0,0,0,0,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Black is... Black Ain't",1994,87,NA,9,21,4.5,0,0,0,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Black to the Promised Land",1992,95,NA,8.3,10,0,14.5,0,0,0,14.5,14.5,14.5,0,64.5,"",0,0,0,0,1,0,0 -"Black-Eyed Susan",2004,105,50000,7.4,5,0,0,0,0,24.5,24.5,24.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"BlackMale",2000,90,NA,4.4,129,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Blackadder Back & Forth",1999,33,NA,6.8,804,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Blackball",2003,96,NA,5.1,405,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Blackbeard's Ghost",1968,106,NA,5.9,558,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blackbeard, the Pirate",1952,99,NA,5.7,128,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blackbelt II",1993,83,NA,2.9,10,44.5,0,0,24.5,34.5,0,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Blackberry Subway Jam",1984,8,NA,5.9,7,0,0,0,0,44.5,14.5,44.5,0,0,0,"",0,1,0,0,0,0,1 -"Blackbird, The",1926,77,NA,7.4,52,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Blackboard Jumble",1957,6,NA,6.9,15,0,4.5,0,0,4.5,14.5,4.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Blackboard Jungle",1955,101,NA,7.4,1262,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Blackenstein",1973,87,NA,2.7,59,34.5,14.5,14.5,4.5,0,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blackfly",1991,5,NA,7.4,45,4.5,4.5,0,0,4.5,14.5,14.5,44.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Blackhawk: Fearless Champion of Freedom",1952,242,NA,7.4,22,4.5,0,0,0,0,24.5,34.5,14.5,4.5,0,"",1,0,0,0,0,0,0 -"Blackheart",1998,95,NA,4.3,83,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blackhole",1998,14,NA,5,8,14.5,0,0,14.5,34.5,24.5,0,0,0,14.5,"",0,0,0,1,0,0,1 -"Blackjack Ketchum, Desperado",1956,76,NA,5.3,24,0,4.5,0,14.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blackmail",1929,84,NA,7,865,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Blackmail",1939,81,NA,6.4,78,4.5,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blackmail",1947,67,NA,6.5,8,14.5,0,0,0,0,24.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Blackout",1978,92,NA,5,33,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Blackout",1986,87,NA,4.6,27,14.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blackout",1988,87,NA,5.3,21,4.5,4.5,14.5,14.5,14.5,24.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Blackout Journey",2004,90,NA,6.8,5,0,0,24.5,0,24.5,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Blackout, The",1997,98,NA,4.4,526,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Blackrock",1997,103,NA,5.7,234,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Blacksmith Scene",1893,1,NA,7,90,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Blacksmith, The",1922,21,NA,7.3,181,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Blacktop",2000,100,3500000,4.7,192,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Blacktop: A Story of the Washing of a School Play Yard",1952,11,NA,6.8,13,0,0,0,0,14.5,14.5,0,44.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Blackwater Elegy",2003,19,40000,9,10,0,0,0,0,0,0,14.5,34.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Blackwater Trail",1996,97,NA,4.7,36,4.5,4.5,4.5,14.5,24.5,4.5,24.5,14.5,14.5,4.5,"R",1,0,0,0,0,0,0 -"Blackwell's Island",1939,71,NA,6.3,58,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blackwoods",2002,90,NA,5,179,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Blacula",1972,93,NA,5.1,459,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blade",1973,90,NA,5.2,30,4.5,0,14.5,24.5,14.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blade",1998,110,45000000,6.8,24372,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,0,0,0,0 -"Blade II",2002,108,55000000,6.6,17139,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Blade Runner",1982,117,28000000,8.2,74749,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Blade af Satans Bog",1921,130,NA,6.6,79,4.5,0,0,4.5,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blade: Trinity",2004,124,65000000,5.7,7439,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Blades",1989,101,NA,4.8,79,24.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Blagajnica hoce ici na more",2000,86,NA,5.6,37,24.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Blagorodnyy razboynik Vladimir Dubrovskiy",1989,104,NA,5.6,8,14.5,0,0,14.5,14.5,14.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Blah Blah Blah",1995,12,NA,5.9,26,4.5,4.5,4.5,4.5,4.5,0,14.5,4.5,0,45.5,"",0,0,0,0,0,0,1 -"Blair Clown Project, The",1999,66,NA,2.8,60,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Blair Fish Project, The",1999,10,NA,1,14,74.5,4.5,0,0,0,0,0,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Blair Witch Mountain Project, The",2002,12,7000,2.8,20,34.5,14.5,14.5,14.5,0,0,4.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Blair Witch Project, The",1999,86,35000,6.1,39814,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Blair Witch Rejects, The",1999,87,NA,3.3,33,34.5,4.5,4.5,4.5,4.5,0,4.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Blake's Junction 7",2004,15,NA,9.2,13,0,0,0,4.5,0,0,0,0,34.5,45.5,"",0,0,1,0,0,0,1 -"Blame It on Rio",1984,100,NA,5.2,2044,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Blame It on the Bellboy",1992,78,NA,4.6,574,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blame It on the Night",1984,85,NA,4.4,53,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Blame It on the Samba",1948,6,NA,6.3,31,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Blanc et le noir, Le",1931,106,NA,3.4,6,0,14.5,14.5,34.5,14.5,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Blanca Paloma, La",1989,100,NA,6.3,35,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blanca por fuera y Rosa por dentro",1971,93,NA,4,6,14.5,14.5,14.5,14.5,0,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Blanche",1971,92,NA,7.1,46,0,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Blanche",2002,104,NA,3.3,209,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blanche Fury",1947,90,1500000,6.6,72,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Blanche et Marie",1984,95,NA,6.1,16,0,0,0,4.5,14.5,14.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Blancor",1975,5,NA,3.6,5,44.5,24.5,0,0,0,0,44.5,0,0,0,"",0,0,1,0,0,0,1 -"Blank",2003,32,NA,5.3,24,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,1 -"Blank Check",1994,93,NA,4.4,1139,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blank Generation, The",1976,55,NA,4.9,33,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,1,0,0 -"Blankman",1994,92,NA,4.2,1133,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Blast",1996,105,NA,4.4,156,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Blast",2000,88,NA,5.6,57,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"R",0,0,1,1,0,0,0 -"Blast 'Em",1992,103,NA,5.5,25,4.5,4.5,0,14.5,4.5,14.5,34.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Blast from the Past",1999,112,35000000,6.4,9483,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Blast of Silence",1961,77,NA,7.6,95,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Blast-Off Girls",1967,83,NA,2.9,41,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Blastfighter",1984,87,NA,4.8,51,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Blaue Engel, Der",1930,107,NA,7.8,1810,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Blaue Hand, Die",1967,72,NA,4.9,64,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blaue Licht, Das",1932,70,NA,5.9,125,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Blaue Licht, Das",1976,82,NA,7.1,13,0,0,0,0,4.5,0,34.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Blaue Stunde, Die",1992,87,NA,6.2,55,4.5,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Blaufuchs, Der",1938,101,NA,5.4,17,0,0,4.5,14.5,14.5,4.5,24.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Blauvogel",1979,97,NA,8,9,0,0,0,0,0,14.5,14.5,44.5,0,34.5,"",0,0,0,1,0,0,0 -"Blaze",1989,120,NA,5.9,820,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blaze Glory",1969,11,NA,8.6,7,0,0,0,14.5,0,14.5,0,0,0,74.5,"",0,0,1,0,0,0,1 -"Blaze Orange",2005,16,0,9.6,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,0,0,0,1 -"Blaze Starr Goes Wild",1960,75,NA,4.3,35,14.5,4.5,0,14.5,14.5,14.5,14.5,0,4.5,24.5,"",0,0,1,1,0,0,0 -"Blaze of Noon",1947,90,NA,5.6,34,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Blazen tot honderd",1998,80,NA,5.8,34,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Blazing Across the Pecos",1948,55,NA,6.8,7,0,0,14.5,14.5,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Blazing Justice",1936,60,NA,5.1,5,0,24.5,0,24.5,24.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Blazing Ninja, The",1973,77,NA,5.8,11,34.5,0,0,0,0,14.5,24.5,0,4.5,4.5,"",1,0,0,1,0,0,0 -"Blazing Saddles",1974,93,2600000,7.7,17166,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Blazing Sixes",1937,55,NA,5.7,8,0,0,0,0,45.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Blazing Stewardesses",1975,95,NA,2.5,32,44.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Blazing Sun, The",1950,69,NA,5.4,10,0,14.5,0,64.5,0,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Blazing Trail, The",1949,59,NA,6.5,7,0,0,0,14.5,44.5,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Blazing the Western Trail",1945,60,NA,5.6,7,0,0,14.5,0,0,44.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bleach",1998,30,NA,8.6,7,0,0,0,0,14.5,0,0,0,74.5,14.5,"",0,0,0,0,0,0,1 -"Bleach",2002,13,NA,9.2,6,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,1,1,0,0,1 -"Bleak Future",1997,87,NA,3.2,72,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bleak Moments",1971,111,NA,7.4,103,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Blechtrommel, Die",1979,142,NA,7.5,2626,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Bleeders",1997,89,NA,3.8,486,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Bleeding Hearts",1994,92,NA,4.4,36,14.5,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bleeke Bet",1934,111,NA,7.3,8,0,0,0,0,0,0,45.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Bleierne Zeit, Die",1981,106,NA,7.5,171,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Blek Giek",2001,100,NA,5.4,16,0,0,0,14.5,4.5,0,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Blekitny krzyz",1955,61,NA,6.2,5,0,0,0,0,0,64.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Bless Their Little Hearts",1984,80,NA,6.6,7,14.5,0,0,0,14.5,0,0,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bless This House",1972,87,NA,5.3,102,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bless the Beasts & Children",1971,109,NA,5.8,287,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bless the Child",2000,107,40000000,5,3814,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Blessed",2004,98,NA,4.6,187,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Blessed Art Thou",2000,90,NA,6.5,26,0,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,24.5,"PG-13",0,0,0,0,0,0,0 -"Blessed Event",1932,80,NA,7.3,82,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Blessing",1994,94,NA,3.7,18,14.5,14.5,14.5,14.5,4.5,0,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blessing",2003,16,NA,8,7,14.5,0,0,0,0,0,0,24.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Blessing of Prometheus, The",2000,20,0,6.1,18,4.5,0,0,0,4.5,0,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Blessure, La",2004,162,NA,7.1,13,14.5,0,4.5,0,0,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Blessures assassines, Les",2000,94,NA,7.1,247,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bleu comme l'enfer",1986,95,NA,5,40,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Bleu comme un coup de feu",2003,5,NA,6,10,0,0,0,14.5,14.5,45.5,24.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Bleu des villes, Le",1999,101,NA,6.3,70,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Blight",1996,15,NA,8,8,0,0,0,0,0,14.5,0,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Blind",1987,132,NA,9.7,10,0,14.5,14.5,0,0,0,24.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Blind Adventure",1933,65,NA,6.2,12,0,0,0,14.5,24.5,4.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blind Alibi",1938,61,NA,6.1,17,0,4.5,0,4.5,24.5,14.5,34.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Blind Alley",1939,69,NA,6,25,0,0,4.5,4.5,34.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Blind Date",1959,90,NA,6.9,64,4.5,0,0,0,14.5,14.5,44.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blind Date",1984,103,NA,5,216,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blind Date",1987,95,NA,5.4,3533,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Blind Date",1997,10,NA,6.7,9,14.5,0,0,0,0,24.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,1 -"Blind Date, The",2000,147,NA,6.1,20,0,14.5,0,0,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blind Faith",1998,122,NA,6.6,120,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Blind Fear",1989,90,NA,4.4,25,0,4.5,24.5,4.5,24.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Blind Flight",2003,97,NA,6.3,139,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Blind Fury",1989,86,NA,5.6,1472,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Blind Goddess, The",1948,87,NA,6.7,18,0,4.5,4.5,0,14.5,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Blind Heat",2002,95,NA,2.9,20,24.5,14.5,24.5,4.5,14.5,4.5,0,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Blind Horizon",2003,99,5100000,5.5,801,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Blind Husbands",1919,68,125000,7.4,81,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Blind Justice",1994,85,NA,5.1,155,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Blind Light",1997,58,NA,5.4,14,4.5,14.5,4.5,0,0,4.5,24.5,0,14.5,24.5,"",0,0,0,1,1,0,0 -"Blind Obsession",2001,90,NA,4.2,48,4.5,14.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blind Rage",1978,80,NA,3.3,34,14.5,14.5,4.5,24.5,14.5,0,4.5,0,4.5,4.5,"",1,0,1,0,0,0,0 -"Blind Spot",1947,64,NA,7,13,0,0,4.5,0,24.5,4.5,4.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blind Spot: Murder by Women",2000,87,NA,8.2,6,14.5,0,0,0,0,0,0,0,34.5,45.5,"",0,0,0,0,1,0,0 -"Blind Target",2000,90,NA,4,26,14.5,4.5,0,4.5,4.5,14.5,0,4.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Blind Terror",1971,89,NA,6.2,230,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blind Vengeance",1994,83,NA,1.9,8,24.5,14.5,0,0,0,34.5,0,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Blind Vision",1992,92,NA,4.2,35,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Blinde Fotograaf, De",1973,48,NA,4.2,10,24.5,0,0,0,0,14.5,24.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Blinded",2004,91,NA,6.2,8,14.5,0,14.5,14.5,0,14.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Blindfold",1965,102,NA,6.2,81,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Blindman",1971,105,NA,5.7,54,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Blindness",1998,88,NA,4.6,18,0,4.5,0,4.5,14.5,4.5,34.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Blindside",1986,98,NA,4.8,50,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Blink",1994,106,11000000,6.1,1517,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blink",2001,8,NA,4.4,133,14.5,0,0,0,0,0,4.5,4.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Blink of an Eye",1999,97,NA,4.7,51,0,14.5,24.5,4.5,24.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,1,0,0,0 -"Blinkende lygter",2000,109,NA,7.3,1998,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,1,0,0,0,0 -"Blinker",1999,90,NA,5.5,52,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blinker en het Bagbag-juweel",2000,92,NA,6.6,20,0,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Blinking Madonna and Other Miracles, The",1996,56,NA,7.7,6,0,0,14.5,0,0,0,34.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Blinkity Blank",1955,5,NA,7.4,33,0,4.5,0,4.5,0,24.5,14.5,34.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Blinky Bill",1992,80,NA,6.3,53,14.5,0,4.5,0,4.5,14.5,4.5,4.5,4.5,45.5,"",0,1,0,0,0,0,0 -"Bliss",1985,130,NA,6.5,327,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Bliss",1997,103,NA,5.8,478,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Bliss",2003,14,NA,5.5,14,0,14.5,14.5,4.5,24.5,4.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,1 -"Bliss of Mrs. Blossom, The",1968,93,NA,5.9,100,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Blithe Spirit",1945,96,NA,7.3,484,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Blitz",2002,28,5000,6.3,6,14.5,14.5,0,0,0,0,14.5,0,34.5,14.5,"",0,0,0,0,0,0,1 -"Blitz Wolf",1942,10,NA,7.7,88,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Blixa Bargeld Stole My Cowboy Boots",1996,11,NA,8.6,5,0,0,24.5,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Blizna",1976,112,NA,6.4,104,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blizzard of AAHHH's, The",1988,75,NA,8.2,16,0,0,0,0,4.5,14.5,0,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Blob, The",1958,82,240000,6,2143,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blob, The",1988,95,9000000,5.5,2484,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blobermouth",1990,86,NA,4.2,14,14.5,4.5,0,0,4.5,14.5,4.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Block Busters",1944,60,NA,6.4,57,0,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Block-Heads",1938,57,NA,7.6,346,4.5,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Blockade",1938,85,NA,5.8,49,0,4.5,0,14.5,24.5,24.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Blocked Trail, The",1943,55,NA,5.9,7,0,0,14.5,0,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Blockhouse, The",1973,93,NA,5.1,26,14.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Blodiga tiden, Den",1960,111,NA,7.6,37,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Blofatzis, O",1969,100,NA,7,7,0,0,14.5,0,14.5,0,44.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Blokersi",2001,77,NA,6.2,34,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Blokpost",1998,85,NA,7.1,80,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blomsterfangen",1996,43,NA,5.9,20,4.5,0,0,14.5,24.5,24.5,34.5,0,4.5,4.5,"",0,0,0,1,0,0,1 -"Blomstrande tider",1980,98,NA,4.4,9,0,14.5,34.5,24.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Blond & Brunettes",2001,95,NA,8.1,28,4.5,0,0,0,4.5,0,24.5,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Blond Cheat",1938,62,NA,5.3,31,0,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blonde Ambition",1981,84,NA,3.8,19,14.5,14.5,0,0,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Blonde Bait",1956,71,NA,5,5,0,0,0,0,84.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Blonde Bandit, The",1950,60,NA,5.8,5,0,0,0,24.5,0,0,44.5,44.5,0,0,"",0,0,0,1,0,1,0 -"Blonde Cobra",1963,33,NA,5.1,11,0,14.5,0,0,14.5,24.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,1 -"Blonde Crazy",1931,79,NA,6.8,109,4.5,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Blonde Dolly",1987,102,NA,5.7,26,0,4.5,4.5,0,14.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Blonde Dynamite",1950,66,NA,6.6,38,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Blonde Fever",1944,69,NA,5.4,18,0,0,14.5,0,24.5,24.5,14.5,0,14.5,4.5,"",0,0,0,1,0,0,0 -"Blonde Fire",1978,86,NA,6.2,13,0,0,0,4.5,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Blonde Fist",1991,102,NA,3.1,21,34.5,4.5,14.5,4.5,0,14.5,4.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Blonde Frau des Maharadscha, Die",1962,90,NA,1.2,10,84.5,14.5,14.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Blonde Goddess",1982,82,NA,5.8,14,14.5,4.5,0,0,0,14.5,4.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Blonde Heat",1985,88,NA,5.3,12,0,4.5,4.5,0,0,44.5,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Blonde Heaven",1995,80,NA,3.4,70,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Blonde Ice",1948,73,NA,6.3,30,14.5,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Blonde Inspiration",1941,72,NA,5.2,27,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Blonde Savage",1947,62,NA,5.1,6,0,14.5,0,0,14.5,14.5,45.5,0,0,0,"",1,0,0,0,0,0,0 -"Blonde Venus",1932,93,NA,7.1,426,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Blonde, The",1980,73,NA,3.7,10,0,14.5,24.5,0,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Blonder Traum, Ein",1932,84,NA,5.6,75,34.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blondes Have More Fun",1980,89,NA,6,7,14.5,0,44.5,0,14.5,0,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Blondes Have More Guns",1995,90,NA,4.2,45,24.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Blondes at Work",1938,63,NA,5.9,28,0,0,0,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blondie",1938,70,NA,6.6,89,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blondie Brings Up Baby",1939,72,NA,6.7,42,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blondie Goes Latin",1941,72,NA,6.2,36,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Blondie Goes to College",1942,72,NA,6.2,37,0,4.5,0,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blondie Has Servant Trouble",1940,72,NA,6.3,36,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Blondie Hits the Jackpot",1949,72,NA,5.7,32,0,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie Johnson",1933,67,NA,6.1,15,0,0,0,4.5,14.5,24.5,24.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Blondie Knows Best",1946,72,NA,6.6,40,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blondie Meets the Boss",1939,72,NA,6.2,40,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie Plays Cupid",1940,72,NA,6.3,39,4.5,0,4.5,0,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blondie Takes a Vacation",1939,72,NA,6.5,41,0,0,0,4.5,24.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Blondie for Victory",1942,71,NA,6.1,29,0,4.5,0,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie in Society",1941,76,NA,6.3,38,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blondie in the Dough",1947,72,NA,6.1,38,0,4.5,4.5,4.5,24.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie of the Follies",1932,91,602620,6,53,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Blondie on a Budget",1940,72,NA,6.1,51,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie's Anniversary",1947,72,NA,5.8,35,0,0,0,4.5,34.5,24.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Blondie's Big Deal",1949,72,NA,5.6,39,0,0,4.5,4.5,34.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie's Big Moment",1947,72,NA,5.9,33,0,0,0,4.5,34.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie's Blessed Event",1942,72,NA,6.2,30,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blondie's Hero",1950,72,NA,5,31,14.5,4.5,4.5,4.5,44.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie's Holiday",1947,72,NA,6.2,23,0,0,0,4.5,34.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie's Lucky Day",1946,72,NA,6.3,36,4.5,0,0,4.5,24.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie's Number One",1971,77,NA,5.7,14,4.5,14.5,4.5,4.5,14.5,0,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Blondie's Reward",1948,72,NA,6,22,0,0,0,4.5,44.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blondie's Secret",1948,72,NA,5.7,29,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blondin i fara",1957,87,NA,5.9,6,14.5,0,0,14.5,14.5,0,0,45.5,0,0,"",0,0,0,1,0,0,0 -"Blondinka za uglom",1983,83,NA,6.8,37,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Blood",1998,90,NA,7.6,5,0,0,0,0,0,0,44.5,64.5,0,0,"",1,0,0,0,0,0,0 -"Blood",2004,90,NA,6.1,33,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blood & Donuts",1995,89,NA,5.2,234,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Blood & Guts",1978,94,700000,4.6,14,14.5,0,24.5,24.5,4.5,4.5,0,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Blood Alley",1955,115,2000000,5.7,316,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blood Arrow",1958,76,NA,5.1,6,0,0,0,14.5,0,45.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Blood Bath",1966,80,NA,3.2,64,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blood Bath",1976,86,NA,2,22,34.5,14.5,14.5,4.5,4.5,0,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Blood Beach",1981,92,NA,3.2,268,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Blood Beast Terror, The",1968,88,NA,4.3,105,4.5,4.5,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blood Beast: The Films of Michael Reeves, The",1999,25,NA,7.8,8,0,0,0,14.5,0,14.5,24.5,45.5,0,0,"",0,0,0,0,1,0,1 -"Blood Beat",1985,85,NA,2.1,21,34.5,14.5,4.5,0,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Blood Bride",1980,87,NA,3.3,9,24.5,0,24.5,34.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Blood Brothers",1993,88,NA,6,17,0,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Blood Church",1985,112,NA,2.1,11,4.5,0,0,0,14.5,34.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blood Clan",1990,87,NA,2.8,12,0,4.5,24.5,4.5,14.5,0,0,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Blood Diner",1987,90,NA,3.6,288,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Blood Dolls",1999,84,NA,3.4,241,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Blood Feast",1963,58,24500,4.5,515,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Blood Feast 2: All U Can Eat",2002,99,NA,4.9,145,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Blood Fingers",1972,74,NA,7,7,0,0,0,14.5,0,0,44.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Blood Freak",1972,86,NA,3.4,125,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Blood Frenzy",1987,90,NA,4.5,18,4.5,0,14.5,24.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Blood Games",1990,90,NA,3.6,37,4.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Blood Hook",1986,85,NA,3.5,99,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blood Juice",1999,1,NA,5.1,14,4.5,4.5,4.5,4.5,14.5,34.5,0,14.5,0,4.5,"",0,1,0,0,0,0,1 -"Blood Justice",1995,87,NA,5.3,6,34.5,0,14.5,0,0,0,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Blood Lake",1987,90,NA,2.5,54,84.5,4.5,4.5,0,0,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Blood Legacy",1971,90,NA,2.4,40,34.5,14.5,24.5,4.5,4.5,4.5,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Blood Link",1982,98,NA,5.8,27,0,4.5,4.5,4.5,14.5,24.5,4.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Blood Mania",1970,88,NA,2.5,68,34.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood Money",1933,65,238591,7.6,20,0,0,0,4.5,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Blood Money",1980,62,NA,4.8,6,0,14.5,0,0,0,64.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Blood Money",1996,90,NA,2.8,37,24.5,14.5,24.5,4.5,14.5,0,0,0,4.5,4.5,"R",0,0,0,0,0,0,0 -"Blood Nasty",1989,80,NA,4.5,18,14.5,14.5,0,14.5,14.5,0,0,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Blood Orange",1953,76,NA,5.3,12,0,0,0,24.5,24.5,14.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Blood Oranges, The",1997,93,NA,4,91,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Blood Orgy of the She Devils",1972,73,NA,2,52,44.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood Rage",1983,82,NA,3.6,26,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood Red",1989,91,NA,3.3,130,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blood Relations",1988,90,NA,3.9,54,14.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blood Salvage",1990,98,NA,3.8,48,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Blood Screams",1988,75,NA,2.3,8,34.5,24.5,0,14.5,0,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Blood Shack",1971,70,NA,2.3,57,44.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blood Shot",2002,28,35000,4.5,22,14.5,0,0,4.5,0,4.5,0,14.5,4.5,45.5,"",1,0,1,0,0,0,1 -"Blood Simple.",1984,97,NA,7.7,9684,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blood Sisters",1987,86,NA,3.6,58,14.5,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blood Song",1982,89,NA,4.2,19,24.5,0,14.5,4.5,4.5,0,24.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood Stalkers",1978,90,NA,4,38,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Blood Suckers from Outer Space",1984,79,NA,2.9,46,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Blood Sucking Freaks",1976,88,NA,4.1,904,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blood Symbol",1992,87,NA,3.9,15,14.5,14.5,14.5,4.5,34.5,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood Syrup",2003,1,NA,7,11,0,4.5,0,14.5,4.5,0,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Blood Tide",1982,82,NA,2.6,77,14.5,14.5,24.5,14.5,4.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Blood Tracks",1985,85,NA,2.6,28,24.5,24.5,14.5,4.5,4.5,0,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood Type",1999,90,NA,6.3,20,4.5,0,0,0,4.5,14.5,14.5,4.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Blood Voyage",1976,80,NA,3.1,8,14.5,14.5,34.5,0,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Blood Warriors",1993,95,NA,4,16,14.5,24.5,0,14.5,24.5,14.5,0,0,0,4.5,"",1,0,0,1,0,0,0 -"Blood Work",2002,110,50000000,6.3,5965,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Blood and Concrete",1991,99,NA,5.4,137,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Blood and Donuts",2000,11,NA,2.8,16,34.5,24.5,14.5,14.5,0,0,0,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Blood and Lace",1971,87,NA,4.4,80,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blood and Sand",1922,80,NA,5.7,116,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Blood and Sand",1941,125,NA,6.6,231,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Blood and Steel",1959,63,NA,3.1,17,24.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Blood and Wine",1996,101,26000000,6,2134,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Blood for Dracula",1974,106,NA,5.4,751,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Blood from the Mummy's Tomb",1971,94,NA,5.1,224,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blood in the Face",1991,78,NA,6.8,107,24.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Blood in the Night",1993,17,NA,3.4,10,34.5,0,14.5,0,24.5,0,14.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Blood of Dracula",1957,68,NA,3.1,88,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood of Dracula's Castle",1969,84,NA,2.3,74,34.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood of Fu Manchu, The",1968,94,NA,4.4,137,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blood of Ghastly Horror",1972,87,NA,1.8,57,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blood of Heroes, The",1989,104,NA,5.9,872,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Blood of Hussain, The",1981,112,NA,8,6,14.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Blood of Jesus, The",1941,68,5000,4.5,44,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blood of the Beast",2003,74,2000,9.1,23,14.5,4.5,4.5,0,4.5,0,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Blood of the Dragon Peril",1980,83,NA,6.3,17,14.5,4.5,14.5,4.5,0,0,24.5,4.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Blood of the Hunter",1995,93,NA,4.2,59,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"PG-13",0,0,0,0,0,0,0 -"Blood of the Innocent",1994,95,NA,4.1,78,14.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Blood of the Samurai",2001,75,2000,6.5,18,24.5,4.5,0,14.5,0,0,4.5,14.5,0,44.5,"",1,0,0,0,0,0,0 -"Blood of the Vampire",1958,87,NA,4.1,60,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood on the Arrow",1964,91,NA,4.9,14,14.5,0,4.5,14.5,24.5,14.5,0,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Blood on the Moon",1948,88,NA,6.6,243,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blood on the Sun",1945,94,NA,6.2,242,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Blood, Bullets, Buffoons",1996,90,NA,3,13,34.5,14.5,14.5,14.5,4.5,0,4.5,0,0,4.5,"",1,0,1,0,0,0,0 -"Blood, Guts, Bullets and Octane",1998,87,7300,5.3,285,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Blood: The Last Vampire",2000,48,NA,6.7,1456,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,1,0,0,0,0,0 -"Bloodbath",1999,80,NA,5,5,24.5,24.5,24.5,0,24.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Bloodbath at the House of Death",1984,88,NA,4.6,108,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Bloodbath in Psycho Town",1989,87,NA,2.9,9,14.5,14.5,24.5,14.5,34.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Bloodbrothers",1978,117,NA,5.1,136,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bloodeaters",1980,89,NA,3.5,54,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bloodfight",1989,100,NA,2.7,43,24.5,14.5,4.5,14.5,4.5,4.5,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Bloodfist",1989,85,NA,2.8,80,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Bloodfist II",1990,85,NA,2.8,45,24.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Bloodfist III: Forced to Fight",1992,88,NA,3,55,14.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Bloodfist IV: Die Trying",1992,86,NA,3.6,59,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Bloodfist VI: Ground Zero",1994,86,NA,2.5,54,24.5,14.5,4.5,14.5,0,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Bloodfist VII: Manhunt",1995,95,NA,2.6,47,34.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Bloodfist VIII: Trained to Kill",1996,85,NA,2.6,34,14.5,14.5,4.5,24.5,4.5,4.5,14.5,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Bloodhounds of Broadway",1952,90,NA,5.6,29,0,0,0,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bloodhounds of Broadway",1989,93,NA,4.4,251,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Bloodletting",1997,89,10000,4.8,47,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Bloodletting, The",2004,87,NA,5.6,5,44.5,0,0,0,0,0,0,44.5,0,24.5,"R",0,0,0,0,0,0,0 -"Bloodline",1979,116,12000000,3.9,160,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bloodlock",1998,26,NA,6.2,18,0,0,0,14.5,14.5,14.5,34.5,14.5,14.5,0,"",1,0,0,1,0,0,1 -"Bloodlust",1992,85,NA,2.7,49,34.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Bloodlust!",1961,68,NA,2.4,239,34.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bloodlust: Subspecies III",1994,83,NA,4.5,195,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bloodmatch",1991,86,NA,2.6,30,24.5,24.5,24.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Bloodmoon",1989,100,NA,4.1,61,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bloodmoon",1997,102,NA,4.1,86,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Bloodrage",1979,78,NA,3.4,34,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Bloodscent",1995,83,NA,7.6,5,24.5,0,0,0,0,0,24.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Bloodshed",2005,82,NA,7.7,10,0,0,14.5,0,14.5,14.5,14.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Bloodsport",1988,92,NA,5.8,5221,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Bloodsport 2",1996,71,NA,4.3,274,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Bloodsport 3",1996,91,NA,2.9,132,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Bloodsport: The Dark Kumite",1998,100,NA,2.1,134,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Bloodstone",1988,91,NA,3.8,46,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Bloodstone: Subspecies II",1993,107,NA,4.9,236,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bloodsuckers",1998,85,NA,1.8,19,74.5,24.5,0,4.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Bloodsucking Pharaohs in Pittsburgh",1991,89,250000,3.6,80,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bloodthirsty",1999,98,NA,3.4,49,14.5,14.5,14.5,14.5,14.5,14.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Bloodthirsty Butchers",1970,79,NA,2.8,41,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Bloody Birthday",1981,85,NA,4.8,157,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bloody Brood, The",1959,80,80000,4.2,11,0,0,14.5,14.5,14.5,4.5,4.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Bloody Child, The",1996,85,NA,1.6,39,45.5,4.5,4.5,0,4.5,0,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Bloody Christmas",1999,6,NA,1.9,13,44.5,14.5,4.5,4.5,4.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Bloody Christmas",2003,8,NA,3.3,44,24.5,0,0,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Bloody Hell",2005,7,NA,8.5,6,0,0,0,0,14.5,14.5,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Bloody Kids",1979,91,NA,5,38,14.5,0,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bloody Mallory",2002,94,NA,4.1,167,14.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Bloody Mama",1970,90,NA,4.7,436,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bloody Mary",1992,7,NA,5.4,12,0,0,4.5,0,34.5,34.5,4.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Bloody New Year",1987,90,NA,4.3,63,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bloody Olive, The",1996,12,NA,8.2,81,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Bloody Sunday",2002,107,5000000,7.6,2388,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Bloody psycho - Lo specchio",1989,90,NA,2.6,24,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Bloom",2003,113,NA,4.2,58,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Bloom",2004,7,0,6.8,9,34.5,0,0,0,0,0,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Bloomfield",1971,97,NA,4,12,24.5,0,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Blooming Dahlia",2004,8,NA,6.8,6,0,14.5,14.5,0,0,0,0,34.5,0,34.5,"",0,0,0,0,0,0,1 -"Blossom Seeley and Bennie Fields",1929,10,NA,6.3,14,0,0,4.5,0,4.5,14.5,14.5,4.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Blossom Time",1934,90,NA,3.2,8,0,14.5,14.5,14.5,14.5,0,24.5,0,0,24.5,"",0,0,0,0,0,1,0 -"Blossom Time",1996,106,NA,3.4,18,14.5,0,0,0,0,4.5,4.5,0,34.5,44.5,"",0,0,0,1,0,0,0 -"Blossoms In the Dust",1941,99,NA,6.6,165,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blot, The",1921,80,NA,5.9,35,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Blotter",2004,20,15000,7.1,7,14.5,0,0,0,14.5,0,0,44.5,0,24.5,"",0,0,0,1,0,0,1 -"Blotto",1930,26,NA,7.7,133,4.5,0,4.5,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Blow",2001,124,30000000,7.1,18670,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Blow",2002,10,NA,7.5,7,0,14.5,0,0,0,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,1 -"Blow Dry",2001,87,NA,6.1,1611,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Blow Job",1963,35,NA,5.8,55,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Blow Job",2002,11,NA,8.4,12,14.5,0,0,0,0,0,0,0,4.5,74.5,"",0,0,1,0,0,0,1 -"Blow Me Down!",1933,6,NA,6.4,11,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Blow Out",1981,108,18000000,7,3563,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blow Out, The",1936,7,NA,7.8,17,0,0,0,0,4.5,4.5,44.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Blowback",2000,91,NA,4.3,201,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Blowing Smoke",2004,88,NA,8.8,12,0,4.5,0,0,0,0,0,24.5,0,64.5,"",0,0,1,1,0,0,0 -"Blowing Wild",1953,90,1000000,5.6,67,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Blown Away",1992,93,NA,5.1,1340,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Blown Away",1994,121,NA,5.8,4330,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Blown Chance",2001,1,NA,4.2,18,0,0,4.5,4.5,0,4.5,24.5,4.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Blowup",1966,111,1800000,7.4,4194,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Blu gang vissero per sempre felici e ammazzati",1973,95,NA,6.7,7,0,0,14.5,0,0,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Blue",1968,113,NA,5.2,50,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blue",1992,22,NA,6.2,22,4.5,0,4.5,0,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Blue",2001,116,NA,5.5,20,0,4.5,14.5,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Blue Angel Cafe",1989,89,NA,3.6,24,14.5,14.5,14.5,4.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Blue Angel, The",1959,107,NA,5.6,65,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Blue Bayou",1946,4,NA,6,12,4.5,0,0,0,14.5,14.5,34.5,0,4.5,14.5,"",0,1,0,0,0,0,1 -"Blue Bird, The",1918,75,NA,9.1,16,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Blue Bird, The",1940,88,NA,5.9,171,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Blue Bird, The",1976,99,12000000,3.9,148,24.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blue Blazes",1936,17,NA,6,8,0,0,0,0,34.5,0,14.5,45.5,0,0,"",0,0,1,0,0,0,1 -"Blue Blood",1951,72,NA,5.5,6,0,0,0,14.5,0,64.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Blue Blood",1973,90,NA,4.5,17,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blue Boy, The",1997,25,NA,3.6,8,24.5,0,34.5,0,24.5,0,0,14.5,0,0,"",0,0,0,1,0,1,1 -"Blue Butterfly, The",2004,97,NA,5.8,141,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blue Canadian Rockies",1952,58,NA,6.2,10,0,0,0,14.5,45.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Blue Car",2002,96,NA,7,819,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Blue Cat Blues",1956,7,NA,6.3,33,0,0,4.5,14.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Blue Caviar",2001,14,NA,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Blue Chips",1994,108,NA,5.6,1849,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blue Citrus Hearts",2003,115,3000,7,34,14.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blue City",1986,83,NA,4.2,185,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blue City",1996,12,NA,7,53,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Blue Collar",1978,114,NA,7.3,636,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blue Collar Comedy Tour: The Movie",2003,105,NA,7.6,804,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"PG-13",0,0,1,0,1,0,0 -"Blue Crush",2002,104,30000000,5.7,4791,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Blue Dahlia, The",1946,96,NA,7.2,563,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blue Danube, The",1939,7,NA,8.2,7,0,0,0,0,0,14.5,0,14.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Blue Denim",1959,89,NA,7,88,0,4.5,0,4.5,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blue Desert",1991,97,NA,5.3,160,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Blue Diner, The",2001,100,NA,5.8,51,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Blue Eagle, The",1926,58,NA,4.8,32,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Blue Eyed",1996,90,NA,8.4,73,4.5,0,0,4.5,0,4.5,4.5,24.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Blue Fin",1978,88,NA,5.2,42,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Blue Fire Lady",1977,96,NA,5,10,14.5,0,0,24.5,34.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Blue Fish",1998,60,NA,4.3,11,0,0,14.5,24.5,4.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,1,0 -"Blue Flame",1993,88,NA,4.3,29,14.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Blue Gardenia, The",1953,90,NA,6.9,325,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Blue Grass of Kentucky",1950,72,NA,5.3,6,0,0,0,0,45.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Blue Haven",2001,17,NA,4.7,39,14.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Blue Hawaii",1961,102,NA,5.3,682,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Blue Heaven",1984,100,NA,4.6,6,0,0,34.5,14.5,14.5,14.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Blue Hill Avenue",2001,120,1200000,6.6,85,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Blue Ice",1992,105,NA,4.9,319,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Blue Iguana, The",1988,90,NA,3.9,130,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Blue Jean Brat",1991,87,NA,7.9,19,0,0,4.5,4.5,0,0,4.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Blue Jeans",1975,93,NA,5.1,5,0,0,0,0,24.5,24.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Blue Juice",1995,90,NA,5.1,574,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Blue Lagoon, The",1949,101,NA,6.5,77,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Blue Lagoon, The",1980,104,4500000,4.7,4324,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Blue Lamp, The",1950,84,NA,6.6,150,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Blue Max, The",1966,153,NA,6.6,778,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Blue Monkey",1987,96,NA,2.9,84,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blue Montana Skies",1939,56,NA,5.8,7,0,14.5,0,14.5,24.5,0,0,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Blue Moon",1998,90,1000,6.8,23,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,4.5,24.5,"",1,0,0,1,0,1,0 -"Blue Moon",2000,89,NA,5.1,70,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Blue Moon",2002,97,NA,6.4,167,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Blue Moses",1962,11,NA,6.8,8,14.5,0,14.5,0,0,14.5,0,0,24.5,34.5,"",0,0,0,0,0,0,1 -"Blue Mountain",1997,97,NA,8.4,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Blue Movie",1969,105,NA,3,45,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Blue Movie",1971,88,NA,4.2,108,14.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blue Movie",1978,90,NA,1.6,23,34.5,4.5,4.5,4.5,4.5,0,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Blue Movies",1988,92,NA,3.2,33,24.5,4.5,34.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Blue Murder at St. Trinian's",1957,86,NA,6.8,147,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Blue Planet",1990,40,NA,7.7,136,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Blue Rhythm",1931,7,NA,6.3,28,0,0,4.5,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Blue Ridge Fall",1999,105,NA,4.9,92,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Blue Scar",1949,90,NA,7.2,5,24.5,0,0,0,24.5,0,0,0,0,64.5,"",0,0,0,1,0,0,0 -"Blue Skies",1946,104,3000000,6.3,160,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Blue Skies Again",1983,96,NA,4.9,51,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Blue Sky",1994,101,NA,6.4,1251,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Blue Steel",1934,54,NA,5.3,171,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blue Steel",1990,102,NA,5.2,1894,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Blue Streak",1999,93,36000000,5.8,7952,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Blue Sunshine",1976,96,NA,5.7,203,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Blue Thunder",1983,108,NA,5.9,2305,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Blue Tiger",1994,88,NA,4.8,118,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Blue Veil, The",1951,113,NA,6.8,51,0,0,0,0,4.5,4.5,4.5,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Blue Velvet",1986,120,6000000,7.7,18756,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Blue Vengeance",1992,90,NA,5.3,8,14.5,24.5,14.5,0,14.5,0,0,0,0,34.5,"",1,0,0,0,0,0,0 -"Blue Vinyl",2002,98,NA,6.7,81,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Blue Water, White Death",1971,99,NA,6.4,53,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Blue and the Gray, The",1935,11,NA,4.6,5,0,0,24.5,24.5,64.5,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Blue in Green",2005,91,50000,9.1,13,4.5,0,0,0,0,0,0,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Blue in the Face",1995,83,2000000,6.4,2306,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Blue of the Night",1933,20,NA,6,13,0,0,4.5,4.5,14.5,14.5,34.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Blue, White and Perfect",1942,74,NA,6.5,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Bluebeard",1944,73,NA,6.5,138,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bluebeard",1972,125,NA,4.1,148,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bluebeard's Eighth Wife",1938,80,NA,7.2,242,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Blueberry",2001,13,NA,4.7,7,0,0,24.5,0,24.5,0,14.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Blueberry",2004,124,NA,5.2,1256,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Blueberry Hill",1988,93,NA,2.5,79,64.5,4.5,4.5,4.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Blueberry Hill",1989,95,NA,5.9,106,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Bluefish",2003,24,7000,7.6,5,24.5,0,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,1,0,0,1 -"Blueprint for Murder, A",1953,77,NA,6.7,46,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Blues Accordin' to Lightin' Hopkins, The",1970,31,NA,7.1,25,0,0,4.5,0,0,14.5,14.5,24.5,34.5,14.5,"",0,0,0,0,1,0,1 -"Blues Brothers 2000",1998,123,28000000,4.5,5267,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Blues Brothers, The",1980,148,27000000,7.7,28964,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Blues Busters",1950,67,NA,6.5,47,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Blues Lahofesh Hagadol",1987,101,350000,7.8,54,4.5,0,4.5,0,0,4.5,4.5,34.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Blues de la calle Pop (Aventuras de Felipe Malboro, volumen 8), Los",1983,90,NA,9,6,0,0,0,14.5,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Blues in the Night",1941,88,NA,6.4,80,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Blues za Saro",1998,96,NA,4.8,6,0,0,0,14.5,14.5,14.5,14.5,0,14.5,14.5,"",0,0,1,1,0,0,0 -"Bluff storia di truffe e di imbroglioni",1976,105,NA,5.7,142,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Blume der Hausfrau, Die",1999,92,NA,5.7,46,4.5,0,4.5,4.5,14.5,14.5,4.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Blume in Love",1973,115,NA,6,143,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Blunder Boys",1955,16,NA,5.8,45,4.5,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Blurred",2002,95,NA,4.7,127,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Blush",2000,10,NA,7.2,11,4.5,4.5,0,0,0,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Bluthochzeit, Die",2005,92,NA,7.1,45,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Blutiger Freitag",1972,97,NA,6,39,4.5,4.5,4.5,0,14.5,14.5,14.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Blutjung und liebeshungrig",1972,90,NA,2.9,23,34.5,14.5,14.5,14.5,4.5,4.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Blutrausch",1997,94,NA,6.2,23,0,0,4.5,0,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Bo Ba Bu",1998,85,NA,6.7,22,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Bo hao",1991,136,NA,6.1,46,0,4.5,4.5,0,14.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bo ming chan dao duo ming chuang",1979,90,NA,7.9,36,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Boarding House Blues",1948,90,NA,4.5,10,14.5,0,14.5,0,0,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Boardinghouse",1982,88,NA,1.7,55,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Boardwalk",1979,98,NA,5.8,20,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Boat Builders",1938,7,NA,7,71,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Boat Trip",2002,97,20000000,4.5,2991,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Boat, The",1921,20,NA,7.7,237,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Boatniks, The",1970,99,NA,4.4,153,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bob & Carol & Ted & Alice",1969,101,2000000,6,607,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Bob & Ray, Jane, Laraine & Gilda",1979,75,NA,7.4,12,0,0,0,0,0,0,14.5,4.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Bob 3:13",2003,3,NA,6.4,5,44.5,0,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Bob Marley",1981,65,NA,8.5,9,14.5,0,0,0,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Bob Marley Live in Concert",1998,65,NA,7.1,15,0,0,0,4.5,4.5,14.5,0,24.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Bob Marley and the Wailers: The Bob Marley Story",1986,100,NA,8.3,6,0,0,0,0,14.5,0,14.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Bob Mathias Story, The",1954,80,NA,5.7,11,0,4.5,0,4.5,4.5,24.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Bob Roberts",1992,102,NA,7.1,4317,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bob Wills and His Texas Playboys",1944,11,NA,5.1,6,0,0,14.5,0,0,14.5,14.5,0,14.5,34.5,"",0,0,0,0,1,0,1 -"Bob le braqueur",2001,4,NA,7.1,7,0,0,0,14.5,0,0,45.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Bob le flambeur",1955,98,NA,7.8,650,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bob's Birthday",1993,12,NA,7.4,64,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Bob's Weekend",1996,93,NA,4.2,35,0,14.5,4.5,0,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bobbie Jo and the Outlaw",1976,89,NA,3.8,107,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Bobbikins",1960,89,NA,4.6,13,0,4.5,4.5,4.5,44.5,4.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Bobby",1973,168,NA,6,62,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Bobby Deerfield",1977,124,NA,4.9,399,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Bobby Dodd greift ein",1959,92,NA,5.3,5,0,0,0,24.5,44.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Bobby G. Can't Swim",1999,89,NA,6.2,98,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Bobby Jones, Stroke of Genius",2004,120,NA,6.2,490,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Bobby Loves Mangos",1998,21,NA,7.7,92,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Bobby Sox",1996,90,NA,7,47,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bobby, the Coward",1911,18,NA,5.1,5,24.5,0,0,0,24.5,64.5,0,0,0,0,"",0,0,0,1,0,0,1 -"Bobo und die Hasenbande",1995,80,NA,8.8,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,1,0,0,0,0,0 -"Bobo, O",1987,120,NA,2.6,5,24.5,0,24.5,0,0,0,0,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Bobo, The",1967,105,NA,4.8,118,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bobolink Pink",1975,7,NA,4.6,6,0,0,0,34.5,64.5,0,0,0,0,0,"",0,1,0,0,0,0,1 -"Bobosse",1959,95,NA,4.4,6,0,0,0,45.5,14.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Boca",1994,91,NA,6.3,86,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Boca a boca",1995,106,NA,6.8,375,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Boca de Ouro",1963,103,NA,8.6,16,0,0,4.5,0,4.5,4.5,0,14.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Boca de Ouro",1990,105,NA,8.6,16,0,0,0,0,4.5,0,14.5,45.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Boca del lobo, La",1988,128,NA,7.2,66,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Bocage - O Triunfo do Amor",1998,85,NA,7.3,23,14.5,0,0,4.5,0,4.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Boccaccio",1972,102,NA,4,5,0,0,24.5,44.5,0,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Boccaccio '70",1962,150,NA,7,319,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bocek",1995,91,NA,7,7,0,0,14.5,0,24.5,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Bockerer 2, Der",1996,95,NA,6,44,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Boda del acordeonista, La",1985,94,NA,4.8,7,0,0,14.5,14.5,0,14.5,0,14.5,44.5,0,"",0,0,0,0,0,0,0 -"Boda secreta",1989,95,NA,6.5,30,0,0,0,0,4.5,14.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Bodacious Ta Ta's",1984,74,NA,5.4,12,0,4.5,4.5,14.5,0,44.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Bodas de Deus, As",1999,150,NA,7.1,87,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bodas de sangre",1981,70,NA,7.5,144,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bodies in Heat",1983,73,NA,5,11,0,4.5,0,4.5,4.5,14.5,0,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Bodies in Heat 2",1989,74,NA,6.5,5,0,0,24.5,0,0,24.5,0,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Bodies, Rest & Motion",1993,95,NA,5.4,730,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Bodigaado Kiba",1973,87,NA,5.5,9,0,0,0,14.5,34.5,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Bodily Harm",1995,91,NA,4.7,93,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Bodo - Eine ganz normale Familie",1989,90,NA,5.9,35,4.5,24.5,0,0,14.5,4.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Body Beautiful, The",1991,23,NA,5.9,14,0,0,4.5,4.5,0,4.5,34.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Body Beneath, The",1970,82,NA,4.4,35,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Body Care and Grooming",1947,16,NA,3.5,47,24.5,34.5,4.5,14.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,1,0,1 -"Body Chemistry",1990,84,NA,3.9,101,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Body Chemistry II: The Voice of a Stranger",1992,84,NA,2.7,64,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Body Count",1998,85,NA,5,387,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Body Disappears, The",1941,72,NA,5.3,27,4.5,0,4.5,14.5,24.5,34.5,4.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Body Double",1984,114,10000000,6.3,3543,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Body Drop Asphalt",2000,90,NA,7.4,10,0,0,0,0,0,24.5,24.5,24.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Body Fever",1969,78,NA,2.6,31,24.5,4.5,4.5,0,24.5,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Body Heat",1981,113,NA,7.4,5063,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Body Language",1996,77,NA,9.2,7,0,0,24.5,0,0,0,0,14.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Body Melt",1993,81,NA,3.9,206,24.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Body Parts",1991,88,10000000,4.6,604,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Body Puzzle",1991,90,NA,4.5,47,4.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Body Rock",1984,94,NA,2.4,43,45.5,14.5,4.5,14.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Body Shop, The",1973,75,NA,2.4,64,34.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Body Shot",1993,98,NA,4.1,93,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Body Shots",1999,106,NA,4.9,1805,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Body Slam",1987,89,NA,4.7,188,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Body Snatcher, The",1945,73,NA,7.3,701,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Body Snatchers",1993,87,NA,5.6,1911,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Body Talk",1982,81,NA,4.9,16,4.5,14.5,0,4.5,14.5,34.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Body Trouble",1992,99,NA,1.8,11,34.5,24.5,14.5,4.5,4.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Body Wars",1989,5,NA,6.2,92,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,1 -"Body Waves",1992,80,NA,2.9,58,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Body Without Soul",1996,94,NA,5.3,47,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Body and Soul",1931,70,NA,6.3,13,0,0,0,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Body and Soul",1947,104,NA,8.1,521,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Body and Soul",1981,109,NA,4,25,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Body and Soul",1998,91,NA,3.6,53,24.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Body by Garret",1982,27,NA,2.9,6,0,14.5,14.5,0,14.5,0,14.5,34.5,0,0,"",0,0,0,0,1,0,1 -"Body of Evidence",1993,102,30000000,4.1,2625,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Body of Influence 2",1996,87,1200000,3.4,44,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Body, The",1970,112,NA,5.9,13,0,0,0,14.5,0,34.5,14.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Body, The",2001,109,NA,5.3,1646,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Bodyguard",1948,75,NA,5.9,60,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bodyguard, The",1944,7,NA,6.1,44,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Bodyguard, The",1992,130,NA,5.3,11415,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Bodyguard, The",2004,105,NA,7.3,7,0,0,0,0,24.5,14.5,14.5,14.5,0,24.5,"",1,0,1,0,0,0,0 -"Bodysong",2003,83,NA,6.5,85,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Bodywork",1999,92,NA,4.8,52,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Boefje",1939,96,NA,7.7,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Boekverfilming, De",1999,88,NA,6.1,169,14.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Boerenpsalm",1989,100,NA,6.9,32,4.5,0,0,0,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Boesman and Lena",2000,90,NA,4.3,80,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boezemvriend, De",1982,100,NA,4.5,105,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bof... Anatomie d'un livreur",1971,110,NA,6.8,15,0,0,0,0,0,14.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Bofetada",1999,12,NA,5.4,14,0,0,0,14.5,4.5,0,0,24.5,0,45.5,"",0,0,0,0,0,0,1 -"Bofors Gun, The",1968,105,NA,5.8,65,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bog",1983,90,NA,2.8,47,44.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Bog je umro uzalud",1969,91,NA,8,5,0,0,24.5,0,0,0,24.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Bogorodica",1999,85,NA,6.2,24,4.5,4.5,0,0,14.5,4.5,14.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Bogus",1996,110,32000000,5,1007,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"Boh fett",1999,87,NA,7.3,10,0,14.5,14.5,24.5,0,0,14.5,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Bohater roku",1987,115,NA,5.5,10,24.5,0,0,0,24.5,0,45.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Boheme, La",1926,95,NA,6.8,60,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Bohemia docta aneb labyrint sveta a lusthauz srdce",2000,254,NA,3.7,6,64.5,0,0,0,0,0,0,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Bohemian Girl, The",1936,71,NA,6.6,203,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bohus bataljon",1949,107,NA,3,5,0,0,64.5,0,0,0,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Boia di Venezia, Il",1963,90,NA,4.6,14,14.5,0,4.5,4.5,0,4.5,24.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Boia scarlatto, Il",1965,87,NA,3.9,104,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Boiler Room",2000,118,9000000,6.8,8586,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Boiling Point, The",1932,70,NA,4.7,5,0,0,24.5,0,24.5,0,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Boin-n-g",1963,70,NA,1.2,11,64.5,14.5,4.5,0,0,0,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Bois noirs, Les",1989,113,NA,6.2,23,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Boj na Kosovu",1989,117,NA,6,42,14.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Bokhandlaren som slutade bada",1969,99,NA,5.7,35,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bokser",1967,93,NA,5.9,5,0,0,24.5,0,0,24.5,24.5,0,0,44.5,"",1,0,0,1,0,0,0 -"Bokseren",2003,37,NA,6.1,8,0,0,0,0,0,45.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,1 -"Bokseri idu u raj",1967,88,NA,8.4,5,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Boksuneun naui geot",2002,121,NA,7.6,1325,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",1,0,0,1,0,0,0 -"Bokunchi",2003,116,NA,6,18,0,0,14.5,4.5,4.5,14.5,24.5,14.5,0,24.5,"",0,0,1,1,0,0,0 -"Bokura wa minna ikiteiru",1993,115,NA,6.9,16,0,4.5,0,0,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Bokuto kidan",1992,116,NA,7,6,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Bola, El",2000,88,NA,7.5,603,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bold Affair, A",1998,99,NA,4.1,71,14.5,14.5,14.5,4.5,24.5,14.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Bold Bank Robbery, The",1904,6,NA,5.6,9,14.5,0,14.5,0,0,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Bold Caballero, The",1936,67,100000,4.9,15,24.5,0,4.5,0,14.5,4.5,34.5,4.5,4.5,0,"",0,0,0,0,0,1,0 -"Bold and the Brave, The",1956,87,NA,6.2,21,0,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Boldog lovak",1995,76,NA,9.1,9,0,0,0,0,0,14.5,0,0,44.5,44.5,"",0,0,1,0,0,0,0 -"Boleiros - Era Uma Vez o Futebol ...",1998,93,NA,7.5,96,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Bolero",1934,85,NA,5.9,35,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bolero",1984,105,NA,2.6,1298,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bolero",1985,103,NA,2.9,29,24.5,14.5,24.5,14.5,4.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Bolero de Raquel, El",1957,101,NA,6.3,43,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Bolero, The",1973,26,NA,2.4,10,24.5,0,0,0,14.5,0,0,0,34.5,44.5,"",0,0,0,0,1,0,1 -"Boli shaonu",2001,94,NA,6.2,20,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bolivia",2001,75,NA,8.7,128,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Bolje od bekstva",1993,110,NA,7.1,21,4.5,0,4.5,0,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bolji zivot",1989,98,NA,4.5,6,14.5,0,14.5,0,0,0,0,0,14.5,45.5,"",0,0,1,0,0,0,0 -"Bollywood",1994,120,NA,3.1,17,74.5,0,0,0,4.5,0,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Bollywood Bound",2001,88,NA,5.4,24,14.5,0,4.5,14.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Bollywood Queen",2002,89,NA,4.4,74,24.5,4.5,0,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Bollywood/Hollywood",2002,105,NA,6.1,593,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Bolotnaya strit, ili sredstvo protiv seksa",1991,81,NA,2.1,10,44.5,0,0,0,34.5,24.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Bolse vita",1996,97,NA,7.4,31,4.5,0,0,0,4.5,14.5,4.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Bolshaya semya",1954,108,NA,7.8,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Bolshoe kosmicheskoe puteshestvie",1974,66,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Boludas, Las",1993,88,NA,3.3,5,24.5,24.5,0,0,24.5,0,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Bom yeoreum gaeul gyeoul geurigo bom",2003,103,NA,8.2,2829,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Bom!",2000,12,NA,7.8,10,0,0,0,0,34.5,0,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Bomba and the Hidden City",1950,71,NA,4.8,12,0,4.5,0,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bomba and the Jungle Girl",1952,70,NA,4.9,11,0,0,0,24.5,24.5,4.5,24.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Bomba on Panther Island",1949,70,NA,4.4,10,0,14.5,0,45.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bomba u 10 i 10",1967,88,NA,5.1,6,0,0,0,14.5,45.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Bomba, A",2001,90,NA,6.2,84,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Bomba, La",1999,96,NA,5.5,36,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bomba, the Jungle Boy",1949,70,NA,5.2,19,0,4.5,0,14.5,24.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Bombardier",1943,99,NA,5.9,70,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bombay",1995,130,NA,7.3,353,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Bombay 405 Miles",1980,164,NA,7.3,19,4.5,0,0,0,4.5,0,34.5,24.5,24.5,4.5,"",1,0,1,0,0,0,0 -"Bombay Boys",1998,105,NA,8.3,94,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Bombay Eunuch",2001,71,NA,8,12,0,0,0,0,0,14.5,4.5,24.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Bombay Mail",1934,70,NA,5.8,10,0,0,0,14.5,14.5,14.5,14.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Bombay Talkie",1970,112,NA,4.9,80,4.5,4.5,4.5,24.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bomben auf Monte Carlo",1931,111,NA,6.5,34,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Bomben auf Monte Carlo",1959,86,NA,4.6,6,14.5,0,14.5,0,34.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Bomber",1982,101,NA,5.3,185,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Bomber & Paganini",1976,104,NA,6.9,21,0,0,0,0,4.5,4.5,4.5,44.5,0,34.5,"",0,0,1,0,0,0,0 -"Bomber's Moon",1943,67,NA,7,5,0,0,0,0,44.5,24.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Bombers B-52",1957,106,NA,5.3,94,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Bombi Bitt och jag",1936,76,NA,7,7,0,14.5,0,24.5,0,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Bombshell",1933,96,344000,7.8,295,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Bombshell",1996,98,NA,4.3,65,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Bomgay",1996,12,NA,9,11,4.5,0,0,0,0,0,0,4.5,0,84.5,"",0,0,0,0,1,0,1 -"Bomsalva",1978,106,NA,5.6,10,0,0,24.5,14.5,24.5,24.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Bon Appetit",1980,90,NA,4.3,13,24.5,4.5,24.5,0,0,34.5,0,0,4.5,4.5,"",0,0,0,0,0,1,0 -"Bon Voyage",1944,26,NA,7.1,156,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Bon Voyage!",1962,130,NA,4.8,79,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Bon Voyage, Charlie Brown (and Don't Come Back!)",1980,80,NA,6.6,341,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Bon plaisir, Le",1984,102,NA,6.2,82,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bon plan",2000,90,NA,4.8,41,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Bon roi Dagobert, Le",1963,95,NA,4.9,8,0,14.5,0,14.5,24.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Bon roi Dagobert, Le",1984,112,NA,3.6,72,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bon shans, inspektore!",1983,94,NA,7.2,9,0,0,0,0,0,0,24.5,24.5,0,45.5,"",0,0,1,0,0,0,0 -"Bon voyage",2003,115,20000000,7.2,1061,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Bona",1981,85,NA,9.5,19,14.5,0,0,0,0,0,14.5,4.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Bonaerense, El",2002,105,NA,7.3,286,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bonanza Bunny",1959,7,NA,6.8,36,0,0,0,4.5,14.5,14.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Bonanza Town",1951,56,NA,5,10,0,0,14.5,34.5,34.5,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Bonchi",1960,105,NA,7,12,0,0,0,4.5,0,0,45.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Bond, The",1918,5,NA,5.8,59,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Bondage Queen Kate",1995,45,NA,5.9,8,14.5,14.5,0,14.5,0,34.5,0,0,14.5,14.5,"",0,1,0,0,0,0,0 -"Bondi Tsunami",2004,91,NA,7.1,13,24.5,0,0,0,0,34.5,4.5,4.5,4.5,24.5,"",0,0,1,1,1,0,0 -"Bone",1972,95,NA,6,84,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bone Bandit",1948,7,NA,6.2,10,0,0,0,24.5,14.5,24.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Bone Collector, The",1999,118,48000000,6.2,17766,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Bone Daddy",1998,90,NA,5.3,371,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Bone Snatcher, The",2003,96,6000000,4.1,400,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Bone Sweet Bone",1948,7,NA,6.6,24,0,0,0,4.5,4.5,34.5,34.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Bone Trouble",1940,9,NA,7,35,4.5,0,0,4.5,0,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Bone for a Bone, A",1951,7,NA,6.7,27,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Bones",1984,100,NA,3.7,6,0,0,14.5,34.5,14.5,0,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Bones",2001,96,16000000,4.2,1418,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Bones of the Forest",1995,80,NA,6.7,6,0,0,0,0,0,45.5,14.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Boney D",1996,3,NA,4.9,6,0,0,0,14.5,14.5,14.5,45.5,0,0,0,"",0,1,1,0,0,0,1 -"Boneyard, The",1991,98,NA,4.4,82,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bonfire of the Vanities, The",1990,125,47000000,5,4151,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Bonga, O Vagabundo",1971,90,NA,5.1,17,14.5,4.5,0,14.5,4.5,4.5,24.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Bongbatnaguene",1991,103,NA,1.8,5,84.5,24.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Bongja",2000,92,NA,5.2,11,24.5,0,14.5,24.5,0,14.5,4.5,0,0,0,"",0,0,1,1,0,0,0 -"Bongwater",1997,97,NA,4.5,458,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Bonheur d'occasion",1983,123,NA,5.8,29,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Bonheur, Le",1934,98,NA,7,21,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Bonheur, Le",1965,79,NA,6.9,131,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bonhoeffer: Agent of Grace",2000,88,NA,6.4,69,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bonjour l'angoisse",1988,95,NA,5.7,21,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bonjour tristesse",1958,94,NA,6.2,254,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bonne, La",1987,82,NA,4.7,29,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bonnes causes, Les",1962,100,NA,6.1,20,0,4.5,0,4.5,4.5,44.5,0,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bonnes femmes, Les",1960,100,NA,7.1,224,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Bonnie Brier Bush, The",1921,50,NA,7.1,11,4.5,0,0,4.5,4.5,0,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Bonnie Parker Story, The",1958,79,NA,5.3,53,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bonnie Prince Charlie",1948,136,NA,4.3,37,0,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bonnie Scotland",1935,80,NA,6.7,177,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bonnie and Clyde",1967,111,2500000,7.9,12653,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Bonnie e Clyde all'italiana",1982,97,NA,4.4,34,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bonnie's Kids",1973,84,NA,5.6,18,0,14.5,0,4.5,24.5,0,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Bono",2004,97,250000,1,14,44.5,0,0,0,0,4.5,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Bons Tempos Voltaram: Vamos Gozar Outra Vez, Os",1985,115,NA,7.6,14,0,0,4.5,4.5,14.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Bons baisers de Hong Kong",1975,97,NA,3.4,24,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Bons vivants, Les",1965,100,NA,6.5,30,4.5,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bonsoir",1994,85,NA,7.5,171,0,0,4.5,0,4.5,4.5,34.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Bonus malus",1993,90,NA,5.7,12,0,14.5,0,0,4.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Bony a Klid",1987,90,NA,6.2,24,4.5,0,0,4.5,14.5,4.5,24.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Bonzo Goes to College",1952,80,NA,4.7,59,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Boo",1932,10,NA,3.9,76,4.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Boob Tube, The",1975,82,NA,4.3,42,14.5,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Boob, The",1926,61,NA,5.7,67,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Boobie Girl",2002,5,NA,5.1,12,0,0,14.5,14.5,24.5,14.5,0,0,4.5,14.5,"",0,1,0,0,0,0,1 -"Boobs in Arms",1940,18,NA,7.6,64,0,4.5,0,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Boobs in the Woods",1950,7,NA,7.2,89,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Booby Dupes",1945,17,NA,6.6,45,4.5,4.5,0,4.5,4.5,4.5,34.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Booby Hatch, The",1976,86,NA,1.3,11,64.5,0,0,4.5,4.5,0,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Booby Hatched",1944,7,NA,7.3,16,0,0,0,0,14.5,14.5,34.5,14.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Booby Trap",1970,90,NA,3.1,7,0,14.5,24.5,14.5,24.5,0,0,14.5,0,0,"",1,0,0,0,0,0,0 -"Booby Traps",1944,3,NA,7.2,28,0,0,0,0,4.5,24.5,14.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Boogens, The",1982,95,600000,4.2,155,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Boogeyman",2005,89,20000000,4.1,2055,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Boogeyman II",1983,83,NA,1.9,110,45.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Boogeyman, The",1980,82,NA,4.7,309,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Boogeyman, The",1982,28,NA,4.6,83,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Boogie Boy",1998,104,NA,5,203,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Boogie Man Will Get You, The",1942,66,NA,5.1,47,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Boogie Nights",1997,156,15000000,7.6,27380,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Boogie-Doodle",1948,4,NA,7.7,21,0,0,0,0,0,14.5,4.5,24.5,34.5,4.5,"",0,1,0,0,0,0,1 -"Boogie-Woogie Dream",1944,13,NA,6.5,8,0,0,0,14.5,14.5,0,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Book Revue",1946,7,NA,8.3,66,0,0,0,0,4.5,14.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Book That Wrote Itself, The",1999,71,25000,4.5,66,4.5,4.5,4.5,4.5,34.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Book and the Rose, The",2001,29,40000,9,10,0,14.5,0,0,0,0,0,14.5,44.5,44.5,"",0,0,0,1,0,1,1 -"Book of Dreams: 'Welcome to Crateland'",1994,9,NA,4,19,14.5,14.5,0,0,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Book of Eve, The",2002,98,NA,4.5,17,14.5,4.5,0,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Book of Kings",2002,19,NA,6.7,30,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Book of Life, The",1998,63,350000,6.7,551,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Book of Love",1990,82,NA,5.1,199,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Book of Love",2002,91,NA,8,17,4.5,0,4.5,0,0,0,14.5,24.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Book of Love",2004,83,NA,2.9,134,4.5,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,1,1,0,0,0 -"Book of Manson, The",1989,120,NA,5.7,6,14.5,0,14.5,0,0,0,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Book of Mormon Movie, Volume 1: The Journey, The",2003,120,2000000,3.4,142,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Book of Numbers",1973,81,NA,5.7,9,0,0,14.5,0,24.5,14.5,24.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Book of Rules",2003,107,NA,6.6,7,24.5,0,0,0,0,0,0,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Book of Shadows: Blair Witch 2",2000,90,15000000,4.2,6532,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Book of Stars, The",2001,111,NA,6.3,182,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"BookWars",2000,79,NA,7.9,23,0,0,0,0,0,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,1,0,0 -"Bookcruncher",2002,29,NA,8.6,7,0,0,0,0,24.5,0,0,0,0,74.5,"",0,0,0,0,0,0,1 -"Bookies",2003,88,NA,5.5,208,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Bookshelf on Top of the Sky: 12 Stories About John Zorn, A",2002,82,NA,6.2,12,0,0,0,4.5,0,24.5,24.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Bookworm Turns, The",1940,9,NA,6.5,8,0,0,0,14.5,14.5,14.5,24.5,0,0,34.5,"",0,1,1,0,0,0,1 -"Bookworm, The",1939,8,NA,6.3,19,0,0,0,14.5,14.5,34.5,0,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Boom",1968,110,10000000,4,166,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boom Boom",1936,8,NA,6.7,6,0,0,0,0,14.5,0,34.5,45.5,0,0,"",0,1,1,0,0,0,1 -"Boom Town",1940,119,2000000,7,312,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Boom boom",1990,92,NA,5.5,31,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Boom, Il",1963,97,NA,6.2,26,0,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Boomerang",1992,118,42000000,5.1,3530,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Boomerang",1995,90,NA,6.1,24,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Boomerang!",1947,88,NA,7.7,199,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Boomtown",1985,6,NA,6,29,0,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Boon sang yuen",1997,127,NA,6.4,51,0,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Boondock Saints, The",1999,110,NA,7.7,17935,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"R",1,0,0,1,0,0,0 -"Boop-Oop-A-Doop",1932,9,NA,7.5,17,0,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Boost, The",1988,95,NA,5.6,355,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Boot Camp",1996,6,NA,5.8,17,14.5,4.5,0,14.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Boot Polish",1954,149,NA,8.9,24,0,0,0,0,0,4.5,4.5,4.5,44.5,44.5,"",0,0,0,1,0,0,0 -"Boot ist voll, Das",1981,101,NA,7.5,89,4.5,0,4.5,4.5,0,4.5,24.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Boot, Das",1981,216,14000000,8.5,28920,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Bootle Beetle",1947,7,NA,6.2,20,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Bootleg Film",1999,74,NA,4.3,14,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Bootleggers",1974,110,NA,4.8,25,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Bootmen",2000,95,NA,6,465,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Boots",1953,25,NA,1.9,23,45.5,4.5,0,0,0,0,14.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Boots Malone",1952,102,NA,5.5,44,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boots and Saddles",1937,58,NA,6,37,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Booty Call",1997,79,NA,4.9,1401,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Booty and the Beast",1953,16,NA,6.1,33,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Booy-E Pirahan-E Yusef",1995,100,NA,5.5,27,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Booye kafoor, atre yas",2000,93,NA,7,70,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Boozecan",1994,98,NA,6.5,40,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Bop Girl Goes Calypso",1957,80,NA,5.5,13,4.5,4.5,4.5,14.5,14.5,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Bopha!",1993,120,NA,6.3,167,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Boquitas pintadas",1974,120,NA,6.2,29,0,4.5,4.5,0,4.5,14.5,34.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Bor lei jun",1999,99,NA,5.3,1421,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,1,0 -"Bora Bora",1968,90,NA,6.2,6,0,0,14.5,14.5,0,0,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Bora Diya Pokuna",2004,141,NA,5.3,9,0,0,0,14.5,34.5,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Boran",2001,99,NA,7.1,11,0,0,4.5,0,0,4.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bord de mer",2002,90,NA,5.7,92,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bordel SS",1978,84,NA,4.4,6,0,0,14.5,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Bordella",1976,100,NA,8.5,6,0,0,0,0,0,34.5,0,14.5,0,45.5,"",0,0,1,0,0,0,0 -"Bordellet",1972,82,NA,3,6,14.5,14.5,0,34.5,0,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bordello of Blood",1996,72,NA,4.6,2187,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Bordello... House of the Rising Sun",1985,86,NA,6.8,7,0,0,0,0,0,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Border",2001,7,NA,6,6,0,0,0,0,45.5,34.5,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Border Badmen",1945,55,NA,4.4,10,24.5,0,34.5,0,34.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Border Cafe",1937,67,NA,4,8,14.5,0,24.5,14.5,34.5,0,0,0,0,14.5,"",0,0,0,0,0,1,0 -"Border Feud",1947,55,NA,4.3,7,0,14.5,14.5,14.5,0,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Border G-Man",1938,60,NA,5.6,13,0,0,4.5,24.5,4.5,34.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Border Incident",1949,94,NA,6.9,102,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Border Legion, The",1940,63,NA,6.8,8,0,0,0,14.5,0,45.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Border Line",1992,90,NA,6.6,17,0,0,0,14.5,14.5,4.5,4.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Border Patrol",1943,65,NA,6.1,23,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Border Phantom",1937,60,NA,5.3,5,0,0,24.5,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Border Radio",1987,87,NA,4.1,34,14.5,24.5,4.5,0,14.5,4.5,24.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Border River",1954,80,NA,5.5,21,0,0,0,14.5,34.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Border Saddlemates",1952,67,NA,6.1,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Border Shootout",1990,110,NA,3.4,23,14.5,4.5,14.5,34.5,4.5,4.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Border Treasure",1950,60,NA,5.8,6,0,0,0,14.5,14.5,14.5,0,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Border Vigilantes",1941,63,NA,6.9,14,0,0,0,0,4.5,24.5,4.5,14.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Border of Tong, The",1985,98,NA,1.9,9,24.5,34.5,14.5,14.5,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Border, The",1979,90,NA,5.5,31,14.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Border, The",1982,109,NA,6,654,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Borderland",1937,82,NA,6.7,21,0,0,0,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Borderline",1950,88,NA,5.9,61,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Borderline",1980,97,NA,5.5,193,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Borderline Normal",2000,85,NA,6.3,92,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bordertown",1935,90,NA,6.6,191,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Bordertown Gun Fighters",1943,56,NA,6.2,13,0,0,0,0,24.5,34.5,34.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Bore Lee: U kandzama velegrada",2003,58,NA,6.9,59,14.5,4.5,0,0,0,4.5,4.5,4.5,4.5,64.5,"",1,0,0,1,0,1,0 -"Bored",1999,1,NA,4.8,11,14.5,4.5,0,14.5,34.5,4.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Bored Silly",2000,81,NA,3.8,14,14.5,0,14.5,14.5,0,4.5,4.5,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Bored of Education",1936,10,NA,7.6,33,0,4.5,0,4.5,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Borei kaibyo yashiki",1958,69,NA,7.7,6,0,0,0,0,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Borets i kloun",1957,95,NA,5.8,14,4.5,0,0,4.5,0,24.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Borges, los libros y las noches",1999,82,NA,5.4,12,4.5,0,0,14.5,0,4.5,14.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Borghese piccolo piccolo, Un",1977,118,NA,8.4,109,0,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Boricua",2004,100,NA,7.2,10,14.5,0,0,14.5,0,24.5,14.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Boricua's Bond",2000,105,NA,3.8,78,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Borinage",1933,36,NA,7.3,32,4.5,4.5,4.5,4.5,4.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Boris Godounov",1989,118,NA,7.5,20,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Boris Godunov",1954,110,NA,7.7,7,0,0,0,0,0,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Boris Godunov",1986,130,NA,5.4,8,14.5,0,14.5,0,0,0,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Boris I",1985,263,NA,8.4,10,14.5,0,0,0,0,0,14.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Boris and Natasha",1992,87,NA,3.6,203,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Borj-E Minoo",1996,80,NA,6.6,14,4.5,0,0,4.5,14.5,24.5,0,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Born Again",1978,110,NA,3.7,23,24.5,4.5,4.5,14.5,4.5,0,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Born American",1986,95,NA,4.5,212,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Born Bad",1999,88,NA,5.1,92,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Born Champion",1998,95,NA,5.6,5,0,24.5,44.5,0,0,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Born Free",1966,95,NA,6.9,763,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Born In Freedom: The Story of Colonel Drake",1955,30,NA,9.2,6,0,0,0,0,0,0,0,34.5,45.5,14.5,"",0,0,0,1,0,0,1 -"Born Into Brothels: Calcutta's Red Light Kids",2004,85,NA,7.8,366,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,0,1,0,0 -"Born Killer",1990,89,NA,2.8,13,34.5,34.5,0,4.5,0,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Born Loser",2001,22,NA,8.3,33,0,0,4.5,0,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Born Losers, The",1967,113,360000,5.4,223,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Born Reckless",1930,82,NA,4.1,19,24.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Born Reckless",1958,80,NA,4.6,10,0,0,14.5,14.5,34.5,24.5,0,0,14.5,24.5,"",0,0,0,1,0,1,0 -"Born Rich",2003,75,NA,6.5,189,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Born Romantic",2000,96,NA,6.2,406,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Born Wild",1995,91,NA,4.4,16,0,24.5,24.5,4.5,4.5,14.5,14.5,0,0,4.5,"PG",0,0,0,1,0,0,0 -"Born Yesterday",1950,103,NA,7.5,1275,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Born Yesterday",1993,100,NA,4.9,943,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Born for Hell",1976,92,NA,4.9,18,14.5,0,4.5,4.5,4.5,34.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Born in East L.A.",1987,93,NA,5.4,1024,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Born in Flames",1983,80,NA,6.3,40,4.5,0,4.5,14.5,4.5,4.5,24.5,4.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Born of Fire",1983,84,NA,4.3,25,14.5,4.5,4.5,0,0,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Born on the Fourth of July",1989,145,14000000,7,11480,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Born to Be Bad",1934,62,252238,5.6,59,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Born to Be Bad",1950,90,NA,6.4,141,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Born to Be Loved",1959,82,NA,5.2,5,24.5,0,0,0,24.5,24.5,24.5,0,24.5,0,"",0,0,1,0,0,1,0 -"Born to Boogie",1972,67,NA,6.5,39,0,0,0,4.5,4.5,14.5,14.5,4.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Born to Dance",1936,106,NA,6.4,131,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Born to Fight",1956,15,NA,5.8,6,0,0,14.5,0,14.5,64.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Born to Kill",1947,92,NA,7.3,233,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Born to Kill",1996,110,NA,3.7,28,24.5,14.5,4.5,14.5,24.5,14.5,0,14.5,0,4.5,"",1,0,0,0,0,1,0 -"Born to Lose",1999,90,NA,3.4,35,4.5,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Born to Lose: The Last Rock and Roll Movie",1999,90,NA,6.8,14,0,0,0,4.5,0,0,4.5,14.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Born to Love",1931,81,NA,4.8,8,0,0,14.5,24.5,14.5,34.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Born to Race",1988,98,NA,2.9,16,24.5,14.5,14.5,0,14.5,4.5,0,0,0,34.5,"",1,0,0,1,0,0,0 -"Born to Sing",1942,82,NA,6.2,12,24.5,0,0,4.5,4.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Born to Win",1971,85,NA,5.6,196,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Born to the West",1937,59,NA,5,102,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bornholms stemme",1999,114,NA,5.5,150,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Borom sarret",1966,20,NA,7.6,20,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Borotalco",1982,107,NA,6.2,85,4.5,4.5,0,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Borrowed Trouble",1948,58,NA,6,18,0,4.5,0,14.5,24.5,14.5,4.5,4.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Borrower, The",1991,90,NA,4.8,180,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Borrowers, The",1997,89,29000000,5.6,1457,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Borsalino",1970,126,NA,6.8,316,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Borsalino & Co.",1974,110,NA,5.2,209,14.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Borstal Boy",2000,93,NA,5.7,289,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bosco, Il",1988,85,NA,2.9,63,34.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Bosna!",1994,117,NA,6.9,61,4.5,0,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Bosque animado, El",1987,103,NA,7.1,102,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bosque animado, El",2001,83,NA,5,78,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Bosque del lobo, El",1971,87,NA,5.9,11,0,0,4.5,0,24.5,4.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Boss Didn't Say Good Morning, The",1937,10,NA,4.1,5,0,0,24.5,44.5,0,24.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Boss Nigger",1975,87,NA,4.6,48,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Boss' Wife, The",1986,83,NA,4.6,129,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Boss, Il",1973,100,NA,5.6,56,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Boss, The",1956,89,NA,7.4,26,4.5,0,0,4.5,4.5,4.5,24.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Bossa Nova",2000,95,NA,6.6,630,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Bossu, Le",1944,110,NA,4.6,5,24.5,0,0,0,24.5,44.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Bossu, Le",1960,101,NA,7,88,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bossu, Le",1997,128,30000000,7.1,668,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bostella, La",2000,95,NA,6.1,87,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Boston Blackie Booked on Suspicion",1945,66,NA,6.5,17,0,0,0,14.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Boston Blackie Goes Hollywood",1942,68,NA,6.9,16,0,0,0,4.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Boston Blackie and the Law",1946,69,NA,6.3,8,0,0,0,14.5,24.5,14.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Boston Blackie's Chinese Venture",1949,59,NA,5.8,15,0,14.5,0,0,34.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boston Blackie's Rendezvous",1945,64,NA,6.7,12,0,0,4.5,0,4.5,14.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Boston Kickout",1995,110,NA,5.7,113,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Boston Quackie",1957,7,NA,6.1,32,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Boston Strangler, The",1968,116,NA,7,875,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bostonians, The",1984,122,NA,5.8,285,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Botany Bay",1953,93,NA,5.5,81,0,4.5,4.5,4.5,34.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Both Barrels Blazing",1945,57,NA,5.3,5,0,0,24.5,24.5,24.5,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Botinki iz America",2001,90,NA,6,7,0,0,0,0,14.5,24.5,0,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Botta di vita, Una",1988,106,NA,3.4,13,24.5,4.5,4.5,24.5,24.5,0,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Botte di Natale",1994,107,NA,5,201,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"Bottega del piacere, La",1988,82,NA,5.1,6,0,0,0,14.5,14.5,0,34.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Bottega dell'orefice, La",1988,95,NA,5.4,38,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Bottle Rocket",1994,13,NA,7.4,457,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Bottle Rocket",1996,92,7000000,7.4,7286,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Bottle and the Throttle, The",1968,10,1000,3.8,7,0,24.5,0,14.5,24.5,0,24.5,0,0,0,"",0,0,0,1,0,0,1 -"Bottles",1936,10,NA,6.9,20,0,0,0,4.5,4.5,24.5,14.5,34.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Bottom Feeders",1997,92,NA,5.4,7,14.5,14.5,0,14.5,0,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Bottom Floor",2004,10,NA,5.3,12,45.5,0,0,0,0,0,0,4.5,0,44.5,"",0,0,0,1,0,0,1 -"Bottom of the Bottle, The",1956,88,NA,6.2,26,0,0,4.5,4.5,14.5,14.5,44.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Bottom's Dream",1984,6,NA,7.1,8,0,0,14.5,0,0,24.5,0,14.5,45.5,0,"",0,1,0,0,0,0,1 -"Bottomfeeders",2001,92,500000,7.4,7,0,0,0,0,24.5,14.5,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Bottomless Cup, The",2000,13,NA,7.3,19,0,0,0,0,0,34.5,0,44.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Bottoms Up",1934,85,NA,6.4,11,0,0,0,4.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bottoms Up",1960,90,NA,6.2,21,0,0,4.5,0,4.5,34.5,0,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Bouba",1987,88,NA,7.1,8,0,0,0,34.5,24.5,14.5,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Bouche de Jean-Pierre, La",1996,52,NA,7.3,21,4.5,0,0,4.5,4.5,4.5,14.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Boucher, Le",1970,93,NA,7.6,538,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Boudica",2003,83,NA,5.7,138,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Boudu",2005,104,NA,5.8,37,4.5,0,4.5,14.5,4.5,24.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Bouge!",1997,99,NA,2.3,51,44.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Boulanger de Valorgue, Le",1953,103,NA,5.8,24,0,0,4.5,4.5,24.5,0,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Boulder Dam",1936,70,NA,6.1,14,0,0,0,14.5,14.5,24.5,14.5,24.5,0,4.5,"",1,0,0,1,0,0,0 -"Boulder Wham!",1965,7,NA,5.6,35,4.5,4.5,14.5,4.5,24.5,14.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Boule de suif",1945,85,NA,7.1,11,0,0,0,0,4.5,4.5,4.5,24.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Boulet, Le",2002,107,NA,5.6,651,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Boulevard",1960,95,NA,5.9,10,0,0,0,24.5,0,34.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Boulevard",1994,95,NA,4.7,143,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boulevard Nights",1979,102,NA,5.1,51,4.5,0,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Boulevard des assassins",1982,102,NA,5.7,8,0,0,14.5,24.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Boulevard des hirondelles",1991,90,NA,5.5,28,0,0,0,0,64.5,24.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Boulevard du rhum",1971,120,NA,6,47,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Boulevard of Broken Dreams",1988,94,NA,5.9,13,0,4.5,4.5,0,0,45.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Boulevardier from the Bronx",1936,8,NA,5.1,12,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,0,0,"",0,1,1,0,0,0,1 -"Boum 2, La",1982,109,NA,5.7,440,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Boum sur Paris",1954,95,NA,6,11,0,0,4.5,4.5,4.5,14.5,0,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Boum, La",1980,100,NA,6.5,775,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Bounce",2000,106,35000000,5.8,5390,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Bounce: Behind the Velvet Rope",2000,71,NA,6.2,63,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Bouncer",2002,10,NA,6.8,18,0,4.5,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Bound",1995,15,NA,7.5,22,0,0,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Bound",1996,109,4500000,7.5,11911,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,0,1,0 -"Bound",2001,7,NA,6.2,5,0,24.5,0,24.5,0,0,24.5,0,44.5,0,"",0,0,0,0,0,0,1 -"Bound and Gagged: A Love Story",1992,94,NA,4.5,53,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bound by Honor",1993,190,35000000,7.4,2499,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Bound for Glory",1976,147,NA,7,431,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Boundaries",2000,19,NA,7.4,51,34.5,4.5,4.5,4.5,0,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Boundaries of the Heart",1988,105,NA,4.4,9,0,14.5,0,14.5,0,14.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Boundin'",2003,5,NA,7.1,726,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Bounty",2002,17,NA,8,6,0,0,0,0,0,0,14.5,64.5,14.5,0,"",1,0,0,1,0,0,1 -"Bounty Hunter, The",1954,79,NA,6.3,71,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bounty Hunter, The",1989,90,NA,3.9,13,0,4.5,24.5,34.5,14.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Bounty Hunters",1997,98,NA,4.9,76,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"R",1,0,0,1,0,0,0 -"Bounty Killer, The",1965,92,NA,5.8,28,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bounty Tracker",1993,86,NA,4.3,84,4.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Bounty, The",1984,126,NA,6.7,3017,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bourgeois gentilhomme, Le",1958,96,NA,5.1,10,0,0,0,14.5,34.5,14.5,14.5,0,0,44.5,"",0,0,1,1,0,0,0 -"Bourgeois gentilhomme, Le",1982,135,NA,6.3,5,0,0,0,24.5,24.5,0,0,44.5,0,24.5,"",0,0,1,0,0,0,0 -"Bourne Identity Crisis, The",2003,18,NA,6.8,16,14.5,0,0,0,14.5,4.5,14.5,14.5,0,34.5,"",0,0,1,0,0,0,1 -"Bourne Identity, The",2002,119,75000000,7.3,29871,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Bourne Supremacy, The",2004,108,75000000,7.3,19878,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Bourreau des coeurs, Le",1983,90,NA,4.1,10,14.5,14.5,24.5,34.5,0,0,0,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Bourse et la vie, La",1966,90,NA,4.7,27,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bout tabou",2000,7,NA,8.5,6,0,0,0,0,0,0,14.5,14.5,64.5,0,"",0,0,0,0,1,0,1 -"Bout with a Trout, A",1947,8,NA,6.2,13,14.5,0,0,14.5,0,34.5,4.5,14.5,4.5,0,"",0,1,0,0,0,0,1 -"Bouteille, La",2000,107,NA,6.9,91,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Boutique",2003,113,NA,7.5,8,0,0,0,0,0,0,34.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Bovenman, De",2001,20,NA,6.4,6,0,0,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Bovine Vendetta",1998,3,NA,1.8,19,34.5,24.5,4.5,0,0,0,14.5,0,4.5,14.5,"",0,0,0,0,0,0,1 -"Bowery Battalion",1951,69,NA,5.9,33,0,0,0,4.5,14.5,4.5,14.5,4.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Bowery Blitzkrieg",1941,63,NA,6,75,0,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Bowery Bombshell",1946,65,NA,6.6,31,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Bowery Boys Meet the Monsters, The",1954,65,NA,5.5,81,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bowery Buckaroos",1947,66,NA,5.8,45,0,0,4.5,4.5,4.5,24.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bowery Bugs",1949,7,NA,7.8,43,0,0,0,4.5,0,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bowery Champs",1944,62,NA,4.7,73,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Bowery Waltz",1897,1,NA,4.1,15,4.5,4.5,14.5,24.5,4.5,34.5,14.5,0,0,0,"",0,0,0,0,1,0,1 -"Bowery at Midnight",1942,61,NA,5.6,75,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bowery to Bagdad",1955,64,NA,6.2,31,0,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bowery to Broadway",1944,94,NA,6.9,13,0,0,0,0,0,14.5,34.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Bowery, The",1933,92,421496,7.3,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Bowfinger",1999,97,55000000,6.4,15000,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Bowl of Pork",1997,5,NA,1.9,25,34.5,4.5,4.5,0,14.5,0,0,4.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Bowling Alley-Cat, The",1942,8,NA,7.4,45,0,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Bowling for Columbine",2002,120,4000000,8.5,36747,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,1,1,1,0,0 -"Box Man, The",2002,6,NA,7.3,15,0,4.5,0,0,0,4.5,0,24.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Box of Moon Light",1996,112,NA,6.9,1433,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Box, The",1975,100,NA,5.8,10,0,0,0,0,34.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Box-Office Bunny",1990,5,NA,5.9,53,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Boxcar Bertha",1972,92,600000,5.8,590,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Boxed",2002,80,500000,6.5,9,0,0,0,14.5,14.5,0,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Boxer a smrt",1963,120,NA,6.5,9,0,0,0,0,24.5,24.5,14.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Boxer, The",1977,94,NA,2.5,15,24.5,4.5,4.5,14.5,0,0,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Boxer, The",1979,50,NA,1.1,10,84.5,14.5,0,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Boxer, The",1997,113,NA,6.9,2375,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Boxers and Ballerinas",2004,90,85000,7.7,7,0,14.5,0,0,0,0,14.5,14.5,44.5,14.5,"",0,0,0,0,1,0,0 -"Boxes",2000,93,NA,7.6,5,24.5,0,0,0,0,0,24.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Boxing Gloves",1929,17,NA,7.3,24,0,4.5,4.5,4.5,0,4.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Boxing Helena",1993,107,NA,3.8,2451,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Boxing's Been Good to Me",2000,15,NA,6.8,8,0,14.5,0,0,14.5,14.5,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Boxprinz, Der",2002,100,NA,6.9,16,0,0,0,0,0,14.5,45.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Boy",1997,11,NA,9.5,17,0,0,0,0,0,0,0,4.5,34.5,45.5,"",0,0,0,1,0,0,1 -"Boy",2004,15,NA,8.6,6,0,0,0,0,14.5,0,0,14.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Boy Called Hate, A",1996,97,NA,4.8,89,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Boy Crazy, Girl Crazier",1996,21,NA,5.2,8,34.5,0,14.5,0,0,0,0,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Boy Cried Murder, The",1966,86,NA,5.4,11,0,0,4.5,4.5,0,14.5,34.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Boy Detective, or The Abductors Foiled, The",1908,5,NA,3.6,5,24.5,0,24.5,24.5,24.5,0,24.5,0,0,0,"",0,0,1,1,0,0,1 -"Boy Ecury",2003,90,NA,4.2,15,0,14.5,0,0,24.5,0,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Boy Friend II",1976,35,NA,8.9,6,0,0,0,0,0,0,14.5,0,84.5,0,"",0,0,0,0,0,0,1 -"Boy Friend, The",1971,138,NA,6.6,251,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Boy From Hell, The",1988,90,NA,2.4,13,34.5,4.5,34.5,0,0,4.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Boy Meets Girl",1938,86,NA,5.2,97,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Boy Meets Girl",1984,100,NA,6.6,185,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Boy Meets Girl",1993,92,NA,2.9,20,74.5,14.5,0,0,4.5,0,4.5,0,0,4.5,"",0,0,0,1,0,1,0 -"Boy Meets Girl",1994,93,NA,6.9,330,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Boy Named Charlie Brown, A",1969,85,NA,6.9,434,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Boy Named Sue, A",2000,69,NA,7.9,7,0,14.5,0,0,0,0,14.5,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Boy Scout, The",2002,14,NA,6.6,15,24.5,0,4.5,0,0,4.5,0,14.5,0,44.5,"",0,0,1,0,0,0,1 -"Boy Slaves",1939,72,NA,5.6,13,14.5,0,0,4.5,4.5,4.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boy Who Caught a Crook",1961,72,NA,4.4,6,0,0,0,34.5,45.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Boy Who Could Fly, The",1986,107,NA,6,1036,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Boy Who Cried Bitch, The",1991,101,NA,6.1,86,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Boy Who Cried Werewolf, The",1973,93,NA,4.2,70,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Boy Who Had Everything, The",1984,94,NA,4.1,9,0,14.5,0,24.5,34.5,0,0,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Boy Who Plays on the Buddhas of Bamiyan, The",2004,96,NA,6,26,0,0,0,4.5,14.5,14.5,0,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Boy Who Saved Christmas, The",1998,94,NA,4.9,22,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Boy Who Saw the Iceberg, The",2000,9,NA,7.7,31,0,0,0,0,4.5,4.5,24.5,4.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Boy Who Turned Yellow, The",1972,17,NA,6.8,22,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Boy and Bicycle",1965,27,NA,5.5,68,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Boy and His Dog, A",1946,21,NA,5.5,23,0,0,4.5,4.5,24.5,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Boy and His Dog, A",1975,91,NA,6.4,1555,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boy and the Pirates, The",1960,82,NA,4.4,34,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Boy from Mercury, The",1996,87,NA,6.6,36,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Boy from Oklahoma, The",1954,87,NA,6,44,0,4.5,0,4.5,24.5,24.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Boy in Blue, The",1986,100,NA,4.7,155,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Boy on a Dolphin",1957,111,NA,5.7,153,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Boy s tenyu",2005,132,3500000,4.8,77,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Boy with Green Hair, The",1948,82,NA,7.1,303,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boy with the X-Ray Eyes, The",1999,93,NA,4.8,21,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Boy! What a Girl!",1947,70,NA,5.9,23,0,0,4.5,0,24.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Boy's Life, A",2003,77,NA,7.5,52,0,4.5,0,4.5,0,4.5,14.5,34.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Boy, Did I Get a Wrong Number!",1966,99,NA,4.3,141,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Boy, a Girl and a Bike, A",1949,92,NA,4.8,15,4.5,0,14.5,14.5,44.5,0,0,0,24.5,4.5,"",0,0,1,1,0,1,0 -"Boy-Next-Door",2004,17,50000,9.4,19,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,1,0,0,0,1 -"Boychick",2001,12,NA,7.5,39,4.5,0,0,4.5,0,14.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Boyfriends",1996,81,NA,5.8,125,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Boyhood Daze",1957,7,NA,7.8,31,0,0,4.5,0,0,4.5,24.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Boyhood of John Muir, The",1998,78,NA,6.8,8,0,0,14.5,0,14.5,24.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Boys",1996,86,NA,4.6,915,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Boys",2003,172,NA,5.1,25,4.5,4.5,4.5,4.5,24.5,4.5,0,4.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Boys Beware",1961,10,1000,4.2,21,44.5,14.5,4.5,0,0,4.5,0,14.5,0,4.5,"",0,0,0,1,0,0,1 -"Boys Briefs",1999,83,NA,6,21,4.5,4.5,0,14.5,4.5,34.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Boys Club, The",1997,91,NA,6,353,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Boys Diving, Honolulu",1901,1,NA,4.3,7,0,0,14.5,24.5,14.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Boys Don't Cry",1999,118,2000000,7.6,14456,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Boys II, Les",1998,120,NA,6.3,311,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Boys III, Les",2001,124,NA,5.9,223,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Boys Life",1995,91,NA,7.6,205,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Boys Life 2",1997,74,NA,6.1,175,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Boys Life 3",2000,79,NA,5.7,83,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Boys Life 4: Four Play",2003,83,NA,5.9,46,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Boys Next Door, The",1986,90,5000000,5.8,308,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boys Night Out",1996,34,30000,7.7,9,14.5,0,0,0,14.5,0,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Boys On the Run",2001,97,NA,5.3,36,14.5,4.5,0,4.5,24.5,4.5,14.5,4.5,14.5,14.5,"R",1,0,0,0,0,1,0 -"Boys Think They Have One On Foxy Grandpa, But He Fools Them, The",1902,1,NA,4.3,15,0,0,14.5,24.5,0,24.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Boys Town",1938,96,NA,7.2,672,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Boys Will Be Boys",1935,80,NA,6.7,47,0,0,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Boys and Girls",1982,22,NA,7.7,6,0,0,0,0,0,34.5,0,34.5,34.5,0,"",0,0,0,0,0,0,1 -"Boys and Girls",2000,94,16000000,4.9,3483,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Boys from Brazil",1993,68,NA,5.8,38,4.5,0,0,4.5,24.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Boys from Brazil, The",1978,123,12000000,6.8,2826,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Boys from County Clare, The",2003,90,NA,5.6,80,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Boys from Syracuse, The",1940,73,NA,6.4,21,0,0,0,4.5,4.5,24.5,0,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Boys in Brown",1949,85,NA,6.4,20,0,0,4.5,4.5,14.5,34.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Boys in Company C, The",1978,125,NA,6.9,511,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Boys in Love 2",1998,97,NA,6.5,25,14.5,0,0,4.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Boys in the Band, The",1970,118,5500000,7.3,448,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Boys in the Sand",1971,90,8000,7.8,14,14.5,0,0,0,4.5,0,4.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Boys of 2nd Street Park, The",2003,91,NA,7.2,38,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Boys of Cellblock Q, The",1992,96,NA,3.5,24,14.5,14.5,24.5,14.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Boys of San Francisco, The",1981,80,NA,5,7,0,0,14.5,0,0,24.5,0,45.5,0,0,"",0,0,0,0,0,0,0 -"Boys of St. Vincent: 15 Years Later, The",1993,90,NA,8.7,54,0,0,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Boys of Venice, The",1978,85,NA,9.2,9,0,0,0,0,0,0,34.5,0,44.5,24.5,"",0,0,0,0,0,0,0 -"Boys of the City",1940,68,NA,5.9,72,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Boys on the Side",1995,115,21000000,6.1,2775,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Boys to Men",2001,75,NA,6.4,47,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Boys' Night Out",1962,115,NA,6.5,288,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Boys' Ranch",1946,97,NA,6.1,12,0,0,0,0,24.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Boys' Shorts: The New Queer Cinema",1993,119,NA,5,23,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Boys, Les",1997,107,NA,6.7,461,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Boys, The",1998,86,NA,6.3,254,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Boyz n the Hood",1991,107,6000000,7.7,10319,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bozic u Becu",1997,97,NA,2.1,19,44.5,14.5,4.5,4.5,14.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Braca po materi",1988,105,NA,8.5,33,4.5,0,0,4.5,0,4.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Braccati",2001,23,NA,7.6,8,14.5,14.5,0,0,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,1 -"BraceFace Brandi",2002,42,NA,7.9,9,14.5,0,0,0,24.5,0,0,0,0,64.5,"",0,0,1,0,0,0,1 -"Braddock: Missing in Action III",1988,101,NA,3.4,582,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Brady Bunch Movie, The",1995,90,12000000,5.6,4636,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Brain Damage",1988,86,NA,6,467,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Brain Dead",1990,85,NA,6.1,448,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Brain Donors",1992,76,NA,5.9,917,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Brain Eaters, The",1958,60,30000,3.6,113,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Brain Machine, The",1977,85,NA,3.8,23,4.5,14.5,34.5,4.5,4.5,4.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Brain That Wouldn't Die, The",1962,82,62000,3,953,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Brain from Planet Arous, The",1957,70,58000,4.1,224,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Brain of Blood",1972,87,NA,1.9,64,34.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Brain, The",1988,94,NA,3.4,108,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"BrainWaves",1983,77,NA,4.4,81,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Braindead",1987,1,NA,6.6,704,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Braindead",1992,97,3000000,7.5,11552,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Braindead, The",2001,12,NA,1.8,18,4.5,14.5,0,0,0,0,0,0,0,74.5,"",0,0,1,0,0,0,1 -"Braineater, The",2001,11,NA,6.9,29,14.5,0,0,0,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Brainscan",1994,96,NA,5.2,1307,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Brainstorm",1965,105,NA,6.4,58,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brainstorm",1983,106,15000000,6.2,1956,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Brainstorm",1994,30,NA,4.9,6,0,0,0,34.5,14.5,0,0,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Brak",2002,86,NA,5,58,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Brakhage",1998,73,NA,6.4,36,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Bramble Bush, The",1960,93,NA,5.1,39,4.5,4.5,14.5,4.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Branca de Neve",2000,75,NA,5.7,67,34.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Brancaleone alle crociate",1970,116,NA,7.8,132,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Branco, O",2000,23,NA,8,14,14.5,0,0,0,14.5,0,14.5,0,14.5,44.5,"",0,0,0,1,0,0,1 -"Brand of Shame",1968,73,NA,1,10,64.5,14.5,0,0,0,0,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Brand of the Devil",1944,62,NA,5.2,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Branded",1950,104,NA,6.5,58,4.5,0,0,14.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Branded a Coward",1935,58,NA,4.3,5,0,0,24.5,44.5,0,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Brandende liefde",1983,96,NA,5.8,89,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Brandnacht",1993,101,NA,7.3,11,0,0,0,0,0,14.5,14.5,34.5,24.5,0,"",0,0,0,1,0,0,0 -"Brandon Teena Story, The",1998,89,NA,6.8,202,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Brandos Costumes",1975,75,NA,6.7,6,0,0,0,14.5,0,34.5,14.5,34.5,0,0,"",0,0,0,1,1,0,0 -"Brannigan",1975,111,NA,5.7,582,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Branquignol",1949,97,NA,4.8,75,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Braqueuses, Les",1994,90,NA,4.9,72,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bras de fer",1985,107,NA,5.4,8,0,0,0,24.5,24.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Brasa Adormecida",1987,105,NA,6.3,13,0,0,4.5,4.5,0,44.5,0,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Brasher Doubloon, The",1947,72,NA,7,35,0,0,0,0,4.5,4.5,44.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Brasier, Le",1991,122,NA,7.1,24,0,0,0,4.5,4.5,14.5,24.5,44.5,4.5,0,"",0,0,0,1,0,0,0 -"Brasil",2001,18,NA,7.2,37,4.5,0,4.5,4.5,0,14.5,4.5,14.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Brasil Ano 2000",1969,95,NA,6.8,31,4.5,0,4.5,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Brasileiro",2001,95,NA,6.9,47,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Brass Bottle, The",1964,87,NA,5.7,92,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Brass Legend, The",1956,79,NA,5.5,14,0,0,14.5,14.5,14.5,24.5,4.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Brass Monkey",1948,90,NA,7.1,9,0,0,0,0,14.5,34.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Brass Tacks",2002,96,NA,8,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Brass Target",1979,111,NA,5.5,202,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Brass on Fire",2002,103,NA,7.7,6,0,0,0,0,14.5,14.5,14.5,0,34.5,14.5,"",0,0,0,0,1,0,0 -"Brassed Off",1996,107,NA,7.2,4974,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Brat",1997,99,NA,7.1,708,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Brat 2",2000,122,1500000,6.7,528,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Brat, The",1931,60,243093,2,12,45.5,4.5,4.5,4.5,4.5,0,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Bratan",1991,90,NA,7.6,11,0,0,0,0,0,0,14.5,44.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Brats",1930,20,NA,7.6,190,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Bratya Karamazovy",1969,232,NA,8,21,0,0,0,4.5,0,4.5,4.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Braut, Die",1999,112,NA,4.5,39,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Brava Gente Brasileira",2000,103,NA,8,70,4.5,0,4.5,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bravados, The",1958,98,NA,6.8,385,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Brave",1994,50,NA,6,77,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Brave Bulls, The",1951,106,NA,6.3,18,0,0,4.5,4.5,14.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Brave Don't Cry, The",1952,89,NA,4.8,5,0,0,0,64.5,0,0,0,0,44.5,0,"",0,0,0,1,0,0,0 -"Brave Engineer, The",1950,7,NA,6.3,18,4.5,0,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Brave Little Bat, The",1941,8,NA,5.6,18,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Brave Little Tailor",1938,9,NA,8.1,125,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Brave Little Toaster, The",1987,90,NA,6.7,954,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Brave One, The",1957,100,NA,7.3,51,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Brave Soldat Schwejk, Der",1960,98,NA,5.9,91,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Brave Warrior",1952,73,NA,4.8,12,0,4.5,0,45.5,34.5,4.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Brave, The",1997,123,NA,5.6,749,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Braveheart",1925,71,NA,8.5,79,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Braveheart",1995,177,53000000,8.3,92437,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"R",1,0,0,1,0,0,0 -"Bravestarr: The Legend",1988,91,NA,5.9,14,0,0,14.5,0,14.5,4.5,14.5,0,4.5,44.5,"",0,1,0,0,0,0,0 -"Bravo Two Zero",1999,115,6500000,6.5,578,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Bravo maestro",1978,99,NA,7.2,7,0,0,0,14.5,0,44.5,0,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Brazil",1944,60,NA,5.7,71,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Brazil",1985,94,15000000,8,30735,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Bread & Roses",1994,92,NA,7.9,14,0,0,0,0,0,14.5,24.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Bread Maker, The",2003,82,NA,2.1,9,0,24.5,0,14.5,24.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,1,0 -"Bread and Roses",2000,110,NA,7,1172,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Bread, My Sweet, The",2001,105,600000,6.8,257,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,1,0 -"Break & Enter",1999,9,NA,6.5,11,0,0,0,4.5,4.5,24.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Break Up",1998,100,9000000,5.1,393,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Break in the Circle",1955,87,NA,4.9,14,0,4.5,24.5,4.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Break of Day",1977,112,NA,5.4,7,0,0,0,24.5,0,24.5,24.5,0,0,14.5,"",0,0,0,0,0,1,0 -"Break of Hearts",1935,78,NA,5.7,67,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Break the News",1938,78,NA,5.7,7,0,24.5,0,0,14.5,0,14.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Break!",1985,11,NA,5.3,12,4.5,0,14.5,0,0,0,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Break, The",1995,104,NA,4.9,81,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Breakaway",1990,85,NA,2.5,11,34.5,4.5,0,0,14.5,0,14.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Breakaway",1996,95,NA,4,38,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Breakdown",1997,95,36000000,6.7,7099,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Breakdowns of 1938",1938,10,NA,6.3,15,0,0,0,0,24.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Breaker! Breaker!",1977,86,NA,3.2,257,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Breakfast (Table Top Dolly)",1976,15,NA,7.4,5,0,0,0,0,0,64.5,0,44.5,0,0,"",0,0,0,0,0,0,1 -"Breakfast Club, The",1985,97,NA,7.6,24223,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Breakfast at Tiffany's",1961,115,2500000,7.7,12246,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Breakfast for Two",1937,67,NA,6.3,72,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Breakfast in Paris",1982,94,NA,4,12,24.5,0,0,24.5,0,4.5,14.5,0,0,24.5,"",0,0,0,0,0,1,0 -"Breakfast of Aliens",1993,88,NA,2.6,11,45.5,4.5,4.5,0,0,0,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Breakfast of Champions",1999,110,12000000,4.2,2250,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Breakfast with Hunter",2003,91,NA,6.8,80,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Breakheart Pass",1975,95,NA,6.2,547,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Breakin'",1984,90,NA,4.4,634,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Breakin' 2: Electric Boogaloo",1984,94,NA,3.6,458,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Breakin' All the Rules",2004,85,NA,5,575,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Breaking All the Rules",1985,91,2032000,4.8,76,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Breaking Away",1979,100,NA,7.7,4280,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Breaking Free",1995,106,NA,6.3,79,0,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Breaking Glass",1980,104,NA,5.6,207,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Breaking In",1989,94,NA,6.2,294,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Breaking Loose",1988,87,NA,2.8,12,14.5,14.5,0,14.5,24.5,4.5,0,4.5,4.5,0,"",1,0,0,0,0,0,0 -"Breaking Point",1975,95,NA,4.4,30,14.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Breaking Point",1976,92,NA,4,38,4.5,0,14.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Breaking Point",1993,92,NA,4.8,69,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Breaking Point, The",1950,97,NA,7.5,129,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Breaking Point, The",1961,59,NA,5,7,0,0,0,45.5,14.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Breaking Up",1997,90,NA,4.5,648,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Breaking and Entering",1992,30,NA,4.4,26,4.5,4.5,4.5,0,74.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,1 -"Breaking the Ice",1938,81,NA,6.5,7,0,0,0,0,24.5,44.5,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Breaking the Rules",1992,100,NA,4.9,139,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Breaking the Silence",1998,90,NA,2.9,41,45.5,4.5,14.5,4.5,4.5,4.5,4.5,0,0,4.5,"R",0,0,0,0,0,0,0 -"Breaking the Waves",1996,158,NA,7.7,10494,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"R",0,0,0,1,0,1,0 -"Breakout",1975,96,NA,5.7,349,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Breakthrough",1950,91,NA,6.5,49,0,4.5,4.5,0,14.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Breakup Film, The",2003,4,NA,9.4,7,0,0,0,0,0,0,0,24.5,0,74.5,"",0,0,1,0,0,0,1 -"Breast Men",1997,96,NA,5.6,1171,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Breath",2000,2,NA,5.9,20,0,0,4.5,14.5,14.5,34.5,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Breath Control: The History of the Human Beat Box",2002,73,NA,7.7,28,0,4.5,0,0,0,4.5,14.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Breath of Scandal, A",1960,97,NA,4.5,47,4.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,1,0,1,0 -"Breath of a Nation, The",1919,6,NA,6.6,10,0,14.5,14.5,0,14.5,24.5,14.5,34.5,14.5,0,"",0,1,1,0,0,0,1 -"Breathe",2000,8,NA,9,7,0,0,0,0,0,0,14.5,45.5,24.5,0,"",0,0,0,1,0,0,1 -"Breathing Fire",1991,74,NA,3.7,59,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Breathing Hard",2000,93,NA,7.8,14,0,4.5,0,0,0,0,4.5,44.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Breathing Lessons: The Life and Work of Mark O'Brien",1996,35,NA,9.5,30,4.5,0,0,4.5,0,0,4.5,4.5,4.5,74.5,"",0,0,0,0,1,0,1 -"Breathing Room",1996,90,500000,4,39,14.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Breathing Show, The",2001,83,NA,6.5,6,14.5,0,0,0,14.5,0,0,45.5,14.5,0,"",0,0,0,0,0,0,0 -"Breathing Together: Revolution of the Electric Family",1971,84,NA,6,7,0,0,0,0,24.5,0,0,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Breathing Under Water",1993,78,NA,6.9,9,0,0,0,0,0,34.5,14.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Breathless",1983,97,NA,5.3,1424,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Breathtaking",2000,100,NA,5.7,59,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Breed Apart, A",1984,95,NA,4.8,220,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Breed, The",2001,91,4000000,4.7,582,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Breeders",1986,77,NA,2.9,196,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Breezy",1973,108,NA,6.3,287,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Brel",1982,92,NA,6.8,8,0,0,0,14.5,14.5,14.5,0,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Bremenskie muzykanty",1969,64,NA,7.8,43,0,0,0,0,4.5,4.5,4.5,4.5,24.5,45.5,"",0,1,0,0,0,0,0 -"Brementown Musicians, The",1935,9,NA,6.5,10,0,0,0,0,34.5,24.5,14.5,14.5,34.5,0,"",0,1,0,0,0,0,1 -"Bremer Stadtmusikanten, Die",1959,77,NA,4.7,6,0,34.5,0,14.5,0,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Brenda Starr",1989,93,NA,3.9,184,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Brennand - De Ovo Omnia",2000,15,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Brennende Acker, Der",1922,98,NA,7.6,64,4.5,0,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brennende Betten",1988,85,NA,7.3,7,0,0,14.5,0,0,0,24.5,44.5,0,14.5,"",0,0,1,1,0,1,0 -"Brennende blomster",1985,84,NA,6,13,0,0,0,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Brennender Sand",1960,90,NA,5.4,5,24.5,0,44.5,0,0,0,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Brenno il nemico di Roma",1963,90,NA,4.9,6,0,0,0,45.5,0,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Brent av frost",1997,97,NA,4.8,36,14.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Brent jord",1969,101,NA,6.4,18,4.5,0,14.5,0,4.5,34.5,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Brev til Jonas",1992,45,NA,5.6,6,0,0,0,14.5,14.5,34.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Breve vacanza, Una",1973,100,NA,8.1,66,4.5,4.5,0,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Brevi amori a Palma di Majorca",1960,98,NA,5.5,6,0,0,0,14.5,45.5,0,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Brewster McCloud",1970,105,NA,6.5,620,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Brewster Project, The",2004,100,NA,6.5,8,0,14.5,24.5,0,0,0,24.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Brewster's Millions",1935,80,NA,6.8,7,0,14.5,0,0,24.5,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Brewster's Millions",1945,79,NA,5.8,71,4.5,14.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Brewster's Millions",1985,97,NA,5.7,3880,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Breza",1967,92,NA,8.9,33,0,0,0,0,0,4.5,0,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Brian De Palma, l'incorruptible",2002,52,NA,5.6,19,14.5,14.5,0,0,0,14.5,4.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Briar Patch",2003,103,NA,2.5,265,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Bribe, The",1949,98,NA,6.4,123,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Brice de Nice",2005,98,NA,5.2,176,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Brick Doll House",1967,55,NA,2.2,12,14.5,44.5,14.5,4.5,4.5,0,0,4.5,0,0,"",0,0,0,1,0,0,0 -"Bridal Path",1998,18,NA,8,8,14.5,0,0,14.5,0,0,0,0,14.5,64.5,"",0,0,0,0,0,1,1 -"Bridal Path, The",1959,95,NA,6.2,51,0,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Bridal Suite",1939,70,NA,4.6,15,0,4.5,4.5,14.5,34.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Bride & Prejudice",2004,122,7000000,6.3,1503,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG-13",0,0,1,0,0,1,0 -"Bride Came C.O.D., The",1941,92,NA,6.9,325,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Bride Comes Home, The",1935,83,NA,7,12,0,0,0,0,4.5,4.5,45.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bride Goes Wild, The",1948,98,NA,5.7,29,4.5,0,0,0,14.5,44.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bride Walks Out, The",1936,75,NA,6,58,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bride Wore Boots, The",1946,85,NA,4.9,18,4.5,4.5,4.5,0,34.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Bride Wore Red, The",1937,103,NA,6.1,81,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Bride and Gloom",1947,16,NA,6.9,6,0,0,14.5,14.5,0,0,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Bride and Gloom",1954,6,NA,4.8,21,0,4.5,4.5,14.5,44.5,0,0,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Bride and the Beast, The",1958,78,NA,2.3,42,44.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Bride for Sale",1949,87,NA,5.6,6,0,0,0,0,45.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Bride of Chucky",1998,89,25000000,5.2,4449,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Bride of Frankenstein",1935,75,397000,8.1,4734,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bride of Killer Nerd",1992,75,NA,3.5,31,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Bride of Re-Animator",1990,96,NA,5.6,973,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bride of Resistor",1997,6,NA,7.1,49,0,0,4.5,4.5,4.5,24.5,14.5,44.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Bride of Vengeance",1949,92,NA,4.7,18,0,0,14.5,14.5,34.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Bride of War",1998,115,NA,8.8,5,0,0,0,0,0,0,0,64.5,0,44.5,"",0,0,0,0,0,1,0 -"Bride of the Gorilla",1951,70,NA,3.6,73,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bride of the Monster",1955,68,NA,2.9,875,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bride of the Wind",2001,99,12000000,5.2,201,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Bride sur le cou, La",1961,85,NA,6.1,37,0,4.5,4.5,0,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bride, The",1987,85,NA,4.6,9,0,0,44.5,0,0,34.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Brideless Groom",1947,17,NA,7.2,143,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Brides",2004,128,NA,7.7,199,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Brides Are Like That",1936,67,NA,6.2,8,0,0,0,14.5,14.5,24.5,45.5,0,0,0,"",0,0,1,0,0,0,0 -"Brides of Blood",1968,92,NA,4.8,48,14.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Brides of Dracula, The",1960,85,NA,6.6,487,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Brides of Fu Manchu, The",1966,94,NA,5,124,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bridge Ahoy!",1936,7,NA,7.3,11,0,0,4.5,0,0,0,14.5,24.5,34.5,4.5,"",0,1,1,0,0,0,1 -"Bridge Too Far, A",1977,176,26000000,7,5527,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Bridge Wives",1932,11,NA,7.6,7,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Bridge at Remagen, The",1969,115,NA,6.5,631,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Bridge of Dragons",1999,95,4000000,3.7,373,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,1,0 -"Bridge of San Luis Rey, The",1944,89,NA,6,41,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Bridge on the River Kwai, The",1957,161,3000000,8.4,22408,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Bridge to Nowhere",1986,86,NA,4.4,29,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bridge to Terabithia",1985,58,NA,5.3,47,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bridge to the Sun",1961,113,NA,7,80,4.5,0,0,0,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bridge, The",1992,102,NA,7.2,28,4.5,0,0,0,0,4.5,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Bridges at Toko-Ri, The",1955,102,NA,6.9,741,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bridges of Madison County, The",1995,135,22000000,6.9,7633,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Bridges-Go-Round",1958,4,NA,6.3,7,0,0,0,0,0,44.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Bridget",2002,90,NA,5.1,63,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bridget Jones's Diary",2001,97,26000000,7,24791,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Bridget Jones: The Edge of Reason",2004,108,70000000,5.7,6636,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Brief Encounter",1945,86,NA,8.3,2583,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Brief Encounter",2003,7,NA,2.3,8,24.5,24.5,14.5,14.5,0,0,14.5,14.5,0,0,"",0,0,0,0,0,1,1 -"Brief History of Errol Morris, A",2000,48,NA,6.5,25,0,0,4.5,0,0,14.5,34.5,34.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Brief History of Time, A",1991,80,NA,7.4,668,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Brief History of the United States of America, A",2002,3,NA,7.7,310,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,45.5,"",0,1,1,0,0,0,1 -"Brief Moment",1933,71,NA,6.5,10,0,0,0,0,24.5,14.5,45.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Brief des Kosmonauten, Der",2002,97,NA,5.4,15,4.5,0,4.5,14.5,4.5,4.5,0,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Brig, The",1964,68,NA,5.4,26,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Brigada explosiva",1986,85,NA,3.2,30,14.5,4.5,4.5,14.5,4.5,0,4.5,4.5,0,45.5,"",1,0,1,0,0,0,0 -"Brigada explosiva contra los ninjas",1986,70,NA,3,17,24.5,4.5,0,0,24.5,0,0,14.5,0,34.5,"",1,0,1,0,0,0,0 -"Brigade antigangs",1966,88,NA,5.6,6,0,0,0,34.5,14.5,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Brigade mondaine",1978,91,NA,2.9,7,24.5,24.5,14.5,0,14.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Brigadiere Pasquale Zagaria ama la mamma e la polizia, Il",1973,85,NA,4,12,44.5,0,4.5,0,0,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Brigadoon",1954,108,2352625,6.8,1286,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Brigand of Kandahar, The",1965,81,NA,5.8,13,4.5,0,4.5,24.5,14.5,14.5,4.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Brigand, The",1952,94,NA,4.5,10,14.5,0,0,34.5,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Brigands, chapitre VII",1996,117,NA,6.7,66,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Brigante di Tacca del Lupo, Il",1952,82,NA,7.2,5,0,0,0,0,0,24.5,0,44.5,0,44.5,"",1,0,0,1,0,0,0 -"Briganti italiani, I",1961,110,NA,5.5,5,0,0,0,24.5,24.5,0,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Brigham City",2001,119,1000000,7.1,405,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Brigham Young - Frontiersman",1940,114,NA,6.2,129,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bright Angel",1991,94,NA,5.3,135,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bright Eyes",1934,83,NA,6.5,203,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Bright Leaf",1950,110,NA,6,114,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bright Leaves",2003,107,NA,7,91,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Bright Lights",1930,69,NA,5.7,16,4.5,0,4.5,4.5,14.5,4.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bright Lights",1935,83,NA,6.6,26,0,0,4.5,4.5,24.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bright Lights, Big City",1988,110,NA,5.2,1461,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bright Road",1953,68,NA,5.7,33,0,4.5,0,0,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bright Shawl, The",1923,80,NA,8.1,7,0,0,0,0,0,0,74.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Bright Victory",1951,96,NA,7.6,63,0,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Bright Young Things",2003,105,NA,6.8,621,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Brightness",2000,25,NA,7.1,41,4.5,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Brighton Beach Memoirs",1986,108,NA,6.4,693,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Brighton Rock",1947,92,NA,7.6,296,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brighton Strangler, The",1945,67,NA,6.3,53,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Brighty of the Grand Canyon",1967,89,NA,4.5,29,14.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Brigitte et Brigitte",1966,75,NA,7.1,7,0,14.5,14.5,0,0,24.5,0,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Brilliant Lies",1996,88,NA,6.1,133,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Brilliantovaya ruka",1968,100,NA,7.9,624,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Brimstone",1949,90,NA,6.1,38,0,4.5,0,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Brimstone & Treacle",1982,87,NA,6.2,368,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bring 'Em Back Alive",1932,65,NA,5.5,19,0,4.5,14.5,4.5,24.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Bring It On",2000,98,10000000,6.1,11784,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Bring Me the Head of Alfredo Garcia",1974,112,1500000,7.1,1163,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bring Me the Head of Charlie Brown",1986,4,NA,2.7,28,24.5,0,4.5,4.5,0,4.5,0,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Bring Me the Head of Geraldo Rivera",1989,8,NA,5.4,5,24.5,0,0,24.5,0,24.5,0,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Bring Me the Head of Mavis Davis",1997,100,NA,4.9,161,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Bring Your Smile Along",1955,83,NA,5.3,9,0,0,0,14.5,34.5,34.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Bring on the Girls",1937,11,NA,5.5,5,0,0,24.5,0,44.5,24.5,0,0,0,24.5,"",0,0,1,0,0,0,1 -"Bring on the Girls",1945,92,NA,6.2,12,0,0,0,4.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Bring on the Night",1985,97,NA,6.5,152,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Bringing Down the House",2003,105,35000000,5.6,6501,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Bringing Out the Dead",1999,121,32000000,6.7,13989,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Bringing Rain",2003,82,150000,5.6,32,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,1,0 -"Bringing Up Baby",1938,102,NA,8.2,9250,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Brink's Job, The",1978,104,NA,6.2,327,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Britannia Hospital",1982,111,NA,5.5,352,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Britannia Mews",1949,90,NA,5.2,38,0,4.5,0,4.5,24.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Britannia of Billingsgate",1933,80,NA,5,11,0,0,4.5,0,45.5,4.5,14.5,0,0,4.5,"",0,0,1,1,0,0,0 -"British Agent",1934,80,NA,5.7,37,4.5,4.5,4.5,14.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"British Intelligence",1940,61,NA,5.7,53,4.5,0,0,4.5,24.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"British Sounds",1970,54,NA,5.9,17,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Britney, Baby, One More Time",2002,83,NA,6.4,102,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Brivele der Mamen, A",1939,105,NA,6.2,11,0,0,0,4.5,14.5,14.5,0,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Broadcast 23",2005,7,2500,5.7,18,14.5,0,0,4.5,0,0,0,14.5,34.5,34.5,"",1,0,1,0,0,0,1 -"Broadcast Bombshells",1995,84,NA,3,52,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Broadcast News",1987,133,NA,7,5008,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Broadminded",1931,72,NA,6,42,4.5,4.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Broadway",1942,91,NA,6.8,13,0,0,4.5,0,34.5,4.5,14.5,34.5,0,4.5,"",0,0,0,0,0,0,0 -"Broadway & Union Square, New York",1902,1,NA,3.1,7,0,0,74.5,14.5,14.5,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Broadway Babies",1929,86,NA,6.9,14,0,0,0,0,24.5,44.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Broadway Bad",1933,61,239308,6,10,0,0,14.5,14.5,14.5,24.5,44.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Broadway Bill",1934,104,NA,5.8,120,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Broadway Damage",1997,110,NA,6.6,205,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Broadway Danny Rose",1984,84,8000000,7.3,2661,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Broadway Gondolier",1935,99,NA,6.5,13,0,0,0,4.5,14.5,24.5,4.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Broadway Hostess",1935,68,NA,4.6,71,44.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Broadway Limited",1941,75,NA,4.8,8,0,0,34.5,14.5,14.5,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Broadway Melody of 1936",1935,101,NA,7,116,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Broadway Melody of 1938",1937,110,NA,6.6,140,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Broadway Melody of 1940",1940,102,NA,7.3,240,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Broadway Melody, The",1929,101,379000,6,378,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Broadway Musketeers",1938,63,NA,6.2,16,0,0,0,14.5,4.5,34.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Broadway Rhythm",1944,115,NA,6.3,21,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Broadway Romeo, A",1931,15,NA,5.9,10,0,14.5,0,0,34.5,34.5,14.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Broadway Serenade",1939,109,NA,5.3,29,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Broadway Through a Keyhole",1933,90,NA,6.5,10,0,0,0,0,14.5,14.5,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Broadway by Light",1958,12,NA,4.4,5,0,0,0,64.5,24.5,0,0,0,24.5,0,"",0,0,0,0,0,0,1 -"Broadway to Cheyenne",1932,60,NA,5.3,8,0,0,0,34.5,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Broadway to Hollywood",1933,85,NA,4.9,28,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Broadway's Like That",1930,10,NA,4.9,24,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Broadway: The Golden Age, by the Legends Who Were There",2003,111,NA,7.7,127,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Broder Gabrielsen",1966,97,NA,5.4,15,0,0,4.5,4.5,34.5,14.5,14.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Brodeuses",2004,89,NA,7.2,123,0,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brodvey. Chernoe more",2002,84,NA,8.4,6,0,0,0,0,0,0,0,45.5,45.5,0,"",0,0,0,0,1,0,0 -"Broidit",2003,80,NA,4.9,23,14.5,4.5,4.5,24.5,4.5,4.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Brokedown Palace",1999,100,NA,6.1,4321,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Broken",2000,29,NA,2.1,43,14.5,4.5,0,0,4.5,0,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Broken",2002,17,NA,6.3,16,0,0,0,0,4.5,24.5,4.5,0,4.5,45.5,"",0,0,0,1,0,0,1 -"Broken",2004,14,NA,4.1,17,0,0,0,4.5,0,0,4.5,14.5,4.5,74.5,"",0,0,1,0,0,0,1 -"Broken Allegiance",2002,23,NA,5.8,30,4.5,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,1 -"Broken Arrow",1950,93,NA,7.2,692,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Broken Arrow",1996,108,65000000,5.7,14415,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Broken Bars",1995,97,NA,3.5,8,0,14.5,0,0,0,24.5,0,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Broken Blossoms",1936,84,NA,5.7,7,0,14.5,0,0,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Broken Blossoms or The Yellow Man and the Girl",1919,90,88000,7.4,789,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Broken Doll, The",1910,17,NA,3.9,6,34.5,0,0,0,14.5,0,0,45.5,0,0,"",0,0,0,1,0,0,1 -"Broken Dolls",1999,81,NA,3.4,29,24.5,4.5,4.5,4.5,4.5,4.5,0,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Broken Down Film",1985,6,NA,8.5,28,4.5,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,1,1,0,0,0,1 -"Broken Dreams",1933,68,NA,4.9,8,0,14.5,0,24.5,14.5,34.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Broken English",1981,93,NA,7.2,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Broken English",1996,92,NA,6.5,299,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Broken Giant, The",1998,83,NA,3.7,10,24.5,0,14.5,0,0,0,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Broken Harvest",1994,97,NA,4.3,21,4.5,4.5,0,0,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Broken Hearts Club: A Romantic Comedy, The",2000,94,1000000,6.8,1712,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Broken Highway",1993,98,NA,3.6,11,0,14.5,14.5,14.5,14.5,4.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Broken Journey",1948,89,NA,5.8,20,0,4.5,0,0,24.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Broken Lance",1954,96,NA,7,298,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Broken Land, The",1962,75,NA,4.8,27,14.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Broken Leghorn, A",1959,6,NA,6.4,69,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Broken Lullaby",1932,76,889154,7.2,66,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Broken Noses",1987,75,NA,5.7,22,4.5,0,0,4.5,0,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Broken Rainbow",1985,70,NA,4.7,16,0,4.5,4.5,14.5,14.5,0,0,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Broken Sabre",1965,89,NA,6.5,8,0,0,0,14.5,0,34.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Broken Silence",1995,106,NA,8.3,122,0,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Broken Strings",1940,60,NA,5.6,20,4.5,4.5,0,4.5,24.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Broken Things",2002,15,NA,7,33,4.5,0,0,0,0,4.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,1 -"Broken Toys",1935,8,NA,7.4,12,0,0,4.5,0,0,4.5,4.5,44.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Broken Treaty at Battle Mountain",1975,60,NA,7.5,6,0,0,0,0,14.5,0,0,14.5,0,64.5,"",0,0,0,0,1,0,0 -"Broken Vessels",1998,90,600000,6.1,223,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Brombeerchen",2002,91,NA,5.1,12,24.5,4.5,4.5,14.5,0,14.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Bromo and Juliet",1926,24,NA,6.2,21,0,0,4.5,0,14.5,34.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,1 -"Bronco Billy",1980,116,NA,5.8,1352,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Bronco Bullfrog",1969,86,NA,8.9,7,0,0,0,0,0,0,24.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Bronco Buster",1952,80,NA,5.2,8,0,0,0,14.5,34.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Bronenosets Potyomkin",1925,66,NA,8.2,6042,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Bronson Lee, Champion",1978,81,NA,6.8,5,24.5,24.5,0,0,0,0,24.5,0,24.5,24.5,"",1,0,0,1,0,0,0 -"Bronsteins Kinder",1991,90,NA,7.2,6,0,0,0,0,14.5,0,34.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Brontosaurus",1979,71,NA,5.2,6,14.5,0,0,34.5,0,14.5,0,34.5,0,0,"",0,0,0,1,0,0,0 -"Bronx Cheers",1990,30,NA,9.1,11,4.5,0,0,0,0,0,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Bronx Morning, A",1932,11,NA,7.5,15,0,0,0,0,14.5,0,34.5,34.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Bronx Tale, A",1993,121,22000000,7.5,9175,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bronx War, The",1990,91,NA,4.3,23,4.5,14.5,14.5,0,34.5,4.5,0,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Bronze Buckaroo, The",1939,58,NA,5.2,18,0,0,14.5,24.5,34.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Bronze Screen: 100 Years of the Latino Image in American Cinema, The",2002,90,NA,7.5,11,0,0,0,0,4.5,14.5,34.5,0,0,34.5,"",0,0,0,0,1,0,0 -"Brood, The",1979,90,NA,6.3,1434,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Brooklyn Babylon",2001,89,NA,5.6,75,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Brooklyn Bound",2004,90,70000,4.2,30,4.5,4.5,4.5,4.5,4.5,0,0,4.5,14.5,64.5,"R",0,0,0,1,0,0,0 -"Brooklyn Bridge",1981,58,NA,7.9,61,0,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Brooklyn Sonnet",2000,95,NA,5.9,25,4.5,0,0,14.5,14.5,24.5,24.5,0,0,24.5,"R",1,0,0,1,0,0,0 -"Brooklyn State of Mind, A",1997,89,NA,5.7,66,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Broom-Stick Bunny",1956,7,NA,7,78,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Brooms",1995,16,NA,9.2,11,0,0,0,0,4.5,4.5,0,4.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Broos",1997,80,NA,6.1,30,4.5,4.5,0,4.5,4.5,24.5,4.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Bror min",2001,10,NA,5.8,13,0,0,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Bror, min bror",1998,20,NA,6.6,10,0,0,0,0,34.5,0,24.5,24.5,0,34.5,"",0,0,0,0,0,0,1 -"Broth of a Boy",1959,77,NA,6.2,9,0,0,0,14.5,14.5,34.5,0,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Brother",1999,8,NA,6.7,68,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,0,1,0,0,1 -"Brother",2000,114,12000000,7.1,4322,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Brother Bear",2003,85,NA,6.6,3780,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,1,0,0,0 -"Brother Born Again",2001,76,NA,6.9,7,0,0,24.5,0,0,14.5,14.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Brother Brat",1944,7,NA,7.8,15,4.5,0,0,0,0,4.5,14.5,44.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Brother John",1971,95,NA,6.4,66,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Brother Minister: The Assassination of Malcolm X",1994,115,NA,2.5,12,34.5,0,0,4.5,4.5,0,4.5,4.5,0,34.5,"",0,0,0,0,1,0,0 -"Brother Orchid",1940,88,NA,6.9,257,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Brother Outsider: The Life of Bayard Rustin",2003,83,NA,7.5,27,4.5,0,0,0,0,4.5,34.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Brother Rat",1938,90,NA,5.4,89,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Brother Rat and a Baby",1940,87,NA,4.4,42,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Brother Tied",1998,109,NA,8.8,9,0,0,0,0,0,0,14.5,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Brother from Another Planet, The",1984,106,300000,6.7,1133,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Brother of the Wind",1973,88,NA,4.3,18,0,0,14.5,4.5,14.5,0,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Brother to Brother",2004,94,NA,4.9,172,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Brother's Keeper",1992,104,NA,7.6,525,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Brother's Kiss, A",1997,92,NA,6.3,102,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Brother, Can You Spare a Dime?",1975,103,NA,6.8,72,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Brotherhood of Death",1976,90,NA,4.6,21,4.5,14.5,0,14.5,24.5,14.5,0,0,4.5,14.5,"",1,0,0,1,0,0,0 -"Brotherhood of Satan, The",1971,92,NA,4.2,109,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Brotherhood, The",1968,96,NA,5.6,106,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Brotherly Love",1936,6,NA,7.2,12,4.5,0,0,0,14.5,0,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Brothers Carry-Mouse-Off, The",1965,7,NA,5.9,14,0,0,14.5,4.5,14.5,24.5,14.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Brothers Karamazov, The",1958,145,NA,6.5,316,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Brothers McMullen, The",1995,98,23800,6.4,2325,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Brothers O'Toole, The",1973,95,NA,4.3,22,4.5,4.5,4.5,4.5,34.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Brothers Rico, The",1957,92,NA,7,27,0,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brothers in Arms",2003,68,500000,4.6,23,14.5,4.5,4.5,4.5,4.5,14.5,0,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Brothers in Law",1957,94,NA,6.4,36,0,0,0,0,4.5,34.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Brothers in Trouble",1995,102,NA,6.9,50,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Brothers in the Saddle",1949,60,NA,5.3,21,0,0,4.5,14.5,4.5,34.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Brothers, The",1947,98,NA,6.3,22,4.5,0,0,0,14.5,24.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brothers... On Holy Ground",2003,54,NA,9.4,14,0,0,0,0,0,4.5,24.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Brott, Ett",1940,92,NA,5.7,18,0,0,0,0,24.5,64.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Brown Bunny, The",2003,119,10000000,5.1,1045,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Brown Eyed Girl",2001,36,NA,7.4,7,0,0,0,24.5,0,14.5,0,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Brown Sugar",2002,109,8000000,5.9,941,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Brown of Harvard",1926,85,NA,9,19,14.5,0,4.5,0,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,1,0,1,0 -"Brown on Resolution",1935,70,NA,7.4,18,0,4.5,0,0,14.5,14.5,24.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Brown's Requiem",1998,104,NA,5.7,303,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Browning Version, The",1951,90,NA,8.3,248,4.5,0,4.5,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Browning Version, The",1994,97,NA,7.2,684,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brubaker",1980,132,NA,6.7,1994,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bruce Almighty",2003,101,81000000,6.4,23905,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Bruce Diet, The",1992,25,NA,1.4,9,44.5,24.5,0,14.5,0,0,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Bruce Haack: The King of Techno",2004,70,NA,8.7,9,0,0,0,0,14.5,0,14.5,0,44.5,34.5,"",0,0,0,0,1,0,0 -"Bruce Le's Greatest Revenge",1978,94,NA,7.8,10,24.5,0,0,0,14.5,24.5,0,34.5,0,24.5,"",1,0,0,1,0,0,0 -"Bruce Lee - Best of the Best",1990,71,NA,4.9,9,24.5,14.5,0,0,0,14.5,24.5,0,0,34.5,"",0,0,0,0,1,0,0 -"Bruce Lee Fights Back from the Grave",1976,84,NA,2.4,52,34.5,4.5,14.5,4.5,4.5,4.5,0,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Bruce Lee and Kung Fu Mania",1992,85,NA,6.3,15,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"",1,0,0,0,1,0,0 -"Bruce Lee's Ways of Kung Fu",1982,87,NA,6.5,5,44.5,44.5,0,0,0,0,0,24.5,0,0,"",1,0,0,1,0,0,0 -"Bruce Lee, the Legend",1977,88,NA,5.9,108,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Bruce the Super Hero",1979,88,NA,6.3,9,14.5,24.5,0,14.5,0,14.5,24.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Bruce's Fingers",1980,91,NA,5.4,15,0,14.5,0,24.5,0,24.5,14.5,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Bruce's Fists of Vengeance",1984,87,NA,2.2,6,34.5,34.5,0,14.5,14.5,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Bruce, The",1996,90,500000,4.5,79,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bruch, Der",1989,118,NA,5.3,13,0,0,4.5,0,24.5,34.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Bruciati da cocente passione",1976,97,NA,6.3,7,0,0,14.5,0,0,44.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Brucio nel vento",2002,118,NA,6.9,159,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Bruden fra Dragstrup",1955,113,NA,7.2,5,0,0,0,0,0,0,84.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Bruder Martin",1954,100,NA,4.7,7,0,0,0,24.5,0,14.5,45.5,0,0,0,"",0,0,1,1,0,1,0 -"Brug, De",1928,11,NA,7.9,13,0,0,0,0,0,4.5,34.5,14.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Brugge, die stille",1981,90,NA,4.7,5,0,0,0,24.5,44.5,24.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Brun bitter",1988,83,NA,5.3,9,0,0,0,14.5,34.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brunet wieczorowa pora",1976,90,NA,7.6,77,0,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Bruno",2000,108,10000000,6,295,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Bruno",2001,6,NA,6.2,5,0,0,0,44.5,0,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Brussels Midnight",1998,16,NA,6.5,14,0,0,0,0,0,34.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Brussels by Night",1983,90,NA,5.3,78,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Brusten himmel",1982,99,NA,6.6,12,0,0,0,0,0,45.5,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Brutal Fury",1993,97,NA,6.4,15,14.5,4.5,0,4.5,14.5,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Brute Force",1914,33,NA,5.9,5,24.5,0,0,0,24.5,0,64.5,0,0,0,"",0,0,0,1,0,0,1 -"Brute Force",1947,98,NA,7.6,378,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brute Man, The",1946,58,NA,3,120,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Brute, The",1977,90,NA,5.2,9,0,0,0,24.5,0,24.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Brutes and Savages",1978,107,NA,3.2,16,14.5,14.5,4.5,24.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,1,0,0 -"Bruto, El",1953,81,NA,7,116,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Brutti sporchi e cattivi",1976,115,NA,7.6,553,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Bruttina stagionata, La",1996,90,NA,7.3,6,0,0,0,14.5,14.5,0,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Bruxelles mon amour",2000,50,NA,3.7,25,4.5,0,0,14.5,14.5,24.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Brylcream Boulevard",1995,95,NA,5.7,51,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Brylcreem Boys, The",1998,106,6000000,6,199,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Bryllupet",2000,85,NA,6.3,10,34.5,0,0,14.5,14.5,14.5,14.5,0,34.5,0,"",0,0,0,1,0,0,0 -"Bryllupsfotografen",1994,85,NA,4.2,11,4.5,0,14.5,24.5,24.5,0,0,4.5,4.5,0,"",0,0,0,1,0,1,0 -"Bryllupsnatten",1997,12,NA,3.3,16,14.5,0,0,0,0,24.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,1,1 -"Brzezina",1970,102,NA,6.8,59,0,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Bsora Al-Pi Elohim, Ha-",2004,90,NA,4.6,9,24.5,24.5,0,24.5,0,0,14.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Bsss",2000,3,NA,5.5,14,0,4.5,4.5,14.5,0,24.5,14.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Bu jian",2003,82,NA,5.8,119,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bu jian bu san",1998,103,NA,7.4,79,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Bu san",2003,84,NA,6.8,368,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Bu su",1987,95,NA,6.4,6,0,0,0,0,14.5,34.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bu ze shou duan",1978,81,NA,3.9,12,4.5,14.5,0,4.5,14.5,24.5,14.5,4.5,0,0,"",1,0,0,1,0,0,0 -"Buai laju-laju",2004,93,NA,7.3,18,0,14.5,0,0,24.5,14.5,0,4.5,0,45.5,"",0,0,0,1,0,1,0 -"Bubasinter",1971,80,NA,5.8,11,0,0,0,4.5,0,0,24.5,14.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Bubba Ho-tep",2002,92,1000000,7.5,7142,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Bubbeh Lee and Me",1996,35,NA,7.9,12,0,0,0,0,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Bubble Bee",1949,7,NA,5.8,22,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Bubble Boy",2001,84,13000000,5.1,2904,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Bubble Trouble",1953,17,NA,6.2,41,14.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Bubble, The",1966,94,NA,4.4,40,14.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Bubblepac",1998,11,NA,5.2,16,0,24.5,4.5,0,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Bubbles",1922,7,NA,7.1,6,14.5,0,0,0,14.5,0,14.5,34.5,14.5,0,"",0,1,1,0,0,0,1 -"Bubbles",1930,8,NA,5.7,22,4.5,0,0,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Bubbles Galore",1996,94,NA,3.2,77,34.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Bubu",1971,105,NA,7,10,14.5,0,0,14.5,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Buccaneer Bunny",1948,7,NA,7.7,68,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Buccaneer's Girl",1950,77,NA,5.2,18,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,0,0,"",1,0,1,0,0,1,0 -"Buccaneer, The",1938,125,NA,6.4,80,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Buccaneer, The",1958,119,NA,6.1,337,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Buchanan Rides Alone",1958,78,NA,7.1,110,0,0,0,0,4.5,14.5,44.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Buchi neri, I",1995,92,NA,5.6,41,14.5,0,4.5,0,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Buck Benny Rides Again",1940,82,NA,7.2,70,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Buck Naked Arson",2001,85,NA,6.5,38,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,34.5,"R",0,0,1,1,0,0,0 -"Buck Nelson Presents: Lifting the Cloak of Mystery Off Rock Drumming",2004,10,NA,9.5,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,1,0,0,0,1 -"Buck Privates",1928,70,NA,9.9,7,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,1,0,0,0,0 -"Buck Privates",1941,84,180000,6.8,461,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Buck Privates Come Home",1947,77,NA,6.3,215,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Buck Rogers",1939,237,NA,7.1,145,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Buck Rogers",1977,90,NA,6.2,78,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Buck Rogers in the 25th Century",1934,10,NA,4.3,35,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Buck Rogers in the 25th Century",1979,98,NA,5.4,678,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Buck and the Magic Bracelet",1999,99,NA,2,8,45.5,14.5,14.5,14.5,0,0,0,0,0,14.5,"PG-13",1,0,0,0,0,0,0 -"Buck and the Preacher",1972,102,NA,5.8,135,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Buckaroo Bugs",1944,9,NA,7.2,51,4.5,0,0,0,4.5,14.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Buckaroo Sheriff of Texas",1951,60,NA,4.4,5,0,24.5,24.5,44.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Bucket of Blood, A",1959,66,25000,6.6,416,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Buckeye and Blue",1988,94,NA,4.9,13,0,4.5,4.5,24.5,4.5,4.5,4.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Bucking Broadway",1917,53,NA,4.9,38,14.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bucking Broncho",1894,1,NA,4.6,30,0,0,24.5,24.5,14.5,14.5,24.5,4.5,0,0,"",0,0,0,0,1,0,1 -"Bucklige von Soho, Der",1966,89,NA,5.5,31,0,0,4.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Buckskin",1968,97,NA,3.9,19,14.5,14.5,4.5,24.5,24.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Buckskin Frontier",1943,76,NA,6.3,13,0,0,0,4.5,24.5,34.5,4.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Buckskin Lady, The",1957,66,NA,5.3,9,14.5,0,24.5,0,34.5,0,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Bucktown",1975,94,NA,4.7,74,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bud Abbott Lou Costello Meet Frankenstein",1948,90,NA,7.2,1874,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Budbringeren",1997,83,2100000,6.8,732,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Buddenbrooks - 1. Teil",1959,99,NA,6.5,31,0,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Buddenbrooks - 2. Teil",1959,107,NA,6.7,25,0,0,4.5,4.5,14.5,34.5,14.5,4.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Buddha Heads",2002,94,NA,3.4,9,14.5,14.5,44.5,0,0,24.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Buddies",1983,97,NA,4.7,25,14.5,4.5,0,14.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Buddies... Thicker Than Water",1962,9,NA,4.9,25,0,14.5,14.5,14.5,24.5,4.5,14.5,0,4.5,14.5,"",0,1,1,0,0,0,1 -"Budding of Brie, The",1980,90,NA,5.6,13,0,4.5,4.5,4.5,0,24.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Buddy",1997,84,NA,4.6,458,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Buddy",2003,100,NA,7.1,691,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Buddy Boy",1999,105,NA,5.6,106,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Buddy Buddy",1981,96,10000000,6.2,761,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Buddy Holly Story, The",1978,113,NA,7.2,1124,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Buddy System, The",1984,110,NA,5.5,208,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Buddy's Song",1990,105,NA,4.4,74,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Budget Liquor",2001,18,NA,4.6,55,34.5,0,0,0,0,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,1,0,1 -"Budjenje pacova",1967,79,NA,7.7,27,4.5,0,0,4.5,0,4.5,14.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Budte moim muzhem",1981,87,NA,6.3,23,0,0,4.5,4.5,4.5,34.5,4.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Buen novio, Un",1998,90,NA,5.7,24,4.5,4.5,0,4.5,24.5,14.5,34.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Buena Sorte",1996,104,NA,5.3,12,0,24.5,0,14.5,24.5,4.5,4.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Buena Vista Fight Club",2000,2,NA,3.9,53,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Buena Vista Social Club",1999,105,NA,7.2,3216,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Buena estrella, La",1997,99,NA,7.1,248,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Buena onda",1999,11,2000,5.2,10,14.5,0,0,0,0,14.5,0,34.5,34.5,24.5,"",0,0,0,1,0,0,1 -"Buena vida delivery",2004,93,NA,6.6,99,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Buena vida, La",1996,107,NA,6.8,164,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Buenos Aires Vice Versa",1996,122,NA,6.8,110,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Buenos Aires me mata",1998,102,NA,4.1,10,45.5,14.5,14.5,0,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Buenos Aires, Here We Come",1996,19,NA,8,16,0,0,14.5,0,0,0,14.5,24.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Buffalo '66",1998,110,1500000,7.2,6652,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Buffalo Bill",1944,90,NA,6.3,131,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Buffalo Bill Rides Again",1947,69,NA,4.7,11,4.5,24.5,14.5,4.5,24.5,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Buffalo Bill and the Indians, or Sitting Bull's History Lesson",1976,123,6000000,5.6,452,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Buffalo Bill in Tomahawk Territory",1952,66,NA,5.5,8,0,0,24.5,24.5,0,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Buffalo Bill's Wild West Parade",1901,2,NA,3.4,8,14.5,0,34.5,14.5,24.5,0,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Buffalo Common",2001,23,NA,5.7,14,0,4.5,0,0,24.5,14.5,0,4.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Buffalo Dance",1894,1,NA,5,35,0,0,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Buffalo Fire Department in Action",1897,1,NA,4.1,16,4.5,4.5,4.5,34.5,14.5,4.5,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Buffalo Gun",1961,72,NA,4.7,5,24.5,0,0,24.5,24.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Buffalo Soldiers",2001,98,15000000,7,3753,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Buffet froid",1979,89,NA,7.5,585,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Buffy the Vampire Slayer",1992,86,NA,5.4,6825,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Bufo & Spallanzani",2001,96,NA,8.4,130,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Buford's Beach Bunnies",1993,90,NA,1.9,138,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bug",1975,99,NA,4.1,247,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bug",2003,14,NA,5.5,6,34.5,0,14.5,0,0,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Bug Buster",1998,93,8500000,2.9,268,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Bug Man, The",2003,22,28000,6.7,16,0,14.5,0,4.5,0,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Bug Off!",2001,84,NA,3.2,37,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Bug Parade, The",1941,6,NA,5.9,11,0,0,0,0,34.5,4.5,34.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Bug's Life, A",1998,96,45000000,7.4,23184,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Bugaboo",1999,82,NA,6.2,10,24.5,0,0,14.5,24.5,0,0,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Bugambilia",1945,105,NA,7.5,7,0,0,0,0,0,14.5,24.5,0,45.5,0,"",0,0,0,1,0,1,0 -"Bugged by a Bee",1969,6,NA,2.9,5,24.5,0,0,44.5,44.5,0,0,0,0,0,"",0,1,1,0,0,0,1 -"Bugle Sounds, The",1942,102,NA,6.2,31,0,0,0,4.5,24.5,34.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Bugles in the Afternoon",1952,85,NA,5.9,38,0,0,4.5,4.5,24.5,14.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Bugs Bunny Gets the Boid",1942,7,NA,7.2,128,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bugs Bunny Nips the Nips",1944,8,NA,6.4,97,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bugs Bunny Rides Again",1948,7,NA,7.7,92,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bugs Bunny Superstar",1976,90,NA,6.7,121,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,0,0,1,0,0 -"Bugs Bunny and the Three Bears",1944,7,NA,7,132,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Bugs Bunny's 3rd Movie: 1001 Rabbit Tales",1982,74,NA,6.6,177,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Bugs and Thugs",1954,7,NA,7.8,97,0,0,0,4.5,4.5,14.5,14.5,44.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bugs in Love",1932,7,NA,6.4,9,0,0,0,0,14.5,34.5,24.5,0,14.5,24.5,"",0,1,1,0,0,0,1 -"Bugs' Bonnets",1956,7,NA,7.6,59,0,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Bugsy",1991,134,40000000,6.6,4159,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bugsy Malone",1976,93,NA,6.2,2043,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bugsy and Mugsy",1957,7,NA,7.6,57,0,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bui bun si mun",1980,92,NA,7.1,17,0,4.5,0,4.5,4.5,0,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Building Bombs",2000,100,NA,6.1,8,0,0,0,0,0,14.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Building a Building",1933,7,NA,7.1,43,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Buio Omega",1979,94,NA,5.8,382,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Bukak Api",2000,80,NA,7.2,6,0,0,0,0,0,0,14.5,34.5,45.5,0,"",0,0,0,1,1,0,0 -"Bukowski: Born into This",2003,130,NA,8.4,133,0,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Bulaklak ng City Jail",1984,110,NA,7.2,7,0,14.5,0,0,0,0,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Bulaklak ng Maynila",1999,101,NA,6.1,6,0,0,14.5,0,0,34.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Bulan",1990,97,NA,5,5,44.5,0,0,0,64.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Bulan tertusuk ilalang",1995,125,NA,7.6,23,14.5,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Bulandi",2000,175,NA,5.6,30,0,4.5,14.5,0,0,34.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Buldoci a tresne",1981,99,NA,4.6,15,24.5,0,24.5,24.5,24.5,4.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Bulevar revolucije",1992,99,NA,6.7,15,4.5,0,4.5,4.5,0,24.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Bulhueui myeongjag",2000,115,NA,5.5,21,0,0,4.5,24.5,34.5,14.5,0,0,0,14.5,"",0,0,0,1,0,1,0 -"Bull Durham",1988,108,7000000,7.1,8434,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Bulldog Breed, The",1960,97,NA,4.9,72,4.5,4.5,0,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bulldog Drummond",1929,90,550000,6.6,91,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bulldog Drummond Comes Back",1937,64,NA,5.7,43,0,0,4.5,14.5,4.5,44.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bulldog Drummond Escapes",1937,67,NA,5.7,53,4.5,0,4.5,4.5,14.5,24.5,34.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Bulldog Drummond Strikes Back",1934,83,NA,7.2,41,4.5,0,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Bulldog Drummond Strikes Back",1947,65,NA,4.8,5,0,24.5,0,24.5,0,0,0,24.5,44.5,0,"",0,0,0,0,0,0,0 -"Bulldog Drummond in Africa",1938,58,NA,5.5,31,4.5,0,0,14.5,24.5,34.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Bulldog Drummond's Bride",1939,56,NA,6.2,23,0,0,0,14.5,4.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Bulldog Drummond's Peril",1938,66,NA,5.9,34,0,0,0,14.5,14.5,34.5,14.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Bulldog Drummond's Revenge",1937,57,NA,6.2,31,0,0,0,14.5,4.5,44.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bulldog Drummond's Secret Police",1939,56,NA,6.4,48,0,0,0,14.5,0,34.5,34.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Bulldog Jack",1935,72,NA,5.8,37,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bulldozing the Bull",1938,6,NA,7.1,8,0,0,0,14.5,0,34.5,0,0,14.5,34.5,"",0,1,1,0,0,0,1 -"Bullet",1996,98,NA,5,672,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Bullet Ballet",1998,98,NA,6.6,181,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bullet Boy",2004,89,NA,6.7,102,4.5,0,4.5,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bullet Code",1940,58,NA,4,16,24.5,0,4.5,4.5,34.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Bullet Is Waiting, A",1954,90,NA,5.1,19,0,0,4.5,34.5,24.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Bullet Scars",1942,59,NA,5.8,16,0,0,0,14.5,14.5,34.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Bullet for Joey, A",1955,85,NA,5.4,50,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bullet for Pretty Boy, A",1970,89,350000,3.5,31,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,0,"",1,0,0,1,0,0,0 -"Bullet for a Badman",1964,80,NA,6,36,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bullet in the Brain",2001,14,NA,8.4,50,0,0,4.5,0,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Bullet on a Wire",1998,83,NA,6,19,14.5,4.5,0,0,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bulleteers, The",1942,8,NA,7.1,53,0,4.5,4.5,0,0,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Bullethead",2002,111,NA,6.4,14,24.5,0,0,4.5,4.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Bulletproof",1988,93,5000000,3.8,155,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Bulletproof",1996,84,NA,5.4,3613,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Bulletproof Monk",2003,104,52000000,5.2,5405,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Bullets Over Broadway",1994,98,20000000,7.4,6685,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Bullets for O'Hara",1941,50,NA,5.8,23,0,0,4.5,14.5,14.5,34.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Bullets or Ballots",1936,82,NA,6.7,210,4.5,0,0,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Bullfighter",2000,90,NA,2.7,58,34.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Bullfighter and the Lady",1951,124,NA,6.4,68,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bullfighters, The",1945,60,NA,5.7,77,4.5,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Bullies",1986,90,NA,4.5,80,4.5,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Bullitt",1968,113,5500000,7.3,6191,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Bulls' Night Out, The",2000,82,NA,6.1,6,0,0,0,0,0,34.5,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Bullseye",1987,93,NA,3.5,10,0,0,64.5,24.5,0,0,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Bullseye!",1990,93,NA,3.9,255,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bullshot",1983,85,NA,5.5,208,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Bullwhip",1958,80,NA,5,28,4.5,4.5,0,14.5,34.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bully",2001,113,NA,7,4913,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Bully Dance",2000,10,NA,6.4,8,0,0,0,0,14.5,34.5,24.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Bully for Bugs",1953,7,NA,8.2,175,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Bully for Pink",1965,6,NA,4.7,78,34.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Bulto, El",1992,114,NA,7.9,55,0,0,0,0,4.5,14.5,14.5,24.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Bulworth",1998,108,30000000,6.9,8277,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Bum Bandit, The",1931,6,NA,5.6,13,0,0,0,4.5,34.5,14.5,34.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Bum Rap",1988,117,NA,7.1,11,0,0,0,0,0,4.5,14.5,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Bumble Boogie",1948,3,NA,6.9,19,4.5,0,0,0,14.5,4.5,14.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Bumblebee Flies Anyway, The",1999,96,NA,6.1,604,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Bumer",2003,110,700000,6.5,264,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bumerang",1997,97,NA,4.3,18,14.5,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Bummer!",1973,90,NA,2.5,21,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Bumping Heads",2002,22,NA,4.6,21,4.5,0,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,1 -"Bumping Into Broadway",1919,23,NA,7.6,28,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Bums",1993,94,NA,3,5,0,0,64.5,0,0,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Bunco Squad",1950,67,NA,5.9,25,0,0,4.5,0,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bundfald",1957,86,NA,6.5,7,0,0,0,0,0,24.5,45.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Bundle of Blues, A",1933,9,NA,6.7,8,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Bundle of Joy",1956,98,NA,5.5,107,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bungalow",2002,85,NA,6,68,4.5,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bunk Witch Project, The",2000,70,NA,6.7,7,14.5,0,0,0,14.5,24.5,0,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Bunker - Die letzten Tage",2003,83,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,0,0,1,0,0 -"Bunker Bean",1936,67,NA,5.4,12,0,0,24.5,4.5,14.5,4.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Bunker Hill Bunny",1950,7,NA,7.1,108,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Bunker, The",2001,92,NA,5.4,927,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Bunny",1998,7,NA,7.2,272,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Bunny",2000,88,NA,6.9,34,4.5,14.5,0,4.5,4.5,4.5,4.5,24.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Bunny Hugged",1951,7,NA,7.9,85,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Bunny Lake Is Missing",1965,107,NA,7.1,429,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bunny Mooning",1937,7,NA,5.1,8,0,0,45.5,0,14.5,14.5,0,24.5,0,0,"",0,1,0,0,0,0,1 -"Bunny O'Hare",1971,88,NA,4.7,143,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Bunny and Claude: We Rob Carrot Patches",1968,6,NA,6.3,10,0,0,14.5,0,34.5,0,14.5,44.5,0,14.5,"",0,1,1,0,0,0,1 -"Bunte Hunde",1995,100,NA,7.4,24,4.5,4.5,4.5,0,4.5,4.5,34.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bunte Traum, Der",1952,101,NA,3.1,5,0,44.5,0,0,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Buntkarierten, Die",1949,100,NA,6.6,7,0,0,0,0,0,14.5,44.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Buon Natale... Buon anno",1989,100,NA,5.4,9,0,0,0,0,34.5,34.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Buona Sera, Mrs. Campbell",1968,108,NA,6.4,183,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Buone notizie, Le",1979,110,NA,6.7,13,0,4.5,0,0,24.5,14.5,34.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Buongiorno, elefante!",1952,78,NA,5.1,5,0,0,0,0,44.5,0,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Buongiorno, notte",2003,106,NA,7.1,423,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Buono, il brutto, il cattivo, Il",1966,180,1200000,8.8,30224,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",1,0,0,1,0,0,0 -"Buppah Rahtree",2003,109,NA,6.8,39,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Buque maldito, El",1975,89,NA,3.7,132,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Buraikan",1970,104,NA,6,10,0,0,14.5,0,14.5,14.5,34.5,0,34.5,14.5,"",0,0,1,1,0,0,0 -"Burakku jakku",1996,92,NA,7.1,116,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,0,1,0,0,0 -"Burattinaio, Il",1994,90,NA,3.4,8,34.5,0,14.5,0,0,0,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Burbero, Il",1987,113,NA,4.3,41,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Burden of Dreams",1982,95,NA,7.7,233,4.5,4.5,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Bure baruta",1998,102,NA,7.5,620,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Bureau of Missing Persons",1933,73,NA,6.5,138,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Burglar",1987,103,NA,4.3,780,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Burglar's Dilemma, The",1912,15,NA,5.3,25,4.5,0,4.5,14.5,4.5,24.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,1 -"Burglar, The",1957,90,90000,7,47,0,0,0,4.5,14.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Burgtheater",1936,120,NA,7.8,6,0,0,0,0,14.5,14.5,0,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Burial Society, The",2002,94,1500000,6.5,52,4.5,4.5,4.5,0,4.5,24.5,24.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Buried Alive",1939,62,NA,4.5,9,0,0,14.5,14.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Buried Loot",1935,19,NA,6.4,16,0,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Buried on Sunday",1992,94,NA,5.4,64,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Burisuta",2000,108,NA,6.2,10,0,0,0,14.5,24.5,24.5,34.5,14.5,14.5,0,"",1,0,1,1,0,0,0 -"Burke & Wills",1985,140,NA,5.8,59,0,0,0,4.5,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Burke and Hare",1971,91,NA,5.9,11,0,0,24.5,4.5,14.5,0,34.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Burl's",2003,9,NA,7.3,12,0,0,0,0,0,34.5,4.5,34.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Burlesk King",1999,109,NA,5.4,38,0,4.5,14.5,4.5,14.5,34.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Burlesk Queen",1977,129,NA,6.5,6,0,0,0,0,0,14.5,0,0,34.5,45.5,"",0,0,0,1,0,0,0 -"Burlesque on Carmen",1915,37,NA,6.7,77,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Burlesque on Carmen",1916,67,NA,6.6,65,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Burma Convoy",1941,72,NA,6.3,5,0,0,0,0,24.5,44.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Burn",1998,97,NA,3.3,17,14.5,4.5,0,0,14.5,4.5,0,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Burn",2002,10,NA,7.4,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Burn 'Em Up O'Connor",1939,70,NA,4.5,16,0,4.5,4.5,44.5,34.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Burn Your Phone",1996,27,NA,7.3,17,14.5,0,0,0,14.5,0,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Burn the Floor",1999,97,NA,6,32,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Burndown",1990,86,NA,3.4,22,24.5,4.5,4.5,24.5,4.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Burned at the Stake",1981,88,NA,3.4,50,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Burning Annie",2003,95,NA,3.1,86,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,1,1,0,1,0 -"Burning Boy, The",2001,11,NA,5.7,7,0,0,14.5,0,0,14.5,0,24.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Burning Hills, The",1956,94,NA,5.5,42,0,0,4.5,24.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Burning Life",1994,105,NA,7.3,34,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Burning Man: The Burning Sensation",2002,75,NA,4.2,27,4.5,4.5,4.5,4.5,4.5,14.5,0,4.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Burning Moon, The",1992,99,NA,4.1,122,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Burning Passion",1999,20,NA,4.6,16,4.5,0,0,4.5,4.5,14.5,4.5,14.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Burning Rubber",1981,85,NA,2.9,10,34.5,24.5,0,24.5,14.5,0,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Burning Season, The",1993,104,NA,5.9,11,0,0,4.5,0,14.5,0,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Burning Secret",1988,106,NA,6.2,68,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Burning Times, The",1990,57,NA,7.7,8,0,14.5,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Burning Train, The",1980,142,NA,4.4,17,0,4.5,14.5,0,4.5,4.5,14.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Burning Wall, The",2002,89,NA,8.5,6,0,0,14.5,0,0,34.5,0,0,34.5,14.5,"",0,0,0,0,1,0,0 -"Burning an Illusion",1981,101,NA,5.4,6,0,0,0,0,34.5,0,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Burning the Grump",2001,20,NA,9.3,6,0,0,0,0,0,0,0,34.5,0,64.5,"",0,0,1,1,0,0,1 -"Burning, The",1968,30,NA,6.2,6,14.5,0,14.5,0,14.5,0,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Burning, The",1981,89,1500000,4.7,546,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Burnt Eden",1997,81,NA,6.7,6,0,0,0,0,34.5,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Burnt Offerings",1976,116,NA,5.4,661,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Burnzy's Last Call",1995,85,NA,6.1,34,4.5,0,0,0,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Burp!",1986,12,NA,3.1,6,34.5,0,0,0,0,45.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Burroughs",1985,86,NA,7.6,33,0,0,0,0,4.5,0,34.5,34.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Bury Me Dead",1947,68,NA,6.8,15,24.5,0,0,0,24.5,24.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Bury Me an Angel",1972,84,NA,4.9,30,4.5,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Bury Me in Kern County",1998,90,NA,7.3,7,0,0,14.5,0,14.5,0,24.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Bury the Evidence",1998,102,NA,2.3,18,24.5,24.5,4.5,0,0,0,4.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Burying Dvorak",2003,19,5000,9.4,8,0,0,0,0,0,0,0,24.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Bus Is Coming, The",1971,109,NA,4.5,6,34.5,34.5,0,0,0,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Bus Rider's Union",1999,87,NA,6.4,15,4.5,0,0,0,4.5,24.5,24.5,14.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Bus Riley's Back in Town",1965,93,NA,6,70,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bus Stop",1956,96,NA,6.9,1310,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Bus Stops Here, The",2003,8,NA,6,5,0,24.5,0,24.5,0,0,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Bus to Queens",1999,23,NA,2,13,14.5,34.5,0,0,0,0,4.5,4.5,0,34.5,"",0,0,0,0,0,0,1 -"Bus, The",1965,62,NA,4.6,18,0,4.5,4.5,4.5,34.5,14.5,0,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Buse, The",2000,22,NA,6.7,6,0,0,0,0,0,45.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Bush Christmas",1947,80,NA,6.2,25,0,0,0,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Bush Christmas",1983,91,NA,4.7,36,14.5,0,4.5,14.5,34.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Bush Mama",1979,97,NA,6.5,21,0,0,0,0,24.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Bush Pilot",1947,60,NA,5.8,10,0,14.5,0,24.5,0,44.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Bush Pilots",1990,68,NA,5.6,17,14.5,0,0,24.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Bush's Brain",2004,80,NA,6.8,264,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,0,1,0,0 -"Bushbaby, The",1969,100,NA,5.5,15,0,0,0,0,24.5,44.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Busher, The",1919,50,NA,6.9,10,14.5,0,0,14.5,0,0,34.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bushido Blade, The",1981,104,NA,5.4,60,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Bushmen",2004,15,10000,8.3,7,0,0,0,0,0,0,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Bushwhackers, The",1952,70,NA,4.8,24,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Bushy Hare",1950,7,NA,5.9,23,0,0,4.5,14.5,14.5,24.5,14.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Business Affair, A",1994,98,NA,5.2,131,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Business of Fancydancing, The",2002,103,200000,7.3,195,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Business of Strangers, The",2001,84,NA,6.4,1458,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Buskers",2000,14,NA,7,16,14.5,0,0,0,4.5,0,14.5,34.5,34.5,0,"",0,0,0,1,0,0,1 -"Busman's Honeymoon",1940,83,NA,6.4,66,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Bussed",2003,31,10000,5.2,9,44.5,0,0,14.5,0,0,0,0,14.5,34.5,"",0,0,1,0,0,0,1 -"Bussen",1961,79,NA,6.4,17,0,4.5,0,14.5,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Bussen",1963,90,NA,5,38,0,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Busses Roar",1942,58,NA,5.8,9,14.5,0,0,24.5,0,24.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Bust a Move",2000,28,NA,5.2,8,0,0,0,0,14.5,0,45.5,24.5,14.5,0,"",0,0,1,1,0,0,1 -"Busted",1989,80,NA,5,15,4.5,0,14.5,14.5,0,14.5,4.5,0,4.5,44.5,"",0,0,1,0,0,0,0 -"Busted",1996,93,NA,3,196,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Busted Up",1986,93,NA,3.8,12,14.5,4.5,4.5,4.5,0,4.5,14.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Buster",1988,102,NA,5.3,470,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Buster Keaton Rides Again",1965,55,NA,7.7,37,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Buster Keaton Story, The",1957,91,NA,5.1,39,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,1,1,0,0,0 -"Buster and Billie",1974,100,NA,5.7,148,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Buster's Bedroom",1991,104,NA,4.5,25,0,4.5,4.5,4.5,0,14.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Busters verden",1984,91,NA,7.5,182,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Bustin' Loose",1981,94,NA,5.6,307,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Busting",1974,92,NA,5.3,126,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Busting Out",2004,57,100000,9.4,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,0,0,1,0,0 -"Busy Bakers",1940,7,NA,7.6,8,0,0,0,0,14.5,0,14.5,45.5,0,24.5,"",0,1,1,0,0,0,1 -"Busy Beavers, The",1931,7,NA,6.6,45,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Busy Bodies",1933,19,NA,7.5,208,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Busy Body, The",1967,101,NA,6.1,51,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Busy Buddies",1944,17,NA,7.2,56,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Busy Buddies",1956,6,NA,5.9,28,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Busy Day, A",1914,6,NA,5.5,36,4.5,0,0,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"But I'm a Cheerleader",1999,85,1200000,6.2,3897,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"But Not for Me",1959,111,NA,6.3,108,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Buta no mukui",1999,118,NA,4.9,5,0,0,0,24.5,44.5,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Buta to gunkan",1961,77,NA,7.8,61,0,0,0,0,4.5,14.5,4.5,34.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Butch Camp",1996,101,NA,5.2,84,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Butch Cassidy and the Sundance Kid",1969,110,NA,8.2,20168,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Butch and Sundance: The Early Days",1979,115,NA,5.2,232,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Butcher Boy, The",1917,30,NA,6.8,102,4.5,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Butcher Boy, The",1997,109,NA,7,2262,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Butcher's Wife, The",1991,98,NA,5.2,1398,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Butley",1976,94,NA,7.3,131,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Buttane, Le",1994,85,NA,5.6,25,24.5,0,4.5,0,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Butter",1998,101,NA,2.9,83,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Butterbox Babies",1995,94,NA,6.8,33,0,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Butterbrot",1990,93,NA,6,16,14.5,14.5,0,0,4.5,0,24.5,14.5,0,14.5,"",0,0,0,0,0,1,0 -"Buttercup Chain, The",1970,95,NA,2.8,22,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Butterflies",1975,112,NA,5.2,27,14.5,4.5,0,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Butterflies Are Free",1972,109,NA,6.7,586,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Butterfly",1982,109,NA,4.1,169,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Butterfly Ball, The",1976,85,NA,8.1,13,0,0,0,0,4.5,0,0,24.5,24.5,44.5,"",0,1,0,0,0,0,0 -"Butterfly Effect, The",2004,120,13000000,7.6,22975,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Butterfly Kiss",1995,88,NA,6,483,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Butterfly Smile",2001,90,NA,5.2,8,14.5,14.5,0,0,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Buttman Goes to Rio",1990,90,NA,4.5,18,14.5,0,4.5,0,4.5,14.5,4.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Buud Yam",1997,97,NA,7.1,22,4.5,0,0,0,0,4.5,44.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Buy & Cell",1989,98,NA,4,80,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Buy 1, Get 5 Free: Texas Fireworks Stands",2000,34,NA,7.8,23,0,0,0,0,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Buy My Film!",1995,3,NA,5.5,19,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Buy One, Get One Free*",1996,7,NA,8.5,6,0,0,0,0,14.5,0,14.5,0,14.5,45.5,"",0,1,0,0,0,0,1 -"Buy Your Own Cherries",1904,4,NA,6,33,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,1 -"Buy an Electric Refrigerator",1926,1,NA,4,16,0,14.5,14.5,14.5,4.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Buy or Die",1997,151,NA,8.2,6,0,0,0,14.5,0,0,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Buying the Cow",2002,88,NA,5.6,936,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Buzz",1998,87,NA,5.9,11,0,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Buzz Off!",2000,1,NA,6.1,8,0,0,14.5,14.5,14.5,14.5,14.5,24.5,14.5,0,"",0,1,0,0,0,0,1 -"Buzzin' Around",1933,20,NA,7.8,13,0,0,0,4.5,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Bwana",1996,80,NA,6.8,51,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Bwana Devil",1952,85,NA,5,66,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"By Candlelight",1933,75,NA,4.9,17,4.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"By Courier",2000,13,NA,4.5,13,0,24.5,4.5,4.5,0,4.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"By Design",1982,92,NA,4.8,25,4.5,0,4.5,24.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"By Hook or by Crook",2001,98,NA,5.5,74,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"By Love Possessed",1961,115,NA,4.8,51,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"By Word of Mouse",1954,8,NA,6.4,16,14.5,0,0,0,14.5,14.5,24.5,14.5,14.5,0,"",0,1,1,0,0,0,1 -"By Your Leave",1934,82,NA,5.4,20,0,0,4.5,4.5,34.5,24.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"By the Light of the Silvery Moon",1953,101,NA,6.5,252,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"By the Sea",1915,16,NA,6.1,119,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"By the Sea",1982,51,NA,8,22,0,0,0,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"By the Sword",1991,91,NA,5.8,339,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Byaku fujin no yoren",1956,103,NA,5.8,7,0,0,0,0,44.5,14.5,24.5,0,14.5,0,"",0,0,0,0,0,1,0 -"Byalata staya",1968,83,NA,9.5,7,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,0,1,0,0,0 -"Bye Bye Africa",1999,86,NA,6.2,18,0,0,14.5,0,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Bye Bye Baby",1988,85,NA,2.3,46,24.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Bye Bye Birdie",1963,112,NA,6.5,940,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Bye Bye Blue Bird",1999,97,NA,6.1,178,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Bye Bye Blues",1989,117,NA,6.8,115,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Bye Bye Brasil",1979,110,NA,7.5,273,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Bye Bye Braverman",1968,109,NA,5.5,78,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Bye Bye, Love",1995,106,NA,5.8,1420,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Bye bye, Barbara",1968,102,NA,7.6,10,0,0,0,14.5,0,0,24.5,34.5,0,44.5,"",0,0,1,0,0,0,0 -"Bye, Bye Bluebeard",1949,7,NA,7.6,16,0,0,0,0,0,14.5,24.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Bye-Bye",1995,105,NA,7.8,79,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Bye-Bye Babushka",1997,80,NA,8.6,7,0,0,0,0,14.5,0,0,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Bye-Bye Souirty",1998,92,NA,6,10,0,0,14.5,14.5,14.5,44.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Bye-Child",2003,15,NA,7.6,8,14.5,0,0,0,14.5,0,0,24.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Byl jazz",1981,96,NA,6.4,5,0,0,0,0,0,44.5,44.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Byl jednou jeden polda II - Major Maisner opet zasahuje!",1997,80,NA,1.8,30,44.5,34.5,14.5,4.5,4.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Byt",1968,13,NA,7.5,86,0,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Bzz",2000,11,NA,6.7,34,4.5,14.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,1,0,0,0,0,1 -"C'era un castello con 40 cani",1990,98,NA,4.2,7,0,14.5,0,14.5,14.5,14.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"C'era un cinese in coma",2000,108,NA,5.1,73,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"C'era una volta il West",1968,158,5000000,8.7,17241,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG-13",0,0,0,1,0,0,0 -"C'era una volta la legge",1979,98,NA,4.2,6,0,34.5,14.5,0,0,34.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"C'era una volta...",1967,105,NA,5.8,111,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"C'eravamo tanto amati",1974,124,NA,7.7,538,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"C'est dur pour tout le monde",1975,94,NA,4.9,13,0,0,4.5,0,0,34.5,0,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"C'est l'aviron",1944,4,NA,6.1,9,0,0,0,0,34.5,0,34.5,24.5,0,14.5,"",0,1,0,0,0,0,1 -"C'est la vie",2001,113,NA,7.2,118,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"C'est le bouquet!",2002,99,NA,6.4,133,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"C'est le vent",1997,6,NA,9.6,7,14.5,0,0,0,0,0,0,0,44.5,44.5,"",0,0,0,1,0,0,1 -"C'est pas ma faute!",1999,90,NA,4.4,38,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"C'est pas moi, c'est l'autre",2004,90,NA,4.5,19,14.5,4.5,0,0,4.5,0,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"C'est pas moi, c'est lui",1980,105,NA,4.5,53,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"C'est quoi la vie?",1999,115,NA,7.2,161,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"C'mon, Let's Live a Little",1967,84,NA,5.5,24,14.5,4.5,4.5,14.5,24.5,4.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"C(r)ook",2004,108,NA,6,108,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"C-Man",1949,75,NA,6.6,9,0,0,14.5,0,0,24.5,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"C.B. Hustlers",1978,85,NA,3.7,10,24.5,24.5,34.5,0,14.5,0,24.5,0,0,0,"",0,0,1,0,0,0,0 -"C.C. and Company",1970,90,NA,3.7,118,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"C.H.O.M.P.S.",1979,89,NA,4,164,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"C.H.U.D.",1984,96,1250000,4.3,834,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"C.H.U.D. II - Bud the Chud",1989,84,NA,2.2,514,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"C.I.D.",1956,146,NA,6.4,15,0,0,0,0,4.5,24.5,14.5,34.5,14.5,14.5,"",1,0,0,0,0,0,0 -"C.K. dezerterzy",1987,155,NA,6.4,58,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"C.O.D.",1981,96,NA,3.5,17,14.5,14.5,24.5,0,4.5,14.5,0,14.5,4.5,0,"",0,0,1,0,0,0,0 -"C4",1996,4,NA,8.4,48,4.5,0,0,0,4.5,4.5,14.5,4.5,74.5,4.5,"",0,0,1,0,0,1,1 -"CB4",1993,89,NA,5.4,1323,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"CIA Code Name: Alexa",1993,93,NA,3.9,101,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"CIA II: Target Alexa",1994,90,NA,3.6,80,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"CQ",2001,91,7000000,6.4,1315,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"CQ2 (Seek You Too)",2004,100,NA,5.5,29,4.5,0,4.5,4.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ca-bau-kan",2002,120,NA,7,24,0,0,0,0,0,24.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Cab Calloway's Hi-De-Ho",1934,10,NA,6.8,17,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Cab Calloway's Jitterbug Party",1935,8,NA,7.3,9,0,0,0,0,14.5,14.5,44.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Cab Waiting",1931,17,NA,6.5,7,0,0,0,0,0,74.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Caballero Don Quijote, El",2002,122,NA,6.1,38,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Caballero Droopy",1952,6,NA,6.5,15,0,0,0,4.5,0,24.5,24.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Caballero a la medida",1954,100,NA,6.4,12,0,0,0,4.5,0,44.5,14.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Caballeros de la cama redonda, Los",1973,105,NA,6.5,24,14.5,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Caballos salvajes",1995,122,NA,7.8,255,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cabaret",1972,124,6000000,7.8,7176,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cabaret Mineiro",1980,75,NA,5.3,7,14.5,0,14.5,14.5,24.5,0,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Cabbage Boy",2000,3,NA,7.9,9,14.5,14.5,0,0,0,0,0,0,24.5,45.5,"",0,1,0,0,0,0,1 -"Cabeza de Vaca",1991,111,NA,7,204,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Cabeza de tigre",2001,93,NA,6.3,9,14.5,0,14.5,0,0,24.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Cabeza viviente, La",1963,88,NA,3.8,12,14.5,4.5,0,0,4.5,24.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Cabezas cortadas",1970,94,NA,3.8,15,24.5,4.5,4.5,0,14.5,14.5,4.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Cabin Boy",1994,80,NA,4.4,2468,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cabin Fever",2002,93,1500000,5.1,7776,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Cabin in the Cotton, The",1932,78,NA,6.4,200,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Cabin in the Sky",1943,98,662141,7.3,260,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Cabina, La",1973,14,NA,9.4,11,0,0,0,0,0,0,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Cabinet of Caligari, The",1962,106,NA,4.9,67,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cabinet of Dr. Ramirez, The",1991,111,NA,4,40,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Cabinet of Jan Svankmajer, The",1984,14,NA,7.6,95,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Cabiria",1914,162,210000,7.6,216,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cable Guy, The",1996,96,47000000,5.5,16266,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Caboblanco",1980,87,NA,4.6,102,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Caboose",1996,92,NA,4.9,31,4.5,4.5,4.5,24.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cabra Marcado Para Morrer",1985,119,NA,7.9,33,4.5,0,0,0,4.5,4.5,4.5,4.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Cabra-Cega",2004,107,NA,7.2,11,0,4.5,0,0,0,14.5,4.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Caccia alla vedova",1991,80,NA,8.6,5,0,0,0,0,0,24.5,24.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Caccia alla volpe",1966,103,NA,6.1,433,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Caccia allo scorpione d'oro",1991,100,NA,4.9,5,0,0,44.5,0,0,0,0,44.5,24.5,0,"",1,0,0,0,0,0,0 -"Caccia tragica",1947,80,NA,6.6,14,0,0,0,14.5,0,14.5,45.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Cacciatore di squali, Il",1979,92,NA,3.9,35,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Cacciatore di uomini, Il",1980,85,NA,3.1,64,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Cacciatori del cobra d'oro, I",1982,92,NA,3.5,44,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cache",1998,30,NA,3.8,7,0,0,14.5,0,24.5,0,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Cache Cash",1994,90,NA,6.8,15,4.5,0,4.5,0,4.5,4.5,0,44.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Cachetonneurs, Les",1998,91,NA,6.2,25,4.5,0,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Cachimba",2004,127,950000,6.6,22,0,4.5,0,4.5,4.5,0,4.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Cachito",1995,95,NA,5.6,30,4.5,0,14.5,4.5,4.5,34.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Cachito, El",1997,10,NA,1.4,8,24.5,14.5,0,0,0,0,14.5,0,14.5,34.5,"",0,0,1,0,0,0,1 -"Cachorro",2004,100,NA,7.4,210,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Cachorros",2002,8,NA,9.2,13,0,0,0,4.5,0,0,0,0,34.5,45.5,"",0,0,0,1,0,0,1 -"Cachorros, Los",1973,110,NA,7,11,0,0,0,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Cacique Bandeira",1975,105,NA,4.4,8,0,14.5,0,24.5,14.5,34.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Cactus",1986,93,NA,5.8,46,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cactus Flower",1969,103,NA,6.8,977,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Cactus Kid, The",1930,7,NA,6.3,16,0,0,0,4.5,4.5,34.5,34.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Cactus Kid, The",2000,92,NA,5.2,23,14.5,14.5,0,4.5,0,0,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Cactus Makes Perfect",1942,17,NA,7.5,59,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Cactus Swing",1995,6,NA,7.4,10,0,0,0,0,14.5,14.5,44.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Cactus in the Snow",1971,90,NA,5.6,20,0,0,4.5,14.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Cadaveri eccellenti",1976,120,NA,7.7,159,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Cadaverous",2000,21,NA,2.8,61,14.5,4.5,0,4.5,4.5,0,0,4.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Caddie",1976,100,NA,5.3,50,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Caddie Woodlawn",1989,104,NA,4.5,14,0,24.5,0,24.5,14.5,24.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Caddy, The",1953,95,NA,5.9,317,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Caddyshack",1980,98,6000000,7.1,13453,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Caddyshack II",1988,98,NA,3.5,3907,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cadeau, Le",1982,100,NA,6.2,88,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Cadena perpetua",1979,95,NA,7.5,14,0,4.5,0,0,0,4.5,24.5,14.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Cadence",1990,97,NA,6.1,1120,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cadet Classification",1943,15,NA,1,9,64.5,0,0,0,0,0,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Cadet-Rousselle",1954,105,NA,5.2,11,0,4.5,0,4.5,24.5,14.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Cadillac",1997,93,NA,8,5,0,0,0,0,44.5,0,0,0,0,64.5,"",0,0,0,1,0,0,0 -"Cadillac Girls",1993,96,NA,5.3,40,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cadillac Man",1990,97,NA,5.3,2509,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cadillac Ranch",1996,100,NA,5.3,89,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Caduta degli angeli ribelli, La",1981,103,NA,4.6,5,24.5,0,24.5,0,0,0,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Caduta degli dei, La",1969,150,NA,7.3,708,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Caesar and Cleopatra",1945,123,NA,6.3,236,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Caesar's Park",2000,67,NA,7,26,4.5,0,4.5,14.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Cafajestes, Os",1962,100,NA,8.4,38,4.5,0,0,4.5,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Cafe Europa",1990,88,NA,5.9,5,0,0,0,24.5,0,64.5,0,0,24.5,0,"",0,0,1,0,0,0,0 -"Cafe Metropole",1937,83,NA,6.3,23,0,0,4.5,4.5,0,34.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Cafe Oriental",1962,95,NA,4.3,9,0,0,14.5,24.5,34.5,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Cafe Society",1939,83,NA,6.7,6,0,0,0,0,0,34.5,34.5,0,34.5,0,"",0,0,1,0,0,1,0 -"Cafe Society",1995,104,3500000,5.7,137,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Cafe and Tobacco",2003,90,NA,8,7,0,14.5,0,0,0,14.5,0,0,24.5,44.5,"",0,0,1,1,0,0,0 -"Caffeine Headache",2003,24,2000,7.7,9,0,14.5,0,0,14.5,0,0,44.5,0,34.5,"",0,0,1,0,0,0,1 -"Cage II",1994,106,NA,3.1,50,44.5,4.5,4.5,4.5,14.5,4.5,0,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Cage aux folles 3 - 'Elles' se marient, La",1985,87,NA,4.4,120,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cage aux folles II, La",1980,91,NA,5.3,297,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cage aux folles, La",1978,96,NA,7.2,1525,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cage aux rossignols, La",1945,89,NA,6.3,19,0,0,0,14.5,14.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Cage of Evil",1960,70,NA,5.4,16,0,4.5,14.5,14.5,14.5,24.5,24.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Cage of Gold",1950,83,NA,4.9,12,0,0,0,34.5,44.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Cage, La",1975,100,NA,5.8,29,4.5,4.5,0,14.5,14.5,4.5,24.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Cage, La",2002,101,NA,6.2,32,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Caged",1950,96,NA,7.8,222,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Caged - Le prede umane",1992,87,NA,5.2,29,4.5,0,4.5,14.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Caged Fear",1992,100,NA,4.3,50,4.5,0,14.5,14.5,24.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Caged Fury",1983,89,NA,3.2,25,14.5,14.5,24.5,24.5,14.5,4.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Caged Fury",1989,86,NA,3.1,66,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Caged Hearts",1995,94,NA,3.7,47,14.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Caged Heat",1974,83,180000,4.9,295,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Caged Heat 3000",1995,85,NA,2.9,73,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Caged Heat II: Stripped of Freedom",1994,72,NA,2.6,72,24.5,14.5,14.5,14.5,4.5,0,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Caged Women II",1996,82,NA,3.8,11,4.5,0,4.5,0,14.5,0,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cagey Canary, The",1941,8,NA,6.8,27,0,0,4.5,0,4.5,14.5,45.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Cagliostro",1974,103,NA,7.3,7,0,14.5,0,0,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Cahill U.S. Marshal",1973,103,NA,5.9,576,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cahoots",2000,108,NA,4.9,27,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cai shu zhi huang sao qian jun",1991,47,NA,4.3,14,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,0,14.5,"",1,0,1,0,0,1,0 -"Caicedo (with Pole)",1894,1,NA,5.8,41,4.5,0,0,4.5,24.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Caifanes, Los",1967,95,NA,8.7,34,0,0,0,0,4.5,0,4.5,24.5,34.5,34.5,"",0,0,1,1,0,0,0 -"Cain and Mabel",1936,90,NA,5.4,67,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Cain's Cutthroats",1971,87,NA,4.3,15,0,14.5,4.5,14.5,34.5,14.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Caine Mutiny, The",1954,125,NA,7.9,4400,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Caino e Caino",1993,102,NA,4.5,10,0,0,14.5,45.5,14.5,0,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Caipiranha",1998,83,NA,5.1,54,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cairo",1942,101,NA,6,43,0,0,0,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Cairo",1963,91,NA,4.9,34,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Cairo Road",1950,83,NA,5.9,8,0,0,0,0,34.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Caixa, A",1994,93,NA,6.3,66,14.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Caja 507, La",2002,112,NA,7.1,293,4.5,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Caja negra",2002,78,NA,7.1,29,14.5,0,0,4.5,14.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cal",1984,102,NA,6.6,301,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Calabacitas tiernas",1949,101,NA,7.7,17,0,0,4.5,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Calabuch",1956,96,NA,7.3,75,0,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Calamari Union",1985,80,NA,7.8,293,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Calamitous Elopement, A",1908,12,NA,4.6,9,24.5,0,0,24.5,14.5,34.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Calamity Jane",1953,101,NA,6.9,998,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Calamity Jane and Sam Bass",1949,85,NA,4.7,18,0,0,14.5,24.5,4.5,44.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Calaveras, Los",1931,63,NA,7.3,6,0,0,0,14.5,0,14.5,34.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Calcium Kid, The",2004,89,NA,5.4,423,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Calcutta",1947,83,NA,6.4,37,0,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Calcutta",1969,105,NA,5.9,17,4.5,0,0,0,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Calde notti di Caligola, Le",1977,88,NA,3.7,8,34.5,14.5,0,14.5,0,0,14.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Calde notti di Don Giovanni, Le",1971,110,NA,3.7,6,0,14.5,14.5,14.5,34.5,0,0,0,14.5,0,"",0,0,1,0,0,0,0 -"Calde notti di Poppea, Le",1969,94,NA,4.2,11,0,4.5,4.5,34.5,4.5,24.5,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Calendar",1993,74,NA,7.4,395,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Calendar Girl",1947,60,NA,6.2,8,0,0,0,14.5,14.5,24.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Calendar Girl",1993,90,13000000,4.7,464,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Calendar Girls",2003,108,NA,7.1,3618,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Calendar, The",1948,79,NA,6.1,11,0,0,4.5,0,4.5,64.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Calgary Stampede",1948,18,NA,5.7,13,0,0,0,0,44.5,14.5,14.5,0,14.5,4.5,"",0,0,0,0,0,0,1 -"Caliche sangriento",1969,128,NA,6.5,16,4.5,0,4.5,0,4.5,14.5,34.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Calico Dragon, The",1935,8,NA,5.7,19,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Califfa, La",1970,112,NA,6.3,22,4.5,0,0,4.5,4.5,44.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"California",1946,97,NA,6.4,67,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"California",1963,86,NA,5.1,6,0,0,0,34.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"California",1977,98,NA,6.5,13,0,0,0,0,4.5,34.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"California",1996,5,NA,6.9,79,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,1 -"California Casanova",1991,90,350000,4.9,30,4.5,4.5,4.5,14.5,4.5,14.5,0,4.5,34.5,34.5,"",0,0,1,0,0,0,0 -"California Conquest",1952,78,NA,4.7,19,14.5,4.5,14.5,24.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"California Dreaming",1979,92,NA,4.8,118,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"California Heat",1995,87,NA,5.3,18,14.5,4.5,14.5,0,14.5,14.5,14.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"California Hot Wax",1992,89,NA,3.4,25,14.5,14.5,24.5,14.5,4.5,0,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"California Mail",1936,56,NA,5.3,9,0,0,0,34.5,24.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"California Passage",1950,90,NA,6.3,18,0,0,0,0,4.5,44.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"California Reich, The",1975,60,NA,7.1,12,0,0,0,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"California Split",1974,108,NA,6.6,423,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"California Straight Ahead!",1937,67,NA,4,23,24.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"California Suite",1978,103,NA,6,1052,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"California Sunshine",1997,20,NA,6.7,23,4.5,0,0,4.5,4.5,4.5,34.5,24.5,4.5,24.5,"",0,0,1,0,0,0,1 -"California Taboo",1989,102,NA,6.4,5,0,0,0,24.5,0,0,24.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Californy 'er Bust",1945,8,NA,7.3,34,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Caligola: La storia mai raccontata",1981,125,NA,4,89,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Caligula",1996,51,NA,1.5,15,44.5,14.5,4.5,0,4.5,14.5,0,0,0,14.5,"R",0,0,0,1,0,0,0 -"Caligula et Messaline",1982,111,NA,2.1,44,34.5,24.5,14.5,4.5,4.5,0,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Call Girl",1995,83,NA,2.9,38,14.5,14.5,4.5,14.5,4.5,0,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Call Her Savage",1932,89,489652,6.9,91,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Call Home, The",2001,31,NA,4.4,5,44.5,0,0,0,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Call It a Day",1937,90,NA,6.2,23,0,0,0,4.5,34.5,14.5,34.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Call Me",1988,93,NA,4.9,139,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Call Me Bwana",1963,102,NA,4.9,141,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Call Me Fishmael",1997,3,NA,4.5,9,0,14.5,24.5,24.5,0,14.5,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Call Me Madam",1953,114,NA,7,180,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Call Me Mister",1951,96,NA,5.6,46,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Call Northside 777",1948,111,NA,7.3,785,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Call Out the Marines",1942,68,NA,5.3,14,24.5,0,4.5,0,24.5,4.5,4.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Call of the Canyon",1942,71,NA,5.8,14,0,4.5,0,0,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Call of the Cuckoo",1927,17,NA,6.2,35,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Call of the Flesh",1930,100,NA,6.8,18,0,0,0,4.5,14.5,14.5,14.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Call of the Forest",1949,56,NA,5,5,0,24.5,0,44.5,0,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Call of the Prairie",1936,63,NA,6.9,21,0,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Call of the Rockies",1944,56,NA,6.4,9,0,0,0,0,14.5,44.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Call of the Savage",1935,212,NA,4.6,7,0,14.5,14.5,14.5,24.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Call of the Wild",1972,100,NA,5.6,181,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Call of the Wild",2002,8,NA,8.1,10,14.5,0,0,0,0,0,0,24.5,0,74.5,"",0,1,1,0,0,0,1 -"Call of the Wild, The",1908,16,NA,3.3,5,44.5,0,0,0,24.5,24.5,0,0,0,24.5,"",1,0,0,0,0,0,1 -"Call of the Wild, The",1935,81,NA,6.6,150,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Call of the Yukon",1938,70,NA,5.3,7,14.5,0,0,14.5,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Callan",1974,106,NA,6.2,66,0,0,4.5,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Callas Forever",2002,111,NA,7.1,331,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Callaway Went Thataway",1951,81,NA,6.8,74,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Calle 54",2000,105,NA,7.4,204,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Calle Mayor",1956,99,NA,7.7,91,0,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Caller, The",1987,97,NA,5.8,73,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Caller, The",2000,8,NA,4.6,16,0,4.5,0,14.5,0,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Calling All Curs",1939,18,NA,7.4,57,0,0,4.5,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Calling All Girls",1942,19,NA,6.1,6,0,0,0,0,14.5,0,45.5,0,0,34.5,"",0,0,0,0,0,0,1 -"Calling All Husbands",1940,63,NA,6.2,16,0,0,4.5,0,14.5,24.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Calling All Kids",1943,11,NA,6.7,5,0,0,0,24.5,0,24.5,0,44.5,0,24.5,"",0,0,1,0,0,0,1 -"Calling All Tars",1935,18,NA,5,6,0,0,14.5,14.5,0,0,34.5,0,0,34.5,"",0,0,1,0,0,0,1 -"Calling Bobcat",2000,91,230000,5,42,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,"R",0,0,0,0,0,0,0 -"Calling Bulldog Drummond",1951,80,NA,5.6,49,0,4.5,4.5,24.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Calling Dr. Death",1943,63,NA,5.2,38,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Calling Dr. Gillespie",1942,84,NA,5.7,30,0,0,0,24.5,14.5,44.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Calling Dr. Kildare",1939,86,NA,6.3,43,4.5,0,4.5,4.5,4.5,14.5,45.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Calling Dr. Porky",1940,7,NA,6.6,15,14.5,4.5,0,4.5,0,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Calling Hedy Lamarr",2004,71,NA,5.5,12,0,0,0,0,24.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Calling Homicide",1956,60,NA,6.3,10,0,0,14.5,14.5,0,45.5,0,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Calling Philo Vance",1940,62,NA,5.5,26,0,0,4.5,0,44.5,34.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Calling Wild Bill Elliott",1943,55,NA,6.8,16,0,0,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Calling the Ghosts",1996,60,NA,6.7,21,4.5,0,0,0,0,24.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Calling, The",2000,89,NA,4.3,405,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Calliope",1994,15,NA,6.8,6,0,0,0,0,0,45.5,14.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Callous Sentiment",2002,13,10000,7.7,11,14.5,0,0,0,0,0,4.5,0,34.5,34.5,"",0,0,0,0,0,0,1 -"Calm Yourself",1935,70,NA,5,12,0,0,14.5,4.5,14.5,4.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Calmos",1976,81,NA,5.5,44,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Calor... y celos",1996,90,NA,6.6,14,4.5,24.5,14.5,0,0,4.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Caltiki - il mostro immortale",1959,76,NA,4.9,97,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Caluga o Menta",1990,100,NA,4.9,26,4.5,4.5,4.5,0,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Calvaire",2004,94,NA,6.8,173,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Calypso Cat",1962,8,NA,3.1,32,14.5,24.5,4.5,24.5,4.5,4.5,4.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Calypso Heat Wave",1957,86,NA,5.3,7,14.5,0,0,0,44.5,14.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Calypso Is Like So",2003,7,NA,6.4,7,0,0,0,14.5,0,24.5,24.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Calypso Joe",1957,76,NA,4.5,6,0,0,0,34.5,45.5,0,0,0,14.5,0,"",0,0,0,1,0,1,0 -"Calzonazos, El",1974,92,NA,2,5,44.5,0,24.5,0,0,0,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Calzonzin Inspector",1973,90,NA,7.4,22,0,0,0,0,0,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Cama Ao Alcance de Todos, A",1969,80,NA,7.1,5,0,0,0,0,0,0,84.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Cama adentro",2004,83,800000,7.3,12,0,0,4.5,0,0,4.5,4.5,24.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Cama de Gato",2002,92,NA,7.8,50,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,1,0,0 -"Camada negra",1977,89,NA,3.9,9,0,0,24.5,24.5,0,14.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Camaradas, Os",1997,15,NA,4.7,14,14.5,0,0,0,34.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Camarate",2001,100,NA,6.6,44,0,0,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Camarero nocturno en Mar del Plata",1986,90,NA,5.6,14,14.5,14.5,14.5,4.5,4.5,0,0,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Camarote de lujo",1959,95,NA,6.4,6,0,0,0,0,0,45.5,0,0,34.5,14.5,"",0,0,1,0,0,0,0 -"Cambiale, La",1959,91,NA,6.9,15,4.5,0,0,0,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cambio de sexo",1977,108,NA,5.9,35,4.5,0,0,14.5,14.5,14.5,14.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Cambio della guardia, Il",1963,90,NA,4.6,10,0,0,14.5,0,24.5,0,34.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Cambio, El",1971,86,NA,4.3,13,4.5,4.5,4.5,4.5,4.5,34.5,0,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Came a Hot Friday",1985,101,NA,6.8,62,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Camelot",1967,179,17000000,6.1,1241,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Camels Are Coming, The",1934,79,NA,3.7,11,14.5,4.5,4.5,0,0,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Camera Noise",2002,29,NA,8.8,14,4.5,0,0,0,4.5,0,0,4.5,4.5,74.5,"",0,0,1,0,0,0,1 -"Camera Obscura",2000,99,NA,4.1,42,24.5,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Camera Sleuth",1951,10,NA,5.8,5,0,0,24.5,0,24.5,0,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Camera d'albergo",1981,105,NA,6.5,6,0,0,0,0,0,45.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Cameraman, The",1928,75,NA,8,796,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Cameramen at War",1943,15,NA,5.6,5,24.5,0,0,0,44.5,0,24.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Cameras Take Five",2003,3,NA,6.7,8,0,0,0,0,34.5,14.5,0,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Camere da letto",1997,100,NA,1.7,16,34.5,14.5,14.5,4.5,4.5,0,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Camerieri",1995,101,NA,5.9,37,4.5,0,4.5,0,14.5,14.5,24.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Cameron's Closet",1989,86,7000000,3.9,113,4.5,4.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Camila",1984,105,NA,7.1,190,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Camilla",1994,95,NA,6.2,217,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Camille",1921,72,NA,6.6,76,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Camille",1936,109,1486000,7.4,674,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Camille 2000",1969,115,NA,4.7,66,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Camille Claudel",1988,158,NA,7.1,1066,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Caminantes",2001,60,NA,7.1,9,0,0,0,0,14.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Caminho das Nuvens, O",2003,87,NA,6,131,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Camino del sur, El",1988,106,NA,7.9,16,0,0,0,0,4.5,4.5,4.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Camino largo a Tijuana",1991,92,NA,6.3,17,0,24.5,4.5,0,14.5,4.5,4.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Camino solitario",1984,90,NA,7,5,24.5,0,0,0,0,0,0,44.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Camino, El",2000,107,NA,4.7,16,4.5,0,14.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Camion, Le",1977,80,NA,6.3,19,14.5,0,0,0,14.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Camisa de la serpiente, La",1996,92,NA,6.7,7,0,0,0,14.5,0,24.5,24.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Camisards, Les",1972,100,NA,5.4,12,14.5,0,4.5,0,4.5,14.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Cammelli, I",1988,100,NA,6.3,15,4.5,0,14.5,0,14.5,24.5,24.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Cammina, cammina",1982,171,NA,7.1,14,4.5,0,0,0,0,14.5,4.5,14.5,45.5,4.5,"",0,0,0,1,0,0,0 -"Cammino della speranza, Il",1950,97,NA,6.9,35,4.5,4.5,0,0,0,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Camomille",1988,81,NA,7.7,8,14.5,0,0,0,0,24.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Camorrista, Il",1985,168,NA,6.1,42,4.5,4.5,4.5,0,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Camp",2003,114,NA,6.6,1332,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Camp Dog",1950,7,NA,6.4,9,0,0,24.5,0,0,24.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Camp Fear",1991,86,NA,7.1,18,14.5,4.5,0,4.5,4.5,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Camp Nowhere",1994,96,NA,4.9,1139,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Camp Pacific",2002,29,35000,9.1,21,0,0,0,0,4.5,0,14.5,4.5,14.5,64.5,"",0,0,0,1,0,0,1 -"Camp Slaughter",2004,95,350000,2,180,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Camp Stories",1997,100,NA,5.8,32,24.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Camp X-Ray: Ghosts of Guantanamo",2004,125,NA,5.5,8,45.5,0,0,0,0,0,0,0,0,45.5,"",1,0,0,0,0,0,0 -"Camp de Thiaroye",1987,147,NA,7.7,35,0,0,0,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Camp on Blood Island, The",1958,81,NA,5,22,0,4.5,0,14.5,34.5,14.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Camp: The Movie",2002,70,NA,5.8,6,0,14.5,0,14.5,0,0,34.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Campa carogna... la taglia cresce",1973,83,NA,4.9,6,0,0,0,34.5,14.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Campana del infierno, La",1973,93,NA,6.7,50,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Campanadas a medianoche",1965,115,800000,8.3,460,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Campbell's Kingdom",1957,102,NA,5.9,79,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Campfire Tales",1991,88,NA,4.5,27,34.5,0,4.5,14.5,14.5,14.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Campfire Tales",1997,88,NA,5.6,561,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Camping",1978,91,NA,5.4,22,0,4.5,0,0,4.5,14.5,44.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Camping",1990,100,NA,3.6,28,14.5,24.5,4.5,14.5,24.5,14.5,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Camping Cosmos",1996,88,NA,4.9,49,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Camping Out",1934,7,NA,6.6,25,0,0,4.5,4.5,4.5,24.5,44.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Camping del terrore",1987,83,NA,4.4,96,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Camping sauvage",2004,100,NA,6.2,101,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Campioana",1990,92,NA,5.8,26,4.5,0,4.5,0,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Campo Mamula",1959,98,NA,6.8,28,0,0,0,0,0,24.5,74.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Campo de sangre",2001,93,NA,6.4,6,0,0,0,0,14.5,45.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Campo de' fiori",1943,95,NA,8,14,0,0,0,0,4.5,0,4.5,34.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Campus Carmen, The",1928,20,NA,6.6,5,0,0,0,0,0,44.5,0,0,44.5,24.5,"",0,0,1,0,0,0,1 -"Campus Cinderella",1938,19,NA,4.7,8,0,0,14.5,24.5,0,24.5,34.5,0,0,0,"",0,0,1,0,0,0,1 -"Campus Man",1987,94,NA,4.3,134,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Campus Stalker",1990,3,NA,2.9,8,24.5,0,0,14.5,0,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Campus, Der",1998,126,NA,5.3,167,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Can Hieronymus Merkin Ever Forget Mercy Humppe and Find True Happiness?",1969,107,NA,3.2,119,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Can I Be Your Bratwurst, Please?",1999,30,NA,6.3,57,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Can I Do It 'Till I Need Glasses?",1977,73,NA,3.2,67,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Can I Get a Witness?",1996,17,NA,7,5,0,0,0,24.5,0,0,44.5,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Can It Be Love",1992,90,NA,4,60,4.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Can She Bake a Cherry Pie?",1983,90,NA,4.9,57,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Can You Keep It Up for a Week?",1974,92,NA,3.8,45,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Can que",1978,107,NA,7.3,128,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Can't Be Heaven",2000,94,2000000,5.7,104,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"PG",0,0,1,1,0,1,0 -"Can't Buy Me Love",1987,94,NA,6.2,3145,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Can't Hardly Wait",1998,101,10000000,6.2,8191,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Can't Help Singing",1944,90,NA,6.3,62,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Can't Stop Dancing",1999,90,NA,3.2,33,24.5,0,4.5,4.5,14.5,4.5,0,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Can't Stop the Music",1980,118,20000000,3.4,512,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Can't You Hear the Wind Howl? The Life & Music of Robert Johnson",1997,77,NA,6.2,23,0,0,0,0,14.5,14.5,34.5,24.5,0,4.5,"",0,0,0,0,1,0,0 -"Can-Can",1960,131,6000000,6,311,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Canada Vignettes: Faces",1978,1,NA,6.2,5,0,0,0,0,0,84.5,0,0,0,24.5,"",0,1,0,0,0,0,1 -"Canada Vignettes: Fort Prince of Wales",1978,1,NA,8.4,6,0,0,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,1,1,0,1,0,1 -"Canada Vignettes: Hudden and Dudden and Donald O'Neary",1978,5,NA,1.9,5,44.5,44.5,0,24.5,0,0,0,0,0,0,"",0,1,0,0,0,0,1 -"Canada Vignettes: Lady Frances Simpson",1978,1,NA,7.7,6,0,0,14.5,0,0,0,34.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Canada Vignettes: Log Driver's Waltz",1979,3,NA,7.2,76,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Canada Vignettes: Spence's Republic",1978,1,NA,7.8,8,0,0,14.5,0,0,0,14.5,45.5,0,24.5,"",0,1,1,0,0,0,1 -"Canadian Bacon",1995,91,11000000,5.5,3514,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Canadian Mounties vs. Atomic Invaders",1953,167,NA,5.3,13,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Canadian Pacific",1949,95,NA,5.5,40,0,4.5,4.5,4.5,34.5,24.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Canadians, The",1961,85,NA,4.9,18,0,0,14.5,24.5,34.5,14.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Canaima",1945,118,NA,8.7,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Cananea",1978,123,NA,5.9,7,14.5,0,0,0,0,84.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Canaris",1954,92,NA,5.8,25,0,0,0,4.5,24.5,34.5,14.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Canary Murder Case, The",1929,82,NA,6.5,39,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Canary Row",1950,7,NA,6.8,87,0,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Canasta de cuentos mexicanos",1956,98,NA,7.1,17,0,0,14.5,0,0,14.5,14.5,24.5,0,24.5,"",0,0,0,1,0,1,0 -"Cancel My Reservation",1972,99,NA,3.6,113,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Canceled Lives: Letters from the Inside",1993,50,NA,9.4,35,4.5,4.5,0,0,0,0,0,4.5,4.5,84.5,"",0,0,0,0,0,0,0 -"Candi Girl",1977,63,NA,6.2,6,0,0,14.5,0,0,14.5,45.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Candid Camera Story (Very Candid) of the Metro-Goldwyn-Mayer Pictures 1937 Convention, The",1937,17,NA,9,5,0,0,0,0,0,0,24.5,0,44.5,44.5,"",0,0,0,0,1,0,1 -"Candid Cameramaniacs",1937,9,NA,4.7,7,0,0,14.5,14.5,14.5,14.5,14.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Candid Candidate, The",1937,6,NA,6.6,9,0,0,0,0,14.5,45.5,0,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Candidate, The",1964,84,NA,5.1,8,0,0,0,0,45.5,14.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Candidate, The",1972,109,NA,7.1,1505,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Candidature",2001,45,NA,6.2,15,4.5,0,14.5,0,4.5,24.5,34.5,0,14.5,4.5,"",0,0,1,1,0,0,0 -"Candide madame Duff, La",2000,90,NA,4,5,24.5,0,24.5,0,44.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Candle Smoke",1998,24,NA,4.2,26,44.5,14.5,4.5,0,4.5,4.5,0,0,4.5,14.5,"",0,0,0,1,0,0,1 -"Candlelight in Algeria",1944,85,NA,7,6,14.5,0,0,0,14.5,0,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Candles at Nine",1944,75,NA,5.9,11,0,4.5,4.5,0,4.5,44.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Candleshoe",1977,101,NA,6.3,508,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Candy",1968,115,NA,4.8,537,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Candy Mountain",1988,91,NA,5.6,85,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Candy Regentag",1989,87,NA,4.8,10,0,14.5,0,34.5,0,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Candy Snatchers, The",1973,94,NA,6.7,45,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Candy Stripe Nurses",1974,80,NA,3.5,79,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Candy Stripers",1978,84,NA,5.7,51,14.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Candy Tangerine Man",1975,95,NA,5,25,4.5,4.5,4.5,4.5,14.5,14.5,4.5,0,14.5,24.5,"",1,0,0,0,0,0,0 -"Candy Town",1932,6,NA,5.4,9,0,0,0,24.5,44.5,24.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Candyman",1992,99,8000000,6.3,4735,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Candyman: Farewell to the Flesh",1995,93,NA,4.5,1176,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Cane Toads",1988,47,NA,8.3,208,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Cane arrabbiato",1985,91,NA,5.7,15,4.5,0,0,14.5,24.5,24.5,4.5,4.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Cane e gatto",1982,101,NA,4.9,90,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cane-Toad: What Happened to Baz?",2002,6,NA,6.9,7,0,0,0,14.5,14.5,0,24.5,24.5,14.5,0,"",0,1,0,0,0,0,1 -"Cangaceiro, O",1953,105,NA,7.8,62,0,0,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,"",1,0,0,1,0,0,0 -"Cangaceiro, O",1997,120,NA,7.2,27,4.5,0,0,4.5,14.5,4.5,4.5,24.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Canh dong hoang",1981,95,NA,4.6,7,0,0,0,14.5,24.5,0,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Canhead",1996,8,NA,6.9,37,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Cani arrabbiati",1974,96,NA,7.4,210,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Canibais, Os",1988,90,NA,6.2,61,14.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Canicule",1984,101,NA,5.3,94,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Canine Caddy",1941,7,NA,6.4,34,0,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Canine Casanova",1945,7,NA,5.6,23,0,0,0,14.5,14.5,34.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Canine Patrol",1945,7,NA,5.9,17,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Cannabis",1970,85,NA,5.6,14,0,0,4.5,4.5,24.5,4.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Canned Feud",1951,7,NA,6.9,75,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Cannery Rodent",1967,7,NA,6,20,0,0,14.5,14.5,14.5,14.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Cannery Row",1982,120,NA,6.4,864,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Cannes Man",1996,88,NA,5.4,130,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Cannes: The Agony and the Ecstasy",1998,60,NA,8.8,9,14.5,0,0,0,0,0,0,0,24.5,64.5,"",0,0,0,0,1,0,0 -"Cannibal Attack",1954,69,NA,3.7,24,14.5,0,4.5,24.5,4.5,0,4.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Cannibal Campout",1988,89,NA,1.7,61,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Cannibal Girls",1973,84,NA,3.1,68,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Cannibal Holocaust",1980,95,NA,5.9,2468,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Cannibal Tours",1988,70,NA,7.8,24,4.5,0,0,0,0,4.5,14.5,34.5,34.5,0,"",0,0,0,0,1,0,0 -"Cannibal Women in the Avocado Jungle of Death",1989,90,NA,4.1,538,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Cannibal ferox",1981,93,NA,4.5,882,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cannibali, I",1970,88,NA,4.6,15,4.5,0,14.5,14.5,4.5,0,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Cannon Movie Tales: Beauty and the Beast",1987,94,NA,6.1,101,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Cannon for Cordoba",1970,104,NA,5.4,69,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cannonball",1976,90,NA,4.9,619,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Cannonball Run II",1984,96,NA,3.9,2619,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Cannonball Run, The",1981,95,NA,5.4,5110,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Canoa",1975,115,NA,6.7,56,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Canoeing on the Charles River, Boston, Mass.",1904,2,NA,4.4,8,0,14.5,24.5,14.5,34.5,0,14.5,0,0,0,"",0,0,0,0,1,0,1 -"Canon",1964,10,NA,6.5,15,0,0,0,4.5,14.5,14.5,24.5,0,24.5,24.5,"",0,1,0,0,0,0,1 -"Canon City",1948,82,NA,7,44,0,0,0,4.5,0,34.5,24.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Canone inverso - making love",2000,107,NA,6.8,176,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cantando a la vida",1969,95,NA,6,5,24.5,0,24.5,0,0,0,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Cantando dietro i paraventi",2003,98,NA,6,106,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Canterbury Tale, A",1944,95,NA,7.9,344,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Canterbury Tales, The",1998,28,NA,6.6,16,4.5,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Canterville Ghost, The",1944,96,NA,6.7,335,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cantique de la racaille",1998,104,NA,6.5,16,0,0,14.5,0,0,34.5,14.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Canvas",1992,90,NA,3.7,28,24.5,0,14.5,24.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Canvas Back Duck",1953,7,NA,7.2,23,0,0,0,0,4.5,4.5,34.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Canyon Crossroads",1955,83,NA,5.9,11,0,0,0,0,24.5,4.5,24.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Canyon Passage",1946,92,NA,6.7,112,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Canyon River",1956,79,NA,5.5,14,0,0,0,4.5,44.5,34.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Canzoni nel mondo",1963,86,NA,7.4,5,0,0,0,0,44.5,0,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Cao inspektore",1985,90,NA,5,21,14.5,4.5,24.5,4.5,0,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cap Tourmente",1993,115,NA,6.4,33,0,0,0,4.5,14.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Cape Breton Island",1948,9,NA,5.5,6,0,0,0,0,45.5,14.5,14.5,0,14.5,0,"",0,0,0,0,1,0,1 -"Cape Canaveral Monsters, The",1960,69,NA,1.9,50,34.5,24.5,14.5,4.5,4.5,4.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Cape Fear",1962,105,NA,7.6,3648,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cape Fear",1991,128,35000000,7.1,15585,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Cape Town Affair, The",1967,100,NA,4.6,41,4.5,14.5,4.5,24.5,24.5,14.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Cape of Good Hope",2004,107,3000000,9.7,13,0,0,0,0,0,0,0,4.5,14.5,74.5,"",0,0,1,1,0,0,0 -"Caper of the Golden Bulls, The",1967,102,NA,4,17,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,0,"",1,0,1,0,0,0,0 -"Caperucita roja, La",1960,85,NA,5.2,17,14.5,4.5,4.5,4.5,14.5,14.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Caperucita y Pulgarcito contra los monstruos",1962,82,NA,4.9,10,24.5,0,0,0,0,34.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Caperucita y sus tres amigos",1961,85,NA,5.4,5,24.5,0,0,24.5,0,24.5,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Capitaine Conan",1996,129,NA,7.5,344,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Capitaine Fracasse, Le",1929,92,NA,6.7,23,0,0,4.5,0,4.5,14.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Capitaine Fracasse, Le",1943,108,NA,7.2,11,0,0,0,0,4.5,24.5,4.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Capitaine Fracasse, Le",1961,108,NA,6.4,39,0,4.5,4.5,4.5,4.5,14.5,34.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Capital City: Washington, D.C., The",1940,9,NA,6.1,14,0,0,0,0,14.5,45.5,24.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Capital Punishment",1991,89,NA,2.8,24,34.5,4.5,4.5,14.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Capital Punishment",2003,88,NA,4.8,12,4.5,14.5,0,4.5,4.5,0,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Capitalismo Selvagem",1993,86,NA,7.8,30,4.5,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Capitan Fuoco",1958,85,NA,4.4,9,14.5,0,24.5,24.5,0,0,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Capitan, Le",1960,111,NA,5.8,51,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Capitano, Il",1991,110,NA,5.8,137,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Capitu",1968,105,NA,4.6,9,14.5,0,34.5,14.5,14.5,0,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Capkovy povidky",1947,97,NA,6.4,6,0,0,0,34.5,0,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Capo Nord",2003,102,NA,6.9,7,14.5,0,0,14.5,0,14.5,14.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Capone",1975,101,NA,4.8,174,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cappotto di legno, Il",1981,88,NA,3,7,44.5,14.5,14.5,14.5,14.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Cappotto, Il",1952,95,NA,9,15,0,0,0,0,0,4.5,14.5,4.5,24.5,45.5,"",0,0,1,1,0,0,0 -"Cappuccino",1998,98,NA,6.9,13,4.5,0,0,0,4.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cappuccino King, The",2003,8,NA,8.8,6,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Cappy Leit",2001,19,NA,6.6,7,14.5,0,0,0,14.5,24.5,24.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Capri",2002,15,NA,3.9,5,24.5,0,24.5,0,24.5,0,0,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Capriccio all'italiana",1968,95,NA,6.2,22,4.5,4.5,4.5,0,4.5,4.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Capricciosa",2003,105,NA,5.9,66,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Caprice",1967,98,NA,5,154,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Caprices d'un fleuve, Les",1996,111,NA,6.4,66,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Caprices de Marie, Les",1970,92,NA,6.6,8,0,0,0,0,24.5,24.5,0,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Capricorn One",1978,123,5000000,6.4,2591,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Captain America",1944,244,NA,5.5,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Captain America",1991,97,NA,2.8,1395,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Captain Apache",1971,94,NA,3.7,76,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Captain Applejack",1931,63,NA,5,14,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,0,0,"",0,0,1,1,0,1,0 -"Captain Blood",1935,99,1200000,7.7,1683,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",1,0,0,0,0,1,0 -"Captain Boycott",1947,92,NA,6.8,62,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Captain Carey, U.S.A.",1950,82,NA,6.2,38,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Captain Caution",1940,84,NA,5.8,17,0,0,0,4.5,34.5,24.5,34.5,0,0,0,"",1,0,0,0,0,0,0 -"Captain China",1950,97,NA,4.8,15,0,14.5,24.5,4.5,14.5,4.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Captain Corelli's Mandolin",2001,131,57000000,5.9,5281,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Captain EO",1986,17,17000000,5.7,551,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Captain Eddie",1945,107,NA,6.1,17,0,4.5,0,0,14.5,34.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Captain Fury",1939,91,NA,5.7,11,14.5,0,0,0,14.5,44.5,4.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Captain Hareblower",1954,7,NA,7.4,34,0,0,4.5,0,0,4.5,44.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Captain Hates the Sea, The",1934,93,NA,5.9,15,0,0,0,4.5,14.5,24.5,24.5,4.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Captain Horatio Hornblower R.N.",1951,117,NA,7.4,827,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Captain Hurricane",1935,72,NA,5.5,14,4.5,0,0,14.5,24.5,34.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Captain Is a Lady, The",1940,65,NA,6,12,0,0,0,4.5,14.5,24.5,44.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Captain Jack",1999,90,NA,5.5,61,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Captain January",1924,64,NA,7.2,12,4.5,0,0,0,0,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Captain January",1936,75,NA,6.7,133,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Captain John Smith and Pocahontas",1953,75,NA,4.4,11,4.5,0,4.5,34.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Captain Kidd",1945,90,NA,6.4,133,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Captain Kidd and the Slave Girl",1954,82,NA,5.5,5,0,0,24.5,0,24.5,24.5,0,44.5,0,0,"",1,0,0,0,0,0,0 -"Captain Kronos - Vampire Hunter",1974,91,400000,6.3,442,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Captain Lightfoot",1955,92,NA,5.9,65,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Captain Lust and the Pirate Women",1977,82,NA,5.7,7,0,0,0,14.5,0,44.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Captain Milkshake",1970,89,NA,2.4,17,14.5,4.5,0,4.5,14.5,4.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Captain Nemo and the Underwater City",1969,105,NA,4.9,157,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Captain Newman, M.D.",1963,126,NA,6.8,283,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Captain Nuke and the Bomber Boys",1995,90,NA,4.5,80,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"Captain Pirate",1952,85,NA,5.8,9,0,0,0,14.5,24.5,44.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Captain Ron",1992,96,NA,4.8,2656,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Captain Salvation",1927,87,NA,7.4,18,0,0,0,0,4.5,14.5,44.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Captain Scarface",1953,72,NA,5.5,12,4.5,4.5,0,24.5,24.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Captain Scarlett",1953,75,NA,4.4,35,4.5,4.5,14.5,14.5,24.5,14.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Captain Sindbad",1963,85,NA,4.2,115,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Captain Thunder",1930,65,NA,4,16,0,24.5,14.5,24.5,14.5,4.5,14.5,0,0,0,"",0,0,1,1,0,0,0 -"Captain Thunderpants",1999,2,NA,5.5,13,14.5,0,4.5,4.5,0,34.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Captain Tugboat Annie",1945,70,NA,6.1,8,0,0,0,14.5,24.5,24.5,24.5,14.5,0,0,"",0,0,1,1,0,0,0 -"Captain Valedor versus the Spider Queen",2004,4,NA,8.5,10,0,14.5,0,0,0,14.5,14.5,0,0,74.5,"",1,0,1,0,0,0,1 -"Captain from Castile",1947,140,4500000,6.7,169,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Captain's Christmas, The",1938,7,NA,7.2,15,0,0,0,0,0,34.5,34.5,4.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Captain's Paradise, The",1953,94,NA,7,282,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Captain's Table, The",1959,90,NA,6.1,41,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Captains Courageous",1937,115,1645000,7.7,1123,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Captains of the Clouds",1942,113,NA,6.2,173,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Captiva Island",1995,85,NA,4.5,35,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"PG",0,0,1,1,0,1,0 -"Captive",1986,98,NA,4.4,43,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Captive Audience",1999,70,NA,4.1,10,0,14.5,14.5,0,0,24.5,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Captive City, The",1952,91,NA,6.9,46,0,0,0,4.5,14.5,14.5,34.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Captive Girl",1950,73,NA,4.5,36,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Captive Heart, The",1946,86,NA,7.6,101,0,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Captive Hearts",1987,97,NA,6.2,49,0,4.5,0,4.5,4.5,4.5,44.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Captive Wild Woman",1943,61,NA,6,53,0,0,4.5,4.5,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Captive Women",1952,64,NA,4.6,7,14.5,0,0,24.5,0,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Captive, La",2000,110,NA,5.7,159,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Captive: The Longest Drive 2, The",1976,80,NA,5,10,14.5,0,14.5,0,34.5,0,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Captives",1994,100,NA,6.1,541,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Capture of Bigfoot, The",1979,92,NA,2.3,38,34.5,14.5,14.5,14.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Capture of the 'Yegg' Bank Burglars",1904,11,NA,3.8,5,24.5,0,0,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,1 -"Capture, The",1950,91,NA,6.3,30,0,0,0,4.5,4.5,34.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Captured",2000,95,NA,2.7,201,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Captured Alive",1995,83,NA,1.5,12,45.5,4.5,0,4.5,4.5,0,4.5,0,0,14.5,"R",0,0,0,0,0,0,0 -"Captured Beauty",1995,80,NA,6,34,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Captured in Chinatown",1935,52,NA,5.7,5,0,0,0,24.5,0,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Captured!",1933,69,245000,6,36,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Capturing the Friedmans",2003,107,NA,8.2,3170,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,1,0,0 -"Car 54, Where Are You?",1994,89,NA,2.3,588,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Car 99",1935,67,NA,7.6,10,0,0,0,0,0,24.5,34.5,34.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Car Bonus",2001,59,NA,7.5,11,0,0,0,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Car Stopped..., A",1999,15,NA,4,12,0,0,4.5,14.5,4.5,4.5,4.5,0,4.5,44.5,"",0,0,1,0,0,0,1 -"Car That Became a Star, The",1965,10,NA,4.1,8,0,14.5,24.5,0,24.5,24.5,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Car Thief and the Hit Man, The",2001,2,NA,4,21,14.5,0,4.5,4.5,24.5,4.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,1 -"Car Trouble",1985,90,NA,4.5,48,14.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Car Trouble",2003,8,NA,9.7,6,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,1,0,0,0,1 -"Car Wash",1976,97,NA,5.5,1071,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Car of Dreams",1935,72,NA,5,17,4.5,4.5,4.5,24.5,14.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Car of Tomorrow",1951,6,NA,7,42,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Car, The",1977,96,NA,4.9,897,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Car-Napping - Bestellt, geklaut, geliefert",1980,89,NA,6.2,31,4.5,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Car-Tune Portrait, A",1937,7,NA,5.7,13,0,0,34.5,0,0,24.5,34.5,4.5,4.5,0,"",0,1,0,0,0,0,1 -"Cara a Cara",1967,80,NA,3,6,34.5,0,14.5,0,0,14.5,0,0,34.5,0,"",0,0,0,1,0,0,0 -"Cara del terror, La",1962,83,NA,2.2,7,24.5,0,0,0,44.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Cara que Mereces, A",2004,108,NA,5.7,12,4.5,0,0,4.5,4.5,34.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Carabbinieri, I",1981,89,NA,4.4,12,0,0,14.5,0,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Carabiniere a cavallo, Il",1961,95,NA,5.3,10,0,0,0,24.5,24.5,0,34.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Carabinieri si nasce",1985,91,NA,1.1,8,74.5,14.5,0,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Carabiniers, Les",1963,80,140000,6.9,330,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Caracas Adventure, The",1993,90,NA,6.8,5,0,0,0,0,0,24.5,64.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Caracol, col, col",1995,12,NA,7.7,7,0,24.5,0,0,0,14.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Carambola",1974,94,NA,2.7,10,24.5,0,14.5,14.5,14.5,0,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Carambolages",1963,88,NA,5.9,30,0,0,14.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Caramelle",1995,29,NA,5.5,13,0,0,0,4.5,24.5,34.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Caramelle da uno sconosciuto",1987,91,NA,4.6,11,14.5,0,0,0,45.5,14.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Carandiru",2003,147,6000000,7.7,1608,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Carapaces",2000,7,NA,4.8,5,0,0,0,44.5,0,24.5,0,44.5,0,0,"",0,0,0,0,0,0,1 -"Carapate, La",1978,100,NA,5.5,67,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Caravaggio",1986,93,NA,6.9,359,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Caravan",1946,80,NA,5,18,0,0,14.5,14.5,14.5,44.5,4.5,0,0,14.5,"",0,0,0,1,0,1,0 -"Caravan",2002,9,NA,5.5,11,0,0,0,0,34.5,4.5,0,14.5,0,34.5,"",0,0,1,0,0,0,1 -"Caravan Trail, The",1946,53,NA,7.2,5,0,0,0,0,24.5,0,24.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Caravans",1978,127,14000000,5.4,59,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Carbine Williams",1952,92,NA,6.9,292,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Carbon Copy",1981,92,NA,4.7,325,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carcan",2003,3,NA,5.5,17,0,14.5,0,14.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Carcerato",1981,98,NA,6.9,6,34.5,0,0,0,0,0,34.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Card, The",1952,85,NA,7.4,134,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cardboard Cavalier",1949,96,NA,5.9,12,0,0,0,0,4.5,34.5,4.5,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Cardiac Arrest",1980,85,NA,3.7,26,4.5,4.5,14.5,34.5,24.5,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Cardinal Richelieu",1935,83,NA,6.9,18,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cardinal's Conspiracy, The",1909,11,NA,4.6,5,44.5,24.5,0,0,24.5,0,0,24.5,0,0,"",0,0,0,1,0,0,1 -"Cardinal, The",1963,175,NA,6.3,293,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cards, Cads, Guns, Gore and Death",1969,2,NA,3.7,13,34.5,4.5,4.5,0,24.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Care Bears Adventure in Wonderland, The",1987,80,NA,5.4,120,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Care Bears Movie II: A New Generation",1986,76,NA,4.3,284,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Care Bears Movie, The",1985,77,NA,4.9,584,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Career",1959,105,NA,6.8,93,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Career Girls",1997,87,NA,7,1156,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Career Opportunities",1991,83,NA,5.3,1257,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Career Suicide",2004,12,NA,8.8,10,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Carefree",1938,83,1253000,7.1,306,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Careful",1992,100,NA,7.5,343,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Careful What You Wish For",2004,7,NA,5.8,79,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Careful, He May Be Watching",1987,76,NA,5.5,17,0,4.5,0,0,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Careful, He Might Hear You",1983,110,NA,6.9,130,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Careless Lady",1932,68,NA,6.7,6,0,0,0,14.5,0,34.5,14.5,34.5,0,0,"",0,0,0,0,0,1,0 -"Caretaker's Daughter, The",1925,20,NA,7.9,8,0,0,0,0,0,0,45.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Caretaker, The",1963,105,NA,7.1,71,0,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Caretakers, The",1963,97,NA,5,66,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Carey Treatment, The",1972,101,NA,6.2,224,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cargaison blanche",1937,100,NA,4.4,13,0,14.5,4.5,4.5,14.5,0,24.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Cargo",2004,84,NA,6.2,5,0,24.5,0,0,24.5,24.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Cargo to Capetown",1950,80,NA,5.5,10,0,0,0,14.5,44.5,34.5,14.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Carhops, The",1975,88,NA,1.6,11,34.5,24.5,0,14.5,4.5,0,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Cari genitori",1973,94,NA,5.4,7,24.5,0,14.5,0,0,14.5,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Caribbean",1952,97,NA,5.3,19,0,0,4.5,14.5,24.5,44.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Caribbean Mystery, The",1945,65,NA,5.5,7,0,0,0,0,24.5,74.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Caribe",1987,90,NA,4.1,29,4.5,24.5,14.5,14.5,14.5,14.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Caribe",2004,90,NA,6.8,13,0,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cariboo Trail, The",1950,81,NA,5.8,38,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Caricatore, Il",1996,95,NA,7.1,18,4.5,0,0,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Cariocas, As",1966,110,NA,8.4,13,0,0,0,0,0,4.5,14.5,34.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Carisma",2003,10,NA,8.1,7,0,0,0,0,0,0,24.5,45.5,14.5,0,"",0,0,0,0,0,0,1 -"Carl Gustav, gjengen og parkeringsbandittene",1982,79,NA,3.3,13,34.5,14.5,4.5,4.5,4.5,0,0,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Carl Th. Dreyer: Min metier",1995,96,NA,7,60,4.5,0,0,4.5,4.5,34.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Carla's Song",1996,127,NA,6.6,615,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Carlito's Way",1993,145,NA,7.6,13080,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Carlo",2004,15,NA,7,15,0,0,0,0,4.5,4.5,14.5,44.5,24.5,4.5,"",0,0,0,1,0,0,1 -"Carlo & Ester",1994,103,NA,6.6,19,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Carlo Giuliani, ragazzo",2002,60,NA,7.6,43,14.5,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Carlo's Wake",1999,90,NA,4.2,18,4.5,4.5,0,14.5,14.5,4.5,14.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Carlos Castaneda: Enigma of a Sorcerer",2004,91,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Carlos contra el mundo",2002,91,1000000,5.4,15,0,4.5,0,0,4.5,24.5,4.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Carlos el terrorista",1979,85,NA,7,9,34.5,0,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Carlota Joaquina, Princesa do Brasil",1995,100,NA,7.9,218,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Carlton-Browne of the F.O.",1959,88,NA,5.9,93,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carman: The Champion",2001,82,NA,4.6,412,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"PG-13",1,0,0,1,0,0,0 -"Carmen",1918,80,NA,7,23,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Carmen",1926,165,NA,6.7,12,4.5,0,0,4.5,14.5,0,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Carmen",1933,9,NA,7.8,7,0,0,0,0,0,14.5,0,14.5,44.5,24.5,"",0,1,0,1,0,0,1 -"Carmen",1945,124,NA,4.7,6,14.5,0,0,0,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Carmen",1984,152,NA,7.7,252,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Carmen & Babyface",1995,81,NA,4.6,11,0,0,4.5,24.5,0,44.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Carmen Get It!",1962,8,NA,3.5,19,14.5,24.5,14.5,14.5,14.5,4.5,4.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Carmen Jones",1954,108,750000,7,534,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Carmen Miranda: Bananas Is My Business",1995,91,NA,8,75,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Carmen la de Ronda",1959,111,NA,7,15,0,0,0,0,4.5,14.5,34.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Carmen nue",1984,82,NA,4.3,6,0,0,0,34.5,0,0,0,14.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Carmen van het Noorden, Een",1919,60,NA,7.4,7,0,0,0,0,0,44.5,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Carmen, Baby",1967,97,NA,5.3,38,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Carmen, la de Triana",1938,110,NA,6.3,8,14.5,0,0,0,0,14.5,24.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Carmilla",1999,80,NA,1.6,11,74.5,4.5,0,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Carmina burana",1975,63,NA,8.1,11,0,0,0,0,4.5,0,4.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Carnada, La",1999,105,NA,5.7,13,4.5,0,4.5,0,24.5,4.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Carnage",1986,91,32500,2.2,30,34.5,24.5,24.5,14.5,4.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Carnage & Deception: A Killer's Perfect Murder",2003,39,NA,4.3,20,24.5,4.5,14.5,0,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Carnage Road",2000,88,NA,1.5,31,64.5,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Carnages",2002,130,NA,6.5,216,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Carnal Crimes",1990,92,NA,4.7,59,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Carnal Desires",1999,87,NA,2.8,42,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Carnal Knowledge",1971,98,NA,6.8,1582,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Carnal Madness",1975,83,NA,5.7,34,4.5,0,4.5,0,24.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Carnaval de las bestias, El",1980,88,NA,2.2,10,24.5,14.5,0,24.5,0,14.5,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Carnaval des barbouzes, Le",1966,94,NA,5.4,21,0,4.5,4.5,4.5,14.5,24.5,4.5,0,4.5,14.5,"",1,0,0,1,0,0,0 -"Carne",1968,90,NA,5.4,24,4.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Carne",1991,40,NA,6.3,115,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Carne apaleada",1977,102,NA,8,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Carne bollente",1987,84,NA,5.4,12,0,0,4.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Carne de gallina",2002,96,NA,5.1,36,0,4.5,4.5,14.5,4.5,34.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Carne de horca",1953,93,NA,6.5,9,24.5,0,0,0,0,24.5,14.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Carne, La",1991,90,NA,5,80,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Carnegie Hall",1947,144,NA,5.2,29,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Carnets du Major Thompson, Les",1955,105,NA,5.5,11,4.5,0,0,4.5,24.5,34.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Carniere, Il",1997,94,NA,3.4,10,34.5,0,0,0,0,24.5,14.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Carnival",1935,77,NA,7.8,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Carnival",1946,93,NA,6.1,16,0,0,14.5,0,14.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,1,0 -"Carnival Boat",1932,62,NA,5.8,10,0,0,0,14.5,24.5,64.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Carnival Day",1936,16,NA,4.3,7,0,0,0,44.5,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,1 -"Carnival Knowledge",2002,93,NA,7.4,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Carnival Rock",1957,75,NA,3.2,27,24.5,14.5,14.5,14.5,24.5,0,4.5,14.5,4.5,0,"",0,0,0,1,0,1,0 -"Carnival Story",1954,95,NA,5.6,70,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Carnival in Costa Rica",1947,97,NA,5.4,29,0,0,4.5,14.5,24.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Carnival of Blood",1970,87,NA,3,64,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Carnival of Rhythm",1941,18,NA,2.6,6,34.5,14.5,14.5,0,0,14.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Carnival of Souls",1962,84,30000,7,1819,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Carnival of Souls",1998,90,2000000,2.8,462,34.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Carnival of Wolves",1996,103,NA,3.9,13,14.5,0,4.5,4.5,24.5,4.5,24.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Carnival of the Animals",1976,23,NA,6.7,12,0,4.5,0,14.5,4.5,4.5,14.5,24.5,0,14.5,"",0,1,0,0,0,0,1 -"Carnivale",2000,74,NA,4.3,11,0,4.5,4.5,14.5,14.5,34.5,4.5,0,0,0,"",0,1,0,0,0,0,0 -"Carnivore",2000,80,NA,1.8,134,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Carnosaur",1993,83,1000000,3.1,583,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Carnosaur 2",1995,83,NA,3.2,237,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Carnosaur 3: Primal Species",1996,85,NA,2.7,202,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Carny",1980,107,NA,6.6,404,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Caro Michele",1976,108,NA,7.6,5,0,0,0,0,0,24.5,44.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Caro diario",1994,100,NA,7,1151,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Caro dolce amore",1994,88,NA,6.2,14,0,0,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Carolina",1934,85,NA,2.3,6,0,34.5,0,0,14.5,0,0,0,0,45.5,"",0,0,1,0,0,1,0 -"Carolina Cannonball",1955,73,NA,6,7,0,0,0,14.5,14.5,44.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Carolina Moon",1940,65,NA,5.4,5,0,0,24.5,0,64.5,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Caroline at Midnight",1994,88,NA,4.8,103,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Carosello napoletano",1954,124,NA,7.7,14,0,0,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Carousel",1956,128,NA,7.1,810,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Carpa del amor, La",1979,93,NA,3,6,34.5,0,34.5,14.5,0,14.5,0,0,0,0,"",0,0,1,0,0,1,0 -"Carpati: 50 Miles, 50 Years",1996,80,NA,5,9,0,0,0,0,44.5,0,14.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Carpenter and His Clumsy Wife, The",2003,14,NA,7.9,9,0,0,0,0,0,0,14.5,14.5,34.5,44.5,"",0,0,1,0,0,0,1 -"Carpenter, The",1989,89,NA,3.8,53,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Carpetbaggers, The",1964,150,3000000,6.1,341,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Carpool",1996,89,17000000,4.5,829,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Carrefour",1938,84,NA,5.7,8,0,0,0,24.5,0,14.5,24.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Carretera y manta",2000,87,NA,7.4,42,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Carreteras secundarias",1997,105,NA,6.1,83,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Carrie",1952,118,NA,7.1,168,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Carrie",1976,98,1800000,7.2,11778,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Carried Away",1985,6,NA,5.7,6,14.5,0,0,0,14.5,14.5,34.5,0,14.5,0,"",0,1,0,0,0,0,1 -"Carried Away",1996,109,NA,6.4,393,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Carried Away",1998,87,NA,3.2,10,0,0,14.5,0,0,0,0,14.5,14.5,74.5,"",0,0,0,0,0,0,0 -"Carrier, The",1988,99,NA,5.2,37,14.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Carrington",1995,121,NA,6.5,1401,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Carrington V.C.",1955,105,NA,6.3,43,0,0,0,4.5,14.5,14.5,44.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Carrosse d'or, Le",1953,103,NA,7.6,208,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Carrotblanca",1995,8,NA,7.1,139,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Carrott Gets Rowdie",1980,52,NA,7.7,5,24.5,24.5,0,0,0,24.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Carrousel Boreal",1958,11,NA,5.8,19,0,0,14.5,4.5,24.5,14.5,14.5,4.5,14.5,0,"",0,1,0,0,0,0,1 -"Carry Me Back",1982,102,NA,6,15,14.5,0,4.5,0,24.5,24.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Carry On Abroad",1972,88,NA,5.8,327,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Carry On Admiral",1957,83,NA,4.8,27,0,0,14.5,14.5,44.5,14.5,14.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Carry On Again Doctor",1969,89,NA,5.2,244,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Behind",1975,90,NA,4.6,237,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Carry On Cabby",1963,91,NA,5.9,243,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Camping",1969,88,NA,5.8,476,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Carry On Cleo",1964,92,NA,6.6,448,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Carry On Columbus",1992,91,NA,3.2,283,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Cowboy",1965,93,NA,5.9,222,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Cruising",1962,89,NA,5.5,219,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Carry On Dick",1974,91,NA,5.3,234,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Emmannuelle",1978,88,NA,3.6,186,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Carry On England",1976,89,NA,3.4,218,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Girls",1973,88,NA,5,259,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Carry On Henry",1970,89,NA,5.7,247,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Carry On Jack",1963,91,NA,5.5,167,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Carry On Loving",1970,88,NA,4.7,215,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Carry On Matron",1972,87,NA,5.4,271,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Nurse",1959,86,NA,5.7,259,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Carry On Regardless",1961,90,NA,5.9,164,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Screaming!",1966,97,NA,6.3,381,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Carry On Sergeant",1958,84,NA,6.3,217,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Carry On Spying",1964,87,NA,5.8,237,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Teacher",1959,86,NA,5.7,166,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On Up the Jungle",1970,89,NA,5.2,241,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On at Your Convenience",1971,90,NA,5.7,332,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Carry On, Constable",1960,86,NA,5.8,214,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carry On... Up the Khyber",1968,88,NA,6.8,466,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Carry on Doctor",1967,94,NA,5.9,357,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cars That Ate Paris, The",1974,91,NA,5.1,493,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Carson City",1952,87,NA,5.8,53,0,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Carson City Kid, The",1940,57,NA,6.6,33,0,0,0,0,14.5,34.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Cart Attack",2005,5,NA,9,8,0,0,0,0,0,14.5,14.5,0,14.5,64.5,"",0,0,1,0,0,0,1 -"Carta de amor de un asesino",1972,98,NA,5.2,7,0,0,14.5,14.5,24.5,0,0,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Cartagine in fiamme",1960,105,NA,4.7,18,4.5,0,14.5,4.5,34.5,14.5,14.5,4.5,0,4.5,"",1,0,0,1,0,1,0 -"Cartaio, Il",2004,96,NA,4.6,329,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cartas de Alou, Las",1990,100,NA,5.8,31,4.5,0,4.5,4.5,14.5,4.5,4.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Cartas de amor de una monja",1978,110,NA,1.1,7,45.5,14.5,0,0,0,0,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Cartas del parque",1989,87,NA,6.1,27,0,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Carte postale, La",1998,18,NA,7.1,7,0,0,0,0,14.5,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Cartel",1990,106,NA,2.8,36,34.5,4.5,14.5,14.5,14.5,0,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Carter's Wish",2003,12,NA,5.5,30,14.5,0,0,4.5,4.5,0,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Cartes sur table",1966,85,NA,5.8,21,4.5,0,0,0,14.5,14.5,24.5,4.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Cartes vivantes, Les",1904,3,NA,6.7,76,4.5,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Cartomante, A",2004,90,NA,6.6,33,14.5,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Carton, Le",2004,88,NA,5.8,57,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cartoon Noir",1999,83,NA,6,16,0,4.5,0,14.5,0,4.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Cartoons Ain't Human",1943,7,NA,5.9,9,0,0,14.5,0,14.5,44.5,0,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Cartouche",1962,114,NA,6.8,274,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Caruga",1991,108,NA,8.9,14,0,0,4.5,0,4.5,0,24.5,24.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Caruso Pascoski di padre polacco",1988,102,NA,6.2,85,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Caruso, zero in condotta",2001,91,NA,4.7,25,24.5,4.5,4.5,14.5,24.5,14.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Carve Her Name with Pride",1958,119,NA,7.2,141,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Carvoeiros, Os",1999,65,NA,6.4,33,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Cas Pinochet, Le",2001,110,NA,7.1,60,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Cas d'O, Le",2003,22,NA,2.6,11,34.5,24.5,0,4.5,0,14.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Cas du Dr Laurent, Le",1957,110,NA,5.6,14,0,0,0,0,34.5,24.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cas sluhu",1989,115,NA,6.8,21,0,0,0,4.5,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Casa 3 - Ghosthouse, La",1988,95,NA,4.1,113,14.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Casa 5, La",1990,95,NA,2.7,43,34.5,14.5,14.5,24.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Casa Assassinada, A",1971,103,NA,8.9,9,0,0,0,0,0,0,14.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Casa Ricordi",1956,110,NA,5.5,5,0,0,0,0,24.5,0,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Casa con la scala nel buio, La",1983,110,NA,6.1,219,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Casa con vista al mar, Una",2001,93,NA,5.6,43,0,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Casa dalle finestre che ridono, La",1976,110,NA,7,324,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Casa de Lava",1995,110,NA,7.6,18,4.5,4.5,0,0,0,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Casa de las muertas vivientes, La",1972,80,NA,1.2,8,34.5,24.5,14.5,14.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Casa de las palomas, La",1972,90,NA,4.8,7,0,14.5,0,24.5,24.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Casa de las sombras, La",1976,90,NA,5.1,9,34.5,0,14.5,0,14.5,0,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Casa de los babys",2003,95,NA,6.7,572,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Casa del buon ritorno, La",1986,90,NA,4.5,6,14.5,0,0,0,14.5,14.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Casa del sorriso, La",1988,110,NA,5.2,14,4.5,0,4.5,24.5,14.5,4.5,0,34.5,0,0,"",0,0,0,1,0,0,0 -"Casa del tappeto giallo, La",1982,89,NA,5.5,14,0,0,14.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Casa del terror, La",1960,60,NA,5.5,5,0,0,0,24.5,44.5,0,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Casa dell'esorcismo, La",1973,95,1000000,5.5,277,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Casa della paura, La",1973,90,NA,4.1,14,0,0,24.5,44.5,4.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Casa en las afueras, Una",1995,97,NA,7.1,34,4.5,4.5,14.5,4.5,4.5,4.5,14.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Casa mia casa mia...",1988,90,NA,4.3,10,24.5,0,0,34.5,14.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Casa privata per le SS",1977,82,NA,5.2,22,14.5,4.5,0,24.5,4.5,24.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Casa sperduta nel parco, La",1980,76,NA,5.6,349,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Casa stregata, La",1982,95,NA,5.3,39,4.5,0,4.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Casa, A",1997,120,NA,7.2,25,0,4.5,4.5,0,0,14.5,4.5,24.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Casablanca",1942,102,950000,8.8,66030,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Casablanca",2002,14,NA,4,31,14.5,0,4.5,4.5,4.5,0,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Casablanca Driver",2004,90,NA,5.5,36,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Casablanca Express",1988,85,NA,3.2,71,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Casablanca, Casablanca",1985,109,NA,5.8,24,0,0,0,4.5,24.5,14.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Casablanca, nid d'espions",1963,101,NA,5.5,13,24.5,0,0,14.5,14.5,14.5,0,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Casablancais, Les",1999,87,NA,6,9,0,14.5,0,0,0,14.5,34.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Casal, O",1975,105,NA,7.4,7,0,0,0,14.5,0,0,45.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Casamento de Louise, O",2001,80,NA,8.8,40,4.5,0,4.5,4.5,4.5,4.5,24.5,4.5,34.5,14.5,"",0,0,1,0,0,1,0 -"Casamento de Romeu e Julieta, O",2005,90,NA,5.8,20,14.5,4.5,0,0,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Casanova",1927,100,NA,7.3,27,0,0,0,0,0,4.5,44.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Casanova",1990,76,NA,4.4,19,0,4.5,14.5,34.5,24.5,14.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Casanova & Co.",1977,100,NA,4.3,58,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Casanova '70",1965,115,NA,5.7,50,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Casanova 2",1977,90,NA,6.2,6,0,0,0,0,0,64.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Casanova Brown",1944,94,NA,6.1,79,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Casanova Cat",1951,6,NA,6.8,25,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Casanova di Federico Fellini, Il",1976,166,NA,6.4,610,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Casanova's Big Night",1954,86,NA,6.5,180,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Casas de fuego",1995,95,NA,5,36,4.5,14.5,0,4.5,0,14.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Casbah",1948,94,NA,6.5,67,0,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cascabel",2000,96,NA,4.1,15,4.5,4.5,0,24.5,4.5,24.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Cascadeur",1998,106,NA,4.3,121,24.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Case Against Brooklyn, The",1958,82,NA,6.4,6,0,0,0,14.5,14.5,0,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Case Against Mrs. Ames, The",1936,85,NA,6.7,10,0,0,0,0,14.5,24.5,44.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Case of Majella McGinty, The",1999,23,NA,5.7,25,4.5,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Case of Spring Fever, A",1940,8,NA,2.7,52,44.5,14.5,4.5,4.5,14.5,0,4.5,0,0,4.5,"",0,1,1,0,0,0,1 -"Case of the Black Cat, The",1936,66,NA,6.1,46,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Case of the Black Parrot, The",1941,60,NA,5.3,29,0,0,4.5,24.5,34.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Case of the Curious Bride, The",1935,80,NA,6.7,88,0,0,0,4.5,14.5,14.5,44.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Case of the Frightened Lady, The",1940,81,NA,5.8,8,0,0,0,0,45.5,0,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Case of the Full Moon Murders",1974,74,NA,4.5,25,4.5,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Case of the Howling Dog, The",1934,75,NA,5.8,26,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Case of the Lucky Legs, The",1935,78,NA,7,45,0,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Case of the Missing Hare",1942,7,NA,7.5,65,0,4.5,0,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Case of the Mukkinese Battle Horn, The",1956,27,NA,5.7,45,4.5,0,4.5,14.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Case of the Stuttering Bishop, The",1937,70,NA,5.6,29,0,0,4.5,4.5,24.5,24.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Case of the Stuttering Pig, The",1937,8,NA,7.2,17,4.5,0,0,0,4.5,0,24.5,34.5,0,24.5,"",0,1,1,0,0,0,1 -"Case of the Velvet Claws, The",1936,63,NA,5.8,38,0,0,0,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Casey Bats Again",1954,8,NA,6.9,44,4.5,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Casey at the Bat",1946,9,NA,7.5,85,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Casey's Shadow",1978,117,NA,5.2,101,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cash",1933,73,NA,6.7,10,0,0,0,0,24.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cash In Hand",1998,90,NA,5.3,17,4.5,4.5,0,14.5,24.5,4.5,4.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Cash McCall",1960,102,NA,6.3,144,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Cash Stashers",1953,9,NA,5.4,21,4.5,4.5,4.5,14.5,14.5,14.5,14.5,0,4.5,0,"",0,0,1,0,0,0,1 -"Cash and Carry",1937,18,NA,7.7,50,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Cash on Demand",1961,66,NA,6.2,24,0,0,0,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Cashback",2004,18,NA,9.8,51,4.5,0,0,4.5,4.5,0,0,4.5,4.5,84.5,"",0,0,1,1,0,0,1 -"Casimir",1950,87,NA,2.8,5,0,44.5,0,24.5,24.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Casinista, Il",1980,82,NA,5.2,7,24.5,0,0,0,14.5,14.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Casino",1995,176,52000000,7.8,27234,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Casino Murder Case, The",1935,83,NA,5.9,16,0,0,4.5,4.5,4.5,34.5,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Casino Royale",1967,131,12000000,5.3,4173,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Casino de Paris",1957,95,NA,3.5,5,0,64.5,24.5,0,0,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Casita blanca. La ciudad oculta, La",2002,82,NA,6.9,11,0,0,0,0,4.5,14.5,64.5,4.5,0,0,"",0,0,0,1,1,0,0 -"Caso Mattei, Il",1972,116,NA,7.6,96,0,0,0,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Caso Moro, Il",1986,110,NA,7.1,28,0,0,0,0,4.5,14.5,44.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Caso de las dos bellezas, El",1969,92,NA,4.6,61,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Casomai",2002,114,NA,6.7,246,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Casotto",1977,106,NA,5.5,66,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Caspar David Friedrich - Grenzen der Zeit",1986,84,NA,6.5,5,0,0,0,24.5,0,24.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Casper",1995,100,55000000,5.6,8798,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Casper the Friendly Ghost",1945,9,NA,5.4,53,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Casque bleu",1994,98,NA,5.1,96,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Casque d'or",1952,94,NA,8.1,287,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Cass Timberlane",1947,119,NA,6.2,129,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cassandra",1986,94,NA,4,37,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cassandra Crossing, The",1976,129,NA,5.9,1014,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Casse, Le",1971,120,NA,5.9,144,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Casse-pieds, Les",1948,71,NA,6.4,8,0,0,14.5,0,14.5,14.5,0,0,24.5,34.5,"",0,0,1,0,0,0,0 -"Casshern",2004,141,5000000,6.5,1237,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Cassidy of Bar 20",1938,56,NA,7,19,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Cassis",1966,4,NA,7.6,5,0,0,0,0,24.5,24.5,0,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Cast Away",2000,143,90000000,7.3,34580,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Cast a Dark Shadow",1957,82,NA,6.8,99,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Cast a Giant Shadow",1966,138,NA,6.2,321,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cast a Long Shadow",1959,82,NA,5.4,23,4.5,0,4.5,14.5,34.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Casta diva",1954,98,NA,5.1,9,0,14.5,0,0,24.5,14.5,34.5,0,0,24.5,"",0,0,0,1,0,1,0 -"Casta e pura",1981,88,NA,3.9,9,14.5,14.5,14.5,14.5,24.5,0,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Castagne sono buone, Le",1970,108,NA,5.6,5,24.5,0,0,24.5,0,24.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Castaway",1986,117,NA,5.8,480,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Castaway Cowboy, The",1974,91,NA,5.8,86,0,4.5,4.5,4.5,24.5,34.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Castaway, The",1931,7,NA,5.2,18,4.5,4.5,4.5,14.5,4.5,34.5,24.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Castello dei morti vivi, Il",1964,90,NA,4.8,29,4.5,4.5,4.5,0,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Castillo de la pureza, El",1973,110,NA,7.9,67,4.5,0,4.5,0,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Castillo de los monstruos, El",1958,89,NA,5.9,6,0,0,0,0,14.5,34.5,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Casting a Guide Box",1904,6,NA,3.4,13,4.5,0,34.5,4.5,24.5,0,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Castle Freak",1995,95,NA,4.9,573,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Castle Keep",1969,105,NA,6,313,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Castle in the Air",1952,89,NA,7.5,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Castle in the Desert",1942,62,NA,7.1,116,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Castle of Evil",1966,81,NA,2.9,43,24.5,4.5,24.5,14.5,4.5,0,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Castle on the Hudson",1940,77,NA,6.8,75,0,0,0,4.5,14.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Castlerock",2000,81,NA,4.1,30,14.5,14.5,14.5,0,4.5,14.5,24.5,4.5,0,34.5,"",1,0,0,0,0,0,0 -"Castro Street",1966,10,NA,6.5,30,14.5,0,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Casual Sex?",1988,97,NA,4.7,908,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Casualties",1997,85,NA,5.4,221,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Casualties of War",1989,113,22500000,6.8,4459,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Casualty, The",2004,20,NA,7.4,7,24.5,0,0,0,0,0,0,0,0,74.5,"",0,0,0,0,0,0,1 -"Casuistry: The Art of Killing a Cat",2004,91,NA,5.3,12,45.5,0,4.5,4.5,4.5,0,4.5,14.5,0,0,"",0,0,0,0,1,0,0 -"Cat Above and the Mouse Below, The",1964,7,NA,6.4,35,4.5,0,14.5,14.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Cat Ate the Parakeet, The",1972,85,NA,7.3,7,14.5,0,0,0,0,0,0,0,45.5,24.5,"",0,0,0,1,0,0,0 -"Cat Ballou",1965,97,NA,6.9,2154,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Cat Burglar, The",1961,65,NA,6.1,13,0,0,0,4.5,4.5,24.5,4.5,44.5,0,4.5,"",0,0,0,1,0,0,0 -"Cat Came Back, The",1936,8,NA,6.3,12,0,0,0,0,24.5,14.5,14.5,0,4.5,34.5,"",0,1,1,0,0,0,1 -"Cat Came Back, The",1988,7,NA,8.1,249,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Cat Chaser",1989,98,NA,5.1,204,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cat Concerto, The",1946,8,NA,8.7,149,4.5,0,0,0,4.5,4.5,4.5,4.5,24.5,45.5,"",0,1,1,0,0,0,1 -"Cat Creeps, The",1930,75,NA,7.3,9,0,0,0,0,0,14.5,24.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Cat Creeps, The",1946,58,NA,3.5,17,14.5,0,4.5,4.5,24.5,4.5,0,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Cat Feud",1958,6,NA,7.7,34,0,0,4.5,0,4.5,4.5,24.5,44.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Cat Fishin'",1947,8,NA,6.9,43,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Cat Girl",1957,69,NA,4.6,43,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Cat Murkil and the Silks",1976,102,NA,1.9,12,34.5,24.5,14.5,0,14.5,0,0,4.5,0,0,"",0,0,0,1,0,0,0 -"Cat Nap Pluto",1948,7,NA,6.4,20,0,0,0,4.5,14.5,24.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Cat Napping",1951,7,NA,6.8,31,0,0,0,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Cat People",1942,73,134000,7.4,1239,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Cat People",1982,118,18000000,5.8,2862,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cat Swallows Parakeet and Speaks!",1996,76,NA,5.7,7,0,14.5,14.5,0,14.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Cat That Hated People, The",1948,8,NA,7.9,75,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Cat and Dupli-cat",1967,7,NA,6.5,24,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Cat and the Canary, The",1927,82,NA,7.2,178,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cat and the Canary, The",1939,72,NA,7.6,216,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Cat and the Canary, The",1979,89,NA,5.3,156,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cat and the Fiddle, The",1934,88,NA,6.8,52,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Cat and the Mermouse, The",1949,8,NA,7,40,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Cat from Outer Space, The",1978,104,NA,5.2,583,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cat in the Cage",1978,98,NA,2.7,22,34.5,24.5,24.5,0,4.5,4.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Cat in the Hat, The",2003,82,109000000,3.2,4997,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Cat on a Hot Tin Roof",1958,108,3000000,7.8,4870,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Cat with Hands, The",2001,4,NA,7.9,92,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,1,0,0,0,0,1 -"Cat's Bad Hair Day",2004,15,NA,8.3,7,14.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Cat's Cradle",1959,6,NA,6.3,57,4.5,4.5,4.5,4.5,24.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Cat's Eye",1985,94,7000000,5.7,2301,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cat's Eye",1997,91,NA,4.8,30,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Cat's Me-Ouch, The",1965,6,NA,6.6,26,0,4.5,4.5,14.5,4.5,4.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Cat's Meow, The",2001,114,NA,6.5,2195,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Cat's Out, The",1931,7,NA,8.9,7,14.5,0,0,0,0,0,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Cat's Paw",1959,6,NA,5.5,32,0,14.5,0,14.5,4.5,14.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Cat's Tale, The",1941,8,NA,6.9,16,0,0,0,4.5,0,34.5,44.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Cat's-Paw, The",1934,102,617000,6.8,93,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cat, The",1966,87,NA,4.3,15,4.5,24.5,14.5,0,34.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Cat-Tails for Two",1953,6,NA,6.8,13,0,0,0,0,4.5,24.5,34.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Cat-Women of the Moon",1953,64,NA,3,137,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cataclysm",1980,94,NA,3.9,45,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Catacombs",1988,84,NA,4.6,59,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Catalina Caper",1967,84,NA,2.1,238,44.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Catastrophe",1977,95,NA,6.1,9,0,0,0,0,24.5,0,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Catastrophe",2000,6,NA,6.2,44,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Catch Me If You Can",1989,106,800000,5.1,93,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",1,0,1,1,0,0,0 -"Catch Me If You Can",2002,141,52000000,7.6,39915,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Catch My Soul",1974,97,NA,3.9,11,4.5,4.5,4.5,4.5,4.5,14.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Catch That Kid",2004,91,18000000,4.5,598,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG",1,0,1,0,0,0,0 -"Catch Us If You Can",1965,91,NA,5.7,77,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Catch as Cats Can",1947,7,NA,6.3,18,0,4.5,0,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Catch the Heat",1987,88,NA,5.8,16,0,4.5,4.5,4.5,34.5,4.5,24.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Catch-22",1970,122,NA,7,3463,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Catcher, The",2000,80,NA,1.8,42,44.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Catchfire",1990,95,NA,5.3,612,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Catching Out",2003,79,NA,6.5,27,0,0,4.5,14.5,4.5,4.5,34.5,14.5,24.5,0,"",0,0,0,0,1,0,0 -"Catching Trouble",1950,10,NA,1.4,46,74.5,4.5,4.5,4.5,0,0,0,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Catching an Early Train",1901,1,NA,4.1,9,0,0,14.5,34.5,34.5,0,0,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Catene",1949,86,NA,9.2,6,0,0,0,0,0,14.5,0,0,14.5,64.5,"",0,0,0,0,0,1,0 -"Catered Affair, The",1956,92,NA,7,310,0,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Caterina di Russia",1963,105,NA,3.2,10,14.5,24.5,14.5,14.5,0,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Cateto a babor",1970,83,NA,4.3,27,14.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Catfish in Black Bean Sauce",1999,119,NA,6.7,181,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Catherine et Cie",1975,100,NA,4.7,35,4.5,0,4.5,14.5,24.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Catherine the Great",1934,95,NA,5.8,60,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Catherine's Grove",1997,91,NA,3.1,38,14.5,14.5,4.5,24.5,14.5,14.5,14.5,0,0,4.5,"R",0,0,0,1,0,0,0 -"Catholic School",1999,13,NA,6.2,15,0,0,0,24.5,0,0,34.5,24.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Cathy's Child",1979,90,NA,5.1,7,0,0,0,14.5,24.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Catlow",1971,101,NA,5.5,140,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Catman in Boxer's Blow",1993,90,NA,6,23,14.5,4.5,4.5,0,0,0,0,4.5,0,74.5,"",1,0,0,0,0,0,0 -"Catman in Lethal Track",1990,90,NA,4.7,28,24.5,4.5,0,0,0,0,0,4.5,0,64.5,"",1,0,0,0,0,0,0 -"Catman of Paris, The",1946,65,NA,5.5,29,4.5,0,4.5,34.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Catorce estaciones",1991,100,NA,4.7,5,24.5,0,24.5,0,44.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Cats & Dogs",2001,87,60000000,5.4,6487,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Cats A-Weigh!",1953,7,NA,6.4,21,0,0,0,14.5,4.5,14.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Cats Bah, The",1954,7,NA,6.8,41,4.5,0,4.5,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Cats Don't Dance",1997,75,32000000,6.4,366,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Cats and Bruises",1965,7,NA,5.7,24,0,0,4.5,4.5,24.5,44.5,4.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Cats and Mice",2003,84,NA,8.7,13,44.5,0,4.5,0,0,4.5,14.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"Cattiva",1991,98,NA,4.6,11,0,0,0,14.5,0,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Cattivi pensieri",1976,105,NA,6.4,22,0,0,4.5,4.5,24.5,24.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cattle Annie and Little Britches",1981,97,NA,5.8,110,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cattle Drive",1951,77,NA,5.8,26,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cattle Driven to Slaughter",1897,1,NA,3.7,15,4.5,24.5,24.5,24.5,14.5,4.5,4.5,4.5,0,0,"",0,0,0,0,1,0,1 -"Cattle Empire",1958,83,NA,5.3,27,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Cattle King",1963,90,NA,5.3,37,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cattle Queen",1951,69,NA,3.8,6,14.5,34.5,14.5,14.5,0,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Cattle Queen of Montana",1954,88,NA,4.5,114,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cattle Thief, The",1936,58,NA,4.6,14,0,0,4.5,24.5,45.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Cattle Town",1952,71,NA,5.2,10,0,14.5,0,0,45.5,24.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Cattolica",2004,84,NA,7,6,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Cattura, La",1969,97,NA,5.8,16,4.5,4.5,0,0,14.5,14.5,14.5,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Catty Cornered",1953,7,NA,6.7,30,0,0,0,4.5,14.5,24.5,44.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Catty-Cornered",1966,6,NA,5.6,17,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Catwalk",1996,95,NA,5.9,81,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Catwoman",2004,104,85000000,3.4,8815,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Cauchemar blanc",1991,9,NA,3.8,41,34.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Cauchemares",1977,88,NA,3.8,75,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Cauchemars naissent la nuit, Les",1970,78,NA,6,31,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Caudillo",1977,130,NA,7.5,6,34.5,0,0,0,0,14.5,0,0,34.5,14.5,"",0,0,0,0,1,0,0 -"Caught",1949,88,NA,7,238,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Caught",1987,113,NA,3.9,19,14.5,4.5,14.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Caught",1996,110,NA,6.5,317,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Caught From Behind 10",1989,76,NA,6.9,5,0,0,0,0,24.5,24.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Caught From Behind 3",1985,73,NA,7.5,6,0,0,0,14.5,14.5,14.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Caught From Behind 4",1985,76,NA,6.3,10,14.5,0,0,14.5,0,14.5,0,0,14.5,64.5,"",0,0,0,0,0,0,0 -"Caught From Behind 6",1986,78,NA,7,6,0,0,14.5,0,14.5,0,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Caught From Behind 7",1987,74,NA,7.4,6,0,0,0,0,0,34.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Caught From Behind 8",1988,78,NA,8.3,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,0,0,0,0 -"Caught From Behind 9",1988,75,NA,5.3,11,14.5,4.5,0,0,24.5,14.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Caught Looking",1991,35,NA,5.1,9,0,0,14.5,14.5,44.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Caught Plastered",1931,68,NA,5.7,32,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Caught Up",1998,97,NA,4.8,188,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Caught by Wireless",1908,10,NA,4.2,6,34.5,0,0,0,45.5,14.5,0,0,0,0,"",0,0,0,1,0,0,1 -"Caught in a Cabaret",1914,33,NA,5.5,79,4.5,4.5,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Caught in the Draft",1941,82,NA,6.7,85,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Caught in the Rain",1914,16,NA,6,23,4.5,0,4.5,0,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Causa Secreta, A",1994,93,NA,8.4,23,0,4.5,4.5,0,0,0,4.5,4.5,64.5,14.5,"",0,0,0,1,0,0,0 -"Causality",2004,9,15000,9.7,10,0,0,0,0,0,0,0,14.5,14.5,84.5,"",0,0,0,0,0,0,1 -"Cause for Alarm!",1951,74,NA,6.1,154,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cause of Death",2000,95,NA,4.4,85,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Cause toujours!",2004,87,NA,6.3,41,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cautiva",2003,120,NA,7.5,25,0,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Cav. Costante Nicosia demoniaco, ovvero: Dracula in Brianza, Il",1975,100,NA,5.1,19,0,0,0,14.5,34.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Cavalca e uccidi",1964,82,NA,4.6,8,0,14.5,0,34.5,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Cavalcade",1933,110,1180280,6.8,315,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Cavalcade of Archery",1946,8,NA,6.7,30,0,0,0,4.5,14.5,14.5,44.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"Cavalcade of Dance",1943,11,NA,6.3,7,0,0,0,14.5,14.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Cavalcade of San Francisco",1940,9,NA,5.5,14,0,0,14.5,4.5,24.5,34.5,14.5,0,0,0,"",0,0,0,0,1,0,1 -"Cavalcade of the West",1936,59,NA,5.4,5,24.5,0,0,0,64.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Cavalcades",2002,88,NA,5.5,8,0,0,0,14.5,14.5,0,24.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Cavale",2002,117,NA,6.8,315,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Cavaliere dei cento volti, Il",1960,75,NA,6.1,9,0,0,24.5,24.5,14.5,0,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Cavaliere inesistente, Il",1969,90,NA,8,7,0,0,0,0,0,0,14.5,44.5,44.5,0,"",0,0,1,0,0,0,0 -"Cavaliere misterioso, Il",1948,90,NA,6.1,11,0,4.5,0,4.5,14.5,4.5,34.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Cavalieri che fecero l'impresa, I",2001,147,8000000,5.7,123,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cavalieri del diavolo, I",1959,92,NA,4.6,6,0,14.5,0,34.5,34.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Cavaliers de l'orage, Les",1984,100,NA,5,8,0,0,14.5,0,34.5,0,14.5,14.5,24.5,0,"",1,0,0,1,0,1,0 -"Cavalleria rusticana",1982,70,NA,8.9,32,4.5,0,0,0,0,4.5,4.5,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Cavalry Command",1963,77,NA,4.6,20,0,4.5,14.5,24.5,24.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Cavalry Scout",1951,78,NA,4.6,8,0,0,0,34.5,34.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Cave of Outlaws",1951,75,NA,5.1,12,0,0,14.5,4.5,24.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Cave se rebiffe, Le",1961,98,NA,6.9,84,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Cavedweller",2004,101,NA,4.8,110,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Cavegirl",1985,85,NA,3.1,108,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Caveman",1981,91,NA,5.3,1186,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Caveman Inki",1950,7,NA,6.9,19,0,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Caveman's Valentine, The",2001,105,NA,6,1505,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Cavite",2005,80,NA,7.8,18,0,0,0,0,4.5,0,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Caza, La",1966,92,NA,7.9,119,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cazador de demonios",1983,93,NA,3.7,6,14.5,34.5,14.5,0,0,0,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Cazadores",1997,12,NA,5.7,14,4.5,0,0,14.5,4.5,24.5,14.5,24.5,4.5,0,"",0,0,0,0,0,0,1 -"Cazadores, Los",1974,104,NA,5.1,83,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Ce ma ru lin",1984,115,NA,8.5,7,0,0,0,0,0,0,14.5,24.5,45.5,0,"",1,0,0,0,0,0,0 -"Ce qu'il reste de nous",2004,77,NA,8,47,0,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Ce soir ou jamais",1960,104,NA,6.2,8,14.5,14.5,0,0,14.5,0,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Cease Fire",1985,97,NA,5.2,36,0,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cease Fire!",1953,75,NA,7.4,15,0,0,0,4.5,0,14.5,24.5,44.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Ceci est mon corps",2001,87,NA,5.5,19,0,14.5,14.5,14.5,34.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Cecil B. DeMented",2000,87,10000000,6,3464,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Cecilia, La",1975,113,NA,8.8,6,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Ceddo",1977,120,NA,5.9,37,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Cego que Gritava Luz, O",1997,85,NA,4.9,11,14.5,0,0,0,0,34.5,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Ceiling Hero",1940,6,NA,6.1,6,0,0,0,14.5,14.5,34.5,0,34.5,0,0,"",0,1,1,0,0,0,1 -"Ceiling Zero",1936,95,NA,7,103,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cela s'appelle l'aurore",1955,102,NA,7.3,48,4.5,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Celebration",2002,4,NA,8.9,34,4.5,4.5,0,4.5,0,0,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Celebration at Big Sur",1971,82,NA,5.4,29,4.5,4.5,4.5,4.5,34.5,4.5,34.5,0,14.5,4.5,"",0,0,0,0,1,0,0 -"Celebration: The Music of Pete Townshend and The Who",1994,180,NA,9.7,9,0,0,0,0,0,0,14.5,14.5,34.5,44.5,"",0,0,0,0,1,0,0 -"Celebrity",1998,113,12000000,6.1,4820,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Celestina, La",1996,109,NA,5.3,97,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Celia",1988,103,NA,6.9,70,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Cell 2455 Death Row",1955,77,NA,6.5,9,0,0,0,0,24.5,14.5,34.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Cell, The",2000,109,33000000,6.1,16118,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Cellar Doors",1989,40,7000,7.1,23,24.5,0,0,0,0,4.5,0,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Cellar Dweller",1988,77,NA,3.2,118,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cellar, The",1990,85,NA,4.5,79,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cellar, The",2003,20,5000,7.1,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Cellblock Sisters: Banished Behind Bars",1995,95,NA,3,102,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Cellbound",1955,6,NA,7.2,32,0,0,0,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Celles qu'on n'a pas eues",1981,110,NA,4.8,11,0,14.5,0,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cellular",2004,94,25000000,6.4,6182,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Celluloid Closet, The",1995,102,NA,7.4,1367,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Celluloid Dreams",2002,47,NA,8,9,0,0,0,0,0,0,14.5,74.5,14.5,0,"",0,0,0,0,1,0,0 -"Celluloide",1996,110,NA,6.6,26,0,0,4.5,0,14.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Celos",1999,105,NA,6.4,125,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Celsius 41.11: The Temperature at Which the Brain... Begins to Die",2004,72,NA,3.8,584,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"R",0,0,0,0,1,0,0 -"Celtic Pride",1996,91,NA,4.6,1319,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Celui qui doit mourir",1957,122,NA,8.9,58,0,0,4.5,0,0,0,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Celuloza",1954,120,NA,6.8,5,0,0,0,0,44.5,0,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Cement",1999,97,NA,5.3,99,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Cement Garden, The",1993,101,NA,7.2,634,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Cemetery Club, The",1993,106,NA,5.7,212,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cemetery High",1989,80,NA,2.7,50,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cena delle beffe, La",1942,87,NA,5.6,14,14.5,0,0,0,14.5,0,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Cena, La",1998,109,NA,6.8,271,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cenere",1916,38,NA,5.8,17,0,0,0,4.5,24.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Cenerentola '80",1983,171,NA,6,62,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Cenerentola, La",1981,152,NA,7.7,7,0,24.5,0,0,0,0,0,0,0,74.5,"",0,0,1,0,0,1,0 -"Ceniciento, El",1952,95,NA,9.8,8,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,1,0,0,0,0 -"Censor, El",1995,110,NA,7.1,12,0,4.5,0,0,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Censored",1944,3,NA,7.3,12,0,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Census Taker, The",1984,95,NA,5.7,28,14.5,0,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Census Taker, The",1998,28,NA,8.6,15,4.5,0,0,0,0,0,14.5,4.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Cent briques et des tuiles",1965,95,NA,3.8,5,24.5,0,0,24.5,44.5,0,0,0,24.5,0,"",0,0,1,0,0,0,0 -"Cent mille dollars au soleil",1964,122,NA,7.2,122,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Centennial Summer",1946,102,NA,5.7,45,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Centeotl, Dios del maiz",1989,5,NA,4.7,7,14.5,14.5,0,0,0,74.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Center of the Web",1992,91,NA,4.5,37,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Center of the World, The",2001,88,NA,5.9,1273,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Centerfold",1996,86,NA,4.2,35,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Centerfold Fantasies",1997,55,NA,4.5,25,0,4.5,0,4.5,4.5,0,4.5,0,4.5,74.5,"",0,0,0,0,0,0,0 -"Centerfold Girls, The",1974,91,NA,3.4,39,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Centerspread Girls",1982,90,NA,4.3,16,14.5,0,4.5,0,34.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Centinelas del silencio",1971,18,NA,6.1,12,0,0,0,0,14.5,4.5,24.5,4.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Centipede!",2004,90,500000,3.6,35,24.5,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Cento cavalieri, I",1965,85,NA,6.3,14,0,0,4.5,0,24.5,24.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Cento giorni a Palermo",1984,100,NA,6.6,43,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cento passi, I",2000,107,NA,7.7,519,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Central Airport",1933,72,356000,5.3,44,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Central Park",1932,58,NA,6.1,33,0,0,4.5,4.5,4.5,44.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Central Park",1989,176,NA,4.9,11,0,0,0,14.5,4.5,0,4.5,0,34.5,24.5,"",0,0,0,0,1,0,0 -"Central do Brasil",1998,108,2900000,7.9,8980,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Centrespread",1981,82,NA,2.4,13,24.5,24.5,14.5,0,4.5,0,4.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Century",1993,112,NA,5.6,68,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Century 21 Calling...",1962,14,NA,2.3,23,34.5,24.5,24.5,4.5,4.5,0,0,0,0,4.5,"",0,0,0,0,0,0,1 -"Century Hotel",2001,95,NA,6.7,166,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Century of Cinema, A",1994,72,NA,4.9,143,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Cepo, El",1982,86,NA,2.6,6,84.5,0,0,0,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Cerca de la frontera",2000,88,NA,5.6,16,24.5,14.5,0,14.5,4.5,0,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Cercle des passions, Le",1983,108,NA,6.9,10,0,14.5,14.5,0,14.5,14.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Cercle rouge, Le",1970,140,NA,7.9,1059,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Cereal Killer",2000,12,NA,7.5,12,0,0,0,0,0,0,34.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Cerebrium",2001,8,NA,9.7,7,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,0,0,0,0,1 -"Ceremonia sangrienta",1973,92,NA,4.9,53,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Ceremony",1994,74,NA,3.5,35,34.5,24.5,4.5,4.5,4.5,4.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Ceremony, The",1964,105,NA,5.2,13,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Cerf-volant du bout du monde",1958,82,NA,6.6,13,0,0,0,0,4.5,14.5,14.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Cerf-volant, Le",2003,80,NA,6.9,83,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Cero y van cuatro",2004,92,NA,7.3,26,14.5,0,0,4.5,0,4.5,14.5,34.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Cerro Torre: Schrei aus Stein",1991,105,NA,6.1,125,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Certain Fury",1985,87,NA,3.5,63,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Certain Guys",1999,107,NA,5.5,57,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Certain Kind of Death, A",2003,69,NA,7.8,63,0,0,0,4.5,0,14.5,4.5,44.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Certain Smile, A",1958,104,NA,6.7,35,0,4.5,0,4.5,4.5,24.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Certaines nouvelles",1980,97,NA,6.1,5,0,0,24.5,0,0,24.5,24.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Certainly Not a Fairytale",2003,18,NA,8.1,15,0,0,0,0,4.5,0,4.5,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Certi bambini",2004,94,NA,7,42,0,0,0,0,4.5,14.5,44.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Certo giorno, Un",1969,105,NA,5.5,16,0,0,0,14.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Certo, certissimo, anzi... probabile",1969,110,NA,1.9,7,24.5,0,14.5,0,0,14.5,14.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Cervantes",1967,111,NA,5.1,23,0,4.5,14.5,14.5,4.5,34.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Cerveau, Le",1969,110,NA,6.4,367,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ces messieurs de la famille",1967,86,NA,3.8,9,0,14.5,24.5,24.5,0,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Cesante",2003,72,NA,4.6,9,44.5,14.5,0,0,14.5,0,0,0,0,34.5,"",0,1,0,0,0,0,0 -"Cesta do praveku",1955,83,NA,7,97,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Cesta peklem",1995,85,NA,2.6,11,34.5,0,34.5,4.5,4.5,0,0,0,0,4.5,"",1,0,0,0,0,0,0 -"Cesta pustym lesem",1997,87,NA,8.1,17,0,0,0,0,14.5,14.5,14.5,14.5,34.5,4.5,"",0,0,0,0,0,0,0 -"Cesta z mesta",2000,104,NA,6.7,112,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Cet homme est dangereux",1953,92,NA,3.6,5,0,0,24.5,24.5,24.5,0,0,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Cetverored",1999,123,NA,3.8,83,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Ceux d'en face",2001,92,NA,5.6,5,24.5,0,0,0,24.5,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Ceux qui m'aiment prendront le train",1998,120,NA,6.8,540,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ch'ing shaonien na cha",1992,127,NA,7.4,234,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ch. P. rayonnogo masshtaba",1988,95,NA,7,5,0,0,24.5,0,24.5,0,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Cha Cha Cha",1989,91,NA,6.2,40,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cha ma gu dao xi lie",2004,110,NA,7.5,33,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Cha no aji",2004,143,NA,8.4,154,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Cha shou",1981,92,NA,6,22,4.5,0,0,0,4.5,14.5,14.5,24.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Cha-Cha",1979,90,NA,4.8,45,14.5,0,0,4.5,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Cha-Cha-Cha",1982,81,NA,6.8,13,4.5,0,0,4.5,0,14.5,0,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Chabelo y Pepito contra los monstruos",1973,90,NA,4.6,20,24.5,0,4.5,0,24.5,0,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Chac: Dios de la lluvia",1975,95,NA,6.5,40,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Chacal de Nahueltoro, El",1969,95,NA,6.7,57,0,4.5,0,4.5,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Chacun cherche son chat",1996,91,300000,7,1105,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Chacun pour soi",1998,105,NA,6.6,20,0,0,0,4.5,14.5,24.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Chacun pour toi",1994,102,NA,6.1,13,0,4.5,0,0,14.5,34.5,34.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Chad Hanna",1940,86,NA,6.1,29,4.5,4.5,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Chafed Elbows",1966,63,25000,2.1,16,34.5,4.5,0,4.5,0,0,24.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Chai dan zhuan jia bao bei zha dan",1994,94,NA,5.1,5,0,24.5,0,0,24.5,44.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Chaikovskiy",1969,157,NA,7,35,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Chain",2004,99,NA,6.8,25,14.5,4.5,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Chain Camera",2001,90,NA,6.4,54,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Chain Gang Women",1971,85,NA,3.4,18,14.5,24.5,34.5,4.5,14.5,4.5,0,0,4.5,0,"",1,0,0,1,0,0,0 -"Chain Gang, The",1930,8,NA,6.6,43,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Chain Letters",1985,96,NA,4.2,7,0,0,14.5,14.5,0,0,0,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Chain Lightning",1950,90,NA,5.4,126,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Chain Reaction",1996,106,55000000,5.1,5936,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Chain Reaction, The",1980,92,NA,4.9,82,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Chain of Command",1994,98,NA,4.2,69,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Chain of Command",2000,96,NA,4.6,299,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Chain of Desire",1992,107,NA,4.1,138,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chain of Evidence",1957,64,NA,5.5,8,0,0,14.5,14.5,0,24.5,0,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Chain of Fools",2000,96,20000000,6.1,845,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Chain, The",1984,100,NA,6.1,62,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Chain, The",1997,10,NA,6.2,7,0,0,0,0,0,44.5,24.5,0,14.5,14.5,"",0,1,0,0,0,0,1 -"Chaindance",1990,109,NA,6.1,81,4.5,0,4.5,0,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Chained",1934,76,NA,6,99,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Chained Girls",1965,65,NA,4.3,19,4.5,24.5,4.5,24.5,4.5,0,24.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Chained Heat",1983,95,NA,4.4,272,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chained Heat II",1993,99,NA,3,153,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Chained for Life",1951,81,NA,4.1,28,0,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Chainsaw Sally",2004,82,NA,1,27,24.5,0,0,4.5,0,4.5,0,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Chainsmoker",1997,11,NA,5.4,20,14.5,0,4.5,14.5,4.5,4.5,4.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Chair de poule",1963,107,NA,6.2,12,0,0,4.5,14.5,4.5,4.5,45.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Chair, The",1989,100,3000000,3.8,40,14.5,14.5,14.5,4.5,14.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Chairman of the Board",1998,95,10000000,2.6,666,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Chairman, The",1969,93,NA,5.2,143,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Chairy Tale, A",1957,12,NA,7.1,42,0,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Chakra",1981,140,NA,6.5,8,0,0,0,0,0,24.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Chakushin ari",2003,111,NA,6.4,691,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Chalk",1996,134,400000,8.6,14,0,0,0,0,14.5,0,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Chalk Garden, The",1964,106,NA,7.3,280,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Challenge",1974,94,NA,2.4,11,14.5,14.5,14.5,14.5,4.5,0,0,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Challenge",1984,152,NA,9.8,8,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,0,1,0,0,0 -"Challenge for Robin Hood, A",1967,85,NA,5,40,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Challenge of the Ninja",1986,86,NA,3.1,14,24.5,24.5,4.5,4.5,24.5,0,0,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Challenge the Wilderness",1951,11,NA,5.1,14,4.5,0,14.5,4.5,24.5,34.5,0,4.5,0,4.5,"",0,0,0,0,1,0,1 -"Challenge to Lassie",1949,76,NA,5.4,49,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Challenge, The",1938,75,NA,6.5,16,0,4.5,4.5,4.5,4.5,4.5,4.5,45.5,4.5,0,"",0,0,0,0,0,0,0 -"Challenge, The",1960,101,NA,5.1,40,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Challenge, The",1982,113,NA,5.4,323,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Chalte Chalte",2003,167,NA,6.6,204,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Chalti Ka Naam Gaadi",1958,173,NA,7.9,27,0,0,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Chamade, La",1968,103,NA,5.2,28,0,0,0,14.5,24.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Chamane",1996,100,NA,7.5,23,0,0,0,4.5,14.5,4.5,24.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Chamber of Horrors",1966,80,NA,5.4,93,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Chamber, The",1996,113,50000000,5.7,2540,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Chambre ardente, La",1962,102,NA,6.3,11,0,0,4.5,4.5,14.5,4.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Chambre des officiers, La",2001,135,NA,7.9,360,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Chambre froide",2000,26,NA,5.6,13,34.5,0,0,0,0,14.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Chambre obscure, La",2000,107,NA,3.8,19,34.5,4.5,14.5,4.5,4.5,4.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Chambre verte, La",1978,94,NA,7.1,253,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Chameleon",1995,108,NA,5.7,177,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Chameleon Street",1989,94,NA,6.8,74,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Chameleon, The",1989,85,NA,6.5,68,0,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Chameli",2004,108,NA,7.2,56,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Champ Against Champ",1983,88,NA,7.1,10,0,0,0,14.5,0,0,34.5,0,14.5,45.5,"",1,0,0,0,0,0,0 -"Champ d'honneur",1987,87,NA,5.7,26,0,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Champ, The",1979,121,NA,5.6,933,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Champ, The",2002,7,NA,8.1,10,0,14.5,0,0,0,0,14.5,44.5,0,44.5,"",0,0,0,0,0,0,1 -"Champagne",1928,86,NA,6.7,80,4.5,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Champagne Charlie",1944,105,NA,5.5,22,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Champagne Club, The",2002,87,NA,3.5,13,24.5,14.5,14.5,34.5,4.5,0,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Champagne Safari, The",1995,100,NA,6.4,14,0,4.5,0,0,0,24.5,34.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Champagne Society",2003,20,5000,4.5,25,4.5,4.5,0,4.5,0,4.5,4.5,24.5,24.5,34.5,"",0,0,1,0,0,1,1 -"Champagne Waltz",1937,85,NA,7.1,10,0,0,0,14.5,24.5,14.5,24.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Champagne amer",1986,82,NA,6,11,0,4.5,0,4.5,0,14.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Champagne for Breakfast",1980,85,NA,6.2,11,0,0,4.5,14.5,14.5,4.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Champagne for Caesar",1950,99,NA,7.6,205,4.5,0,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Champagnegalopp",1975,83,NA,4.7,24,4.5,14.5,4.5,4.5,24.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Champion",1949,99,NA,7.7,433,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Champion",2002,117,NA,6.3,79,4.5,4.5,4.5,4.5,14.5,4.5,44.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Champion, The",1915,33,NA,7.1,175,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Champions",1984,106,NA,6,106,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Champions",1998,99,NA,3.3,86,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Champions Forever",1989,90,NA,5.9,28,4.5,0,0,4.5,0,14.5,14.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Champions Forever: The Latin Legends",1997,93,NA,1,6,64.5,0,0,0,14.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Champions of the World",1995,120,NA,9.4,41,4.5,0,0,0,0,0,4.5,4.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Chan Is Missing",1982,80,20000,6.3,135,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Chan sam ying hung",1998,86,NA,7.2,151,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Chance",2002,73,150000,8,440,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Chance at Heaven",1933,71,NA,5.7,44,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Chance of a Lifetime, The",1943,65,NA,6.7,11,0,0,4.5,0,0,14.5,14.5,44.5,0,4.5,"",0,0,0,1,0,0,0 -"Chances",1931,72,NA,6.1,20,0,4.5,4.5,4.5,4.5,34.5,14.5,24.5,14.5,0,"",0,0,0,1,0,1,0 -"Chances Are",1989,108,NA,6,1492,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Chandelier",2004,20,32000,8.7,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Chandler",1971,85,NA,4.8,29,0,4.5,14.5,14.5,34.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Chandni",1989,186,NA,7.4,56,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Chandramukhi",2005,166,NA,7.1,28,14.5,4.5,4.5,0,4.5,0,4.5,14.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Chandu on the Magic Island",1935,70,NA,5.7,11,0,0,14.5,14.5,14.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Chandu the Magician",1932,71,349456,5.7,74,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Chanel Solitaire",1981,107,7000000,4.9,52,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Chanfle II, El",1982,90,NA,7.2,19,4.5,4.5,4.5,0,4.5,4.5,34.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Chanfle, El",1979,106,NA,5.8,35,4.5,4.5,4.5,4.5,14.5,0,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Chang: A Drama of the Wilderness",1927,69,NA,7.6,96,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Change Up",2002,46,NA,9.1,15,4.5,0,0,0,0,0,0,0,24.5,74.5,"",0,0,0,1,1,0,0 -"Change moi ma vie",2001,101,NA,5.5,45,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Change of Climate, A",1999,19,15000,4.6,14,4.5,0,4.5,4.5,14.5,0,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Change of Habit",1969,93,NA,4.6,320,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Change of Heart",1934,76,NA,4.8,8,0,0,14.5,24.5,24.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Change of Mind",1969,98,NA,6,10,0,0,0,14.5,0,44.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Change of Seasons, A",1980,102,NA,5,180,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Changed Man, A",2003,19,NA,5.9,8,0,0,0,0,14.5,0,45.5,24.5,14.5,0,"",0,0,0,1,0,0,1 -"Changeling, The",1980,115,NA,7.1,2066,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Changes",1969,93,NA,4.7,7,0,0,14.5,14.5,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Changing Faces",2001,15,NA,8.5,8,0,14.5,0,0,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,1 -"Changing Habits",1997,95,1200000,5.5,134,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Changing Hearts",2002,92,NA,4.9,55,4.5,4.5,4.5,0,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Changing Lanes",2002,99,45000000,6.6,12779,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Changing Our Minds: The Story of Dr. Evelyn Hooker",1992,77,NA,6.9,10,14.5,14.5,0,0,0,14.5,0,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Changing of the Guard, The",1936,20,NA,6.1,6,0,0,0,0,14.5,0,84.5,0,0,0,"",0,0,0,0,0,0,1 -"Chann Pardesi",1980,147,NA,7.8,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Channel 69",1996,104,NA,5.4,10,14.5,0,0,34.5,14.5,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Channeling Alphonse",2003,12,0,7.6,12,4.5,0,14.5,0,4.5,0,0,0,4.5,45.5,"",0,0,1,0,0,0,1 -"Channelling Baby",1999,92,NA,4.4,25,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Channumasadan",2005,10,NA,8.7,6,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Chanoc y el hijo del Santo contra los vampiros asesinos",1981,85,NA,9.3,7,0,0,0,0,14.5,0,0,0,0,84.5,"",1,0,0,0,0,0,0 -"Chanson de Roland, La",1978,110,NA,5.4,18,0,0,4.5,14.5,14.5,24.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Chant of Jimmie Blacksmith, The",1978,108,NA,7.3,137,0,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Chanteur de Mexico, Le",1956,85,NA,5.5,10,14.5,0,0,24.5,34.5,24.5,24.5,0,0,0,"",0,0,0,0,0,1,0 -"Chantons sous l'occupation",1976,95,NA,7.9,6,0,0,14.5,0,0,0,14.5,64.5,0,0,"",0,0,0,0,1,0,0 -"Chao ji ji hua",1993,104,NA,5.8,554,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Chaos Factor, The",2000,95,NA,4.5,109,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Chapaev",1934,93,NA,6.3,63,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Chapeau claque",1974,95,NA,6.8,8,0,0,0,0,14.5,24.5,0,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Chapeau, Le",2000,6,NA,8.9,18,14.5,0,0,0,0,4.5,0,4.5,24.5,45.5,"",0,1,0,0,0,0,1 -"Chaperone",2000,20,NA,8,17,0,4.5,0,0,0,0,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Chaplin",1992,143,NA,6.9,4187,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Chaplin Revue, The",1959,119,NA,7.3,80,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Chaplin's Goliath",1996,54,NA,8,8,14.5,0,0,0,0,14.5,34.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Chaplinesque, My Life and Hard Times",1972,56,NA,8,6,0,0,0,0,0,0,34.5,45.5,14.5,0,"",0,0,0,0,1,0,0 -"Chapman Report, The",1962,125,NA,5.2,97,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Chappaqua",1966,82,NA,5.4,84,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chapter Perfect",1998,100,NA,2.1,13,24.5,4.5,14.5,4.5,14.5,0,0,0,4.5,24.5,"R",0,0,0,1,0,0,0 -"Chapter Two",1979,124,NA,5.7,206,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Chapter Zero",1999,104,1500000,5.1,47,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Charachar",1993,97,NA,4.9,6,14.5,0,0,0,34.5,0,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Character Studies",1921,6,NA,6.3,5,0,0,0,0,0,24.5,24.5,24.5,44.5,0,"",0,0,1,0,0,0,1 -"Charade",1953,83,NA,6.7,49,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Charade",1963,113,4000000,8.1,9046,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Charade",1984,5,NA,8.2,41,4.5,0,4.5,0,4.5,4.5,24.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Charades",1998,94,NA,4.1,62,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Charcoal Black",1972,91,NA,5.6,13,34.5,4.5,0,0,14.5,14.5,4.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Charge at Feather River, The",1953,95,NA,5.9,87,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Charge of the Lancers",1954,73,NA,4.7,17,4.5,0,14.5,34.5,4.5,24.5,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Charge of the Light Brigade, The",1936,115,1200000,7.2,547,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,1,0 -"Charge of the Light Brigade, The",1968,139,8000000,6.2,300,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Charge of the Model Ts, The",1979,90,NA,3.7,10,14.5,14.5,24.5,34.5,0,14.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Charing Cross Road",1935,72,NA,6.6,5,0,0,0,24.5,24.5,0,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Chariots of Fire",1981,123,5500000,7.3,6666,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Chariots of Fur",1994,6,NA,7.2,34,0,0,0,4.5,0,14.5,24.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Charity",2004,15,NA,7.9,10,24.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,1,0,0,0,1 -"Charles Mingus: Triumph of the Underdog",1998,78,NA,6.2,22,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Charles et Lucie",1979,95,NA,6.8,8,14.5,0,0,0,14.5,14.5,24.5,0,34.5,0,"",0,0,0,0,0,0,0 -"Charles mort ou vif",1969,93,NA,7.1,28,0,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Charles' tante",1959,101,NA,6.8,93,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Charleston",1977,93,NA,5.7,50,0,4.5,4.5,0,24.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Charleston Chain Gang",1902,1,NA,3.7,7,0,14.5,44.5,0,24.5,14.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Charley Moon",1956,92,NA,6.1,6,0,0,14.5,14.5,14.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Charley One-Eye",1972,96,NA,5.6,19,0,0,4.5,14.5,24.5,34.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Charley Varrick",1973,111,NA,7.4,1155,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Charley and the Angel",1973,93,NA,5.2,74,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Charley's Aunt",1930,88,NA,6.1,37,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Charley's Aunt",1941,80,NA,6.6,63,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Charley's Big-Hearted Aunt",1940,72,NA,7.3,8,0,0,0,24.5,0,0,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Charleys Tante",1963,90,NA,4,38,24.5,4.5,4.5,14.5,14.5,14.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Charlie",2004,94,5000000,5,141,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Charlie & Louise - Das doppelte Lottchen",1994,98,NA,4.6,75,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Charlie Bravo",1980,94,NA,5.2,12,4.5,0,0,34.5,14.5,0,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Charlie Bubbles",1967,89,NA,6,101,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Charlie Butterfly",2002,100,NA,4.1,11,34.5,0,0,24.5,0,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Charlie Chan Carries On",1931,76,NA,7.9,83,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Charlie Chan and the Curse of the Dragon Queen",1981,97,NA,3.5,192,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Charlie Chan at Monte Carlo",1937,71,NA,6.5,154,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan at Treasure Island",1939,72,120000,7.4,206,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Charlie Chan at the Circus",1936,72,NA,7.1,180,4.5,0,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Charlie Chan at the Olympics",1937,71,NA,7.1,213,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan at the Opera",1936,68,NA,7.3,311,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan at the Race Track",1936,70,NA,7.3,177,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan at the Wax Museum",1940,63,NA,7.2,224,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in Black Magic",1944,67,75000,6.2,167,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in City in Darkness",1939,75,NA,6.6,147,0,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in Egypt",1935,72,NA,7,212,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in Honolulu",1938,67,NA,7,191,0,4.5,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in London",1934,79,100000,7.1,229,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in Panama",1940,66,NA,7.3,170,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Charlie Chan in Paris",1935,72,110000,7,199,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in Reno",1939,70,NA,7.1,159,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in Rio",1941,60,NA,6.7,197,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in Shanghai",1935,70,NA,6.7,149,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan in The Chinese Cat",1944,65,75000,6.5,190,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Charlie Chan in the Secret Service",1944,63,75000,6.6,180,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan on Broadway",1937,68,NA,7.3,164,0,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chan's Chance",1932,73,NA,7.9,52,0,0,0,0,4.5,4.5,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Charlie Chan's Courage",1934,70,NA,7.5,52,0,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Charlie Chan's Greatest Case",1933,70,NA,7.5,50,0,0,0,0,14.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Charlie Chan's Murder Cruise",1940,77,NA,7.1,110,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Charlie Chan's Secret",1936,72,NA,6.9,108,0,0,0,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Charlie Chaplin Carnival",1938,100,NA,5.7,12,24.5,0,0,0,0,0,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Charlie Chaplin Cavalcade",1938,75,NA,6,24,24.5,4.5,0,0,0,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Charlie Chaplin Festival",1938,96,NA,6.1,24,14.5,4.5,0,4.5,0,0,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Charlie Is My Darling",1966,60,NA,5.5,8,0,0,0,0,14.5,24.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Charlie McCarthy, Detective",1939,65,NA,6.6,17,4.5,0,0,14.5,4.5,24.5,0,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Charlie Noir",2002,9,NA,8.2,6,0,0,14.5,0,0,14.5,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Charlie Ve'hetzi",1974,105,NA,5,38,4.5,4.5,4.5,14.5,0,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Charlie and the Talking Buzzard",1979,66,NA,4.5,6,0,14.5,0,14.5,0,0,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Charlie the Ox",2004,93,NA,9,27,0,0,4.5,0,4.5,4.5,0,0,14.5,74.5,"",0,0,0,0,0,0,0 -"Charlie's Angels",2000,94,92000000,5.8,25705,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Charlie's Angels: Full Throttle",2003,107,120000000,5,13990,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Charlie's Ghost Story",1994,88,NA,4.5,73,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Charlie's War",2003,115,NA,6.5,6,0,34.5,0,0,0,14.5,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Charlie, the Lonesome Cougar",1967,75,NA,6.5,105,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Charlie: The Life and Art of Charles Chaplin",2003,132,NA,7.4,142,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Charlotje",1998,13,NA,5.2,10,24.5,14.5,0,0,24.5,24.5,0,14.5,24.5,0,"",0,0,0,1,0,0,1 -"Charlotte",1981,96,NA,6.1,36,0,0,4.5,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Charlotte Gray",2001,121,NA,6.3,1832,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Charlotte Sometimes",2002,85,80000,4.6,555,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Charlotte et son Jules",1960,20,NA,6.5,107,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Charlotte for Ever",1986,94,NA,5.1,42,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Charlotte's Web",1973,94,NA,6.7,1596,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Charly",1968,103,NA,7.2,931,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Charly",2002,103,950000,5.5,149,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"PG",0,0,1,1,0,1,0 -"Charly & Steffen",1979,83,NA,5.3,23,4.5,14.5,0,4.5,24.5,34.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Charm School",1986,84,NA,4.5,11,0,0,4.5,14.5,4.5,14.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Charme discret de la bourgeoisie, Le",1972,102,NA,7.9,2913,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Charming Billy",1999,82,250000,5.3,39,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Charming Sinners",1929,85,NA,5.4,5,0,0,0,24.5,24.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Charnel House, The",2002,15,NA,5.7,16,0,0,4.5,14.5,4.5,34.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,1 -"Charrito",1984,90,NA,6.5,8,0,14.5,0,0,14.5,24.5,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Charro!",1969,98,NA,4.9,195,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chartres Series, The",1994,9,NA,6.8,6,14.5,0,0,0,0,14.5,0,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Chartreuse de Parme, La",1948,170,NA,6.9,47,4.5,0,4.5,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Chartroose Caboose",1960,75,NA,6.4,19,24.5,0,0,0,14.5,4.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Charulata",1964,117,NA,8.1,211,0,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Chase a Crooked Shadow",1957,87,NA,6.8,87,0,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Chase, The",1946,86,NA,6.3,53,4.5,0,0,0,14.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chase, The",1966,133,NA,7,1000,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Chase, The",1994,89,NA,5.3,3224,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Chase, The",2003,3,2000,8.3,6,0,0,0,0,14.5,0,14.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Chaser on the Rocks",1965,7,NA,3.6,17,24.5,14.5,14.5,14.5,0,24.5,4.5,0,0,0,"",0,1,1,0,0,0,1 -"Chaser, The",1938,75,NA,5.8,17,4.5,0,0,4.5,24.5,14.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Chasers",1994,102,NA,4.8,1066,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Chases of Pimple Street, The",1934,20,NA,9.1,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Chashme Buddoor",1981,145,NA,8.5,40,0,0,0,0,4.5,4.5,4.5,24.5,24.5,44.5,"",0,0,1,0,0,1,0 -"Chasin' Pink",1998,75,NA,6.8,36,4.5,0,0,0,4.5,0,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Chasing Amy",1997,111,250000,7.6,32141,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Chasing Choo Choos",1927,21,NA,7.9,15,0,0,0,0,0,14.5,24.5,24.5,0,34.5,"",0,0,1,0,0,0,1 -"Chasing Daylight",2004,21,NA,9.2,11,4.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,1,0,0,1 -"Chasing Destiny",2001,91,NA,4.9,72,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"PG-13",0,0,1,1,0,1,0 -"Chasing Dreams",1982,94,NA,2.8,69,44.5,14.5,4.5,14.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Chasing Holden",2001,101,NA,5,136,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Chasing Jason",2004,7,2000,7,9,0,0,0,0,14.5,14.5,14.5,24.5,0,44.5,"",0,0,1,0,0,0,1 -"Chasing Kevin",2000,21,NA,4.1,72,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Chasing Liberty",2004,111,23000000,5.7,1911,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Chasing Papi",2003,81,NA,4.2,598,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Chasing Rainbows",1930,100,NA,6.9,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Chasing Sleep",2000,104,NA,6.4,496,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Chasing Yesterday",1935,77,NA,4.6,14,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Chasing a Rainbow: The Life of Josephine Baker",1986,90,NA,7,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Chasing the Deer",1994,97,NA,4.1,28,4.5,4.5,14.5,0,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Chasing the Dragon",2000,120,NA,6.8,12,14.5,0,0,0,4.5,24.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Chasing the Edge",2004,15,0,9.2,10,0,14.5,0,0,0,0,0,0,0,94.5,"",0,0,0,0,1,0,1 -"Chasse aux papillons, La",1992,114,NA,6.3,85,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Chasse papillon",2001,11,NA,5.4,17,4.5,0,0,0,14.5,34.5,24.5,4.5,14.5,0,"",0,1,0,1,0,0,1 -"Chastity",1969,81,NA,4.6,89,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Chastnaya zhizn",1982,102,NA,6.5,9,0,0,0,14.5,14.5,14.5,0,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Chastnyy detektiv, ili operatsiya 'Kooperatsiya'",1990,94,NA,4.9,34,0,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Chat d'appartement, Le",1998,7,NA,8.3,6,0,0,0,0,0,34.5,0,14.5,0,45.5,"",0,1,0,0,0,0,1 -"Chat dans le sac, Le",1964,74,NA,8.5,40,0,0,4.5,0,0,4.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Chat et la souris, Le",1975,107,NA,6.8,51,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Chat min yan",1975,92,NA,6.4,5,24.5,0,0,0,0,24.5,0,44.5,24.5,0,"",1,0,0,0,0,0,0 -"Chat, Le",1971,86,NA,7.6,140,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Chatarra",1991,96,NA,4.7,15,0,0,4.5,44.5,14.5,0,14.5,0,14.5,4.5,"",0,0,0,1,0,0,0 -"Chato's Land",1972,110,NA,6.1,352,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Chatouilleuses, Les",1975,100,NA,4.2,7,24.5,0,0,14.5,0,0,0,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Chattahoochee",1989,97,NA,5.9,275,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Chattanooga Choo Choo",1984,102,NA,4.5,104,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Chatte andalouse, La",2002,48,NA,6.7,18,0,0,0,14.5,0,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Chatte sort ses griffes, La",1960,102,NA,6.7,9,0,14.5,0,14.5,14.5,24.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Chatte, La",1958,108,NA,6.7,14,0,0,4.5,4.5,4.5,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,1,0 -"Chatterbox",1936,68,NA,5.4,32,0,0,14.5,14.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Chatterbox",1943,77,NA,6.3,6,0,0,14.5,0,0,34.5,14.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Chatterbox",1977,73,NA,5.7,54,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Chau ji da Kuo min",1995,104,NA,8.2,18,14.5,4.5,0,0,14.5,0,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Chaud lapin, Le",1974,120,NA,5,17,4.5,4.5,4.5,14.5,4.5,0,24.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Chaudhvin Ka Chand",1960,169,NA,6.1,24,0,0,0,0,4.5,14.5,4.5,24.5,34.5,4.5,"",0,0,0,0,0,1,0 -"Chaverim Shel Yana, Ha-",1999,90,NA,7.3,193,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Chavez Ravine",1992,30,NA,6.4,18,0,0,0,0,24.5,24.5,34.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Chayim Al-Pi Agfa, Ha-",1992,100,NA,7.4,118,4.5,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Chayka",1970,100,NA,6.1,8,0,0,0,0,14.5,24.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Che c'entriamo noi con la rivoluzione?",1973,103,NA,5.2,21,14.5,0,0,4.5,24.5,4.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Che gioia vivere",1960,132,NA,6.7,101,0,0,0,0,4.5,14.5,34.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Che si shi si",2001,11,NA,7.2,41,4.5,0,0,0,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Che!",1969,96,2800000,3.3,100,34.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Che, El",1997,88,NA,6.8,25,4.5,0,4.5,0,0,14.5,44.5,14.5,4.5,14.5,"",0,0,0,1,1,0,0 -"Cheap Detective, The",1978,92,NA,6,600,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Cheap Rate Gravity",2002,10,NA,6.5,7,0,0,0,0,0,24.5,44.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Cheaper by the Dozen",1950,85,NA,7.1,676,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Cheaper by the Dozen",2003,98,40000000,5.8,5977,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Cheaper to Keep Her",1980,92,NA,3,31,14.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Cheat, The",1915,59,17311,7.2,188,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Cheat, The",1931,74,NA,6.2,10,14.5,0,0,0,14.5,14.5,45.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Cheaters, The",1930,82,NA,6.4,7,0,0,0,14.5,0,14.5,24.5,0,14.5,24.5,"",0,0,0,1,0,1,0 -"Cheaters, The",1945,60,NA,6.7,49,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Cheaters, The",2001,80,NA,3.7,5,24.5,0,64.5,0,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Cheating",1952,12,NA,3.4,59,34.5,14.5,14.5,4.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,1,0,0,1 -"Cheats",2002,90,NA,5.9,783,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Cheb",1991,79,NA,6.4,15,0,0,0,4.5,0,24.5,34.5,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Cheburashka",1972,19,NA,7.6,44,0,0,0,4.5,4.5,0,4.5,24.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Chechahcos, The",1924,87,NA,6.8,35,0,0,0,4.5,4.5,4.5,34.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Check Is in the Mail..., The",1986,91,NA,4.6,40,14.5,14.5,4.5,24.5,14.5,14.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Check Your Guns",1948,55,NA,5,10,0,0,14.5,44.5,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Check and Double Check",1930,77,NA,4.4,42,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"CheckMating",1996,7,NA,4,13,4.5,0,0,0,14.5,24.5,14.5,14.5,0,24.5,"",0,0,0,1,0,1,1 -"Checkered Flag",1990,91,NA,4.8,33,14.5,0,0,24.5,34.5,4.5,0,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Checkered Flag or Crash",1977,95,NA,4.4,33,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Checkered Flag, The",1962,110,NA,2.3,5,64.5,0,24.5,0,0,0,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Checkout",2002,100,NA,4,21,14.5,14.5,0,4.5,4.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Checkpoint",1956,86,NA,5.6,23,0,0,0,4.5,34.5,34.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Cheech & Chong's Next Movie",1980,99,NA,5.3,1938,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Cheech & Chong's The Corsican Brothers",1984,82,NA,4,677,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cheek to Cheek",2000,38,NA,8.4,8,0,0,0,0,0,14.5,0,45.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Cheeky",2003,94,NA,8,26,4.5,4.5,0,0,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Cheer Up and Smile",1930,76,NA,4.3,13,34.5,4.5,0,4.5,0,4.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cheering Section",1977,84,NA,3.5,10,34.5,0,14.5,24.5,0,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Cheerleader",2003,24,5500,8.8,8,14.5,0,0,0,0,14.5,34.5,0,24.5,14.5,"",0,0,0,0,1,0,1 -"Cheerleader Camp",1987,89,NA,3.7,203,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cheerleader Ninjas",2002,96,NA,3.1,151,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Cheerleaders' Beach Party",1978,85,NA,3.3,8,0,34.5,34.5,0,0,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Cheerleaders' Wild Weekend",1979,87,NA,2.8,49,24.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cheerleaders, The",1973,84,153000,5,177,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Cheers for Miss Bishop",1941,95,NA,6.5,63,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Cheese Burglar",1946,7,NA,4.6,17,0,4.5,14.5,0,24.5,4.5,14.5,14.5,0,24.5,"",0,1,0,0,0,0,1 -"Cheese Chasers",1951,7,NA,7.7,48,4.5,0,0,4.5,0,4.5,14.5,34.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Cheese It, the Cat!",1957,7,NA,6.7,21,4.5,0,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Cheese Makes You Dream",2003,5,NA,6.1,11,34.5,0,0,0,0,4.5,4.5,0,0,44.5,"",0,0,0,1,0,0,1 -"Cheetah",1989,83,5000000,5.9,115,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chef Donald",1941,7,NA,7,47,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Chef!",1999,61,NA,5.1,13,0,0,4.5,0,14.5,24.5,14.5,34.5,4.5,0,"",0,0,0,0,1,0,0 -"Chek",2000,110,NA,5,5,0,24.5,0,24.5,0,0,24.5,0,0,44.5,"",1,0,0,0,0,0,0 -"Chek law dak gung",2002,90,NA,5.4,651,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,1,0 -"Chekhovskie motivy",2002,120,NA,4.6,82,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Chekist",1992,93,NA,6.9,34,4.5,4.5,4.5,4.5,4.5,0,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Chelovek idyot za solntsem",1961,66,NA,7.5,7,14.5,0,0,0,0,0,14.5,45.5,0,14.5,"",0,0,0,1,0,0,0 -"Chelovek niotkuda",1961,81,NA,6.6,21,0,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Chelovek s bulvara Kaputsinov",1987,99,NA,7.9,129,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Chelovek s kinoapparatom",1929,68,NA,7.9,1199,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Chelovek s ruzhyom",1938,88,NA,2.9,16,14.5,0,4.5,0,0,4.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Chelovek ukhodit za ptitsami",1975,87,NA,5.7,7,0,0,14.5,0,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Chelovek-Amfibiya",1962,82,NA,6.1,94,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Chelovek-nevidimka",1984,89,NA,6.8,13,4.5,0,0,0,0,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Chelsea Girls",1966,210,NA,6.4,127,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Chelsea Walls",2001,109,NA,4.3,600,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Chemi bebia",1929,65,NA,8.7,6,0,0,0,0,0,0,0,64.5,0,34.5,"",0,0,1,0,0,0,0 -"Chemin perdu, Le",1980,107,NA,6.2,5,0,0,0,0,44.5,44.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Chemins de l'oued, Les",2002,78,NA,5.9,35,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chemins de traverse",2004,101,NA,5.2,34,4.5,0,24.5,4.5,14.5,14.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Chemist, The",1936,19,NA,6.7,8,0,0,14.5,14.5,24.5,0,34.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Chemmeen",1965,140,NA,6.4,19,0,0,4.5,0,0,14.5,0,24.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Chen Mo he Meiting",2002,78,NA,6.4,28,0,0,4.5,0,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chen nu yu hun",1960,83,NA,7.5,10,0,0,0,0,0,0,34.5,24.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Cheng shi lie ren",1993,105,NA,6.2,919,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"PG-13",1,0,1,0,0,1,0 -"Cheng shi te jing",1988,90,NA,6.7,84,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Cheob-sok",1997,105,NA,7.8,109,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,1,0 -"Cheong feng",1999,81,NA,7.2,579,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Cheong wong",2000,89,NA,6.9,114,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Cheongchun",2000,119,NA,5.6,34,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cheongpung myeongwol",2003,100,NA,5.9,157,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Cheonnyeon ho",2003,92,NA,5.8,179,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Cheonsamong",2001,84,NA,3.4,67,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,1,0 -"Cheot sarang",1993,110,NA,7.3,18,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Cheotsarang sasu gwolgidaehoe",2003,108,NA,4.8,81,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Chepor, La",2004,16,NA,1,13,45.5,0,0,4.5,0,4.5,0,0,4.5,24.5,"",0,0,1,0,0,0,1 -"Cherchez l'erreur",1980,85,NA,5.9,5,0,0,0,24.5,24.5,24.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Cherchez l'idole",1963,85,NA,5.7,11,0,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Cherez ternii k zvyozdam",1981,148,NA,4.2,79,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Cherish",2002,99,1500000,6.5,743,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Chernata lyastovitza",1997,104,NA,3.7,17,14.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,0,1,0,0,0 -"Chernite angeli",1970,139,NA,6,13,4.5,4.5,4.5,24.5,0,0,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Chernobyl Heart",2003,39,NA,8.9,53,0,0,0,0,0,0,4.5,24.5,24.5,45.5,"",0,0,0,0,1,0,1 -"Chernov/Chernov",1990,99,NA,9.7,6,0,0,0,0,0,14.5,0,0,0,84.5,"",0,0,0,1,0,0,0 -"Cherokee Strip",1940,86,NA,5.9,10,0,0,0,14.5,0,74.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Cherokee Strip, The",1937,55,NA,5.7,11,0,0,14.5,4.5,14.5,34.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Cherry",1999,90,NA,5.2,139,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Cherry 2000",1987,95,NA,4.7,1157,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cherry Falls",2000,92,14000000,4.9,2165,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Cherry Hill High",1977,87,NA,3.2,21,24.5,0,14.5,4.5,4.5,14.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Cherry Orchard, The",1999,141,5000000,6.4,127,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cherry, Harry & Raquel!",1970,71,90000,4.6,189,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cheshmane John Malkovich",2004,90,NA,9.1,15,0,0,0,0,0,0,0,34.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Chess",1993,4,NA,5.2,21,4.5,0,4.5,0,14.5,4.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Chess Dispute, A",1903,1,NA,6.3,27,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Chess-Nuts",1932,7,NA,6.4,19,14.5,0,0,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Chester Story, The",2003,101,NA,7.6,29,0,4.5,0,0,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Chesty Anderson, USN",1976,88,NA,4.2,20,14.5,4.5,4.5,4.5,34.5,0,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Chetniks",1943,73,NA,4.1,7,14.5,0,0,14.5,0,0,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cheun gwong tsa sit",1997,96,NA,7.4,2102,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Cheval d'orgueil, Le",1980,120,NA,6.4,27,0,0,4.5,14.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chevrolet",1997,96,NA,5.2,22,14.5,0,0,4.5,24.5,4.5,4.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Chewin' Bruin, The",1940,7,NA,5.5,8,14.5,0,0,14.5,0,34.5,0,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Chewingum",1984,100,NA,5.3,7,14.5,0,14.5,14.5,0,24.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Cheyenne",1947,99,NA,6.5,41,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Cheyenne Autumn",1964,154,4200000,6.8,560,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cheyenne Social Club, The",1970,103,NA,6.5,572,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cheyenne Takes Over",1947,58,NA,6.7,10,0,0,0,14.5,24.5,44.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Cheyenne Wildcat",1944,56,NA,7,9,0,0,0,0,24.5,0,45.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Chez nous",1978,99,NA,7.8,6,0,0,0,14.5,0,0,34.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Chhaila Babu",1977,146,NA,7.5,6,0,0,0,0,0,0,64.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Chhoti Si Baat",1975,123,NA,7.1,32,0,0,4.5,0,0,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Chi Girl",1999,87,NA,7,6,14.5,0,0,0,0,0,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Chi l'ha vista morire?",1972,90,NA,6.4,155,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chi luo tian shi",1995,100,NA,4.5,22,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Chi o suu bara",1974,87,NA,5.5,25,0,4.5,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Chi sei?",1974,109,350000,3.1,84,14.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Chi to hone",2004,140,NA,7.2,65,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Chi trova un amico, trova un tesoro",1981,110,NA,6.1,394,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Chia e tazi pesen?",2003,70,NA,7,18,0,14.5,0,0,24.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Chiara",1999,25,NA,4.3,19,44.5,14.5,4.5,4.5,24.5,0,4.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Chiave, La",1983,116,NA,5.5,151,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chiavi di casa, Le",2004,105,NA,7,153,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Chibideka monogatari",1958,51,NA,9.8,8,0,0,0,0,0,0,14.5,0,14.5,74.5,"",0,0,0,0,0,0,0 -"Chibikko Remi to meiken Capi",1970,81,NA,8.1,8,0,0,0,0,0,0,14.5,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Chica de Via Condotti, La",1974,97,NA,5,74,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Chica de las bragas transparentes, La",1981,99,NA,4,8,14.5,0,24.5,0,14.5,0,0,0,34.5,14.5,"",1,0,1,0,0,0,0 -"Chica del Molino Rojo, La",1973,162,NA,3.3,9,24.5,14.5,0,0,24.5,0,0,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Chica del lunes, La",1967,78,NA,5.4,11,4.5,0,0,0,24.5,24.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Chicago",1927,90,NA,9,19,0,0,0,0,4.5,0,0,14.5,14.5,64.5,"",0,0,1,1,0,0,0 -"Chicago",2002,113,45000000,7.5,34933,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Chicago Cab",1998,96,NA,6.4,586,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Chicago Calling",1952,75,NA,5.6,11,0,0,0,4.5,14.5,4.5,4.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Chicago Confidential",1957,75,NA,6,30,4.5,0,0,4.5,34.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Chicago Deadline",1949,86,NA,5.9,23,0,0,0,4.5,14.5,34.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Chicago Filmmakers on the Chicago River",1998,77,NA,8.1,17,4.5,4.5,0,4.5,4.5,0,0,14.5,0,64.5,"",0,0,0,0,1,0,0 -"Chicago Joe and the Showgirl",1990,103,NA,4.4,160,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Chicago Syndicate",1955,83,NA,6.4,11,0,0,0,0,14.5,44.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Chicas de Copacabana, Las",1981,95,NA,6.8,5,24.5,0,0,24.5,0,0,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Chicas de la Cruz Roja, Las",1958,83,NA,5.8,18,14.5,0,0,14.5,0,24.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Chicas del tanga, Las",1987,84,NA,7.3,5,24.5,0,0,0,0,0,0,0,24.5,64.5,"",0,0,0,0,0,0,0 -"Chichi ariki",1942,94,NA,8.6,46,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Chick Street Fighter",2001,88,NA,2.1,14,45.5,0,14.5,0,0,4.5,4.5,0,4.5,14.5,"",1,0,0,1,0,0,0 -"Chicken",1996,90,NA,3.4,15,14.5,24.5,14.5,4.5,4.5,24.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Chicken",2001,3,NA,6.9,37,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Chicken Chronicles, The",1977,95,NA,4.7,56,14.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Chicken Every Sunday",1949,94,NA,6.5,25,0,0,0,4.5,4.5,44.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Chicken Heart",2002,105,NA,6.7,32,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Chicken Jitters",1939,7,NA,7.3,5,0,0,0,0,24.5,24.5,0,64.5,0,0,"",0,1,1,0,0,0,1 -"Chicken Kiev",2000,9,NA,6.1,28,0,0,4.5,0,14.5,34.5,24.5,14.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Chicken Little",1943,8,NA,7.7,57,0,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Chicken Park",1994,97,NA,2.1,364,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Chicken Party",2003,29,NA,6.6,10,0,0,0,14.5,0,14.5,34.5,0,14.5,44.5,"",0,0,1,0,0,0,1 -"Chicken Pox Pal",1999,10,NA,7.1,19,0,0,0,0,14.5,14.5,14.5,4.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Chicken Ranch",1983,74,NA,5.7,30,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Chicken Real",1970,23,NA,6.1,9,0,0,0,0,14.5,24.5,44.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Chicken Run",2000,84,42000000,7.4,25099,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Chicken Tikka Masala",2005,90,NA,5.1,15,24.5,4.5,0,24.5,4.5,14.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Chicken Tree, The",1998,13,NA,1.6,13,45.5,0,0,4.5,0,0,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Chicken a La King",1937,7,NA,4.1,7,0,0,45.5,14.5,14.5,0,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Chicken from Outer Space, The",1995,8,NA,8.9,40,4.5,0,0,0,4.5,0,0,24.5,24.5,45.5,"",0,1,0,0,0,0,1 -"Chicken in the Rough",1951,7,NA,6,21,0,0,14.5,0,4.5,4.5,44.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Chicken of Tomorrow, The",1948,20,NA,3,40,44.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,1,0,1 -"Chickendales",2003,7,NA,5.3,13,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Chickens Come Home",1931,30,NA,7.5,115,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Chicks in White Satin",1994,25,NA,5.3,7,0,0,0,14.5,0,0,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Chicks, Man",1999,93,NA,4,47,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Chico",2001,112,NA,6.6,68,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Chico Rei",1985,115,NA,4.6,5,24.5,0,0,0,24.5,0,0,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Chicos con las chicas, Los",1967,81,NA,4.4,5,0,24.5,0,24.5,44.5,0,0,0,24.5,0,"",0,0,1,0,0,0,0 -"Chicos de la guerra, Los",1984,105,NA,6.1,22,4.5,4.5,0,14.5,14.5,14.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Chicos del Preu, Los",1967,89,NA,4.8,12,4.5,0,0,4.5,45.5,0,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Chicos ricos",2000,87,NA,2.3,22,34.5,14.5,4.5,0,4.5,4.5,0,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Chidambaram",1985,103,NA,7.8,9,24.5,0,0,0,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,0 -"Chiedi la luna",1991,88,NA,6.8,43,4.5,0,0,0,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Chiedimi se sono felice",2000,100,NA,6.8,300,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Chiedo asilo",1979,110,NA,5.2,90,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Chief Crazy Horse",1955,86,NA,5.7,63,4.5,0,4.5,14.5,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chief, The",1933,65,NA,5.9,5,0,0,0,24.5,0,44.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Chienne, La",1931,95,NA,8.3,245,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Chiens chauds, Les",1980,97,NA,2.9,13,14.5,14.5,0,24.5,4.5,34.5,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Chiens perdus sans collier",1955,98,NA,6.5,12,0,0,0,0,14.5,4.5,44.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Chiens, Les",1979,100,NA,5.8,31,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Chiesa, La",1989,98,3500000,5.9,486,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chigireta ai no satsujin",1993,101,NA,4.5,9,34.5,0,14.5,0,14.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Chignon d'Olga, Le",2002,96,NA,7.1,99,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Chihwaseon",2002,117,NA,7.3,429,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Chiisana penguin lolo no buken",1989,75,NA,4.6,40,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,1,0,0,0,0,0 -"Chik yeung tin sai",2002,106,NA,6.8,1059,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,1,0,0,1,0 -"Chika's Bird",2004,12,NA,8.6,5,0,0,0,0,0,24.5,24.5,0,0,64.5,"",0,0,0,1,0,0,1 -"Chikamatsu monogatari",1954,102,NA,8.1,124,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Chikin Biznis",1998,103,NA,8.1,10,0,0,0,24.5,0,14.5,34.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Chiklo gouyeung",1992,89,NA,6,424,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Chikuzan hitori tabi",1977,119,NA,6.1,5,0,0,0,44.5,0,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Chikyu Boeigun",1957,85,NA,5.9,129,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Child Bride",1938,62,NA,4.8,24,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Child Is Born, A",1939,79,NA,7.3,23,0,0,4.5,0,4.5,24.5,14.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Child Is Waiting, A",1963,104,NA,7.3,239,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Child Psychology",2004,14,7000,6.6,7,0,24.5,0,0,0,0,0,45.5,0,14.5,"",0,0,1,0,0,0,1 -"Child Psykolojiky",1941,6,NA,5.4,6,0,0,14.5,14.5,14.5,14.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Child Under a Leaf",1974,88,NA,5,14,4.5,4.5,4.5,14.5,24.5,4.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Child of Divorce",1946,62,NA,5.9,14,0,0,0,4.5,24.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Child of Manhattan",1933,70,NA,5,13,0,0,4.5,4.5,4.5,14.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Child of the Ghetto, A",1910,16,NA,4.6,6,34.5,14.5,0,0,14.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Child's Play",1953,68,NA,5.2,23,24.5,4.5,4.5,4.5,14.5,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Child's Play",1972,100,NA,5.4,88,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Child's Play",1980,27,NA,5.8,5,24.5,0,0,24.5,24.5,0,0,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Child's Play",1988,87,19000000,5.9,4250,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Child's Play 2",1990,84,13000000,4.5,2327,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Child's Play 3",1991,90,NA,3.8,2074,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Child, The",1977,85,NA,3.7,91,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Childhood",1999,85,NA,9,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Childhood's End",1997,115,600000,4.4,38,24.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Childish Things",1969,98,NA,5.3,11,0,0,14.5,14.5,4.5,0,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Children Galore",1955,60,NA,5,8,0,14.5,0,0,45.5,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Children On Their Birthdays",2002,102,10000000,6,163,24.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Children Shouldn't Play with Dead Things",1972,87,70000,4.4,413,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Children Speak",1996,11,NA,8.5,6,0,0,0,34.5,0,0,0,14.5,45.5,0,"",0,1,0,0,0,0,1 -"Children Underground",2000,104,NA,8.3,165,0,0,0,0,4.5,4.5,4.5,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Children Who Labor",1912,13,NA,5.3,13,0,4.5,4.5,0,34.5,34.5,4.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Children of Chabannes, The",1999,93,NA,8.5,17,0,0,0,0,0,14.5,4.5,24.5,44.5,14.5,"",0,0,0,0,1,0,0 -"Children of Divorce",1927,70,NA,8.4,13,0,0,4.5,0,0,4.5,34.5,0,14.5,34.5,"",0,0,0,1,0,1,0 -"Children of Leningradsky, The",2005,35,NA,8.2,19,0,0,0,0,0,0,0,24.5,44.5,34.5,"",0,0,0,0,1,0,1 -"Children of Pleasure",1930,70,NA,6.9,9,0,0,0,24.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Children of Rage",1975,106,NA,5.6,6,0,0,0,14.5,14.5,34.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Children of Sanchez, The",1979,90,NA,5.2,36,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Children of Theatre Street, The",1977,90,NA,7.8,18,0,4.5,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Children of a Lesser God",1986,119,NA,7,2797,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Children of the Arcana",2003,22,11000,7.1,8,24.5,0,0,0,0,0,14.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Children of the Corn",1984,93,3000000,4.9,3562,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Children of the Corn II: The Final Sacrifice",1993,92,900000,3.2,937,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Children of the Corn III",1995,92,NA,3.3,678,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Children of the Damned",1963,90,NA,5.7,407,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Children of the Living Dead",2001,90,NA,2.1,385,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Children of the Night",1991,92,NA,3.9,137,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Children of the Revolution",1996,101,NA,6.3,786,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Children of the Revolution",1999,64,NA,4.3,12,4.5,4.5,14.5,0,4.5,14.5,14.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Children of the Struggle",1999,31,NA,9.3,6,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,0,1,0,0,1 -"Children's Hour, The",1961,107,3600000,7.3,1089,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Children's Midsummer Night's Dream, The",2001,115,NA,8.6,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Children, The",1980,93,NA,4.6,140,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Children, The",1990,115,NA,6.2,22,0,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Childstar",2004,98,NA,7.1,107,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Chile, la memoria obstinada",1997,52,NA,7.1,46,4.5,4.5,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Chilean Gothic",2000,45,NA,8,7,0,0,0,24.5,0,0,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Chili Con Carne Club, The",1993,30,NA,2.8,24,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Chili Corn Corny",1965,6,NA,6.3,19,4.5,4.5,4.5,0,24.5,14.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Chili Weather",1963,6,NA,6.3,20,0,0,0,4.5,34.5,14.5,24.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Chili con carne",1999,103,NA,4.7,36,4.5,14.5,4.5,24.5,14.5,24.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Chill Factor",1990,95,NA,4.5,9,14.5,14.5,14.5,0,24.5,24.5,14.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Chill Factor",1999,101,34000000,5,2542,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Chillers",1987,91,NA,2.9,75,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Chillicothe",1999,90,NA,7.1,96,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Chilling, The",1989,95,NA,2.4,48,44.5,14.5,14.5,4.5,4.5,0,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Chilsu wa Mansu",1988,109,NA,7.1,33,0,4.5,0,0,4.5,4.5,14.5,44.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chiltern Hundreds, The",1949,84,NA,6.6,20,0,0,0,0,4.5,14.5,44.5,34.5,0,14.5,"",0,0,1,0,0,1,0 -"Chimera House",1999,82,NA,8.4,5,0,0,0,0,0,0,44.5,0,44.5,24.5,"",0,0,0,0,0,0,0 -"Chimhyang",2000,94,NA,5.9,13,0,4.5,0,0,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Chimp & Zee",1968,6,NA,6.1,6,0,0,0,14.5,0,0,14.5,34.5,0,34.5,"",0,1,1,0,0,0,1 -"Chimp, The",1932,25,NA,7.1,125,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Chimps onder elkaar",1984,55,NA,7.9,8,0,0,0,0,0,0,14.5,74.5,14.5,0,"",0,0,0,0,1,0,0 -"Chin gei bin",2003,102,NA,5.8,562,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Chin se tai yang",1976,96,NA,3,22,34.5,24.5,4.5,0,24.5,4.5,0,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Chin wong ji wong 2000",1999,91,NA,5.4,120,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"China",1943,79,NA,6.8,48,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"China Clipper",1936,88,NA,6.1,83,0,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"China Corsair",1951,76,NA,5.4,6,0,0,0,34.5,0,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"China Cry: A True Story",1990,101,NA,7.6,98,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"China Doll",1958,99,NA,4.8,55,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"China Dolls",1997,30,NA,7.7,5,0,0,0,0,0,0,44.5,24.5,44.5,0,"",0,0,0,0,1,0,1 -"China Gate",1957,97,NA,6.5,68,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"China Girl",1942,95,NA,6.2,45,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"China Girl",1987,89,NA,5.3,191,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"China Jones",1959,6,NA,7.1,17,0,0,0,4.5,4.5,4.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"China Lake",1983,34,3000,7.5,21,0,0,0,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"China Lake",1989,94,NA,4.3,8,0,0,0,14.5,24.5,0,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"China Moon",1994,99,NA,6.1,969,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"China O'Brien",1990,86,NA,4.1,154,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"China O'Brien II",1991,82,NA,4.3,64,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"China Passage",1937,65,NA,5,7,0,0,24.5,0,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"China Plate, The",1931,7,NA,5.9,42,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"China Seas",1935,87,NA,6.8,213,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,1,0 -"China Shop, The",1934,8,NA,8,11,0,0,0,0,0,4.5,4.5,14.5,24.5,34.5,"",0,1,1,0,0,0,1 -"China Sky",1945,78,NA,5.9,38,0,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"China Syndrome, The",1979,122,NA,7.3,4185,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"China Town",1962,151,NA,8.1,32,4.5,0,0,0,0,0,14.5,34.5,34.5,14.5,"",1,0,0,0,0,0,0 -"China Venture",1953,83,NA,5,16,14.5,0,0,14.5,34.5,24.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"China de Sade",1977,90,NA,5.6,10,0,0,14.5,0,34.5,44.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"China's Little Devils",1945,74,NA,7.2,31,0,4.5,0,0,4.5,0,4.5,14.5,4.5,64.5,"",0,0,0,1,0,0,0 -"China: The Panda Adventure",2001,48,NA,6.1,51,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chinatown",1974,131,6000000,8.4,25695,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Chinatown Nights",1929,83,NA,5,9,0,14.5,0,0,44.5,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Chinatown Squad",1935,75,NA,6.1,5,0,0,0,24.5,0,44.5,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Chinatown at Midnight",1949,67,NA,5.6,6,0,0,0,14.5,34.5,0,0,45.5,0,0,"",0,0,0,1,0,0,0 -"Chinese Box",1997,99,NA,6,917,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Chinese Boxes",1986,87,NA,5.3,19,34.5,0,0,4.5,14.5,24.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Chinese Chocolate",1996,95,NA,5.1,22,14.5,0,0,14.5,34.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Chinese Coffee",2000,99,NA,6.9,61,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"R",0,0,0,1,0,0,0 -"Chinese Dog, The",2001,15,NA,5.9,7,14.5,0,0,24.5,0,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Chinese Hercules",1973,90,NA,4.1,28,4.5,4.5,4.5,14.5,4.5,4.5,24.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Chinese Nightingale, The",1935,10,NA,6.6,6,0,0,0,14.5,0,14.5,34.5,34.5,0,0,"",0,1,0,0,0,0,1 -"Chinese Ring, The",1947,68,NA,5.8,18,0,4.5,0,14.5,24.5,14.5,14.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Chinese Series",2003,2,NA,8.4,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Chinese muur, De",2002,10,NA,5.6,22,0,0,4.5,0,4.5,24.5,24.5,34.5,0,4.5,"",0,0,0,1,0,0,1 -"Chinesische Wunder, Das",1977,90,NA,4.5,11,0,14.5,4.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Chinesisches Roulette",1976,86,NA,7.4,225,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ching Se",1993,98,NA,6.7,264,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ching ham baak lok moon",2000,91,NA,5.6,6,0,0,0,14.5,0,64.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Chingoo",2001,118,NA,7.3,549,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Chinmoku",1971,129,NA,8.3,6,0,0,0,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Chinoise, La",1967,96,NA,7.1,182,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Chinos y minifaldas",1967,99,NA,2.7,7,14.5,14.5,14.5,24.5,14.5,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Chinpira",1996,101,NA,7.3,16,0,0,14.5,0,4.5,0,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Chiome d'oro",1993,5,NA,6.7,7,0,0,0,0,14.5,14.5,24.5,24.5,14.5,0,"",0,1,0,0,0,0,1 -"Chip Off the Old Block",1944,71,NA,6.1,5,0,0,0,0,24.5,24.5,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Chip an' Dale",1947,7,NA,7.2,81,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Chipmunk Adventure, The",1987,90,NA,6.5,301,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",0,1,1,0,0,0,0 -"Chips",2000,1,NA,6.3,9,0,0,0,24.5,0,44.5,14.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Chips Ahoy",1956,6,NA,7.7,49,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Chips Off the Old Block",1942,8,NA,6.1,10,0,0,0,14.5,34.5,24.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Chirin no suzu",1978,47,NA,6.8,15,0,14.5,0,0,0,0,24.5,0,34.5,34.5,"",0,1,0,1,0,0,0 -"Chiriyakhana",1967,125,NA,7.2,18,4.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Chisholm '72: Unbought & Unbossed",2004,76,NA,7.4,29,4.5,0,0,0,4.5,0,24.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Chispita y sus gorilas",1982,80,NA,1.5,5,84.5,0,0,0,0,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Chisto angliyskoe ubiystvo",1975,165,NA,6.1,15,0,0,0,14.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Chistoe nebo",1961,110,NA,8.3,13,0,0,0,0,4.5,0,24.5,24.5,34.5,14.5,"",0,0,0,1,0,1,0 -"Chisum",1970,111,NA,6.4,833,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chitchor",1976,105,NA,8.2,15,4.5,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Chithram",1988,159,NA,4.8,29,0,14.5,0,14.5,0,14.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Chitty Chitty Bang Bang",1968,144,10000000,6.3,3200,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Chiu si hung yiu oi",1998,95,NA,6.9,20,4.5,0,14.5,0,14.5,14.5,24.5,14.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Chiyari Fuji",1955,94,NA,8,12,0,0,0,0,0,0,14.5,45.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Chlebnyy den",1998,55,NA,8.1,12,0,0,4.5,0,0,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Chloe, Love Is Calling You",1934,62,NA,6,9,0,24.5,0,0,24.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Chlopaki nie placza",2000,90,NA,7.2,226,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Chlopi",1973,166,NA,7.5,7,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Chlorine Dreams",1998,10,NA,6.4,9,0,0,0,0,14.5,14.5,44.5,14.5,24.5,0,"",0,0,0,0,0,0,1 -"Choc, Le",1982,100,NA,6.1,122,4.5,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Choca, La",1974,94,NA,4.4,8,0,0,0,34.5,14.5,0,0,0,24.5,24.5,"",1,0,0,1,0,0,0 -"Chocolat",1988,105,NA,6.6,376,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Chocolat",2000,121,NA,7.3,20031,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Chocolate Babies",1997,83,NA,8,11,4.5,0,4.5,0,0,0,0,24.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Chocolate Girls",2004,14,NA,7.3,10,0,14.5,0,0,14.5,14.5,0,24.5,0,45.5,"",0,0,0,1,0,0,1 -"Chocolate Soldier, The",1941,102,NA,5.8,41,0,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Chocolate Sperm",2001,5,NA,6.7,6,14.5,0,0,14.5,0,14.5,0,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Chocolate War, The",1988,100,NA,6.7,445,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chocolate del loro, El",2004,90,NA,5.9,15,4.5,0,4.5,0,0,24.5,0,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Chocolate for Breakfast",1998,92,NA,4,21,4.5,4.5,0,0,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Choices",1981,90,NA,5,46,14.5,0,4.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Choir, The",2002,9,NA,9,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Choirboys, The",1977,119,6500000,4.9,260,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Choix des armes, Le",1981,114,NA,6.9,169,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Chojin gakuen Gowcaizer",1997,90,NA,4.5,23,14.5,14.5,4.5,14.5,0,4.5,14.5,14.5,4.5,14.5,"",1,1,0,0,0,0,0 -"Chok-Dee",2005,105,NA,6.6,12,0,4.5,0,0,0,34.5,34.5,0,4.5,14.5,"",1,0,0,1,0,0,0 -"Choke",1999,98,550000,5.6,68,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Choke",2000,89,NA,3.2,95,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Choker",2005,93,NA,7.6,13,4.5,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Chokher Bali",2003,120,NA,6.6,110,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Chokugeki! Jigoku-ken",1974,87,NA,7.4,22,0,0,0,0,4.5,14.5,14.5,44.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chomana Dudi",1975,141,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Chona, la puerca asesina",1990,38,NA,3.3,19,14.5,4.5,4.5,0,4.5,0,4.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Chong qing sen lin",1994,102,NA,7.7,4814,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"PG-13",0,0,0,1,0,1,0 -"Chooch",2003,81,NA,4,9,0,0,14.5,34.5,14.5,0,0,14.5,24.5,14.5,"R",0,0,1,0,0,1,0 -"Choose Me",1984,114,NA,6.8,665,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Choose Your 'Weppins'",1935,6,NA,5.8,11,0,0,0,4.5,24.5,34.5,4.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Choosing Matthias",2001,90,2500000,4.9,22,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Choosing for Happiness",1950,13,NA,3.5,5,0,24.5,24.5,44.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Chop Suey",2001,98,NA,6.3,84,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Chopin. Pragnienie milosci",2002,134,3500000,4,55,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,0,14.5,"R",0,0,0,1,0,1,0 -"Chopper",2000,94,NA,7.1,3122,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Chopper",2001,3,NA,6.4,58,4.5,4.5,0,0,4.5,14.5,4.5,34.5,4.5,24.5,"R",0,0,0,0,0,0,1 -"Chopper Chicks in Zombietown",1989,86,NA,3.6,384,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Choppers, The",1961,66,NA,3.5,65,24.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Chopping Mall",1986,77,NA,4.3,488,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Chorake",1981,92,NA,2.8,26,24.5,14.5,14.5,14.5,14.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Choral von Leuthen, Der",1933,91,NA,4.2,5,24.5,24.5,0,0,24.5,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Chords of Fame",1984,88,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,0,0,1,0,0 -"Chori Chori",1956,158,NA,7.3,9,14.5,0,0,0,0,0,44.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Chori Chori",2003,135,NA,5.9,51,4.5,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Chori Chori Chupke Chupke",2001,160,NA,6.5,140,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Chori Mera Kaam",1975,165,NA,7.9,19,0,0,0,0,0,0,34.5,45.5,14.5,0,"",0,0,1,0,0,1,0 -"Choristes, Les",2004,96,NA,7.7,2374,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,0,1,0,1,0 -"Chorok mulkogi",1997,115,NA,7.5,158,0,0,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Choropampa, el precio de oro",2002,65,NA,8.1,6,0,0,0,0,0,0,0,34.5,45.5,14.5,"",0,0,0,0,1,0,0 -"Chorrito de sangre, Un",1998,13,NA,7.9,10,14.5,0,0,0,14.5,0,0,34.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Chorus",1974,124,NA,4.2,7,14.5,14.5,0,44.5,0,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Chorus Line, A",1985,113,NA,5.7,1935,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Chorus of Disapproval, A",1988,92,NA,4.9,137,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Chosen Survivors",1974,130,NA,4.6,34,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Chosen, The",1981,108,NA,6.9,364,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Choses de la vie, Les",1970,83,NA,7.9,349,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Chou",1974,92,NA,6.6,5,0,0,0,24.5,0,0,44.5,0,24.5,24.5,"",1,0,0,1,0,0,0 -"Chou lian hu an",1972,92,NA,5.4,19,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,0,24.5,"",1,0,0,1,0,0,0 -"Chou tin dik tong wah",1987,98,NA,7.7,181,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Chouans!",1988,143,NA,6,143,14.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chouchou",2003,105,NA,5.6,316,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Chouette aveugle, La",1987,90,NA,8.6,7,0,0,0,14.5,0,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Chow Hound",1951,7,NA,7,27,4.5,0,0,14.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Chow tau yau liu",2001,99,NA,7.1,12,0,0,0,4.5,14.5,14.5,44.5,4.5,4.5,0,"",1,0,1,0,0,0,0 -"Choyonghan kajok",1998,101,NA,7,198,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Chris and the Dragon",2003,90,NA,7.8,6,0,0,0,14.5,14.5,0,0,14.5,0,45.5,"",0,0,1,0,0,0,0 -"Christa: Swedish Fly Girls",1971,100,NA,8,8,0,0,0,0,0,24.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Christian",1989,105,NA,6.3,20,0,0,0,14.5,24.5,34.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Christian Licorice Store, The",1971,90,NA,2.9,14,24.5,14.5,14.5,4.5,14.5,0,4.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Christiane F. - Wir Kinder vom Bahnhof Zoo",1981,131,NA,7.4,996,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Christiania",1977,87,NA,5.2,5,0,0,0,44.5,0,44.5,0,0,0,24.5,"",0,0,0,0,1,0,0 -"Christie Malry's Own Double-Entry",2000,94,NA,7.7,134,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Christina",1974,98,NA,5.2,15,0,4.5,0,14.5,44.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Christina's House",1999,96,NA,4,481,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Christine",1958,109,NA,6.4,123,4.5,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Christine",1963,106,NA,7.7,7,0,0,0,0,0,0,24.5,45.5,14.5,0,"",0,0,1,1,0,0,0 -"Christine",1983,110,9700000,6,5666,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Christine",1987,52,NA,7.2,22,0,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Christine Jorgensen Story, The",1970,98,NA,4.5,77,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Christine's Secret",1986,89,NA,6.5,7,0,0,0,0,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Christmas",2003,87,NA,2.7,14,4.5,14.5,0,0,14.5,4.5,4.5,0,14.5,34.5,"",0,0,1,1,0,0,0 -"Christmas Carol, A",1910,17,NA,4.7,46,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Christmas Carol, A",1938,69,NA,7.2,470,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Christmas Carol, A",1971,28,NA,8.1,121,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,44.5,"",0,1,0,1,0,0,1 -"Christmas Carol, A",1997,72,NA,4.5,86,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,1,0,1,0,0,0 -"Christmas Carol: The Movie",2001,81,NA,4.9,95,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"PG",0,1,0,0,0,0,0 -"Christmas Child",2003,96,NA,3.7,28,4.5,4.5,4.5,4.5,0,4.5,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Christmas Comes But Once a Year",1936,9,NA,6.7,35,4.5,0,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Christmas Cracker",1962,9,NA,7.2,14,0,0,0,4.5,4.5,14.5,4.5,45.5,14.5,0,"",0,1,0,0,0,0,1 -"Christmas Eve",1947,90,NA,5.9,45,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Christmas Holiday",1944,93,NA,6.6,88,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Christmas Mountain",1981,90,NA,5.7,18,4.5,0,0,0,24.5,0,0,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Christmas Party, The",1931,9,NA,6.6,66,4.5,0,0,4.5,14.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Christmas Path, The",1998,95,NA,4.2,32,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Christmas Story, A",1983,93,NA,8.1,19737,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Christmas Tauntauns",2002,3,NA,3.9,13,4.5,14.5,0,4.5,14.5,4.5,34.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Christmas That Almost Wasn't, The",1966,89,NA,4.4,48,4.5,4.5,14.5,14.5,4.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Christmas Vacation",1989,97,NA,6.9,9977,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Christmas Visitor, The",1959,7,NA,6.7,6,0,0,0,0,0,14.5,45.5,0,14.5,14.5,"",0,1,0,0,0,0,1 -"Christmas in Connecticut",1945,102,NA,7,439,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Christmas in July",1940,67,NA,7.5,262,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Christmas in Love",2004,118,NA,4.2,39,34.5,4.5,4.5,14.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,1,0,0,1,0 -"Christmas on Earth",1963,29,NA,1.1,19,45.5,4.5,4.5,0,4.5,4.5,0,4.5,0,14.5,"",0,0,0,0,1,0,1 -"Christmas with the Kranks",2004,98,60000000,4.5,1520,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Christo in Paris",1990,58,NA,7.6,10,0,0,0,0,0,14.5,14.5,34.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Christo's Valley Curtain",1973,28,NA,7.8,12,0,4.5,4.5,0,0,4.5,0,45.5,0,14.5,"",0,0,0,0,1,0,1 -"Christopher Columbus: The Discovery",1992,120,NA,4.2,553,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Christopher Strong",1933,78,284000,6.1,151,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Chromata tis iridos, Ta",1974,100,NA,7.3,11,0,0,0,0,0,14.5,4.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Chrome and Hot Leather",1971,91,NA,4.5,48,4.5,14.5,14.5,4.5,14.5,4.5,14.5,0,4.5,24.5,"PG-13",1,0,0,1,0,0,0 -"Chromophobia",1966,10,NA,7.1,19,0,0,0,4.5,0,14.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Chronic",1997,38,NA,3.8,14,14.5,0,0,14.5,0,4.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Chronicle History of King Henry the Fift with His Battell Fought at Agincourt in France, The",1944,137,NA,7.8,862,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Chronicle of Corpses, A",2000,83,NA,2.9,54,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chronicle of a Disappearance",1997,88,NA,6.9,59,4.5,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Chronicles of Riddick, The",2004,135,110000000,6.2,11438,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Chronik der Anna Magdalena Bach",1968,94,NA,7,54,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Chrono-Perambulator",1999,11,NA,6.5,21,0,0,0,4.5,0,4.5,34.5,4.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Chronos",1985,40,NA,7.5,107,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Chronotrip",2002,74,10000,4,6,64.5,0,0,0,0,0,0,0,0,34.5,"",0,0,0,0,1,0,0 -"Chrysanthemum",1999,14,NA,3.7,11,4.5,0,14.5,0,0,0,4.5,0,0,64.5,"",0,0,0,0,0,0,1 -"Chrystal",2004,106,NA,3.8,169,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Chu Chin Chow",1934,103,500000,4.8,10,0,0,14.5,14.5,14.5,34.5,24.5,0,0,24.5,"",0,0,1,0,0,1,0 -"Chu Chu and the Philly Flash",1981,100,NA,3.1,73,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Chuan Lu",1980,90,NA,5.7,16,4.5,14.5,14.5,0,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Chubasco",1968,100,NA,5.8,29,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Chubbchubbs!, The",2002,6,NA,7.8,702,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Chubby Goes Down Under and Other Sticky Regions",1998,83,NA,5,23,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chuchelo",1983,127,NA,8.7,88,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Chuck",2000,15,NA,7.6,17,0,4.5,4.5,0,0,4.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Chuck Amuck: The Movie",1991,51,NA,7.9,7,0,0,0,0,0,44.5,0,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Chuck Berry Hail! Hail! Rock 'n' Roll",1987,120,NA,6.9,167,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Chuck&Buck",2000,96,250000,6.6,1919,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Chuen hua mon lu",1996,123,NA,2.6,15,14.5,0,14.5,0,4.5,14.5,0,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Chuen jik sat sau",2001,102,NA,6.8,1234,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Chuet sai hiu bra",2001,105,NA,6.9,88,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Chui lian ting zheng",1983,102,NA,6.2,6,0,0,0,0,14.5,34.5,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Chui ma lau",2002,98,NA,6,71,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Chuka",1967,105,NA,5.8,65,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Chukje",1996,108,NA,6.7,30,14.5,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Chulas Fronteras",1976,58,NA,7.1,11,0,0,4.5,0,0,0,24.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Chump Champ, The",1950,7,NA,7.4,25,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Chump Change",2004,87,NA,5,139,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"R",0,0,1,0,0,1,0 -"Chump at Oxford, A",1940,63,NA,7.3,351,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Chumscrubber, The",2005,102,6800000,4.5,80,4.5,14.5,4.5,0,4.5,0,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Chung Kuo - Cina",1972,134,NA,7.2,18,4.5,0,0,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Chung chung lieh t'u",1975,102,NA,7.4,19,0,0,0,0,0,14.5,14.5,14.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Chung fung dui ji no foh gaai tau",1996,98,NA,7.1,172,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Chunga Chui Leopard Beware",2001,2,NA,3.9,8,24.5,0,14.5,24.5,0,14.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Chungon satluk linggei",1994,90,NA,6.7,52,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Chungyo",1972,110,NA,6.4,10,0,14.5,0,0,0,34.5,14.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Chunhyang",2000,120,NA,7.5,507,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Chunky Monkey",2001,87,NA,5.5,11,4.5,0,0,24.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Chunyudleui jeonyuksiksah",1998,105,NA,5.5,76,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Chura Liyaa Hai Tumne",2003,143,NA,7.2,17,14.5,14.5,0,4.5,24.5,0,14.5,14.5,0,14.5,"",1,0,0,1,0,1,0 -"Churakhaneun geosheun nalgaega itda",1990,122,NA,3.9,7,45.5,0,14.5,0,0,0,0,0,0,24.5,"",0,0,0,1,0,1,0 -"Church Mouse, The",1934,76,NA,4.7,20,4.5,0,4.5,24.5,14.5,34.5,14.5,14.5,0,0,"",0,0,1,0,0,1,0 -"Church of Acceptance",2000,14,NA,6.2,6,0,0,0,45.5,14.5,0,0,0,0,34.5,"",0,0,0,1,0,0,1 -"Churchill's Island",1941,21,NA,8,14,0,0,0,0,0,14.5,34.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Churchill: The Hollywood Years",2004,84,NA,5.1,210,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Chushingura",1932,109,NA,5.5,7,14.5,0,0,0,14.5,0,0,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Chushingura - Hana no maki yuki no maki",1962,207,NA,8,293,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Chushingura gaiden yotsuya kaidan",1994,106,NA,6.5,19,4.5,0,0,14.5,4.5,14.5,14.5,14.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Chute de la maison Usher, La",1928,63,NA,7.6,179,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Chutney Popcorn",1999,92,NA,5.7,378,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Chuzhaya votchina",1982,91,NA,8.7,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"Chyornaya kuritsa, ili Podzemnye zhiteli",1980,74,NA,5,11,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Chyornaya roza - emblema pechali, krasnaya roza - emblema lyubvi",1989,139,NA,7.8,66,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,1,0 -"Chyornaya strela",1985,91,NA,6.5,5,0,0,0,24.5,0,24.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Chyornaya vual",1995,97,NA,5.4,8,0,24.5,0,0,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,1,0 -"Chyornyy kvadrat",1992,123,NA,5.7,9,0,0,14.5,0,24.5,44.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Chyornyy monakh",1988,88,NA,7.9,9,0,14.5,0,0,0,0,34.5,0,24.5,34.5,"",0,0,0,1,0,1,0 -"Ci risiamo, vero Provvidenza?",1973,99,NA,6.6,7,0,0,0,0,0,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ci troviamo in galleria",1953,95,NA,5.1,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Ciakmull - L'uomo della vendetta",1970,90,NA,8.1,9,0,0,0,0,14.5,24.5,14.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Cialo",2003,98,NA,6.5,121,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ciao America",2002,100,5000000,4.8,27,14.5,4.5,0,4.5,14.5,4.5,0,4.5,14.5,44.5,"R",0,0,1,1,0,1,0 -"Ciao ma'",1988,88,NA,6,10,14.5,24.5,0,0,0,34.5,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ciao maschio",1978,110,NA,5.7,92,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Ciao nemico",1982,82,NA,2.7,17,24.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Ciao! Manhattan",1972,84,NA,5.4,98,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ciao, Federico!",1971,55,NA,6.6,22,4.5,4.5,0,0,14.5,4.5,14.5,4.5,0,44.5,"",0,0,0,0,1,0,0 -"Cible, La",1997,95,NA,6.9,21,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Cible, La",2003,10,NA,6.5,10,0,0,0,0,34.5,45.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Cicadas",2000,90,NA,9.2,24,4.5,0,0,0,4.5,4.5,0,24.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Cicala, La",1980,101,NA,5.6,26,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ciccio perdona... Io no!",1968,100,NA,7.2,10,0,14.5,0,0,0,14.5,34.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Ciclo, El",2003,9,NA,3.6,8,24.5,0,0,14.5,0,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Ciclone, Il",1996,93,NA,6.7,527,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cid cabreador, El",1983,84,NA,1.5,14,74.5,14.5,4.5,0,4.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Cid: La leyenda, El",2003,83,NA,5.5,77,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Cidade Oculta",1986,120,NA,6.5,14,4.5,0,4.5,0,0,4.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Cidade de Deus",2002,135,3300000,8.7,25964,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,0,1,0,0,0 -"Cider House Rules, The",1999,126,24000000,7.5,18950,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Ciel de Paris, Le",1991,90,NA,6.3,16,0,14.5,0,14.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ciel et la boue, Le",1961,92,NA,6.8,42,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Cielito, El",2004,93,NA,7,32,4.5,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cielo abierto, El",2001,110,NA,8.2,191,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Cielo azul, cielo negro",2003,86,NA,6.8,9,0,0,0,0,14.5,14.5,45.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Cielo cade, Il",2000,102,NA,5.6,79,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cielo ciego",1998,95,NA,6.5,25,14.5,14.5,0,0,0,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Cielo della luna, Il",1997,90,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Cielo gira, El",2004,115,NA,6.3,11,4.5,0,0,4.5,14.5,0,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Cielo negro",1951,113,NA,6.9,23,0,0,4.5,4.5,4.5,0,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Cielo no perdona, El",2003,3,NA,1,5,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Ciemna strona Wenus",1998,95,NA,5.7,11,4.5,0,4.5,0,0,14.5,14.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Cien",1956,98,NA,7.9,10,0,0,0,0,0,14.5,14.5,64.5,0,24.5,"",0,0,0,0,0,0,0 -"Cien gritos de terror",1965,100,NA,7.3,7,0,0,0,0,0,0,24.5,74.5,0,0,"",0,0,0,0,0,0,0 -"Cien veces no debo",1990,91,NA,4.9,82,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Cifra impar, La",1962,85,NA,8,16,14.5,0,0,0,0,4.5,4.5,34.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Cigarette Blues",1985,6,NA,6,8,0,0,0,0,24.5,0,34.5,24.5,14.5,0,"",0,0,0,0,1,0,1 -"Cigarettes & Coffee",1993,24,NA,3.5,74,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Cigarra no es un bicho, La",1964,92,NA,6,14,4.5,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Cilantro y perejil",1995,90,NA,6.5,106,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Cilveka berns",1991,98,NA,7.8,21,0,0,0,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Cimarron",1931,131,1433000,6.2,319,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cimarron",1960,147,NA,6,260,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cimarron Kid, The",1952,84,NA,6.5,44,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cin cin",1991,97,NA,4.6,63,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cincinnati Kid, The",1965,102,NA,7.2,1351,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Cincinnati: Just Around the Corner",2003,30,NA,8.6,8,0,0,14.5,0,0,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,1 -"Cinco Dias, Cinco Noites",1996,100,NA,6.9,39,4.5,0,0,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cinco nacos asaltan Las Vegas",1987,106,NA,7.3,6,14.5,0,0,0,14.5,0,0,0,34.5,34.5,"",1,0,1,0,0,0,0 -"Cinco tenedores",1979,90,NA,5.8,7,0,0,0,0,14.5,44.5,0,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Cinco vezes Favela",1962,92,NA,7.3,9,0,14.5,0,0,0,24.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cinderela Baiana",1998,85,NA,5.5,14,45.5,0,0,0,0,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Cinderella",1950,74,2900000,7.3,5596,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Cinderella",1977,94,NA,6.3,119,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Cinderella 2000",1977,95,NA,2,25,44.5,4.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Cinderella Jones",1946,90,NA,4.6,13,14.5,0,4.5,0,14.5,44.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Cinderella Liberty",1973,117,NA,6.6,322,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Cinderella Meets Fella",1938,8,NA,6.8,19,4.5,0,0,0,4.5,24.5,34.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Cinderella Story, A",2004,95,20000000,4.9,2755,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"PG",0,0,1,0,0,1,0 -"Cinderfella",1960,91,3000000,5.4,405,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cindy Goes to a Party",1955,9,NA,2.7,6,14.5,14.5,14.5,45.5,0,0,0,0,0,0,"",0,0,0,1,0,0,1 -"Cineasta da Selva, O",1997,87,NA,7.7,8,0,0,0,0,0,0,45.5,34.5,0,14.5,"",0,0,0,0,1,0,0 -"Cinedictum",2002,40,100000,7,5,24.5,0,0,0,0,0,44.5,0,0,44.5,"",0,0,1,0,0,1,1 -"Cinema Falado",1986,112,NA,7.4,9,14.5,0,24.5,0,0,14.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Cinema of Unease: A Personal Journey by Sam Neill",1995,52,NA,6.5,41,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Cinemania",2002,54,NA,7.2,449,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Cinematographer, The",1951,10,NA,6.7,7,0,0,0,0,0,44.5,44.5,0,14.5,0,"",0,0,0,0,1,0,1 -"Cinerama Adventure",2002,93,NA,8.6,25,0,0,4.5,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Cinerama Holiday",1955,119,NA,6.1,11,0,4.5,0,0,4.5,4.5,34.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Cinico, l'infame, il violento, Il",1977,100,NA,5.9,56,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Cinq jours en juin",1989,108,NA,6.9,15,0,0,0,4.5,24.5,4.5,44.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Cinque del Condor, I",1985,90,NA,5,20,14.5,0,14.5,4.5,0,0,0,0,0,74.5,"",1,0,0,0,0,0,0 -"Cinque della vendetta, I",1968,103,NA,4.1,9,0,0,14.5,14.5,45.5,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Cinque giornate, Le",1973,122,NA,4.3,35,4.5,4.5,0,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cinque giorni di tempesta",1997,94,NA,3.1,15,24.5,0,0,0,14.5,34.5,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Cinque per l'inferno",1969,95,NA,3.3,38,4.5,14.5,4.5,14.5,24.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Cinta dalam sepotong roti",1991,100,NA,4.4,12,24.5,4.5,0,0,0,0,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cinta roja, La",1999,110,NA,4.8,26,4.5,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Cintamani a podvodnik",1964,111,NA,7.2,8,14.5,0,0,14.5,14.5,0,24.5,0,34.5,0,"",0,0,1,0,0,0,0 -"Cintura, La",1989,93,NA,4.4,9,24.5,14.5,14.5,14.5,0,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Ciociara, La",1960,100,NA,7.7,645,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Cipher in the Snow",1973,21,NA,8.6,20,0,0,0,0,0,0,14.5,34.5,24.5,44.5,"",0,0,0,1,0,0,1 -"Cipolla Colt",1975,92,NA,4.8,25,24.5,4.5,0,4.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Ciprian Porumbescu",1972,150,NA,9.3,6,0,0,0,0,0,14.5,0,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Cirano di Bergerac",1925,113,NA,7.2,61,0,4.5,0,0,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Circle Game, The",1994,112,NA,4,9,0,0,14.5,14.5,0,0,34.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Circle of Danger",1951,86,NA,6.1,37,0,0,0,4.5,24.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Circle of Deception, A",1960,100,NA,6.5,26,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Circle of Friends",1995,103,NA,6.6,2499,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Circle of Iron",1978,102,4000000,5.2,376,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Circle of Power",1983,97,NA,3.8,34,14.5,4.5,0,24.5,4.5,4.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Circle of Two",1980,106,NA,4.3,68,14.5,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Circle, The",1925,60,NA,7.3,11,0,0,0,0,0,24.5,34.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Circles",1998,87,NA,7.6,17,4.5,0,4.5,4.5,0,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Circles in a Forest",1990,95,NA,6.5,16,4.5,0,0,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Circo das Qualidades Humanas, O",2000,98,NA,8.9,18,0,4.5,0,0,0,0,0,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Circo, El",1943,88,NA,5.3,12,0,0,4.5,0,4.5,24.5,14.5,34.5,4.5,0,"",0,0,1,0,0,0,0 -"Circuit",1995,20,NA,6.4,5,24.5,0,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Circuit Carole",1995,70,NA,6.5,9,0,0,0,0,0,45.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Circuit marine",2004,8,NA,6.4,12,0,0,0,0,14.5,24.5,14.5,44.5,0,0,"",0,1,0,0,0,0,1 -"Circuit, The",2002,91,NA,2.8,71,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Circuitry Man",1990,93,NA,4.3,177,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Circumstantial Evidence",1935,67,NA,6.2,10,0,0,0,14.5,14.5,34.5,44.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Circumstantial Evidence",1945,68,NA,6.6,9,0,0,0,14.5,0,44.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Circus",2000,95,NA,5.6,728,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Circus Clown, The",1934,63,NA,6.4,22,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Circus Queen Murder, The",1933,63,NA,6.9,5,0,0,0,0,24.5,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Circus Redickuless",1997,88,NA,7.8,5,0,0,0,24.5,0,24.5,0,0,24.5,44.5,"",0,0,0,0,1,0,0 -"Circus Today",1926,20,NA,5.7,8,0,0,0,14.5,45.5,14.5,14.5,0,14.5,0,"",0,0,1,0,0,0,1 -"Circus Today",1940,9,NA,7,11,0,0,0,0,0,24.5,24.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Circus World",1964,135,9000000,5.7,215,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Circus of Fear",1966,90,NA,5,131,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Circus of Horrors",1960,88,NA,6.2,214,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Circus on Ice",1959,9,NA,1.8,13,45.5,24.5,14.5,0,0,0,0,0,0,4.5,"",0,0,0,0,0,0,1 -"Circus op stelten",1972,69,NA,7.1,5,24.5,0,0,0,0,0,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Circus, The",1928,71,900000,7.8,1239,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Cirkeline VIII - Klodsmus",1970,13,NA,6.4,7,0,0,0,0,0,74.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Cirkeline X - Kanon-fotograf Fredrik",1970,14,NA,6.1,7,0,0,0,0,44.5,24.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Cirkeline: Storbyens mus",1998,62,NA,6.5,21,4.5,0,4.5,0,0,34.5,24.5,14.5,0,4.5,"",0,1,0,0,0,0,0 -"Cirklen",1996,40,NA,1.7,26,64.5,4.5,0,0,4.5,4.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Cirkus Buster",1961,101,NA,7.4,7,0,0,14.5,0,14.5,14.5,14.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Cirkus Casablanca",1981,96,NA,5.6,45,4.5,4.5,0,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Cirkus v cirkuse",1975,131,NA,5.9,19,4.5,0,14.5,4.5,14.5,14.5,14.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Cirkusrevyen 67",1967,82,NA,6.9,9,0,0,14.5,0,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Ciro norte",1998,17,NA,5.6,5,0,0,44.5,24.5,0,0,0,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Cirque du Soleil: Journey of Man",2000,38,NA,7.1,178,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Cisarovy nove saty",1994,90,NA,6.3,9,0,0,0,14.5,14.5,24.5,44.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Cisco Kid and the Lady, The",1939,74,NA,6,12,0,0,0,24.5,4.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Cisco Kid, The",1931,60,NA,4.7,6,0,0,0,14.5,0,0,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Cisco Pike",1972,94,NA,5.9,144,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ciske de Rat",1955,88,NA,7.3,32,0,0,0,0,4.5,14.5,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ciske de Rat",1984,107,NA,7,334,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cisza",2001,89,NA,6.2,21,0,4.5,4.5,4.5,0,4.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Citadel, The",1938,110,NA,7.5,246,0,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Citizen Black",2004,88,NA,7.8,9,0,0,0,0,0,24.5,34.5,0,0,44.5,"",0,0,0,0,1,0,0 -"Citizen Hong Kong",1999,90,NA,5,15,14.5,0,4.5,0,24.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Citizen James",2000,74,NA,8,7,0,0,0,0,14.5,0,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Citizen Kane",1941,119,686033,8.7,61083,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Citizen Langlois",1994,65,NA,5.9,9,24.5,14.5,0,0,14.5,0,0,34.5,0,24.5,"",0,0,0,0,1,0,0 -"Citizen Ruth",1996,102,3000000,6.8,1441,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Citizen Shane",2004,59,4000,5,10,24.5,0,14.5,0,14.5,14.5,0,0,14.5,44.5,"",0,0,0,0,1,0,0 -"Citizen Tania",1989,87,NA,8,7,0,0,0,14.5,14.5,0,0,0,44.5,24.5,"",0,0,0,0,0,0,0 -"Citizen Toxie: The Toxic Avenger IV",2000,99,NA,6.5,531,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"R",1,0,1,0,0,0,0 -"Citizen Verdict",2003,97,10000000,4.8,58,14.5,0,4.5,24.5,14.5,4.5,4.5,4.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Citizen, The",1999,107,NA,7.2,8,0,0,0,0,14.5,0,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Cittadino si ribella, Il",1974,105,NA,6.5,39,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"City Across the River",1949,91,NA,6.2,43,0,0,0,4.5,4.5,34.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"City After Dark, Manila by Night",1980,150,NA,7.1,9,0,0,14.5,0,0,14.5,14.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"City Beneath the Sea",1953,87,NA,5,68,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"City Girl",1930,90,NA,8.7,77,0,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,"",0,0,0,1,0,1,0 -"City Girl",1984,85,NA,6.3,9,14.5,0,14.5,14.5,14.5,0,24.5,34.5,0,0,"",0,0,0,1,0,0,0 -"City Hall",1996,111,40000000,6.1,4381,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"City Heat",1984,93,NA,5,1085,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"City Hunter: Ai to shukumei no Magnum",1989,87,NA,7.9,31,0,4.5,0,0,4.5,0,4.5,14.5,24.5,44.5,"",1,1,0,0,0,0,0 -"City Life",1990,251,NA,4.7,13,14.5,4.5,0,4.5,0,0,4.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"City Lights",1931,87,1500000,8.5,7802,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,1,0,1,0 -"City Limits",1985,86,NA,2.8,209,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"City Loop",2000,78,NA,5.4,55,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"City Paradise",2004,3,NA,5.1,6,0,0,0,0,14.5,0,14.5,34.5,14.5,14.5,"",0,1,0,0,0,0,1 -"City Sharks",2003,90,NA,6.9,16,14.5,0,0,4.5,0,4.5,0,24.5,34.5,14.5,"",0,0,1,0,0,0,0 -"City Slicker, The",1918,12,NA,5.3,5,0,0,0,24.5,44.5,0,44.5,0,0,0,"",0,0,1,0,0,0,1 -"City Slickers",1991,112,NA,6.7,9286,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"City Slickers II: The Legend of Curly's Gold",1994,116,NA,5.1,3406,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"City Streets",1931,83,NA,7.2,53,4.5,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"City That Never Sleeps",1953,90,NA,6.7,58,0,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"City Under the Sea, The",1965,84,NA,4.9,202,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"City Without Men",1943,75,NA,5.4,8,14.5,0,0,0,45.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"City at Peace",1998,95,NA,3.5,13,44.5,0,4.5,0,0,0,0,0,14.5,34.5,"",0,0,0,0,1,0,0 -"City by the Sea",2002,108,60000000,6.3,4886,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"City for Conquest",1940,101,NA,7.4,157,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"City in Panic",1986,85,NA,4.6,12,24.5,4.5,4.5,4.5,14.5,0,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"City of Angels",1998,114,55000000,6.2,15333,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"City of Bad Men",1953,81,NA,6.3,24,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"City of Blood",1983,95,NA,3.4,14,24.5,45.5,0,24.5,0,0,4.5,0,0,0,"",0,0,0,1,0,0,0 -"City of Fear",1959,81,NA,6.2,25,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"City of Ghosts",2002,116,17500000,5.6,877,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"City of Gold",1957,22,NA,6.9,22,0,4.5,0,4.5,14.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,0,1,0,1 -"City of Hope",1991,129,3000000,7.3,645,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"City of Industry",1997,97,8000000,5.9,1262,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"City of Joy",1992,132,NA,5.9,940,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"City of Little Men, The",1938,11,NA,5.6,12,0,0,0,4.5,34.5,34.5,14.5,4.5,0,0,"",0,0,0,0,1,0,1 -"City of Missing Girls",1941,74,NA,6,9,0,24.5,0,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"City of Shadows",1955,70,NA,5.4,9,0,14.5,0,0,34.5,14.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"City of Shadows",1986,92,NA,4.7,5,44.5,0,0,44.5,0,24.5,0,0,0,0,"",1,0,0,0,0,0,0 -"City of Sin",1991,85,NA,6.5,8,14.5,0,14.5,24.5,0,24.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"City of the Dead, The",1960,76,NA,6.5,419,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,0,0,0,0 -"City on Fire",1979,104,5300000,3.4,127,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ciudad de Dios",2003,87,NA,7.2,42,4.5,0,0,0,4.5,4.5,4.5,4.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Ciudad de M",2000,100,NA,8.2,61,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ciudad de ciegos",1991,87,NA,7.2,9,0,14.5,0,0,0,0,44.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Ciudad de los prodigios, La",1999,156,NA,6.1,54,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Ciudad del sol",2003,110,NA,4.5,21,0,14.5,0,4.5,14.5,14.5,0,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Ciudad y los perros, La",1985,135,NA,8.6,80,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Ciudad, La",1998,88,NA,6.9,118,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Ciudades oscuras",2002,113,NA,6.2,60,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ciutat cremada, La",1976,156,NA,4,12,0,0,14.5,4.5,34.5,4.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Civil Action, A",1998,112,60000000,6.4,6847,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Civil Brand",2002,95,500000,4.1,102,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Civility",2000,82,NA,3.7,46,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Civilization",1916,78,NA,6.1,36,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cjamango",1967,90,NA,5.4,5,0,0,0,24.5,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Claim",2002,93,NA,5.5,42,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Claim, The",2000,115,NA,6.5,1710,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"Clair de femme",1979,102,NA,6.1,82,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Claire",2001,55,NA,8,7,0,0,0,0,0,0,0,24.5,0,74.5,"",0,0,0,0,0,0,0 -"Claire Dolan",1998,95,NA,6.5,280,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Claire of the Moon",1992,107,130000,4.1,208,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Clairvoyant, The",1934,73,NA,6.7,67,0,0,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Clairvoyant, The",1982,97,NA,5.2,51,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Clambake",1967,100,NA,4.6,310,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Clan de los inmorales, El",1975,110,NA,4.7,10,0,14.5,14.5,14.5,34.5,24.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Clan des Siciliens, Le",1969,118,NA,7,540,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Clan of the Cave Bear, The",1986,98,NA,5,1073,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Clan, Le",2004,90,NA,7.2,40,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Clancy Street Boys",1943,66,NA,6.3,66,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Clancy's Kitchen",1996,52,NA,5,45,74.5,4.5,0,0,4.5,0,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Clandestine Marriage, The",1999,90,NA,5.7,116,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Clandestinos",1987,98,NA,7.7,8,0,0,0,0,0,14.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Clandestins",1997,98,NA,7.3,46,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Clando",1996,96,NA,6.1,8,0,0,0,0,0,34.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Clara",1999,27,NA,8,6,14.5,0,0,0,0,0,14.5,0,0,64.5,"",0,0,0,1,0,0,1 -"Clara Hakedosha",1996,85,NA,7.8,149,4.5,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Clara et les Chics Types",1981,110,NA,6.1,74,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Clara et moi",2004,81,NA,6.9,62,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Clara's Heart",1988,108,NA,5.8,425,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Claremont Theatre, N.Y.",1915,4,NA,3.3,9,14.5,14.5,24.5,24.5,14.5,14.5,0,14.5,0,0,"",0,0,0,0,1,0,1 -"Clarence, the Cross-Eyed Lion",1965,92,NA,5.6,101,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Clarks",2002,22,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,1,0,0,0,1 -"Clase z tropical",2000,6,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",1,0,1,0,0,0,1 -"Clases de ruso",2001,20,NA,6.8,11,24.5,4.5,0,4.5,0,0,24.5,14.5,4.5,0,"",0,0,0,1,0,0,1 -"Clash",1984,100,NA,1.9,6,14.5,14.5,0,14.5,14.5,0,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Clash by Night",1952,105,NA,7,458,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Clash by Night",1964,75,NA,6.7,6,0,0,0,0,14.5,0,84.5,0,0,0,"",0,0,0,0,0,0,0 -"Clash of the Ninjas",1986,90,NA,6.4,5,44.5,0,0,0,0,0,0,0,0,64.5,"",1,0,0,0,0,0,0 -"Clash of the Titans",1981,118,15000000,6.3,3860,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Clash of the Titans: UFC VI",1996,114,NA,8,43,4.5,0,0,0,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Clash of the Wolves",1925,70,NA,6.5,19,4.5,0,4.5,0,14.5,24.5,44.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Clash: Westway to the World, The",2000,60,NA,7.9,128,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Class",1983,98,NA,5.3,1610,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Class Act",1992,98,NA,5.1,599,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Class Action",1991,110,NA,6.2,1242,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Class Reunion",1972,85,NA,2.7,19,45.5,0,0,4.5,14.5,0,4.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Class Reunion",1982,84,NA,3.9,348,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Class of '44",1973,95,NA,5.2,130,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Class of 1984",1982,98,4300000,5.5,662,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Class of 1999",1990,99,5200000,4.5,549,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Class of 1999 II: The Substitute",1994,87,NA,3.5,182,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Class of 83",2004,50,25000,9.6,20,0,4.5,0,0,0,0,0,0,0,94.5,"",0,0,0,0,1,0,0 -"Class of Miss MacMichael, The",1978,94,NA,4,26,4.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,0,14.5,"",0,0,1,1,0,0,0 -"Class of Nuke 'Em High",1986,76,NA,4,634,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Class of Nuke 'Em High 3: The Good, the Bad and the Subhumanoid",1994,102,NA,3.7,88,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Class of Nuke 'Em High Part II: Subhumanoid Meltdown",1991,100,NA,3.5,147,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Classe de neige, La",1998,96,NA,7.1,344,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Classe operaia va in paradiso, La",1971,125,NA,7.3,84,4.5,0,0,4.5,4.5,14.5,4.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Classe tous risques",1960,110,NA,7.2,62,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Classic Queen",1992,80,NA,9.6,39,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,0,0,0,0 -"Claude Jutra, portrait sur film",2002,82,NA,7.2,18,4.5,0,0,0,0,4.5,34.5,34.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Claude Sautet ou La magie invisible",2003,85,NA,7.6,9,0,0,0,0,0,24.5,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Claude et Greta",1970,75,NA,4.3,9,24.5,14.5,14.5,14.5,0,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Claudelle Inglish",1961,99,NA,5.2,25,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Claudia",1943,91,NA,7.5,46,0,4.5,0,0,0,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Claudia and David",1946,78,NA,6.9,25,0,4.5,0,0,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Claudine",1974,95,NA,6.4,179,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Claudine's Return",1998,91,2000000,3.8,80,24.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Claustrophobia",2003,79,114000,4.2,90,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Clavo, El",1944,99,NA,7.2,6,0,0,0,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Claws",1977,100,NA,3.3,25,24.5,14.5,14.5,14.5,4.5,4.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Claws for Alarm",1954,7,NA,8.4,48,4.5,0,0,4.5,0,4.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Claws in the Lease",1963,6,NA,5.8,19,14.5,0,0,14.5,14.5,14.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Clay Farmers",1988,60,NA,7.8,13,4.5,0,0,4.5,14.5,0,34.5,4.5,24.5,0,"",0,0,0,1,0,0,0 -"Clay Fields",2003,93,NA,5.4,6,34.5,0,0,0,14.5,34.5,0,0,14.5,0,"",0,0,0,0,1,0,0 -"Clay Pigeon",1971,93,NA,4.6,22,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Clay Pigeon, The",1949,63,NA,6.9,45,0,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Clay Pigeons",1998,104,8000000,6.4,2658,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Clay Pride: Being Clay in America",2001,5,NA,6.8,19,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Clean Break, A",1999,8,NA,4.2,5,24.5,0,0,0,0,44.5,24.5,24.5,0,0,"",0,0,1,0,0,1,1 -"Clean Shaven Man, A",1936,6,NA,6.5,11,0,0,0,4.5,4.5,4.5,34.5,24.5,4.5,0,"",0,1,1,0,0,0,1 -"Clean Slate",1994,107,NA,5.6,913,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Clean and Narrow",1999,85,NA,4.1,45,4.5,14.5,4.5,4.5,14.5,24.5,14.5,4.5,0,4.5,"R",0,0,0,1,0,0,0 -"Clean and Sober",1988,124,NA,6.6,1109,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Clean, Shaven",1994,79,60000,6.8,370,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Cleaning Up",1930,18,NA,5.2,6,0,0,14.5,14.5,34.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Cleaning Up!",2002,78,NA,7.9,7,0,0,0,0,0,14.5,14.5,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Cleanup On Aisle Five",2003,6,NA,6,12,4.5,14.5,4.5,14.5,0,14.5,4.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Clear All Wires!",1933,78,NA,6.7,20,0,4.5,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Clear and Present Danger",1994,141,65000000,6.8,13025,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Clearcut",1991,92,NA,6.2,133,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Clearing the Range",1931,61,60000,4.5,6,0,0,14.5,14.5,64.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Clearing, The",1997,26,NA,3.7,14,24.5,0,0,0,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Clearing, The",2004,95,NA,6.1,2203,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Clefs de bagnole, Les",2003,90,NA,5.2,185,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Clementine",2004,90,NA,4.5,74,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Cleo/Leo",1989,92,NA,4.7,49,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cleopatra",1912,88,NA,5.2,82,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Cleopatra",1917,125,500000,9.3,25,4.5,0,0,4.5,0,0,0,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Cleopatra",1934,100,NA,7,314,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cleopatra",1963,320,44000000,6.6,2612,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Cleopatra Jones",1973,89,NA,5.2,348,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cleopatra Jones and the Casino of Gold",1975,94,NA,5.2,125,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cleopatra Wong",1978,110,NA,3,12,4.5,4.5,24.5,4.5,4.5,0,0,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cleopatra's Second Husband",1998,92,NA,4.8,73,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Clerks.",1994,92,230000,7.9,39927,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"R",0,0,1,1,0,0,0 -"Click Three Times",1999,32,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,0,0,1 -"Click: For the Love of the Click",1997,91,NA,4.9,9,14.5,0,0,0,14.5,0,14.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Click: The Body Beautiful",2000,91,NA,2.5,41,24.5,4.5,14.5,4.5,4.5,24.5,4.5,4.5,0,4.5,"R",0,0,1,0,0,0,0 -"Click: The Calendar Girl Killer",1990,79,NA,1.7,36,84.5,4.5,4.5,4.5,4.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Client, The",1994,119,NA,6.4,8340,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cliffhanger",1993,112,65000000,6,12434,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Clifford",1994,90,NA,4,1230,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Clifford the Big Red Dog",1988,30,NA,7.2,9,14.5,0,0,0,0,0,24.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Clifford's Really Big Movie",2004,73,70000,5.9,70,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,44.5,"",0,1,0,0,0,0,0 -"Climactic Death of Dark Ninja, The",2004,12,NA,7.5,12,4.5,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Climate for Killing, A",1991,103,NA,5.4,53,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Climax",1983,12,NA,5.9,8,0,0,0,0,24.5,14.5,24.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Climax, The",1944,86,NA,5.4,40,0,0,4.5,24.5,14.5,24.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Climb, The",1986,90,NA,7.3,11,0,0,0,0,0,0,24.5,44.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Climb, The",1998,98,NA,6.7,139,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Climb, The",2002,98,2500000,5.2,83,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"PG",1,0,0,1,0,0,0 -"Climbing High",1938,78,NA,6.7,21,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Clinch",1999,27,NA,5.6,7,0,0,14.5,14.5,0,45.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Clinging Vine, The",1926,71,NA,7,30,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Clinic, The",1982,93,NA,5.9,28,14.5,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Clip Cult Vol. 1: Exploding Cinema",1999,66,NA,5.2,22,4.5,4.5,0,4.5,0,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Clipped Wings",1953,65,NA,6.7,40,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Clippety Clobbered",1966,6,NA,5.2,17,0,0,24.5,14.5,14.5,14.5,14.5,4.5,0,0,"",0,1,1,0,0,0,1 -"Clipping Adam",2004,90,NA,4.1,23,14.5,4.5,4.5,14.5,4.5,0,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Clive Barker's Freakz",1998,15,NA,1.1,5,84.5,0,0,0,0,0,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Clive of India",1935,94,NA,7,45,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Cloak & Dagger",1984,101,NA,6.1,1134,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cloak Without Dagger",1956,69,NA,5.5,12,4.5,0,0,24.5,14.5,44.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Cloak and Dagger",1946,106,NA,6.4,204,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Clochemerle",1948,90,NA,8,14,0,0,0,0,0,14.5,4.5,4.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Clock Cleaners",1937,9,NA,7.9,106,0,0,0,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Clock Store, The",1931,7,NA,6.8,7,0,0,0,0,14.5,44.5,0,0,0,44.5,"",0,1,1,0,0,0,1 -"Clock, The",1945,90,1324000,7.3,390,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Clockers",1995,129,25000000,6.8,3099,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Clockstoppers",2002,94,26000000,5.1,2555,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Clockwatchers",1997,96,NA,6.4,1786,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Clockwise",1986,96,NA,6.5,2012,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Clockwork Maury, A",2000,17,NA,7.4,11,4.5,0,0,0,4.5,0,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Clockwork Mice",1995,100,NA,6.3,106,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Clockwork Orange, A",1971,137,2200000,8.3,65283,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Clon",2001,95,NA,3.3,5,24.5,0,24.5,0,24.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Clone, Le",1998,90,NA,3.7,56,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Clones, The",1973,90,NA,3.8,20,24.5,34.5,0,14.5,14.5,4.5,14.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Clonus Horror, The",1979,90,350000,2.1,469,45.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Close Call",2004,93,NA,4.5,31,4.5,4.5,4.5,0,0,4.5,4.5,4.5,4.5,64.5,"",1,0,0,1,0,0,0 -"Close Call for Boston Blackie, A",1946,60,NA,6.1,8,0,0,0,14.5,14.5,24.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Close Call for Ellery Queen, A",1942,67,NA,6,6,0,0,0,0,34.5,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Close Encounters of the Third Kind",1977,137,20000000,7.7,26304,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Close Enough to Touch",2002,87,NA,3.7,39,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Close My Eyes",1991,107,NA,6.6,361,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Close Relations",1933,20,NA,7.7,5,0,0,0,0,0,0,64.5,0,24.5,24.5,"",0,0,1,0,0,0,1 -"Close Up",1996,84,NA,6.7,10,34.5,14.5,0,0,14.5,0,24.5,14.5,0,24.5,"R",0,0,0,0,0,0,0 -"Close to My Heart",1951,90,NA,6.4,27,0,0,4.5,4.5,0,14.5,44.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Closed Mondays",1974,11,NA,7.6,50,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Closer",2000,20,NA,8.7,6,0,0,0,0,0,14.5,14.5,0,14.5,45.5,"",0,0,0,0,1,0,1 -"Closer She Gets, The",2005,99,NA,9,9,0,0,0,0,0,0,0,24.5,45.5,24.5,"",0,0,0,0,1,0,0 -"Closer You Get, The",2000,90,NA,6.2,441,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Closer to Home",1995,125,NA,3.3,21,4.5,4.5,14.5,4.5,4.5,4.5,0,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Closest Thing to Heaven, The",1996,98,NA,7.5,6,0,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Closet Cases of the Nerd Kind",1980,12,NA,6.1,62,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Closet Land",1991,94,NA,6.7,499,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Closet, The",2000,8,NA,6.8,40,4.5,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Closing Numbers",1993,94,NA,6.8,25,0,4.5,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Cloud Cover",2000,6,NA,6.6,9,0,14.5,0,0,14.5,24.5,44.5,0,14.5,0,"",0,1,0,0,0,0,1 -"Cloud Cuckoo Land",2004,92,NA,6.4,9,14.5,14.5,14.5,0,0,14.5,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Cloud Dancer",1980,104,NA,4.9,46,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Cloud Door, The",1995,29,NA,5.9,16,0,0,14.5,14.5,14.5,4.5,34.5,14.5,0,0,"",0,0,0,1,0,1,1 -"Cloudburst",1951,83,NA,6.2,7,0,0,0,0,14.5,24.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Clouded Yellow, The",1951,95,NA,7.3,95,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Clouds: Letters to My Son",2001,76,NA,5.4,38,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,1,1,0 -"Clover Bend",2001,89,NA,5.4,28,14.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Clown",1969,11,NA,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,1,0,1 -"Clown Murders, The",1976,96,NA,3.8,55,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Clown Princes",1939,11,21243,6.5,9,0,0,0,0,24.5,14.5,64.5,0,0,0,"",0,0,1,0,0,0,1 -"Clown at Midnight, The",1998,91,NA,4.2,235,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Clown in Babylon, A",1999,105,150000,7.8,5,24.5,0,0,0,0,0,0,0,44.5,44.5,"",0,0,0,1,0,0,0 -"Clown in Kabul",2002,58,NA,6.8,11,14.5,0,0,0,0,0,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Clown of the Jungle",1947,6,NA,7.6,48,0,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Clown, Der",2005,104,NA,4,65,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Clown, The",1953,91,NA,6.4,66,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Clownhouse",1989,81,NA,5.6,308,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Club Dread",2004,119,9000000,5.2,3432,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Club Fed",1990,93,360000,3.2,54,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Club Havana",1945,62,NA,5.4,14,0,0,0,4.5,44.5,4.5,0,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Club Le Monde",2002,79,NA,6.5,44,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Club Life",1985,93,NA,4.2,16,4.5,4.5,14.5,14.5,34.5,4.5,0,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Club Paradise",1986,104,NA,4.3,1315,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Club V.R.",1996,93,NA,3.5,25,14.5,4.5,14.5,4.5,14.5,24.5,0,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Club Vampire",1998,76,NA,1.8,84,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Club Wild Side",1998,101,NA,4.9,44,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Club de femmes",1936,81,NA,6.5,13,0,0,4.5,0,4.5,24.5,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Club de rencontres",1987,102,NA,4.3,15,0,14.5,14.5,24.5,4.5,24.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Club eutanasia",2005,100,NA,6.5,10,0,14.5,0,14.5,14.5,24.5,14.5,14.5,34.5,0,"",0,0,1,0,0,0,0 -"Club, The",1975,4,NA,5.8,5,0,0,0,0,24.5,24.5,0,24.5,0,44.5,"",0,1,0,0,0,0,1 -"Club, The",1980,96,NA,6.2,187,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Club, The",1994,90,NA,4,103,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Clubbed to Death (Lola)",1996,89,NA,5.3,222,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Clubhouse Detectives",1996,85,NA,4.7,51,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"PG",0,0,0,0,0,0,0 -"Clubhouse Detectives in Scavenger Hunt",2003,80,NA,5,27,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Clubland",1999,94,4000000,4,58,24.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Clue",1985,97,15000000,6.7,8767,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Clue of the New Pin, The",1960,58,NA,5.6,7,0,0,0,0,44.5,14.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Clueless",1995,97,20000000,6.7,16521,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Clueless",1998,10,NA,7.5,9,0,0,14.5,0,0,14.5,34.5,24.5,0,24.5,"",0,0,1,0,0,0,1 -"Clues to Adventure",1949,11,NA,5.5,6,0,0,0,34.5,14.5,45.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Cluny Brown",1946,100,NA,7.5,256,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Clutch",1998,85,NA,4.2,79,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Cma",1980,103,NA,8.6,6,0,0,0,0,0,14.5,0,34.5,0,45.5,"",0,0,0,0,0,0,0 -"Co mi zrobisz jak mnie zlapiesz",1978,99,NA,8.3,81,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Coach Carter",2005,136,30000000,6.6,1636,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Coach at Rural Post Office, U.S.P.O.",1903,1,NA,2.6,6,0,34.5,34.5,14.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Coal Black and de Sebben Dwarfs",1943,7,NA,7.4,95,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Coal Face",1935,11,NA,5.7,21,0,14.5,4.5,4.5,4.5,34.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Coal Miner's Daughter",1980,125,NA,7.3,2207,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Coast Guard",1939,72,NA,6.2,6,0,0,0,0,34.5,34.5,34.5,0,0,0,"",0,0,0,1,0,1,0 -"Coast Patrol, The",1925,63,NA,7,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Coast of Skeletons",1964,90,NA,5.2,22,0,4.5,0,24.5,44.5,14.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Coast to Coast",1980,95,NA,5.1,90,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Coastlines",2002,119,NA,5.7,29,4.5,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Coastwatcher",1989,94,NA,5.4,30,4.5,0,4.5,14.5,4.5,34.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cobb",1994,128,NA,6.2,1472,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cobra",1925,70,NA,5.9,36,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cobra",1986,73,NA,4.2,5250,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cobra Mission",1985,85,NA,3.5,23,24.5,24.5,0,14.5,4.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Cobra Verde",1987,111,NA,6.9,361,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cobra Woman",1944,71,NA,5.4,124,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cobra nero",1987,85,NA,3.8,61,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Cobra nero 3",1990,92,NA,4.4,30,14.5,14.5,14.5,0,4.5,24.5,0,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Cobra, Il",1967,89,NA,4.8,8,14.5,0,0,24.5,45.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Cobweb, The",1955,134,NA,6.2,154,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Coca-Cola Kid, The",1985,98,NA,5.9,657,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Cocaine Cowboys",1979,87,NA,3.4,21,24.5,14.5,14.5,4.5,14.5,0,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cocaine Wars",1985,110,NA,3.8,31,24.5,14.5,14.5,24.5,0,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Coche de pedales, El",2004,92,NA,7.1,8,0,14.5,0,0,14.5,14.5,14.5,0,34.5,14.5,"",0,0,1,0,0,0,0 -"Cochecito, El",1960,85,NA,6.8,60,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Cochon, Le",1970,50,NA,6.2,5,0,0,0,0,0,84.5,0,0,24.5,0,"",0,0,0,0,1,0,0 -"Cock o' the Walk",1935,8,NA,7.2,10,0,0,0,0,14.5,14.5,44.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Cock, The",1994,9,NA,7.8,8,24.5,0,0,0,0,0,0,0,0,74.5,"",0,0,0,0,0,0,1 -"Cock-Eyed World, The",1929,118,661315,5.9,11,0,0,0,14.5,34.5,0,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cock-a-Doodle Deux-Deux",1966,6,NA,5.9,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Cock-a-Doodle Dog",1951,6,NA,7,30,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Cockaboody",1974,9,NA,5.1,7,0,0,0,14.5,24.5,14.5,0,14.5,24.5,0,"",0,1,0,0,0,0,1 -"Cockettes, The",2002,100,300000,6.6,177,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"R",0,0,0,0,1,0,0 -"Cockeyed Cavaliers",1934,72,NA,6.5,53,0,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cockeyed Cowboys of Calico County",1970,99,NA,5.4,64,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cockeyed Miracle, The",1946,81,NA,6.5,37,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cockfight",2001,45,NA,7.9,12,14.5,0,0,0,0,4.5,0,0,24.5,45.5,"R",0,0,0,0,1,0,0 -"Cockfighter",1974,83,NA,6,152,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cockleshell Heroes, The",1955,97,NA,6.4,164,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Cockroach That Ate Cincinnati, The",1996,95,NA,6.8,23,14.5,4.5,4.5,0,0,14.5,4.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Cocksucker Blues",1972,93,NA,5.9,74,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Cocktail",1988,104,NA,5.2,9713,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Cocktail Hostesses, The",1976,80,NA,1.3,13,74.5,0,0,0,0,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Cocktail Hour",1933,73,NA,7.8,7,0,0,0,0,0,45.5,0,14.5,24.5,0,"",0,0,0,1,0,1,0 -"Cocktail Molotov",1980,100,NA,6,39,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Cocoanut Grove",1938,85,NA,7.2,7,0,0,0,0,0,24.5,14.5,45.5,0,0,"",0,0,1,0,0,1,0 -"Cocoanuts, The",1929,96,500000,6.8,834,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cocoon",1985,117,NA,6.6,7694,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Cocoon: The Return",1988,115,NA,4.8,2387,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cocorico monsieur Poulet",1974,90,NA,5.6,11,0,0,4.5,0,4.5,4.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Coda",2003,10,NA,6.9,8,0,0,0,14.5,0,14.5,24.5,14.5,0,34.5,"",0,0,0,1,0,0,1 -"Coda",2004,5,NA,8.5,6,0,0,0,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,1,0,0,1 -"Coda dello scorpione, La",1971,90,NA,6.8,50,4.5,0,0,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Code",2003,12,10000,6.2,5,0,0,0,0,44.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Code 46",2003,92,7500000,6.4,2094,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Code Conspiracy, The",2001,97,NA,6.1,123,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"PG-13",1,0,0,0,0,0,0 -"Code Name Vengeance",1989,96,NA,2.9,15,14.5,44.5,14.5,4.5,4.5,4.5,0,0,0,4.5,"",1,0,0,0,0,0,0 -"Code Name: Emerald",1985,95,NA,5.8,142,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Code Name: Wild Geese",1984,96,NA,4.2,135,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Code Two",1953,69,NA,6.8,13,0,0,0,0,14.5,24.5,34.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Code of Ethics",1999,114,NA,2.7,17,34.5,14.5,4.5,4.5,0,4.5,0,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Code of Silence",1985,101,NA,5.4,504,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Code of the Secret Service",1939,58,NA,3.2,34,24.5,4.5,4.5,14.5,14.5,4.5,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Code of the West",1947,57,NA,6.5,11,0,0,0,0,0,44.5,44.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Codename: Silencer",1995,93,NA,4.3,67,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,0,24.5,"R",1,0,0,0,0,0,0 -"Codename: Simon",2004,10,50000,9.2,22,0,0,4.5,0,4.5,0,0,4.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Codice privato",1988,90,NA,5.2,9,14.5,14.5,14.5,0,14.5,44.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Codine",1962,98,NA,9,9,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Coed Fever",1980,68,NA,5.1,26,14.5,4.5,0,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Coeur au poing, Le",1998,97,NA,6.5,64,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Coeur des hommes, Le",2003,100,NA,6.7,268,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Coeur sur la main, Le",1949,95,NA,4.4,6,14.5,0,0,14.5,34.5,0,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Coeur sur la main, Le",2001,11,NA,4.8,5,0,24.5,24.5,0,0,0,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Coeurs verts, Les",1966,90,NA,7.9,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,1,0,0,0 -"Coffee & Donuts",2000,90,NA,9.6,10,0,0,0,0,0,0,14.5,0,14.5,84.5,"",0,0,1,0,0,0,0 -"Coffee and Cigarettes",1986,6,NA,7.2,277,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Coffee and Cigarettes",2003,95,NA,6.8,3729,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Coffee and Cigarettes II",1989,8,NA,6.9,185,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Coffee and Cigarettes III",1993,12,NA,7.7,251,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Coffee, Tea or Me?",2002,70,NA,6.4,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",0,0,0,0,1,0,0 -"Coffins on Wheels",1941,17,NA,5.7,15,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Coffy",1973,84,NA,6.2,714,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Cog",2003,9,NA,8,7,0,0,0,0,0,14.5,0,44.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Cog",2004,5,4000,9.6,9,0,0,0,0,0,0,0,24.5,0,74.5,"",0,0,0,1,0,0,1 -"Cohen and Tate",1989,88,NA,5.4,204,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cohen vs. Rosi",1998,90,NA,4.4,37,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Cohens and Kellys in Hollywood, The",1932,75,NA,6.2,7,0,0,0,0,14.5,14.5,74.5,0,0,0,"",0,0,1,0,0,0,0 -"Coiffeur pour dames",1952,87,NA,5.9,23,4.5,0,0,14.5,14.5,24.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Coil",2001,79,12000,7.8,12,4.5,0,0,0,0,4.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Coil Winding Machines",1904,2,NA,3.6,13,4.5,14.5,4.5,34.5,14.5,4.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Coil Winding Section E",1904,2,NA,2.6,5,24.5,0,84.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Coked Out",1994,15,NA,8.6,29,0,0,0,0,0,0,14.5,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Col cuore in gola",1967,107,NA,4.7,17,4.5,4.5,14.5,0,4.5,24.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Col ferro e col fuoco",1962,112,NA,5.2,5,0,0,24.5,44.5,24.5,0,0,24.5,0,0,"",1,0,0,1,0,0,0 -"Cola Conquest, The",1998,50,NA,8,18,0,0,0,0,0,14.5,14.5,45.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Cola for Tea",1999,72,NA,4.7,8,0,0,0,34.5,34.5,0,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Cola, Candy, Chocolate",1979,82,NA,5.4,7,0,14.5,24.5,14.5,14.5,0,14.5,0,0,14.5,"",0,0,1,0,0,1,0 -"Cold Around the Heart",1997,96,NA,3.8,407,34.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Cold Call",1999,15,NA,4.6,12,4.5,0,0,24.5,14.5,4.5,4.5,24.5,4.5,0,"",0,0,0,0,0,0,1 -"Cold Call",2001,14,20000,7.7,17,24.5,0,0,0,0,4.5,24.5,14.5,24.5,14.5,"",0,0,1,0,0,1,1 -"Cold Comfort",1989,111,NA,5.9,103,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cold Creek Manor",2003,118,NA,4.8,3498,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Cold Dog Soup",1990,100,7000000,4.6,136,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cold Feet",1984,96,NA,5.3,18,14.5,4.5,0,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cold Feet",1989,94,NA,4.3,77,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cold Feet",1999,93,NA,5,15,24.5,0,0,4.5,4.5,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cold Fever",1995,83,NA,7,502,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Cold Fish",2001,91,NA,6.9,13,24.5,0,0,0,4.5,0,0,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Cold Front",1989,96,NA,4.3,66,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cold Harvest",1998,89,NA,4.8,90,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Cold Heart",2001,95,3000000,4.1,140,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Cold Hearts",1999,90,900000,3.9,131,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Cold Heat",1989,85,NA,3.4,19,44.5,14.5,4.5,4.5,4.5,14.5,14.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Cold Heaven",1991,105,NA,6.5,293,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Cold Intelligence",2004,90,NA,7.7,6,14.5,0,0,0,0,0,0,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Cold Justice",1989,105,NA,2.9,15,14.5,0,24.5,0,0,4.5,4.5,4.5,0,44.5,"",0,0,0,1,0,0,0 -"Cold Light of Day",1989,79,NA,4,7,0,14.5,0,44.5,0,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Cold Mountain",2003,152,83000000,7.4,15712,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Cold Night Into Dawn",1997,91,NA,3.5,25,24.5,4.5,4.5,14.5,24.5,0,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Cold River",1982,94,NA,5.6,37,4.5,4.5,4.5,0,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Cold Steel",1987,91,NA,4.2,114,14.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cold Storage",1951,7,NA,6.6,9,0,0,0,14.5,0,34.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Cold Summer, A",2003,83,NA,5.1,22,4.5,0,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cold Sweat",1993,93,NA,4.1,81,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cold Turkey",1951,7,NA,5.5,14,0,4.5,4.5,0,24.5,34.5,4.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Cold Turkey",1971,99,NA,6.4,343,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cold War",1951,7,NA,6.8,36,4.5,0,0,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Cold Wind in August, A",1961,80,NA,6.6,34,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Cold-Blooded Penguin, The",1945,7,NA,6.9,18,4.5,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Coldblooded",1995,92,NA,6.6,872,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",1,0,1,0,0,0,0 -"Coldfire",1990,113,NA,2.4,14,45.5,4.5,14.5,0,4.5,14.5,0,4.5,0,0,"",1,0,0,0,0,0,0 -"Colditz Story, The",1955,94,NA,7.1,187,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cole Younger, Gunfighter",1958,78,NA,5.6,18,0,0,0,14.5,14.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Colegas",1982,117,NA,5.5,24,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Coleslaw Warehouse",1992,25,NA,7.2,16,4.5,0,0,0,0,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Colette",1952,21,NA,5.4,6,0,0,0,0,64.5,14.5,14.5,0,0,0,"",0,0,0,0,1,0,1 -"Colimbas al ataque, Los",1987,90,NA,3.8,15,14.5,4.5,0,14.5,4.5,14.5,4.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Colimbas se divierten, Los",1986,85,NA,4.8,16,14.5,4.5,0,0,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Colin Fitz",1997,85,NA,7.5,13,4.5,4.5,0,0,0,4.5,14.5,4.5,44.5,4.5,"",0,0,1,0,0,0,0 -"Collaboration, The",2001,90,NA,8.2,5,0,0,0,0,24.5,0,0,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Collateral",2004,120,65000000,7.7,24499,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Collateral Damage",2002,108,85000000,5.2,8590,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Collateral Damages",2003,67,NA,6.9,6,0,0,0,0,0,14.5,34.5,0,0,45.5,"",0,0,0,0,1,0,0 -"Colle universelle, La",1907,5,NA,5.6,45,4.5,4.5,0,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Collecting Mail, U.S.P.O.",1903,1,NA,2.8,5,0,24.5,84.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Collectionneur, Le",2002,110,NA,6.6,194,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Collectionneuse, La",1967,89,NA,6.9,269,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Collector of Bedford Street, The",2002,36,NA,7.7,18,0,0,0,0,0,14.5,14.5,45.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Collector, The",1965,119,NA,7.4,996,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Collectors, The",1999,90,NA,3.8,125,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Colleen",1936,89,NA,5.8,29,0,0,4.5,24.5,4.5,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,1,0 -"College",1927,66,NA,7.5,411,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"College Coach",1933,76,245000,5.2,55,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"College Confidential",1960,91,NA,4.1,42,14.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"College Girls",1968,85,NA,1,7,84.5,0,0,0,0,0,0,0,14.5,0,"",0,0,1,0,0,0,0 -"College Holiday",1936,86,NA,7.5,11,0,0,0,0,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"College Humor",1933,80,NA,6.8,12,0,0,0,0,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"College Kickboxers",1990,89,NA,2.3,20,24.5,4.5,24.5,4.5,24.5,4.5,0,0,14.5,4.5,"",1,0,0,0,0,0,0 -"College Rhythm",1934,75,NA,5.9,6,0,0,0,14.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"College Swing",1938,86,NA,6.3,77,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Collegiale, La",1975,92,NA,4.1,8,0,14.5,24.5,14.5,24.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Collegians Are Go!!, The",1999,30,NA,3.3,13,14.5,4.5,0,4.5,14.5,0,0,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Collera del vento, La",1970,105,NA,5.5,38,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Collina degli stivali, La",1969,87,NA,4.8,189,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Collision Course",1989,100,NA,3.9,202,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Colloque de chiens",1977,22,NA,7.2,15,0,0,0,4.5,0,24.5,14.5,4.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Colmena, La",1982,105,NA,7.5,131,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cologne",1939,14,NA,6.7,18,0,0,0,14.5,14.5,14.5,14.5,34.5,14.5,0,"",0,0,0,0,1,0,1 -"Cologne",2004,20,NA,7.9,12,0,0,0,0,14.5,4.5,44.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Colombes, Les",1972,116,NA,5.3,11,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Colombianos, un acto de fe",2004,90,NA,4.7,6,34.5,14.5,0,0,0,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Colonel Bunker",1998,103,NA,8.3,12,0,0,0,4.5,4.5,0,0,4.5,34.5,44.5,"",0,0,0,0,0,0,0 -"Colonel Chabert, Le",1943,102,NA,8.3,8,0,0,0,0,14.5,0,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Colonel Chabert, Le",1994,110,NA,7,416,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Colonel Effingham's Raid",1946,72,NA,6.1,30,0,4.5,4.5,0,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Colonnello Buttiglione diventa generale, Il",1973,100,NA,4.2,5,0,0,24.5,0,24.5,24.5,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Color Adjustment",1991,86,NA,6.5,32,4.5,0,0,0,4.5,24.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Color Me Blood Red",1965,79,50000,3.4,130,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Color Me Dead",1969,97,NA,5.6,18,4.5,0,14.5,14.5,14.5,14.5,14.5,0,24.5,4.5,"",1,0,0,1,0,0,0 -"Color Purple, The",1985,154,15000000,7.6,10599,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Color de las nubes, El",1997,110,NA,6.8,33,4.5,0,0,0,14.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Color of Evening, The",1994,90,NA,5.4,90,0,34.5,0,4.5,34.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Color of Money, The",1986,119,10000000,6.8,9095,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Color of Night",1994,133,40000000,4.7,4646,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Color of a Brisk and Leaping Day",1996,87,NA,5.6,63,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Color-Blinded",1998,92,NA,8.3,7,0,0,0,24.5,0,0,0,0,0,74.5,"",0,0,1,0,0,0,0 -"Colorado",1940,54,NA,6.7,19,0,0,0,0,14.5,34.5,14.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Colorado Cowboy: The Bruce Ford Story",1994,76,NA,4.3,12,14.5,0,4.5,4.5,0,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Colorado Serenade",1946,68,NA,5.4,17,0,4.5,24.5,0,0,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Colorado Sundown",1952,67,NA,6.3,12,0,0,0,4.5,34.5,4.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Colorado Sunset",1939,58,NA,5.7,11,4.5,4.5,0,0,0,24.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Colorado Territory",1949,94,NA,7.1,233,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Colorforms",2003,8,NA,7.7,25,4.5,0,0,0,4.5,4.5,14.5,44.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Colors",1988,120,NA,6.4,3192,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Colorz of Rage",1999,90,NA,2.6,21,34.5,4.5,4.5,4.5,4.5,4.5,0,0,0,34.5,"R",0,0,0,1,0,0,0 -"Colosso di Rodi, Il",1961,123,NA,5.6,202,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Colossus of New York, The",1958,70,NA,5.4,118,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Colossus: The Forbin Project",1970,100,NA,7,940,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Colour Box, A",1935,3,NA,6.6,24,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Colour Cry",1952,3,NA,7.3,13,0,0,0,0,14.5,14.5,34.5,0,24.5,4.5,"",0,1,0,0,0,0,1 -"Colpi di luce",1985,86,NA,4.4,31,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Colpire al cuore",1982,105,NA,6.4,23,4.5,0,0,4.5,4.5,4.5,34.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Colpo di fulmine",1985,94,NA,4.4,5,24.5,0,24.5,0,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Colpo di luna",1995,90,NA,7.5,32,4.5,0,0,0,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Colpo gobbo all'italiana",1962,100,NA,5.7,8,0,0,0,0,14.5,24.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Colpo in canna",1974,96,NA,4.4,22,4.5,4.5,24.5,24.5,14.5,4.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Colpo rovente",1969,104,NA,6,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Colt .45",1950,70,NA,5.5,54,0,4.5,4.5,14.5,24.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Colt Comrades",1943,67,NA,6.1,25,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Colt era il suo Dio, La",1972,87,NA,1.2,5,64.5,24.5,0,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Coltelli del vendicatore, I",1966,86,75000,4.7,38,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Coltello di ghiaccio, Il",1972,91,NA,6.6,20,0,0,0,0,0,24.5,34.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Column South",1953,82,NA,6.8,17,0,0,14.5,0,4.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Columna",1968,93,NA,7.7,30,0,0,0,4.5,0,4.5,14.5,0,24.5,45.5,"",0,0,0,0,0,0,0 -"Columpio, El",1992,9,NA,7.6,44,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,1,1 -"Coma",1978,113,NA,6.6,2675,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Comanche",1956,87,NA,5.3,46,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Comanche Station",1960,74,NA,7.1,175,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Comanche Territory",1950,76,NA,4.9,37,4.5,0,0,24.5,34.5,24.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Comanche blanco",1968,93,NA,4.1,42,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Comancheros, The",1961,107,NA,6.5,771,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Comandante",2003,99,NA,6.3,454,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Comandante, Il",1963,109,NA,7.3,11,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Comando al infierno",1970,92,NA,5.7,9,0,0,14.5,14.5,24.5,0,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Comandos azules",1980,92,NA,3.2,7,74.5,0,14.5,0,0,14.5,0,0,0,0,"",1,0,1,0,0,0,0 -"Comb, The",1990,18,NA,7.8,62,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Combat",1999,8,NA,4.4,18,4.5,0,14.5,24.5,4.5,14.5,4.5,34.5,0,4.5,"",0,0,1,1,0,0,1 -"Combat America",1943,62,NA,6.4,13,4.5,0,4.5,4.5,4.5,0,34.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Combat Shock",1986,92,40000,5.6,237,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Combat Squad",1953,72,NA,4.5,16,14.5,0,14.5,24.5,14.5,4.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Combat d'amour en songe",2000,120,NA,6.7,40,4.5,4.5,0,4.5,14.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Combat de fauves",1997,90,NA,6.7,39,4.5,0,0,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Combien?",2004,7,NA,8.8,6,0,0,0,0,0,0,0,45.5,0,45.5,"",0,0,1,0,0,0,1 -"Combination Platter",1993,84,NA,6.3,45,4.5,4.5,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Come Again",1998,16,NA,6,5,24.5,0,0,0,0,24.5,24.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Come Along Do!",1898,1,NA,4.6,27,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Come Back to the Five and Dime, Jimmy Dean, Jimmy Dean",1982,109,850000,6.9,607,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Come Back, Africa",1960,95,NA,6.9,19,0,4.5,0,4.5,4.5,14.5,14.5,4.5,34.5,14.5,"",0,0,0,1,1,0,0 -"Come Back, Charleston Blue",1972,100,NA,5.8,46,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Come Back, Little Sheba",1952,96,NA,7.5,589,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Come Blow Your Horn",1963,112,NA,6.3,187,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Come Clean",1931,20,NA,7.8,91,0,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Come Fill the Cup",1951,113,NA,7.2,70,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Come Fly with Me",1963,109,NA,5.7,95,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Come Live with Me",1941,86,NA,7.1,162,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Come Next Spring",1956,92,NA,7,66,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Come Nightfall",2002,17,NA,7,8,0,0,0,14.5,14.5,0,0,45.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Come On In, the Water's Pink",1968,6,NA,5.9,11,4.5,0,0,0,4.5,45.5,4.5,4.5,4.5,0,"",0,1,0,0,0,0,1 -"Come On, Rangers",1938,57,NA,6.3,8,0,0,0,0,24.5,34.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Come On, Tarzan",1932,61,NA,4.6,5,0,0,0,44.5,44.5,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Come On, The",1956,83,NA,6,8,0,0,0,14.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Come Out Fighting",1945,62,NA,6.5,63,0,0,4.5,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Come Play with Me",1977,94,NA,3.8,24,34.5,0,4.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Come See the Paradise",1990,133,NA,6.4,452,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Come September",1961,112,NA,6.6,293,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Come Spy with Me",1967,85,NA,4.9,10,14.5,0,0,0,34.5,34.5,24.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Come Together",2001,80,NA,8.4,46,4.5,0,4.5,0,4.5,4.5,14.5,14.5,4.5,45.5,"",0,0,1,1,0,1,0 -"Come and Get It",1936,99,NA,6.7,192,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Come and Take it Day",2001,60,NA,6.7,16,0,0,0,4.5,4.5,4.5,0,24.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Come due coccodrilli",1994,100,NA,6,80,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Come inguaiammo l'esercito",1965,89,NA,6.1,6,14.5,0,0,0,34.5,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Come mi vuoi",1997,100,NA,6.4,29,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Come on Danger",1942,59,NA,5.5,10,0,0,0,14.5,24.5,45.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Come on Danger!",1932,54,NA,5.4,13,0,4.5,0,4.5,4.5,64.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Come on George!",1939,88,NA,6.3,22,4.5,0,4.5,4.5,0,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Come parli, frate?",1974,52,NA,6.7,7,24.5,0,0,0,0,0,14.5,0,24.5,24.5,"",0,0,0,0,0,1,0 -"Come rubammo la bomba atomica",1967,98,NA,5.9,7,0,14.5,0,0,24.5,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Come rubare la corona d'Inghilterra",1967,83,NA,4.2,16,14.5,4.5,4.5,14.5,14.5,4.5,0,0,4.5,34.5,"",1,0,0,0,0,0,0 -"Come sono buoni i bianchi",1988,95,NA,3.9,16,4.5,0,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Come svaligiammo la banca d'Italia",1966,100,NA,6.6,16,14.5,4.5,0,4.5,4.5,4.5,14.5,4.5,34.5,4.5,"",0,0,1,0,0,0,0 -"Come te nessuno mai",1999,88,NA,6.9,267,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Come the Morning",1993,60,NA,2.7,6,14.5,14.5,0,14.5,14.5,0,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Come to the Stable",1949,94,NA,7.3,128,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Come una rosa al naso",1976,100,NA,3.6,7,14.5,24.5,0,14.5,14.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Come with Me, My Love",1976,131,NA,2.9,12,24.5,4.5,4.5,4.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Comeback",1982,105,NA,7.6,5,0,0,0,24.5,0,24.5,0,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Comeback Trail, The",1982,76,NA,3.8,8,14.5,0,14.5,14.5,14.5,0,0,0,0,45.5,"",0,0,1,0,0,0,0 -"Comeback, The",1978,100,NA,2.7,45,24.5,4.5,14.5,0,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Comeback, The",1980,78,NA,1.9,29,24.5,4.5,4.5,4.5,0,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,1,0,0 -"Comedian",2002,82,NA,7,1566,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Comedian Harmonists",1997,126,NA,7.3,939,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Comedians in Africa, The",1967,11,NA,6.8,27,0,0,0,4.5,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Comedians of Comedy, The",2005,103,500000,8.8,8,0,0,0,0,0,0,14.5,14.5,24.5,45.5,"",0,0,1,0,1,0,0 -"Comedians, The",1967,152,NA,6.3,217,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Comedy Team of Pete & James, The",2001,80,NA,4.8,8,34.5,0,14.5,0,14.5,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Comedy of Terrors, The",1964,84,NA,6.4,454,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Comedy's Dirtiest Dozen",1988,97,NA,4.6,39,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Comes a Horseman",1978,118,NA,5.8,321,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Comet Over Broadway",1938,70,NA,5.7,22,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Comet in Moominland",1993,70,NA,6.3,57,0,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Cometa, El",1999,92,NA,7.1,66,4.5,14.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Cometogether",1971,90,NA,4.7,7,0,0,0,14.5,24.5,24.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Comfort and Joy",1984,106,NA,7,300,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Comfort of Strangers, The",1990,107,NA,6.2,581,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Comfortably Numb",1995,100,NA,4.5,18,24.5,14.5,4.5,14.5,14.5,14.5,0,4.5,0,4.5,"NC-17",0,0,0,1,0,0,0 -"Comforters, Miserable",2001,72,NA,7,10,14.5,0,0,14.5,0,0,14.5,24.5,0,45.5,"",0,0,0,1,0,0,0 -"Comfy",2000,1,NA,2.6,10,14.5,14.5,44.5,24.5,14.5,0,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Comic Act",1998,105,NA,5.3,15,14.5,14.5,0,24.5,24.5,4.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Comic Book Confidential",1988,90,NA,6.5,113,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Comic, The",1969,94,NA,6.3,111,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Comiche 2, Le",1992,91,NA,4.1,49,14.5,4.5,4.5,24.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Comin' 'Round the Mountain",1936,60,NA,4.7,10,0,14.5,24.5,14.5,14.5,14.5,14.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Comin' Round the Mountain",1951,77,NA,5.6,84,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Comin' at Ya!",1981,91,NA,2.8,66,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Coming Apart",1969,110,NA,7.1,76,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Coming Home",1978,126,NA,7.2,1539,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Coming Out",2001,40,NA,8.9,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Coming Out Alive",1984,77,NA,6.5,8,0,14.5,0,0,14.5,45.5,24.5,0,0,0,"",1,0,0,1,0,0,0 -"Coming Out Under Fire",1994,72,NA,5.2,28,14.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Coming Round, The",1997,15,NA,4.5,5,0,0,0,44.5,0,0,0,44.5,24.5,0,"",0,0,0,0,0,0,1 -"Coming Snafu",1943,3,NA,7.9,8,0,0,0,0,14.5,14.5,0,34.5,34.5,0,"",0,1,0,0,0,0,1 -"Coming Up Easy",2004,98,NA,7.2,5,24.5,0,0,0,0,24.5,0,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Coming Up Roses",1986,93,NA,6.3,21,0,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Coming in America",1988,85,NA,5.9,5,0,0,24.5,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Coming of Age",1989,85,NA,6.3,13,4.5,4.5,14.5,0,24.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Coming of Angels",1977,87,NA,5.8,16,14.5,0,4.5,4.5,14.5,4.5,34.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Coming of Angels, the Sequel, A",1985,87,NA,6,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Coming on America",1989,85,NA,9,13,0,0,0,0,0,4.5,14.5,0,34.5,44.5,"",0,0,0,0,0,0,0 -"Coming to America",1988,116,28000000,6.6,13103,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Comisar acuza, Un",1973,114,NA,7.2,36,14.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Command Decision",1948,112,3700000,7.5,262,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Command, The",1954,94,NA,6.2,54,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Commander, Der",1988,105,NA,5,38,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Commandments",1997,88,5000000,5.4,468,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Commando",1985,75,NA,5.7,10797,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Commando Duck",1944,7,NA,7.3,71,0,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Commando Mengele",1986,92,NA,2.8,24,44.5,14.5,4.5,4.5,14.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Commando Squad",1987,90,NA,3.4,38,14.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Commando suicida",1968,98,NA,3.1,10,14.5,24.5,34.5,14.5,14.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Commandos",1968,98,NA,4.7,63,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Commandos Strike at Dawn",1942,98,NA,6.5,44,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Commare secca, La",1962,88,NA,6.5,110,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Comme des rois",1997,95,NA,7.3,34,0,0,0,0,4.5,4.5,34.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Comme la lune",1977,90,NA,6.5,6,0,0,0,14.5,0,0,34.5,0,14.5,34.5,"",0,0,1,1,0,0,0 -"Comme les six doigts de la main",1978,74,NA,5.9,14,0,0,0,4.5,34.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Comme sur des roulettes",1977,99,NA,6.8,6,14.5,0,0,0,0,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Comme un aimant",2000,95,NA,5.8,55,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Comme un avion",2002,100,NA,3.5,20,24.5,14.5,14.5,14.5,4.5,4.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Comme un boomerang",1976,100,NA,7.4,109,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Comme un poisson hors de l'eau",1999,90,NA,6.5,121,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Comme un seul homme",2002,15,NA,6,8,0,0,0,14.5,14.5,14.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,1 -"Comme une image",2004,110,NA,7.3,924,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Commedia sexy",2001,85,NA,4.2,17,24.5,4.5,4.5,14.5,14.5,14.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Comment font les gens",1993,48,NA,7.7,10,0,0,0,0,0,0,24.5,45.5,0,34.5,"",0,0,0,0,0,0,0 -"Comment qu'elle est!",1960,91,NA,4.3,14,0,4.5,0,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Comment se faire reformer",1978,90,NA,1.9,7,44.5,44.5,14.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Commies Are Coming, the Commies Are Coming, The",1962,60,NA,5.6,37,24.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Commingled Containers",1997,5,NA,7.5,56,4.5,0,0,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Commissario Lo Gatto, Il",1987,91,NA,5.8,40,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Commissario Pepe, Il",1969,107,NA,6.8,31,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Commissario, Il",1962,102,NA,6.5,10,0,0,0,14.5,24.5,14.5,44.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Commission, The",2003,102,NA,4.1,30,14.5,4.5,4.5,0,4.5,0,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Commissioner, The",1998,108,NA,6.2,102,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Commitments, The",1991,118,NA,7.4,6058,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Committed",1988,90,NA,4.4,38,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Committed",2000,98,3000000,5.2,739,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Committee, The",1968,58,NA,5.2,9,0,0,0,24.5,14.5,0,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Commode Creations: The Artwork of Barney Smith",2004,21,NA,7.7,6,0,0,0,0,0,0,45.5,34.5,14.5,0,"",0,0,0,0,1,0,1 -"Common Clay",1930,89,NA,6.1,5,0,24.5,0,0,24.5,0,44.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Common Law Cabin",1967,69,NA,3.6,83,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Common Law Wife",1963,81,NA,3,18,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Common Law, The",1931,77,NA,5.7,24,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Common Touch, The",1941,104,NA,6.1,14,0,0,0,0,0,45.5,34.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Commotion on the Ocean",1956,17,NA,5.2,39,24.5,14.5,14.5,4.5,4.5,24.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,1 -"Commune (Paris, 1871), La",2000,555,NA,7.8,33,0,4.5,4.5,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Communion",1976,108,NA,5.5,428,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Communion",1989,106,NA,5.4,681,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Communion solennelle, La",1977,105,NA,7.1,8,0,0,0,14.5,0,24.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Commuter Husbands",1973,85,NA,1.1,5,44.5,24.5,24.5,0,0,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Como Fazer Um Filme de Amor",2004,84,NA,5.6,12,0,4.5,0,4.5,14.5,14.5,34.5,14.5,0,0,"",0,0,1,0,0,1,0 -"Como Nascem os Anjos",1996,100,NA,8.5,89,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Como Ser Solteiro",1998,95,NA,7.2,95,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Como agua para chocolate",1992,105,NA,7.3,3572,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Como dos gotas de agua",1964,100,NA,1.7,6,34.5,34.5,0,14.5,0,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Comodines",1997,95,NA,3.9,105,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Compadecida, A",1969,92,NA,6.3,7,0,0,14.5,0,0,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Compadre Mendoza, El",1934,85,NA,7,22,0,0,0,4.5,0,0,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Compagna di viaggio",1996,104,NA,7,75,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Compagna di viaggio, La",1980,94,NA,4,5,24.5,0,0,44.5,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Compagnes de la nuit, Les",1953,90,NA,6.2,6,14.5,0,0,0,34.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Compagni di scuola",1988,120,NA,6.9,137,4.5,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Compagni, I",1963,130,NA,7.9,78,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Compagno Don Camillo, Il",1965,110,NA,6.5,168,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Compagnons de la marguerite, Les",1967,90,NA,7.4,26,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Company",2002,155,NA,8.6,406,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",1,0,0,1,0,0,0 -"Company Business",1991,99,NA,5.2,349,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Company Jasmine",2001,55,150000,8.4,47,4.5,0,0,0,0,0,4.5,4.5,34.5,45.5,"",0,0,0,0,1,0,0 -"Company K",2004,100,NA,8.6,9,0,0,0,0,14.5,0,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Company Man",2000,86,16000000,4.8,492,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Company She Keeps, The",1951,82,NA,5.8,47,0,0,4.5,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Company of Wolves, The",1984,95,2000000,6.4,1846,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Company, The",2003,112,15000000,6.2,1505,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Compartiment tueurs",1965,95,NA,7.3,93,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Compelling Evidence",1995,86,NA,1.3,35,45.5,14.5,0,4.5,4.5,0,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Compensation",1999,95,NA,6.2,21,0,4.5,4.5,14.5,14.5,0,4.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Competition, The",1980,123,NA,6.4,441,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Complaints of a Dutiful Daughter",1994,44,NA,7.1,19,0,0,0,0,4.5,24.5,14.5,14.5,34.5,14.5,"",0,0,0,0,1,0,1 -"Compleat Beatles, The",1984,119,NA,7.9,352,4.5,0,0,4.5,4.5,4.5,24.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Complessi, I",1965,100,NA,6.9,50,0,0,4.5,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Complex Sessions, The",1994,30,NA,9.8,25,4.5,4.5,0,0,0,0,4.5,4.5,4.5,74.5,"",0,0,0,0,0,0,1 -"Complex World",1992,81,NA,6.6,43,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",1,0,1,0,0,0,0 -"Complexe du kangourou, Le",1986,86,NA,5.4,23,4.5,0,4.5,24.5,24.5,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Complicato intrigo di donne, vicoli e delitti, Un",1986,115,NA,5.7,38,4.5,4.5,4.5,14.5,4.5,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Complicity",2000,99,NA,5.6,160,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Compliments of the Season",1930,13,NA,4.8,14,0,0,4.5,14.5,24.5,24.5,4.5,4.5,14.5,0,"",0,0,0,1,0,0,1 -"Complot d'Aristote, Le",1996,72,NA,4.9,6,0,0,0,34.5,14.5,0,0,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Complot dels anells, El",1988,90,NA,3,10,24.5,14.5,14.5,0,0,34.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Complot, Le",1973,99,NA,6.4,15,0,0,4.5,0,14.5,24.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Comprador de Fazendas, O",1951,96,NA,6.3,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Compressed Hare",1961,7,NA,7.4,53,0,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Compromis",1998,15,NA,4.7,14,0,0,4.5,24.5,0,24.5,14.5,4.5,24.5,4.5,"",0,0,1,0,0,0,1 -"Compromising Positions",1985,99,NA,5.5,333,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Comptoir, Le",1998,96,NA,5.8,8,0,0,0,24.5,14.5,0,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Compulsion",1959,99,NA,7.4,486,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Computer Wore Tennis Shoes, The",1969,91,NA,5.4,576,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Comrade X",1940,90,NA,6,147,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Comrades",1987,180,NA,5.4,35,4.5,0,0,14.5,4.5,0,4.5,24.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Comrades in Arms",1991,115,NA,2.5,18,24.5,14.5,14.5,24.5,4.5,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Comte de Monte Cristo, Le",1943,183,NA,6.2,14,0,0,0,14.5,0,24.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Comte de Monte Cristo, Le",1961,132,NA,7.2,35,4.5,0,0,0,4.5,24.5,34.5,34.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Comte de Monte-Cristo, Le",1955,183,NA,6.8,74,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Comtesse de Castiglione, La",2000,14,NA,7.1,21,0,0,4.5,0,4.5,24.5,14.5,14.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Comune senso del pudore, Il",1976,123,NA,5.1,20,0,4.5,14.5,14.5,34.5,24.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Comunidad, La",2000,110,2000000,7.2,1270,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Con Air",1997,115,75000000,6.3,26642,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Con Game",2004,90,NA,6.4,15,0,4.5,4.5,0,0,44.5,14.5,14.5,14.5,0,"",0,0,1,1,0,0,0 -"Con gli occhi chiusi",1994,113,NA,5.6,27,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Con la rabbia agli occhi",1976,98,NA,4.4,33,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Conamara",2000,105,NA,4.5,16,4.5,0,4.5,24.5,14.5,4.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Conan the Barbarian",1982,129,20000000,6.5,13624,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Conan the Destroyer",1984,103,NA,5.2,6839,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Concealed Weapon",1994,80,NA,4.9,18,4.5,14.5,24.5,4.5,14.5,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Conceiving Ada",1997,85,NA,4.2,139,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Concert for Bangladesh, The",1972,95,NA,7.7,82,4.5,4.5,0,4.5,0,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Concert for Kampuchea",1981,72,NA,5.6,6,0,0,0,0,14.5,14.5,34.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Concert of Wills: Making the Getty Center",1997,100,NA,6,5,0,0,0,0,0,64.5,24.5,0,24.5,0,"",0,0,0,0,1,0,0 -"Concerto",1982,18,NA,5.3,6,0,0,0,14.5,14.5,14.5,14.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Concerto Grosso Modo",1985,7,NA,7.9,6,0,0,0,0,0,14.5,0,45.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Concorde Affaire '79",1979,96,NA,5,34,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Concorde: Airport '79, The",1979,123,NA,3.8,825,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Concorrenza sleale",2001,113,NA,7.1,247,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Concrete Angels",1987,90,NA,2.5,14,24.5,0,24.5,4.5,4.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Concrete Garden, The",1994,23,NA,7.8,10,14.5,0,0,0,0,0,34.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Concrete Jungle, The",1982,99,NA,4.2,63,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Condanna, La",1991,92,NA,5.8,33,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Condemned",1929,86,600000,5.7,38,0,4.5,0,14.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Condemned",2002,21,NA,6.8,13,0,34.5,0,0,0,4.5,0,0,44.5,14.5,"",0,0,0,1,0,0,1 -"Condemned Women",1938,77,NA,5.7,28,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,0,"",0,0,0,1,0,1,0 -"Condemned to Live",1935,67,NA,4.5,25,0,4.5,24.5,14.5,14.5,34.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Condenados a vivir",1972,90,NA,6,76,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Condition Red",1996,83,NA,4.8,87,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Condominio",1991,100,NA,7.1,7,0,0,0,0,0,0,45.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Condor, El",1970,102,NA,5.6,134,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Condorman",1981,90,NA,4.8,609,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Conduct Unbecoming",1975,103,NA,6.1,95,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Conductor 1492",1924,70,NA,5.6,6,0,14.5,0,0,0,0,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cone of Silence",1961,76,NA,7.2,6,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Coneheads",1993,88,NA,4.9,5249,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Coney Island",1917,24,NA,6.9,67,0,0,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Coney Island",1943,96,NA,6.8,70,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Coney Island Baby",2003,93,NA,5.2,25,4.5,0,4.5,0,14.5,0,4.5,4.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Confection",2003,4,NA,6.5,14,0,4.5,0,0,24.5,0,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,1 -"Confederate Honey",1940,8,NA,5.4,22,14.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,0,"",0,1,1,0,0,0,1 -"Confederate Ironclad, The",1912,16,NA,6.5,47,0,4.5,4.5,4.5,14.5,24.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Confederation Park",1999,32,NA,8.4,16,0,0,0,0,4.5,0,14.5,24.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Confession",1937,87,NA,7.5,70,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Confession",1955,90,NA,6.8,5,0,0,0,0,24.5,0,24.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Confession, The",1964,96,NA,3.2,15,24.5,24.5,24.5,4.5,14.5,14.5,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Confession, The",1998,20,15000,6.9,18,0,14.5,4.5,4.5,4.5,14.5,0,14.5,0,44.5,"",0,0,1,0,0,0,1 -"Confession, The",1999,114,4000000,5.8,519,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Confession, The",2000,22,NA,8.3,18,4.5,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Confessional, The",1976,104,NA,5,43,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Confessione di un commissario di polizia al procuratore della repubblica",1971,101,NA,7,89,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Confessionnal, Le",1995,100,NA,7.3,499,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Confessions d'un Barjo",1992,85,NA,5.9,90,4.5,4.5,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Confessions from a Holiday Camp",1977,89,NA,2.9,70,24.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Confessions from the David Galaxy Affair",1979,97,NA,2.5,15,45.5,4.5,4.5,14.5,0,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Confessions of Boston Blackie",1941,65,NA,6.7,16,0,4.5,0,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Confessions of Christy",1990,75,NA,5.5,5,0,24.5,0,0,0,24.5,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Confessions of Robert Crumb, The",1987,55,NA,7.7,19,0,0,0,0,14.5,0,44.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Confessions of a Burning Man",2003,83,NA,4.7,23,0,0,4.5,14.5,0,4.5,0,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Confessions of a Dangerous Mind",2002,113,29000000,7.1,11487,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Confessions of a Driving Instructor",1976,90,NA,3.5,77,24.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Confessions of a Hitman",1994,93,NA,3.6,19,14.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Confessions of a Male Prostitute",1992,17,NA,8,8,0,14.5,0,0,14.5,0,14.5,0,0,64.5,"",0,0,0,1,0,0,1 -"Confessions of a Nazi Spy",1939,104,1500000,6.6,126,0,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Confessions of a Pop Performer",1975,91,NA,3.4,69,24.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Confessions of a Psycho Cat",1968,69,NA,5.1,15,14.5,14.5,0,0,0,4.5,14.5,0,34.5,24.5,"",0,0,0,0,0,0,0 -"Confessions of a Serial Killer",1985,90,NA,5.4,92,4.5,4.5,0,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Confessions of a Sex Maniac",1974,80,NA,2.1,20,24.5,34.5,34.5,14.5,0,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Confessions of a Sexist Pig",1998,91,NA,5.2,57,4.5,0,0,14.5,4.5,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Confessions of a Teenage Drama Queen",2004,89,15000000,4.4,2205,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Confessions of a Teenage Peanut Butter Freak",1976,58,NA,6.1,5,0,0,0,0,0,24.5,24.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Confessions of a Vice Baron",1943,59,NA,6.2,5,24.5,0,0,24.5,0,0,0,24.5,44.5,0,"",0,0,0,1,0,0,0 -"Confessions of a Window Cleaner",1974,90,NA,3.7,131,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Confessions of a Young American Housewife",1976,80,NA,5.6,11,4.5,4.5,0,0,0,0,14.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Confessions of an Opium Eater",1962,85,NA,6.8,41,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Confetti Brothers, The",2001,28,NA,7,11,0,0,0,0,4.5,0,4.5,0,4.5,74.5,"",0,0,1,0,1,0,1 -"Confidence",1909,11,NA,4.4,5,44.5,0,0,0,24.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Confidence",2003,97,15000000,6.8,6168,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Confidence Girl",1952,81,NA,5.4,8,0,0,0,14.5,34.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Confidence Man, The",1996,94,NA,6.4,11,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Confidences pour confidences",1979,110,NA,7.2,14,4.5,0,0,0,0,24.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Confidences trop intimes",2004,104,NA,7,751,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Confidential",1935,65,NA,4.4,17,0,4.5,44.5,4.5,14.5,14.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Confidential",1986,95,NA,3.7,10,14.5,0,0,64.5,14.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Confidential Agent",1945,118,NA,6.5,129,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Confidentially Connie",1953,74,NA,5,17,4.5,0,0,24.5,4.5,14.5,24.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Confirm or Deny",1941,74,NA,6.3,31,0,0,0,4.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Confituur",2004,84,NA,5.6,40,24.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Conflict",1936,60,NA,3.9,22,34.5,0,0,4.5,14.5,0,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Conflict",1945,86,NA,6.7,241,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Conflict of Interest",1993,88,NA,2.7,58,24.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Conflict of Wings",1954,84,NA,3.1,6,0,0,14.5,0,14.5,14.5,14.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Conformista, Il",1970,115,750000,7.7,1348,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Confort moderne",2000,95,NA,5,8,0,14.5,0,14.5,14.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Confortorio",1992,85,NA,8.1,8,0,14.5,0,0,0,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Confusion des genres, La",2000,97,NA,6.9,256,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Congiuntura, La",1965,112,NA,6.6,5,0,0,0,0,24.5,64.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Congiura dei dieci, La",1962,97,NA,5,41,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Congo",1995,109,50000000,4.4,8058,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Congo Crossing",1956,85,NA,4.5,28,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Congo Maisie",1940,71,NA,6.3,32,4.5,0,0,4.5,14.5,24.5,34.5,4.5,0,0,"",0,0,1,1,0,0,0 -"Congratulations! It's Pink",1967,6,NA,5.4,8,0,0,0,14.5,34.5,45.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Connecticut Yankee in King Arthur's Court, A",1949,106,NA,6.6,367,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Connecticut Yankee, A",1931,95,NA,6.9,50,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Connecting Dots",2003,95,500000,7.7,6,0,0,0,14.5,0,14.5,14.5,0,14.5,34.5,"",0,0,1,1,0,0,0 -"Connecting Rooms",1970,103,NA,6,101,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Connection, The",1962,110,167000,7.3,34,0,0,0,4.5,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Connie and Carla",2004,98,NA,6.1,1367,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Conny und Peter machen Musik",1960,83,NA,5.2,5,0,0,0,0,64.5,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Conquering Horde, The",1931,75,NA,5.1,6,0,0,14.5,0,14.5,45.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Conquering Power, The",1921,89,NA,7,53,0,0,0,4.5,4.5,14.5,14.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Conqueror, The",1956,111,6000000,3.3,364,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Conquerors, The",1932,86,NA,5.6,25,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Conquest",1937,113,2732000,6.7,163,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Conquest",1998,92,NA,6.2,69,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Conquest of Cheyenne",1946,56,NA,6.7,5,0,0,0,24.5,64.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Conquest of Cochise",1953,70,NA,5.2,24,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Conquest of Everest, The",1953,78,NA,7.3,18,0,0,0,4.5,4.5,0,24.5,24.5,0,34.5,"",0,0,0,0,1,0,0 -"Conquest of Space",1955,81,NA,5.8,154,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Conquest of the Planet of the Apes",1972,88,1700000,5.5,2255,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Conquista de Albania, La",1984,122,NA,4.9,8,14.5,0,0,34.5,0,34.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Conquista, La",1983,84,NA,4.4,123,14.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Conquistatore di Atlantide, Il",1965,93,NA,4.5,15,4.5,0,24.5,0,24.5,4.5,24.5,14.5,4.5,0,"",1,0,0,1,0,0,0 -"Conquistatore di Corinto, Il",1962,77,NA,5.2,11,0,0,4.5,34.5,4.5,14.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Conrack",1974,106,NA,6.9,374,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Conrad Brooks vs. the Werewolf",1994,43,NA,5.9,12,24.5,0,0,0,14.5,0,0,0,0,45.5,"",0,0,1,0,0,0,1 -"Conrad the Sailor",1942,7,NA,6.3,32,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Conseguenze dell'amore, Le",2004,100,NA,7.8,193,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Conseil de famille",1986,98,NA,5.2,61,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Consent",2004,6,NA,9.4,8,0,0,0,0,0,0,0,24.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Consenting Adults",1992,95,NA,5.4,1360,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Consequence",2000,91,NA,8,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Consequence",2003,97,NA,4.5,104,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Conserje en condominio",1974,118,NA,6.2,11,4.5,0,0,0,4.5,34.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Consigli per gli acquisti",1997,90,NA,4.1,14,14.5,0,14.5,0,0,0,14.5,45.5,0,4.5,"",0,0,1,0,0,0,0 -"Consiglio d'Egitto, Il",2002,138,NA,8.3,16,0,0,0,4.5,0,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Consigliori, Il",1973,99,NA,3.6,9,24.5,14.5,0,0,14.5,44.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Consolation Marriage",1931,81,NA,6.3,43,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Conspiracy",1930,69,NA,6.7,6,0,0,0,0,34.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Conspiracy",1939,58,NA,6.3,12,4.5,0,0,14.5,0,34.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Conspiracy Theory",1997,135,75000000,6.4,15470,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Conspiracy of Hearts",1960,113,NA,6.6,53,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Conspiracy of Silence",2003,90,NA,6.3,47,0,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Conspirator",1949,87,NA,5.9,56,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Conspirators, The",1944,101,NA,6.4,101,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Constance",1984,104,NA,5.1,7,0,0,0,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Constans",1980,92,NA,7.1,25,0,0,0,0,4.5,14.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Constant Forge, A",2000,200,NA,7.8,19,0,0,0,0,0,14.5,4.5,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Constant Husband, The",1955,88,NA,6.6,33,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Constant Nymph, The",1943,112,NA,7.5,31,0,4.5,0,0,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Constantine",2005,121,100000000,6.4,11633,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Constelaciones",1980,85,NA,3.3,8,14.5,14.5,14.5,0,0,45.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Constellation Jodorowsky, La",1994,91,NA,7.2,48,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Consulta del Dr. Natalio, La",2004,12,NA,6.6,11,4.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Consuming Passions",1988,98,NA,5.1,91,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Contact",1992,30,NA,6.2,222,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Contact",1997,153,90000000,7.3,36390,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Container, A",2002,5,NA,6.3,5,0,24.5,0,0,24.5,0,44.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Contaminated Man, The",2000,100,NA,4.6,300,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Contamination",1980,95,NA,4.8,189,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Contamination .7",1990,91,NA,1.7,65,64.5,14.5,4.5,4.5,0,0,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Conte Max, Il",1957,101,NA,6.3,41,0,0,0,0,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Conte d'automne",1998,112,NA,7.1,855,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"PG",0,0,0,0,0,1,0 -"Conte d'hiver",1992,114,NA,7.3,323,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Conte de printemps",1990,112,NA,7.3,342,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Conte du ventre plein, Le",2000,105,NA,3,54,45.5,14.5,4.5,4.5,4.5,0,4.5,0,0,4.5,"",0,0,1,1,0,0,0 -"Contender, The",2000,126,9000000,6.9,7023,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Contes immoraux",1974,103,NA,5.7,230,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Continental",1990,104,NA,4.8,11,0,14.5,4.5,24.5,4.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Continental Divide",1981,103,NA,5.8,1106,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Continental Twist, The",1962,76,NA,3.2,17,14.5,0,14.5,24.5,4.5,0,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Contra Todos",2003,95,NA,6.8,59,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Contra el viento",1990,95,NA,4.7,46,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Contraband",1940,80,NA,7.6,100,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Contract, The",1998,90,NA,4.9,78,14.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Contract, The",1999,90,NA,4.5,74,14.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Contract, The",2000,42,NA,4.2,6,14.5,14.5,14.5,0,14.5,0,34.5,0,0,0,"R",0,0,0,0,0,0,1 -"Contrainte par corps",1988,98,NA,4.6,7,24.5,0,0,14.5,0,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Contranatura",2001,13,NA,6.6,5,24.5,0,0,0,0,0,0,84.5,0,0,"",0,0,0,0,0,0,1 -"Contraption, The",1977,8,NA,3.5,8,14.5,0,0,0,14.5,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Contrary Condor",1944,8,NA,7.3,22,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Contre l'oubli",1991,110,NA,6.5,15,4.5,4.5,0,0,34.5,0,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Contro 4 bandiere",1979,100,NA,4.7,49,14.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Control Room",2004,57,NA,8,1453,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Control de plagas",2004,14,5000,8.1,10,14.5,14.5,0,0,0,0,0,0,24.5,64.5,"",0,0,1,0,0,0,1 -"Controlled Chaos",2003,93,NA,5.1,11,14.5,0,0,24.5,0,0,0,24.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Controsesso",1964,90,NA,4.8,10,0,14.5,0,0,24.5,44.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Controvento",2000,98,NA,5.4,25,4.5,0,14.5,14.5,24.5,4.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Convent, The",2000,84,NA,4.8,629,14.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Convention City",1933,69,239000,4.7,5,0,24.5,0,0,0,0,0,0,24.5,64.5,"",0,0,1,0,0,0,0 -"Convention Girl",1935,66,NA,7.6,6,14.5,0,0,14.5,0,0,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Convento, O",1995,90,NA,5.1,268,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Convergence",1999,93,NA,4.3,212,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Converging with Angels",2002,158,NA,5.7,23,14.5,0,4.5,0,0,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Conversa Acabada",1982,100,NA,2.4,11,14.5,0,14.5,4.5,0,4.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Conversation with Gregory Peck, A",1999,97,NA,6.5,51,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Conversation with Haris, A",2002,6,NA,7.8,6,0,0,0,0,14.5,14.5,0,34.5,34.5,0,"",0,1,0,0,1,0,1 -"Conversation with the Beast",1996,95,NA,6.9,44,14.5,4.5,0,4.5,0,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Conversation, The",1974,113,1600000,8.1,10260,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Conversations",2004,16,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,0,0,0,1 -"Convict 13",1920,20,NA,7.4,166,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Convict 762",1997,97,NA,2.8,76,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Convict 99",1939,91,NA,7.3,52,0,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Convicted",1950,91,NA,6.6,38,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Convicts",1990,103,NA,5.7,65,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Convicts 4",1962,105,NA,6.2,37,0,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Convite ao Prazer",1980,109,NA,5.5,7,14.5,0,0,14.5,14.5,0,0,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Convivencia",1993,97,NA,4.4,20,14.5,4.5,4.5,24.5,14.5,34.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Convoy",1940,78,NA,5.3,15,4.5,0,0,24.5,24.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Convoy",1978,106,NA,5.7,1729,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Convoyeur, Le",2004,95,NA,6.6,175,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Convoyeurs attendent, Les",1999,93,NA,6.7,404,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"CooCoo Nut Grove, The",1936,7,NA,6.3,32,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Coogan's Bluff",1968,93,NA,6.5,1301,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Cook the Thief His Wife & Her Lover, The",1989,98,NA,7.1,5676,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cook, The",1918,22,NA,7.5,56,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Cookers",2001,96,NA,8.6,22,0,4.5,4.5,0,4.5,0,0,14.5,14.5,45.5,"R",0,0,0,1,0,0,0 -"Cookery for Men",1995,12,NA,9.2,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,0,0,0,0,0,1 -"Cookie",1989,94,NA,5,312,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cookie Carnival, The",1935,7,NA,7.1,51,0,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Cookie Story, The",2001,6,NA,6.9,5,0,0,0,0,0,44.5,44.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Cookie's Fortune",1999,118,NA,6.9,4727,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Cookies & Stuff",1994,10,NA,6,5,0,24.5,0,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Cookin' with Gags",1955,6,NA,5,25,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Cookoo Cavaliers",1940,18,NA,7.3,54,0,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Cookout, The",2004,97,NA,3.2,368,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Cool Air",1999,50,NA,5.1,21,4.5,0,0,4.5,4.5,0,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Cool Breeze",1972,101,NA,4.8,46,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cool Cat",1967,6,NA,6,11,0,0,4.5,0,34.5,0,0,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Cool Hand Luke",1967,126,NA,8.2,14167,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Cool Hot Rod, The",1953,26,1000,3.9,5,0,24.5,0,0,44.5,44.5,0,0,0,0,"",0,0,0,1,0,0,1 -"Cool It Carol!",1970,101,NA,3.7,24,14.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Cool Mikado, The",1962,81,NA,4.5,11,34.5,0,14.5,0,24.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Cool Ones, The",1967,98,NA,4.6,32,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cool Runnings",1993,98,NA,6.3,7593,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cool Surface, The",1994,88,NA,4.6,590,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Cool World",1992,102,NA,4.1,3545,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,1,1,0,0,0,0 -"Cool World, The",1964,125,NA,6.8,36,0,0,4.5,4.5,14.5,14.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Cool and the Crazy, The",1958,78,NA,5,52,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cool as Ice",1991,100,6000000,2.4,1280,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Cool!",2004,89,NA,5.3,120,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Cool, Dry Place, A",1998,97,NA,6.3,725,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Coolangatta Gold, The",1984,113,NA,4.3,32,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cooler, The",2003,101,NA,7,6329,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Cooley High",1975,107,NA,6.6,282,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Coolie No. 1",1995,143,NA,5.2,34,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Coonskin",1975,83,NA,6.4,125,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",1,1,1,1,0,0,0 -"Cop",1988,110,NA,6,537,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cop & 1/2",1993,97,NA,3.2,1662,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cop Hater",1958,75,NA,6,17,0,0,4.5,4.5,4.5,44.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Cop Killers",1973,93,NA,6.5,5,0,0,0,0,24.5,24.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Cop Land",1997,116,15000000,6.7,12677,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Cop Target",1990,89,NA,3.4,12,4.5,4.5,34.5,14.5,4.5,4.5,0,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Cop on a Mission",2001,89,NA,7.3,40,4.5,0,4.5,0,14.5,14.5,24.5,34.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cop-Out",1991,102,NA,3.1,6,45.5,0,0,0,34.5,0,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Copacabana",1947,92,NA,5.6,160,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Copacabana",2001,90,NA,7.7,93,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Copacabana Me Engana",1968,96,NA,8,10,0,0,0,0,14.5,24.5,24.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Copains du dimanche, Les",1958,100,NA,5.8,9,14.5,0,0,0,14.5,34.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Copak je to za vojaka...",1987,85,NA,5,36,14.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Copi, je t'aime",2002,7,NA,9.8,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Copie conforme",1947,105,NA,7.3,25,0,0,0,0,0,4.5,34.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Copkiller",1983,113,NA,5.3,141,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Coplan FX 18 casse tout",1965,95,NA,4.1,5,44.5,0,24.5,0,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Coplan prend des risques",1964,98,NA,4.1,5,0,0,0,64.5,44.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Coplan sauve sa peau",1968,110,NA,3.9,13,14.5,4.5,4.5,34.5,0,14.5,14.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Coplan, agent secret FX 18",1964,95,NA,3.9,13,0,0,4.5,14.5,4.5,0,4.5,0,0,64.5,"",1,0,0,0,0,0,0 -"Copper Canyon",1950,84,NA,5.7,62,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Copper Mountain",1983,60,NA,2.6,116,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Copper Sky",1957,77,NA,4.5,23,4.5,14.5,4.5,14.5,14.5,4.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Coppia omicida",1998,108,NA,2.3,19,44.5,24.5,0,4.5,0,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Coppie, Le",1970,111,NA,5.1,10,0,14.5,0,0,14.5,44.5,34.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Cops",1922,18,NA,8.1,542,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Cops Is Always Right",1938,7,NA,5.7,12,0,0,14.5,4.5,4.5,34.5,14.5,0,4.5,4.5,"",0,1,1,0,0,0,1 -"Cops Is Tops",1955,7,NA,5.7,7,0,14.5,0,14.5,14.5,14.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Cops and Robbers",1973,89,NA,6.2,73,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cops and Robbersons",1994,93,NA,4.4,1106,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Copy",1929,21,NA,5.1,9,0,0,0,14.5,44.5,0,24.5,14.5,0,14.5,"",0,0,0,1,0,0,1 -"Copy Cat",1941,7,NA,8.6,21,0,0,0,0,0,4.5,4.5,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Copy Shop",2001,12,NA,7.5,213,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,1 -"Copycat",1995,123,20000000,6.5,7804,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Coquette",1929,76,489106,4.9,90,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Coquille et le clergyman, La",1928,9,NA,6,62,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Cor do seu Destino, A",1986,104,NA,8.8,20,0,4.5,0,14.5,0,0,4.5,14.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Coraggio, Il",1955,95,NA,5.8,11,0,0,0,0,44.5,0,14.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Coraje",1998,110,NA,7.6,27,4.5,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Coraje del pueblo, El",1971,90,NA,8,8,0,0,0,0,0,0,14.5,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Coral Reef Adventure",2003,45,10000000,6.2,65,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Corbari",1970,90,NA,6,10,0,0,14.5,0,0,24.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Corbeau et le renard, Le",1969,3,NA,8.1,9,14.5,0,0,0,0,0,24.5,24.5,44.5,0,"",0,1,0,0,0,0,1 -"Corbeau, Le",1943,87,NA,8.3,477,4.5,0,0,4.5,4.5,4.5,14.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Corbeau, Le",2001,9,NA,6.8,6,0,0,0,0,34.5,0,45.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Cord",2000,100,NA,5.3,384,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Cord of Life, The",1909,9,NA,4.9,7,24.5,0,0,14.5,14.5,0,24.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Core 'ngrato",1951,110,NA,8.6,14,4.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,1,0,0,0 -"Core, The",2003,135,74000000,5.4,7860,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Corey",2000,14,NA,5.7,10,0,0,14.5,14.5,44.5,0,0,0,44.5,0,"",0,0,0,1,0,0,1 -"Coriolano: eroe senza patria",1964,96,NA,4.8,5,0,0,0,64.5,44.5,0,0,0,0,0,"",1,0,0,1,0,0,0 -"Coriolis Effect, The",1994,33,NA,3.2,53,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Corisco, O Diabo Loiro",1969,100,NA,8.1,6,0,0,0,14.5,0,34.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Corky",1972,88,NA,5.2,29,14.5,0,0,14.5,4.5,14.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Corky Romano",2001,86,11000000,4.6,2463,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Corleone",1977,108,NA,4.7,18,0,4.5,14.5,4.5,24.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Corn Chips",1951,7,NA,7.2,24,0,0,0,4.5,4.5,4.5,34.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Corn Is Green, The",1945,115,NA,7.5,306,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Corn Plastered",1951,7,NA,6.1,12,0,0,4.5,4.5,4.5,14.5,14.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Corn on the Cop",1934,20,NA,6.8,12,0,0,0,0,4.5,4.5,45.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Corn on the Cop",1965,6,NA,6,25,0,0,14.5,4.5,4.5,34.5,24.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Cornbread, Earl and Me",1975,95,NA,6,108,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Corndog Man, The",1999,83,NA,6.3,240,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Corner in Wheat, A",1909,14,NA,7,115,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Corner of Your Eye",2003,96,100000,5.2,8,0,0,0,24.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Corner's",2002,66,NA,8.6,10,0,0,0,0,0,0,14.5,34.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Cornered",1945,102,NA,6.7,132,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cornered",2001,88,NA,3.3,16,34.5,4.5,14.5,0,4.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Cornetti alla crema",1981,109,NA,5.1,29,14.5,0,14.5,14.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Corniaud, Le",1965,108,NA,7.6,443,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Cornman: American Vegetable Hero",2001,70,NA,3.6,22,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Corny Casanovas",1952,17,NA,7.1,45,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Corny Concerto, A",1943,8,NA,7.9,108,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Corona di ferro, La",1941,97,NA,6.8,60,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Corona negra, La",1951,106,NA,6,10,0,0,0,14.5,24.5,0,34.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Coronado",2003,88,4700000,4.5,411,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Coronel no tiene quien le escriba, El",1999,122,3000000,6.9,265,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Coroner Creek",1948,90,NA,6.8,65,4.5,4.5,0,4.5,4.5,24.5,44.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Corpi presentano tracce di violenza carnale, I",1973,92,NA,5.7,195,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Corpo Ardente, O",1966,85,NA,6,9,0,0,0,0,24.5,34.5,24.5,0,0,24.5,"",0,0,0,1,0,1,0 -"Corpo dell'anima, Il",1999,105,NA,6.3,20,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Corpo, Il",1974,93,NA,4.3,5,24.5,0,0,24.5,0,24.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Corpo, O",1991,80,NA,7.9,38,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Corporate Dawgz",2002,21,NA,7.2,8,14.5,0,0,0,0,24.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Corporate Fantasy",1999,86,NA,3.1,46,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Corporate Ladder, The",1997,112,NA,4.6,72,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Corporation, The",2003,150,NA,8.4,2106,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Corpress",1975,12,NA,6.1,6,0,0,0,0,14.5,14.5,34.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Corps de mon ennemi, Le",1976,120,NA,6.2,185,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Corps impatients, Les",2003,94,NA,6.1,106,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Corps inflammables",1995,40,NA,7.3,8,0,0,0,14.5,0,14.5,34.5,0,14.5,24.5,"",0,0,0,1,0,0,1 -"Corps ouverts, Les",1998,47,NA,8,25,4.5,4.5,4.5,0,4.5,0,14.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Corpse Came C.O.D., The",1947,87,NA,6.2,17,0,0,0,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Corpse Eaters",1974,61,NA,4.2,5,0,24.5,0,24.5,44.5,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Corpse Grinders, The",1972,62,47000,2.6,153,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Corpse Vanishes, The",1942,64,NA,4.1,246,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Corpse, The",1970,91,NA,3.6,73,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Corpus Christi Bandits",1945,56,NA,6.3,6,14.5,0,0,14.5,14.5,0,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Correccional de mujeres",1986,90,NA,3,18,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Corregidor",1943,73,NA,5.4,21,4.5,0,14.5,14.5,24.5,24.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Correre contro",1996,93,NA,8,9,14.5,0,0,0,0,0,0,34.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Corri, uomo, corri",1968,120,NA,6.7,97,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Corrida pour un espion",1965,111,NA,5.1,6,0,0,14.5,0,14.5,14.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Corridor",1989,1,NA,5.8,7,14.5,0,0,0,0,0,44.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Corridor of Mirrors",1948,96,NA,6.9,24,4.5,4.5,0,4.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Corridors of Blood",1962,86,NA,6,110,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Corrina, Corrina",1994,115,NA,6,1949,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Corruption",1967,91,NA,4.5,40,4.5,0,4.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Corruption",1983,84,NA,4.6,10,14.5,0,0,24.5,24.5,14.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Corruptor, The",1999,99,NA,5.5,4312,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Corruzione, La",1963,80,NA,5.6,7,0,0,14.5,0,0,44.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Corsa dell'innocente, La",1993,105,NA,6.8,145,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Corsa di primavera",1989,106,NA,8.3,6,0,0,0,0,14.5,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Corsair",1931,75,NA,6,12,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Corsarios, Los",1971,102,NA,5.8,6,0,14.5,0,14.5,0,14.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Corsaro nero, Il",1971,99,NA,4.8,86,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Corsaro nero, Il",1976,126,NA,4.8,27,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Corsican Brothers, The",1941,111,NA,6.5,65,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Corte de Cabelo",1995,91,NA,5.7,35,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cortex",2004,90,NA,6.6,5,0,0,0,0,44.5,0,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Cortigiana di Babilonia",1955,105,NA,5.3,21,0,14.5,0,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Corvette K-225",1943,98,NA,6.7,72,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Corvette Summer",1978,108,NA,4.3,458,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cosa avete fatto a Solange?",1972,102,NA,6.5,162,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Cosa de brujas",2003,102,NA,5.8,53,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Cosa, La",1990,60,NA,6.9,24,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Cosacchi, I",1959,100,NA,5,7,0,14.5,24.5,14.5,0,14.5,14.5,14.5,0,0,"",1,0,0,1,0,0,0 -"Cosas del querer, Las",1989,103,NA,7.1,53,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cosas del querer: Segunda parte, Las",1995,98,NA,3.4,15,4.5,34.5,0,4.5,4.5,4.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Cosas que hacen que la vida valga la pena",2004,90,NA,6.5,37,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Cosas que nunca te dije",1996,93,NA,6.9,248,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Cosh Boy",1952,75,NA,4.5,23,14.5,4.5,4.5,24.5,4.5,4.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Cosi",1996,103,NA,6.8,536,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Cosmic Eye, The",1986,71,NA,3.3,9,24.5,0,24.5,14.5,0,0,0,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Cosmic Man, The",1959,72,NA,3.3,37,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Cosmic Ray",1962,4,NA,8.2,22,0,4.5,0,0,0,4.5,14.5,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Cosmic Space Ninja",1997,34,NA,6.3,6,34.5,0,0,0,0,14.5,0,0,0,45.5,"",1,0,1,0,0,0,1 -"Cosmic Voyage",1996,35,NA,7.1,96,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Cosmic Zoom",1968,8,NA,7.4,15,0,0,0,0,4.5,0,24.5,24.5,14.5,24.5,"",0,1,0,0,1,0,1 -"Cosmo Jones, Crime Smasher",1943,62,NA,4.7,9,0,0,14.5,24.5,24.5,34.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Cosmos",1974,33,NA,6.9,23,4.5,0,0,0,4.5,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,1,0,1 -"Cosmos",1996,99,NA,7,116,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Cost of Living",1997,104,NA,3.6,35,14.5,14.5,4.5,0,4.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Costa Azzurra",1959,84,NA,7.4,7,0,0,0,0,14.5,14.5,0,45.5,14.5,0,"",0,0,1,0,0,0,0 -"Costa Brava",1994,90,NA,4,25,0,0,14.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Costa do Castelo, O",1943,135,NA,7.5,53,4.5,0,0,0,4.5,14.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Costa!",2001,95,NA,4.3,675,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Costantino il grande",1962,120,NA,4.9,38,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Costume Designer, The",1950,9,NA,6.1,6,0,0,14.5,0,14.5,34.5,0,0,0,34.5,"",0,0,0,0,1,0,1 -"Cottage to Let",1941,97,NA,7,67,0,0,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cotter",1973,94,NA,5.5,9,0,0,0,14.5,24.5,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Cotton Bud",1999,1,NA,5.2,17,0,0,14.5,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Cotton Club, The",1984,127,47000000,6.2,2663,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cotton Comes to Harlem",1970,97,1200000,6.2,204,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Cotton Mary",1999,124,3500000,5.3,164,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Cotton Patch Gospel",1988,111,NA,7.5,13,0,0,0,0,4.5,0,4.5,4.5,34.5,44.5,"",0,0,0,0,0,0,0 -"Cottonpickin' Chickenpickers",1967,92,NA,1.9,7,44.5,24.5,0,0,0,0,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Cottonwood, The",1996,90,NA,6.7,13,4.5,0,0,4.5,0,4.5,4.5,4.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Cou de la girafe, Le",2004,84,NA,6.4,29,0,0,0,4.5,0,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Couch Trip, The",1988,97,NA,5.3,964,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Couch, The",1962,100,NA,6.2,9,0,0,14.5,0,14.5,14.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Coucou, monsieur Edgar!",1999,13,NA,6.8,6,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,1,0,0,0,0,1 -"Could This Be Love?",1973,29,5000,3.6,8,14.5,0,24.5,14.5,0,0,14.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Couleur du vent, La",1988,81,NA,5.7,5,0,0,0,0,64.5,24.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Couleurs du diable, Les",1997,90,NA,3.2,8,24.5,0,14.5,0,14.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Couloirs du temps: Les visiteurs 2, Les",1998,118,NA,4.7,736,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Counsellor at Law",1933,80,NA,8.3,173,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Count Dracula",1970,97,NA,5.1,178,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Count Five and Die",1958,92,NA,6.3,15,0,0,4.5,0,24.5,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Count Me Out",1938,7,NA,6,13,0,0,0,0,34.5,34.5,4.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Count Three and Pray",1955,102,NA,6.3,41,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Count Yorga, Vampire",1970,90,NA,5.4,278,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Count Your Blessings",1959,102,NA,4.8,32,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Count of Monte Cristo, The",1934,113,NA,7.8,130,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Count of Monte Cristo, The",2002,134,35000000,7.4,13907,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Count the Hours",1953,76,NA,6.3,40,0,0,0,4.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Count, The",1916,34,NA,7,186,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Countdown",1968,101,NA,6.3,271,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Countdown",1996,90,NA,2.9,88,24.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Countdown at Kusini",1976,101,NA,4.8,5,0,24.5,0,24.5,0,24.5,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Counter Measures",1999,90,NA,3.7,119,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Counter-Attack",1945,90,NA,6.9,21,0,0,0,4.5,0,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Counterblast",1948,90,NA,6.1,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Counterfeit Cat, The",1949,7,NA,6.9,21,4.5,0,0,0,4.5,14.5,4.5,44.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Counterfeit Traitor, The",1962,140,NA,7.6,390,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Counterpoint",1968,107,NA,5.3,112,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Countess Alice, The",1992,81,NA,6.5,26,0,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Countess Dracula",1971,93,NA,5.6,263,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Countess from Hong Kong, A",1967,120,3500000,5.4,449,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Countess of Monte Cristo, The",1948,77,NA,4,20,4.5,14.5,14.5,24.5,14.5,14.5,0,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Counting Days",2000,95,NA,7.1,7,14.5,0,14.5,0,0,0,0,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Country",1984,105,NA,6.5,369,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Country",2000,92,NA,6.6,19,4.5,4.5,0,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Country Bears, The",2002,88,35000000,3.7,664,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Country Blue",1973,110,NA,2,8,0,34.5,14.5,0,14.5,14.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Country Boy",1935,7,NA,3.2,7,14.5,14.5,14.5,24.5,14.5,14.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Country Comfort",1981,90,NA,4.3,25,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Country Cousin, The",1936,7,NA,7.3,87,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Country Cuzzins",1970,81,NA,4.5,17,14.5,4.5,14.5,0,0,24.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Country Dance",1970,112,NA,6,75,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Country Doctor, The",1909,10,NA,6.9,32,14.5,0,0,0,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Country Doctor, The",1936,110,NA,5.8,6,0,0,0,14.5,0,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Country Gentlemen",1936,53,NA,5.6,16,0,0,4.5,4.5,34.5,34.5,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Country Girl, The",1954,104,NA,7.3,578,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Country Life",1994,114,NA,6.2,280,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Country Mouse, The",1935,7,NA,6.3,10,0,0,0,14.5,14.5,24.5,34.5,0,0,34.5,"",0,1,1,0,0,0,1 -"Country of My Skull",2004,104,12000000,5.1,194,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Countryman",1982,102,NA,6.7,49,0,0,4.5,0,14.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"County Fair",1937,72,NA,4.1,8,0,14.5,14.5,34.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"County Fair",1950,76,NA,5.2,5,0,0,0,0,44.5,0,64.5,0,0,0,"",0,0,0,1,0,0,0 -"County Hospital",1932,19,NA,7.4,175,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"County Kilburn",2000,81,NA,6.5,13,0,0,0,0,0,34.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Coup",1999,158,NA,5.4,31,4.5,0,0,0,4.5,0,4.5,4.5,14.5,45.5,"",0,0,0,1,1,0,0 -"Coup de foudre",1983,110,NA,7.8,296,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Coup de jeune",1993,88,NA,3.9,11,4.5,0,24.5,14.5,4.5,0,24.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Coup de lune",2003,6,NA,5.5,20,4.5,0,0,14.5,34.5,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Coup de sirocco, Le",1979,102,NA,5.5,27,4.5,0,4.5,14.5,34.5,4.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Coup de torchon",1981,128,NA,7.5,561,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Coup du parapluie, Le",1980,95,NA,6.2,148,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Coupable d'innocence",1992,110,NA,7.2,11,0,0,0,0,0,4.5,14.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Coupe de Ville",1990,99,NA,6.2,377,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Couperet, Le",2005,122,NA,6.9,137,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Couple cherche esclave sexuel",1978,90,NA,4.5,9,0,14.5,0,14.5,24.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Couple gisant",1997,8,NA,4.5,6,0,0,14.5,0,34.5,34.5,0,0,14.5,0,"",1,0,0,0,0,0,1 -"Coupling",1999,5,NA,7.3,28,4.5,0,4.5,4.5,4.5,0,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Courage",1984,90,NA,5,50,14.5,4.5,4.5,0,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Courage & Stupidity",2004,25,NA,8.8,10,14.5,0,0,0,0,0,14.5,0,0,84.5,"",0,0,1,1,0,0,1 -"Courage Mountain",1990,94,NA,4.5,129,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Courage Under Fire",1996,117,46000000,6.7,8884,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Courage fuyons",1979,100,NA,5.5,30,0,0,4.5,14.5,14.5,44.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Courage of Black Beauty",1957,78,NA,4.9,11,4.5,0,4.5,4.5,4.5,44.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Courage of Lassie",1946,92,NA,5.6,96,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Courageous Dr. Christian, The",1940,67,NA,5.1,5,24.5,0,0,0,44.5,0,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Courier of Death",1984,77,NA,7,6,14.5,14.5,14.5,0,0,0,34.5,0,14.5,0,"",1,0,0,1,0,0,0 -"Cours du soir",1967,30,NA,6.7,69,4.5,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Cours toujours",2000,84,NA,6.6,22,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Course aux potirons, La",1907,6,NA,4.2,8,14.5,0,0,0,14.5,14.5,24.5,0,24.5,14.5,"",0,0,1,0,0,0,1 -"Course des sergents de ville, La",1907,6,NA,6.5,91,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Court Jester, The",1956,101,NA,7.8,2419,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Court-Martial of Billy Mitchell, The",1955,100,NA,6.8,304,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Courting Courtney",1997,83,NA,5.8,73,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Courtneys of Curzon Street, The",1947,112,NA,6.9,34,0,0,0,4.5,4.5,34.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Courtship",1987,84,NA,4.3,28,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Courtship of Andy Hardy, The",1942,95,NA,6.3,41,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Courtship of Eddie's Father, The",1963,118,NA,6.3,298,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Courtship of the Newt, The",1938,8,NA,6.2,7,0,24.5,0,0,0,0,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Cousin",1998,4,NA,7.1,50,4.5,0,4.5,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,1,1,0,0,1 -"Cousin Bette",1998,108,NA,6.2,628,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Cousin Bobby",1992,70,NA,6.3,39,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Cousin, Le",1997,112,NA,6.7,248,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cousin, cousine",1975,95,NA,6.8,275,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Cousins",1983,106,NA,7.5,23,0,0,0,0,0,4.5,24.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Cousins",1989,109,NA,6,1084,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Cousins, Les",1959,107,NA,7.5,158,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Couteau dans la plaie, Le",1962,112,NA,6.3,62,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Couteau sous la gorge, Le",1986,85,NA,5.1,5,0,24.5,0,0,24.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Couturier de ces dames, Le",1956,95,NA,5.2,21,4.5,0,14.5,4.5,0,14.5,34.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Covek nije tica",1965,81,NA,5.6,31,4.5,4.5,0,0,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Covek sa cetiri noge",1983,97,NA,5.7,6,0,0,14.5,0,0,45.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Coven",1997,40,NA,4,354,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Covenant with Death, A",1967,97,NA,6.5,24,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cover Girl",1944,107,NA,7.2,361,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Cover Girl Killer",1959,61,NA,4.4,23,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Cover Girl Models",1975,73,NA,4.5,19,14.5,4.5,0,24.5,4.5,4.5,14.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Cover Me",1995,94,NA,3.5,79,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Cover Me Babe",1970,89,NA,5.5,10,34.5,0,0,14.5,24.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Cover Story",2002,92,NA,3.5,64,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Cover Up",1988,72,NA,7.3,47,14.5,0,4.5,4.5,0,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Cover Up",1991,87,7500000,3.3,193,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cover-Up",1949,82,NA,5.9,19,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Coverage",2000,16,NA,6.9,12,34.5,0,0,0,0,0,0,0,4.5,45.5,"",0,0,0,0,0,0,1 -"Covered Wagon, The",1923,98,782000,7.9,49,0,4.5,0,0,4.5,4.5,24.5,14.5,34.5,14.5,"",0,0,0,0,0,1,0 -"Covered with Chocolate",2001,1,NA,7.3,11,0,0,0,0,4.5,14.5,4.5,34.5,4.5,14.5,"",0,1,0,0,1,0,1 -"Covergirl",1984,93,NA,2.4,7,24.5,0,14.5,0,14.5,24.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Covert Action",1988,90,NA,1.6,10,45.5,24.5,0,14.5,24.5,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Cow Country",1953,82,NA,5.9,6,0,0,0,0,34.5,14.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Cow Monkey",2001,88,NA,7.7,9,14.5,0,0,0,0,14.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Cow Town",1950,70,NA,6.1,14,0,4.5,0,0,24.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Cowards Bend the Knee",2003,60,NA,7.5,85,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Cowboy",1958,92,NA,6.7,207,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Cowboy Bebop: Tengoku no tobira",2001,116,NA,7.5,3083,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",1,1,1,0,0,0,0 -"Cowboy Jesus",1996,8,NA,3.8,9,24.5,0,14.5,0,0,0,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Cowboy Needs a Horse, A",1956,7,NA,4.4,17,14.5,0,4.5,14.5,14.5,0,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Cowboy Serenade",1942,66,NA,5.6,7,0,0,14.5,14.5,24.5,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cowboy Star, The",1936,56,NA,7.1,11,0,0,0,4.5,34.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cowboy Up",2001,105,NA,5.3,143,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Cowboy Way, The",1994,102,NA,5.1,1421,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Cowboy and the Blonde, The",1941,68,NA,6.3,15,0,4.5,4.5,0,24.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Cowboy and the Indians, The",1949,68,NA,6,24,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Cowboy and the Lady, The",1938,91,1500000,6.3,110,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Cowboy and the Senorita",1944,52,NA,6,28,0,0,0,4.5,24.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cowboy from Brooklyn",1938,77,NA,4.7,49,14.5,4.5,4.5,4.5,14.5,24.5,24.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Cowboy, The",1954,69,NA,3.1,5,44.5,0,0,24.5,0,24.5,24.5,0,0,0,"",0,0,0,0,1,0,0 -"Cowboys & Angels",2003,89,2000000,7.5,206,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Cowboys and Angels",2000,97,NA,6.5,83,0,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"PG",0,0,0,0,0,1,0 -"Cowboys from Texas, The",1939,57,NA,6,5,0,24.5,0,24.5,0,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Cowboys, The",1972,128,6000000,6.9,1316,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cowboys: High Noon",1991,3,NA,7.3,6,0,0,0,14.5,14.5,0,0,64.5,0,0,"",0,1,1,0,0,0,1 -"Cowboys: Slim Pickin's",1991,3,NA,7.3,5,0,0,0,0,44.5,0,24.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Cowgirl",2004,84,NA,4.1,23,14.5,4.5,4.5,34.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Coy Decoy, A",1941,7,NA,6.5,37,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Coyote",1992,99,NA,4,57,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Coyote Beach",2003,21,NA,4.6,13,0,4.5,4.5,0,4.5,14.5,14.5,0,24.5,24.5,"",0,0,0,1,0,0,1 -"Coyote Run",1996,101,NA,3.9,37,24.5,14.5,14.5,14.5,4.5,24.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Coyote Summer",1996,93,NA,5.9,36,0,4.5,0,14.5,4.5,14.5,24.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Coyote Ugly",2000,100,45000000,5.4,13221,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Coyotes",1999,90,NA,4.7,22,4.5,0,0,4.5,24.5,0,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Crab Boy",1996,11,17000,2.1,5,44.5,0,0,0,0,0,64.5,0,0,0,"",0,0,0,0,0,0,1 -"Crabe-tambour, Le",1977,120,NA,6.6,80,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Crac",1980,15,NA,8.2,72,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,0,1,0,0,1 -"Crack Glass Eulogy",1992,6,NA,6.4,37,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Crack House",1989,90,NA,4.6,30,14.5,4.5,14.5,4.5,14.5,0,14.5,4.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Crack II, El",1983,115,NA,7.4,25,14.5,0,0,4.5,0,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Crack in the Floor, A",2000,90,NA,2.5,199,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Crack in the Mirror",1960,97,NA,6.9,29,0,0,0,4.5,14.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Crack in the World",1965,96,600000,5.8,244,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Crack, El",1981,119,NA,7.1,73,4.5,0,4.5,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Crack-Up",1936,65,NA,5.9,20,0,0,14.5,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Crack-Up",1946,93,NA,6.6,119,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cracked Ice",1938,8,NA,6.5,13,0,0,0,14.5,4.5,14.5,34.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Cracked Nuts",1931,65,NA,6.3,35,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Cracked Quack",1952,7,NA,6.9,36,0,0,0,4.5,0,14.5,44.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Cracker Bag",2003,15,NA,5.9,32,24.5,0,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Cracker Man, The",1999,57,NA,4.7,13,0,0,14.5,4.5,24.5,4.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Crackerjack",1938,76,NA,6.3,17,0,0,0,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Crackerjack",1994,96,NA,3.7,177,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Crackerjack",2002,92,NA,6.5,449,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Crackerjack 2",1996,96,NA,2.7,69,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Crackerjack 3",2000,97,NA,4.8,29,24.5,0,14.5,4.5,14.5,4.5,0,4.5,4.5,34.5,"PG-13",1,0,0,0,0,0,0 -"Crackers",1984,91,NA,4.5,157,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Crackers",1998,92,NA,6.3,102,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cracking Up",1977,69,NA,3.5,28,14.5,14.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Cracking Up",1983,83,NA,4.2,112,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Crackpot Quail, The",1941,8,NA,6.6,20,0,0,0,14.5,14.5,24.5,14.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Cracks, Les",1968,108,NA,6.5,21,0,0,4.5,4.5,14.5,4.5,14.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Cracksman, The",1963,112,NA,4.4,18,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Cradle 2 the Grave",2003,101,25000000,5.3,4164,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Cradle Will Rock",1999,132,32000000,6.7,3375,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Craft, The",1996,101,15000000,5.9,9187,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Craic, The",1999,86,NA,5,239,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Craig's Wife",1936,73,300000,7.8,54,0,0,0,4.5,4.5,4.5,34.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Crainquebille",1922,50,NA,7.6,18,0,44.5,14.5,4.5,0,0,14.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Crane, The",1994,16,NA,6.4,7,0,14.5,0,0,14.5,14.5,0,14.5,0,44.5,"",0,0,0,0,0,0,1 -"Crank Calls",2002,10,40000,6.8,22,4.5,0,0,0,4.5,24.5,4.5,4.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Crash",1974,90,NA,5.9,30,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Crash",2004,113,6500000,8.3,1660,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"R",0,0,0,1,0,0,0 -"Crash Dive",1943,106,NA,6.3,145,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Crash Fans",2003,70,NA,8.3,7,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,1,0,0 -"Crash Goes the Hash",1944,18,NA,7.6,60,0,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Crash Landing",1958,76,NA,5.5,8,0,0,14.5,0,34.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Crash Point Zero",2000,89,NA,2.8,97,34.5,14.5,14.5,14.5,4.5,4.5,0,0,4.5,14.5,"R",1,0,0,0,0,0,0 -"Crash che botte!",1974,102,NA,7.2,9,0,0,14.5,0,14.5,14.5,14.5,0,14.5,44.5,"",1,0,0,0,0,0,0 -"Crash, The",1932,58,NA,5.3,8,0,0,0,24.5,14.5,14.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Crashing Hollywood",1938,61,NA,6.6,28,0,4.5,4.5,0,14.5,14.5,44.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Crashing Hollywood",2003,5,NA,5,5,0,0,0,0,24.5,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Crashing Las Vegas",1956,62,NA,6.2,28,0,0,0,0,14.5,4.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Crashing Thru",1939,65,NA,5.6,6,0,0,14.5,0,34.5,14.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Crashing the Wake",2004,14,NA,7.2,10,24.5,0,0,0,0,0,24.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Crashout",1955,89,NA,6.4,32,0,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Crater Lake Monster, The",1977,85,NA,2.1,75,34.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cravan vs. Cravan",2002,100,NA,7.5,15,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Cravate club",2002,85,NA,5.5,96,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Crawling Hand, The",1963,89,100000,2.6,248,34.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Crawlspace",1986,80,NA,4.5,187,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Crayoluv",1997,24,NA,4.8,6,45.5,0,0,0,0,0,0,34.5,0,14.5,"",0,0,1,0,0,0,1 -"Crayon Shin-chan ankoku tamatama daitsuiseki",1997,100,NA,5,20,0,4.5,4.5,14.5,14.5,24.5,14.5,0,14.5,14.5,"",1,1,1,0,0,0,0 -"Craze",1973,96,NA,3.5,41,14.5,4.5,14.5,34.5,14.5,4.5,4.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Crazed",1982,86,NA,3.9,15,14.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Crazed",1992,65,NA,7.6,10,0,0,0,0,0,34.5,14.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Crazies, The",1973,103,275000,5.7,669,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Crazy Cruise",1942,6,NA,6.2,18,0,0,4.5,0,24.5,24.5,24.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Crazy Horse and Custer: The Untold Story",1990,120,NA,4.1,7,14.5,0,14.5,14.5,14.5,14.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Crazy House",1930,13,NA,4.7,22,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Crazy House",1943,80,NA,5.8,37,0,4.5,4.5,4.5,24.5,4.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Crazy Joe",1974,100,NA,5.8,53,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Crazy Jones",2002,86,NA,6.6,13,0,0,4.5,0,0,14.5,0,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Crazy Knights",1944,63,NA,6.6,7,0,0,14.5,0,14.5,14.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Crazy Legs Conti: Zen and the Art of Competitive Eating",2004,75,NA,5.6,16,0,0,4.5,0,0,0,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Crazy Like a Fox",1926,25,NA,6.4,32,4.5,0,14.5,0,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Crazy Like a Fox",2003,98,NA,7.2,5,24.5,0,0,0,0,0,44.5,24.5,0,24.5,"",0,0,1,1,0,0,0 -"Crazy Like the Taz",2000,10,NA,9,6,0,0,0,0,0,14.5,0,14.5,0,64.5,"",0,0,0,0,0,0,1 -"Crazy Love",1987,90,NA,6.3,161,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Crazy Love",2004,7,2000,9.2,17,4.5,0,0,0,4.5,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Crazy Mama",1975,83,NA,5.8,74,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Crazy Mixed Up Pup",1954,6,NA,7.2,25,4.5,4.5,0,0,4.5,14.5,14.5,14.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Crazy Moon",1986,90,NA,5.9,152,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Crazy Over Daisy",1949,6,NA,7.2,42,0,4.5,0,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Crazy Over Horses",1951,65,NA,6.6,30,0,0,0,0,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Crazy People",1990,90,NA,5.6,885,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Crazy Richard",2002,64,NA,2,11,84.5,0,4.5,0,0,0,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Crazy Six",1998,94,NA,1.9,273,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Crazy Town",1932,7,NA,6.1,21,0,0,4.5,4.5,4.5,34.5,14.5,14.5,0,4.5,"",0,1,0,0,0,0,1 -"Crazy Watto",2000,2,NA,3.9,28,24.5,4.5,0,0,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Crazy World of Julius Vrooder, The",1974,89,NA,4.7,36,14.5,0,4.5,4.5,14.5,24.5,4.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Crazy World of Laurel and Hardy, The",1967,83,NA,6.8,13,4.5,0,0,4.5,0,34.5,24.5,4.5,4.5,14.5,"",0,0,1,0,1,0,0 -"Crazy as Hell",2002,113,NA,5.5,174,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Crazy in Alabama",1999,111,15000000,6.1,2086,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Crazy with the Heat",1947,5,NA,5.7,32,0,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Crazy-Quilt, The",1966,75,250000,4.2,16,0,0,4.5,4.5,14.5,0,0,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Crazy/Beautiful",2001,135,14000000,6.5,4503,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Crazylegs",1953,87,NA,6,9,0,0,0,24.5,24.5,0,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Crazysitter, The",1995,92,NA,3.8,79,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Cream Will Rise, The",1998,90,NA,7.2,25,4.5,4.5,0,0,4.5,14.5,24.5,4.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Cream's Farewell Concert",1969,50,NA,7.5,25,0,0,0,0,4.5,14.5,34.5,14.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Creampuff",1998,27,NA,7.1,18,4.5,0,0,0,0,0,14.5,4.5,4.5,74.5,"",0,0,0,0,0,0,1 -"Creation of the Humanoids, The",1962,75,NA,3.9,56,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Creative Process: Norman McLaren",1990,117,NA,8.5,14,0,0,0,4.5,0,0,4.5,24.5,45.5,4.5,"",0,0,0,0,1,0,0 -"Creator",1985,107,NA,5.9,771,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Creator's Game, The",1999,102,NA,2.7,18,34.5,4.5,4.5,4.5,14.5,0,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Creature",1985,97,4000000,3.8,293,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Creature",1999,76,NA,5.9,26,4.5,4.5,0,14.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Creature Comforts",1989,5,NA,7.7,1302,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Creature Walks Among Us, The",1956,78,NA,5,236,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Creature Wasn't Nice, The",1981,88,NA,3.3,323,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Creature from Black Lake",1976,91,NA,3.8,75,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Creature from the Black Lagoon",1954,79,NA,6.6,2044,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Creature from the Haunted Sea",1961,75,NA,2.9,195,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Creature of the Sunny Side Up Trailer Park, The",2004,105,NA,4.5,11,4.5,4.5,0,45.5,0,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Creature with the Atom Brain",1955,69,NA,4.1,70,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Creaturealm: Demons Wake",1998,75,NA,4.9,12,4.5,4.5,24.5,4.5,14.5,0,24.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Creaturealm: From the Dead",1998,82,NA,4.5,12,34.5,4.5,0,0,24.5,0,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Creatures the World Forgot",1971,92,NA,3.4,74,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Creep",2004,88,NA,5.4,659,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Creepees vs. Robot Monster Number Two, The",2004,15,0,1.2,5,44.5,0,0,0,0,24.5,0,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Creeper, The",1948,64,NA,5.5,14,0,14.5,0,24.5,4.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Creeping Flesh, The",1973,94,NA,5.7,347,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Creeping Terror, The",1964,75,NA,2,539,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Creepozoids",1987,72,75000,2.6,152,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Creeps",1956,16,NA,6,31,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,1 -"Creeps, The",1997,80,NA,3.2,107,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Creepshow",1982,120,8000000,6,3687,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Creepshow 2",1987,92,3500000,4.9,1524,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Creepy Tales: Girls Night Out",2003,115,30000,1.8,11,4.5,4.5,4.5,0,0,4.5,4.5,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Cremaster 1",1996,40,NA,6.6,120,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Cremaster 2",1999,79,1700000,6.5,152,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cremaster 3",2002,179,NA,7.1,211,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cremaster 4",1995,42,NA,6.2,100,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Cremaster 5",1997,55,NA,6.8,111,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cremators, The",1972,75,NA,2,23,44.5,4.5,24.5,14.5,4.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Crescendo",1970,92,NA,4.5,25,4.5,0,0,14.5,44.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Cresceranno i carciofi a Mimongo",1996,80,NA,6.1,55,4.5,4.5,4.5,4.5,14.5,14.5,44.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Crew, The",2000,84,23000000,5.3,1297,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Cri Cri el grillito cantor",1963,150,NA,7.2,6,0,0,0,0,14.5,34.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Cri de la nuit, Le",1996,81,NA,6.7,6,0,0,0,0,14.5,14.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Cri de la soie, Le",1996,110,NA,6.4,51,0,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Cri du coeur, Le",1994,86,NA,6.2,20,4.5,4.5,0,14.5,14.5,14.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cri du hibou, Le",1987,102,NA,6.6,124,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Criado malcriado, El",1969,90,NA,7.8,5,0,0,0,24.5,0,0,0,44.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Criatura, La",1977,100,NA,7.1,5,0,0,0,0,0,44.5,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Cricket Player, The",2002,18,NA,7.6,9,0,0,14.5,0,0,24.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Cricket on the Hearth, The",1909,10,NA,3.9,5,44.5,0,0,0,24.5,44.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Crier, The",1995,78,250000,3.3,12,34.5,14.5,4.5,4.5,4.5,0,0,14.5,0,4.5,"R",0,0,0,0,0,0,0 -"Crime & Punishment, USA",1959,78,NA,5.1,20,0,0,14.5,24.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Crime Against Joe",1956,70,NA,6.7,7,14.5,0,0,0,14.5,24.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Crime Doctor",1943,66,NA,5.8,6,0,0,0,14.5,0,14.5,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Crime Doctor's Courage, The",1945,70,NA,6.8,6,0,0,14.5,0,14.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Crime Doctor's Diary, The",1949,61,NA,6.2,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Crime Doctor's Gamble",1947,66,NA,5.9,7,0,0,0,0,24.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Crime Doctor's Man Hunt",1946,61,NA,5.8,12,0,0,0,14.5,14.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Crime Lords",1990,91,NA,3.1,18,34.5,14.5,14.5,4.5,24.5,0,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Crime Partners 2000",2001,102,250000,4.4,57,14.5,14.5,4.5,0,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Crime Ring",1938,69,NA,6.5,17,0,4.5,0,0,14.5,44.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Crime School",1938,85,NA,6.5,110,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Crime Spree",2003,98,10000000,6.3,953,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Crime Wave",1954,73,NA,7.4,70,4.5,0,0,0,4.5,14.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Crime Without Passion",1934,70,NA,7.1,38,0,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Crime Zone",1988,92,NA,4.1,45,14.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Crime and Punishment",2002,126,NA,5.8,35,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Crime and Punishment in Suburbia",2000,98,NA,5.8,873,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Crime by Night",1944,72,NA,6.2,47,0,0,14.5,0,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Crime d'Ovide Plouffe, Le",1984,107,NA,6.5,61,0,0,0,0,14.5,14.5,34.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Crime de Monsieur Lange, Le",1936,77,NA,7.6,252,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Crime in the Streets",1956,91,NA,6.3,48,4.5,0,0,4.5,14.5,14.5,44.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Crime ne paie pas, Le",1962,79,NA,5.9,20,4.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Crime of Dr. Crespi, The",1935,63,NA,5.1,15,4.5,0,4.5,14.5,4.5,24.5,14.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Crime of Passion",1957,84,NA,6,125,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Crime on Their Hands",1948,18,NA,7.8,60,0,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Crime, Inc.",1945,75,NA,6,7,0,0,0,0,44.5,14.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Crime, La",1983,98,NA,5.2,29,0,0,4.5,24.5,14.5,44.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Crimebroker",1993,93,NA,4.6,49,4.5,0,14.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Crimebusters, The",1961,88,NA,7.4,8,0,14.5,0,0,14.5,14.5,0,45.5,14.5,0,"",0,0,0,1,0,0,0 -"Crimen",1960,105,NA,6.7,26,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Crimen de Cuenca, El",1980,92,NA,7.3,67,0,4.5,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Crimen de la calle de Bordadores, El",1946,92,NA,5.9,23,0,0,4.5,4.5,4.5,24.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Crimen del cine Oriente, El",1997,105,NA,5.6,28,4.5,0,4.5,4.5,14.5,44.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Crimen del padre Amaro, El",2002,118,1800000,7,2469,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Crimen ferpecto",2004,105,NA,6.9,317,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Crimes and Misdemeanors",1989,104,19000000,7.9,7302,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Crimes of Passion",1984,112,NA,5.9,1058,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Crimes of Stephen Hawke, The",1936,69,NA,6.3,10,0,0,0,0,24.5,24.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Crimes of the Future",1970,70,20000,4.7,94,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Crimes of the Heart",1986,100,NA,6.3,619,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Crimetime",1996,118,NA,3,359,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Criminal",2004,87,NA,6.4,762,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Criminal Act",1989,93,NA,3.2,25,34.5,4.5,24.5,4.5,4.5,14.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Criminal Code, The",1931,97,NA,6.6,65,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Criminal Court",1946,60,NA,5.7,34,0,0,0,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Criminal Hearts",1995,92,NA,4.8,74,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Criminal Law",1988,117,NA,5.5,519,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Criminal Lawyer",1937,72,NA,5.6,20,0,4.5,0,24.5,24.5,24.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Criminal Mind, The",1993,93,NA,3.3,31,44.5,4.5,14.5,14.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Criminal Minds",1998,88,NA,6.5,6,14.5,0,0,14.5,0,0,14.5,0,45.5,0,"R",1,0,0,0,0,0,0 -"Criminal Passion",1994,96,NA,4,94,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Criminal, The",1960,97,200000,6.7,70,4.5,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Criminal, The",1999,99,NA,5.5,152,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Criminali della galassia, I",1965,93,NA,3.2,60,14.5,24.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Criminally Insane",1975,61,NA,4,45,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Criminally Insane 2",1987,70,NA,2.6,30,45.5,4.5,4.5,4.5,0,4.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Criminals",1996,73,NA,5.6,6,0,14.5,0,0,34.5,34.5,14.5,0,0,0,"",0,0,0,0,1,0,0 -"Crimson",2004,10,NA,4.3,12,44.5,0,0,0,0,0,0,0,4.5,45.5,"",0,0,1,0,0,0,1 -"Crimson Canary, The",1945,64,NA,6.7,8,0,0,0,0,14.5,14.5,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Crimson Ghost, The",1946,167,NA,7,51,0,0,4.5,0,4.5,14.5,14.5,14.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Crimson Kimono, The",1959,82,NA,6.8,114,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Crimson Permanent Assurance, The",1983,16,NA,8.2,498,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Crimson Pirate, The",1952,105,1850000,7.2,831,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Crimson Romance",1934,71,NA,4.8,11,0,4.5,14.5,14.5,14.5,4.5,14.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Crimson Tide",1995,116,53000000,7.1,14033,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,1,0,0,0 -"Crin-Blanc",1952,40,NA,7.5,38,0,0,0,0,4.5,14.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,1 -"Crinoline Head",1995,90,NA,2.2,11,14.5,4.5,0,0,0,0,14.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Cripple Creek",1952,78,NA,5.3,28,0,4.5,0,4.5,34.5,24.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Cripple Creek Bar-Room Scene",1899,1,NA,3.9,21,4.5,4.5,14.5,14.5,4.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,1 -"Crippled Masters",1981,90,NA,5,163,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Crisantemo estalla en cinco esquinas, Un",1998,83,NA,4.8,14,0,24.5,0,0,14.5,14.5,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Crise est finie, La",1934,74,NA,5.1,7,0,0,14.5,14.5,14.5,24.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Crise, La",1992,95,NA,6.4,269,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Crisis",1950,95,1616455,6.2,195,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Crisis in the Kremlin",1992,85,NA,4,16,14.5,24.5,0,4.5,34.5,0,0,0,0,24.5,"",1,0,0,1,0,0,0 -"Crisis: Behind a Presidential Commitment",1963,52,NA,8.5,25,0,0,0,0,4.5,4.5,4.5,34.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Criss Cross",1949,87,NA,7.3,507,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"CrissCross",1992,100,NA,5.1,297,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cristina Quer Casar",2003,119,NA,6.8,38,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Cristo proibito, Il",1950,96,NA,6.3,9,0,0,0,0,24.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Critic's Choice",1963,100,NA,5.8,114,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Critic, The",1963,4,NA,8.2,50,4.5,0,0,4.5,4.5,0,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Critical Care",1997,107,12000000,5.8,397,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Critical Condition",1987,100,NA,4.2,372,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Critical Mass",2000,92,NA,4.1,86,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Critics and Other Freaks",1997,96,NA,1.5,12,14.5,14.5,0,0,0,64.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Critters",1986,82,2000000,5.3,2219,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Critters 2: The Main Course",1988,93,4500000,4.2,1074,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Critters 3",1991,86,NA,3.5,749,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Crna Marija",1986,95,NA,6.1,5,0,0,0,0,24.5,44.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Crna macka, beli macor",1998,123,NA,7.6,4613,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"R",0,0,1,0,0,1,0 -"Crni biseri",1958,99,NA,9,5,0,0,24.5,0,0,0,0,44.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Crni bombarder",1992,116,NA,5.1,65,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Crni film",1971,17,NA,5.3,6,0,0,0,14.5,34.5,14.5,0,0,14.5,14.5,"",0,0,0,0,1,0,1 -"Crno seme",1971,82,NA,9,5,0,0,0,0,0,0,24.5,0,64.5,24.5,"",0,0,0,1,0,0,0 -"Croaziera",1981,122,NA,9.6,14,0,4.5,0,0,0,0,0,14.5,4.5,74.5,"",0,0,1,0,0,0,0 -"Croce dalle sette pietre, La",1987,88,NA,2.2,7,74.5,14.5,0,0,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Crocodile 2: Death Swamp",2002,89,NA,3.6,249,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Crocodile Dundee",1986,98,NA,6.4,12034,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Crocodile Dundee in Los Angeles",2001,92,25000000,4.7,2698,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"Crocodile Hunter: Collision Course, The",2002,90,13000000,5.3,1648,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Croisade d'Anne Buridan, La",1995,85,NA,7,6,0,0,0,0,14.5,14.5,0,45.5,14.5,0,"",0,0,1,0,0,0,0 -"Croix de bois, Les",1932,110,NA,8.2,20,0,0,0,0,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Crollo di Roma, Il",1962,89,NA,4.1,6,0,14.5,14.5,0,0,14.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Cromwell",1970,145,NA,6.5,509,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cronaca di un amore",1950,98,NA,7.2,74,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Cronaca di un amore violato",1996,105,NA,5.6,31,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cronaca di una morte annunciata",1987,109,NA,6.1,135,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cronaca familiare",1962,115,NA,7.3,82,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cronache di poveri amanti",1954,115,NA,6.8,23,0,4.5,0,4.5,4.5,4.5,24.5,24.5,34.5,0,"",0,0,0,1,0,0,0 -"Cronos",1993,94,NA,6.6,1269,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Crooked Circle, The",1932,70,NA,6.2,14,4.5,0,0,0,24.5,45.5,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Crooked Hearts",1991,113,NA,5.7,231,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Crooked Lines",2003,90,NA,6.8,18,14.5,4.5,0,0,0,4.5,4.5,34.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Crooked Mile, The",2001,120,NA,6.7,15,14.5,4.5,4.5,14.5,14.5,0,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Crooked Road, The",1965,92,NA,4.8,6,0,0,14.5,14.5,45.5,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Crooked Way, The",1949,90,NA,7.8,13,0,4.5,4.5,0,4.5,4.5,4.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Crooklyn",1994,115,14000000,6.2,1112,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Crooks",2004,6,NA,7.8,11,4.5,4.5,0,0,0,0,0,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Crooks Anonymous",1962,88,NA,5.5,46,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Crooks and Coronets",1969,106,NA,5.8,30,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Crooks in Cloisters",1964,97,NA,6.4,28,4.5,0,4.5,0,24.5,14.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Crop Circles: Quest for Truth",2002,115,750000,7.2,66,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Crop, The",2004,103,40000,6.6,15,24.5,0,4.5,4.5,0,14.5,4.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Croque la vie",1981,100,NA,6.4,14,0,4.5,0,4.5,14.5,24.5,24.5,24.5,0,0,"",0,0,1,1,0,0,0 -"Croqueuses, Les",1975,87,NA,6.3,19,14.5,14.5,4.5,4.5,0,24.5,14.5,0,24.5,4.5,"",0,0,0,0,0,0,0 -"Crosby Case, The",1934,60,NA,5.1,5,0,24.5,0,0,0,0,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Crosby, Columbo, and Vallee",1932,7,NA,5.6,8,0,0,0,0,34.5,14.5,14.5,14.5,24.5,0,"",0,1,1,0,0,0,1 -"Cross",1987,87,NA,6,5,24.5,0,0,24.5,0,0,24.5,24.5,0,24.5,"",1,0,0,0,0,0,0 -"Cross Bronx",2004,99,NA,8.3,18,4.5,0,0,0,0,14.5,14.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Cross Country",1983,95,2500000,4.6,30,4.5,4.5,14.5,14.5,4.5,34.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Cross Country Detours",1940,10,NA,6.8,16,0,0,0,0,4.5,24.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Cross Creek",1983,127,NA,6.5,330,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Cross Fire",1933,55,NA,5.5,12,0,0,14.5,4.5,34.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cross My Heart",1987,90,NA,5.4,217,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cross Words",1999,13,NA,4.4,16,4.5,14.5,4.5,14.5,4.5,24.5,4.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Cross and the Switchblade, The",1970,106,NA,5,136,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Cross of Iron",1977,119,6000000,7.3,2587,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Cross of Lorraine, The",1943,90,NA,6.7,110,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cross, The",2002,90,NA,7.9,12,34.5,0,0,0,14.5,0,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cross-Country Romance",1940,68,NA,5.7,13,0,0,0,4.5,34.5,24.5,14.5,14.5,4.5,0,"",0,0,1,0,0,1,0 -"Crosscut",1996,98,NA,5.5,43,4.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Crossed Swords",1978,113,NA,5.7,174,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Crossfire",1947,86,250000,7.6,593,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Crossfire",1998,90,NA,5.6,17,4.5,4.5,4.5,14.5,14.5,14.5,0,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Crossing Cords",2001,28,NA,2.6,28,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Crossing Delancey",1988,97,NA,6.6,924,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Crossing Fields",1997,102,NA,6.7,23,0,4.5,0,0,4.5,4.5,24.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Crossing Guard, The",1995,111,NA,6.3,2269,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Crossing the Bridge",1992,103,NA,5.9,217,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Crossing the Line",1989,94,NA,3.4,7,14.5,0,24.5,0,0,0,0,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Crossing, The",1990,92,NA,4.9,193,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Crossing, The",1999,89,NA,5.4,26,14.5,14.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Crossmaheart",1998,94,NA,5.3,7,24.5,0,14.5,0,0,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Crossover Dreams",1985,86,NA,6,25,0,0,0,14.5,24.5,4.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Crossplot",1969,96,1000000,4.1,49,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,14.5,"PG-13",0,0,0,0,0,0,0 -"Crossroads",1942,83,NA,6.5,101,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Crossroads",1976,36,NA,5.1,10,14.5,24.5,14.5,14.5,0,14.5,14.5,0,34.5,0,"",0,0,0,0,0,0,1 -"Crossroads",1986,96,NA,6.3,1489,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Crossroads",2002,93,12000000,3.1,8546,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Crosstalk",1982,83,NA,4.1,11,14.5,4.5,4.5,0,0,4.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Crosswinds",1951,95,NA,5.8,16,0,0,4.5,0,14.5,34.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Crossworlds",1996,90,NA,5.1,496,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Croupier",1998,94,NA,7.4,3816,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Crow De Guerre",1967,6,NA,5.9,5,0,0,0,0,24.5,84.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Crow Hollow",1952,69,NA,5.3,7,0,0,14.5,0,24.5,44.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Crow Stone",2001,12,NA,7.5,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,1,0,0,1 -"Crow's Feat",1962,6,NA,6.1,11,4.5,0,0,0,24.5,14.5,14.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Crow, The",1994,98,15000000,7.2,20290,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Crow: City of Angels, The",1996,84,13000000,3.8,3656,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Crow: Salvation, The",2000,102,25000000,4.9,1383,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Crowd Roars, The",1932,68,NA,6.4,103,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Crowd Roars, The",1938,90,NA,6.9,44,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Crowd, The",1928,104,NA,8,938,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Crowded Sky, The",1961,105,NA,5.5,79,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Crowing Pains",1947,7,NA,6.8,27,0,0,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Crucible of Terror",1971,91,NA,2.9,67,34.5,4.5,24.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Crucible, The",1996,124,NA,6.8,4197,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Crude",2003,88,NA,9.4,9,0,0,0,0,0,0,0,24.5,14.5,64.5,"",0,0,1,1,0,0,0 -"Crude Oasis, The",1995,92,NA,5.6,35,4.5,0,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Crudeli, I",1967,90,NA,6.1,47,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cruel Intentions",1999,97,11000000,6.5,25634,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Cruel Passion",1977,99,NA,4,32,4.5,4.5,24.5,14.5,24.5,0,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cruel Sea, The",1953,121,NA,7.6,490,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Cruel Tower, The",1956,79,NA,6.7,6,0,0,0,0,0,14.5,34.5,14.5,34.5,0,"",0,0,0,0,0,0,0 -"Cruel, Cruel Love",1914,16,NA,5.5,63,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Crueles, Las",1969,95,NA,4.9,5,24.5,0,0,0,0,24.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Cruise Cat",1952,7,NA,6.3,36,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Cruise Control",2001,7,NA,6,5,0,24.5,0,0,24.5,0,24.5,24.5,0,24.5,"",0,0,1,0,0,0,1 -"Cruise of the Jasper B, The",1926,60,NA,8.3,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,1,0,0,1,0 -"Cruise of the Zaca",1952,20,NA,5.8,27,0,0,0,4.5,44.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,1,0,1 -"Cruise, The",1966,8,NA,7.2,6,0,0,0,0,0,34.5,14.5,0,34.5,14.5,"",0,1,0,0,0,0,1 -"Cruisin' Down the River",1953,79,NA,5.3,5,0,0,0,0,24.5,24.5,0,64.5,0,0,"",0,0,0,0,0,0,0 -"Cruising",1980,106,NA,5.6,1365,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cruising Bar",1989,90,NA,6.3,165,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Crumb",1994,119,NA,7.6,3528,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Crusades, The",1935,123,NA,6.7,130,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Crush",1992,115,NA,5.4,152,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Crush Proof",1999,91,NA,4.9,46,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Crush, The",1993,89,NA,5.1,2594,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Crushes",2003,12,NA,8.2,8,14.5,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,1,0,0,0,1 -"Crusoe",1989,91,NA,6.3,130,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Crutch",2004,88,500000,6.2,12,4.5,0,0,0,0,14.5,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Cruz del sur, La",2003,86,NA,5.6,18,0,4.5,14.5,14.5,14.5,4.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Cruz e Sousa - O Poeta do Desterro",1998,86,NA,3.3,8,14.5,14.5,0,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cruz, La",1997,90,NA,5.2,30,14.5,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Crvena prasina",1999,105,NA,5.3,85,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",1,0,0,1,0,0,0 -"Cry 'Havoc'",1943,97,NA,6.9,98,0,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cry Baby Killer, The",1958,75,NA,3.5,35,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cry Blood, Apache",1970,82,NA,2.1,31,34.5,24.5,4.5,4.5,0,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Cry Danger",1951,79,NA,7,132,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Cry Freedom",1987,157,NA,7.1,1705,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cry From the Grave, A",1999,150,NA,8,19,0,0,0,0,0,4.5,0,44.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Cry Funny Happy",2003,92,NA,4.2,50,24.5,4.5,4.5,0,0,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cry Radio",1998,13,NA,6,10,0,0,14.5,14.5,24.5,14.5,34.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Cry Terror!",1958,96,NA,6.4,127,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cry Tough",1959,83,NA,6.5,6,0,0,0,0,34.5,14.5,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Cry Uncle!",1971,87,NA,5.4,85,14.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cry Vengeance",1954,82,NA,7.1,16,0,0,4.5,14.5,4.5,4.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cry Wolf",1947,83,NA,5.9,104,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cry for Bobo",2001,10,NA,7.3,15,14.5,0,0,4.5,14.5,0,4.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Cry for Cindy",1976,90,NA,5.7,12,4.5,0,0,0,14.5,4.5,14.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Cry for Happy",1961,110,NA,5.7,37,4.5,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cry for Me, Billy",1972,93,NA,5.1,17,14.5,0,4.5,4.5,4.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Cry from the Mountain",1985,78,NA,5.5,16,14.5,0,0,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Cry from the Streets, A",1958,99,NA,6.3,13,4.5,0,0,0,14.5,34.5,14.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Cry in the Dark, A",1988,122,NA,6.8,1297,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cry in the Night, A",1956,75,NA,5.7,29,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cry in the Wild, A",1990,82,NA,6.1,107,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Cry of Battle",1963,99,NA,5.3,31,0,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Cry of Jazz",1959,34,NA,7.6,5,0,0,0,0,24.5,0,0,64.5,24.5,0,"",0,0,0,0,1,0,1 -"Cry of the Banshee",1970,87,500000,4.6,180,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Cry of the City",1948,95,NA,7.2,88,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cry of the Hunted",1953,80,NA,6.5,26,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cry of the Werewolf",1944,63,NA,5,35,4.5,4.5,4.5,14.5,24.5,24.5,24.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Cry, the Beloved Country",1951,103,NA,7.1,88,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cry, the Beloved Country",1995,106,NA,6.4,387,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Cry-Baby",1990,85,11000000,6,4136,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Crying Freeman",1995,102,NA,6.5,2372,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Crying Game, The",1992,112,NA,7.3,9524,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Crying Ladies",2003,110,NA,6.1,59,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Crying?",2004,100,NA,7.1,10,14.5,0,0,0,0,14.5,44.5,14.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Crypt Club, The",2004,23,NA,5.3,18,14.5,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Crypt of Dark Secrets",1976,71,NA,3.6,21,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Crypt of the Living Dead",1973,81,NA,3.9,34,4.5,4.5,24.5,24.5,24.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Crystal Ball, The",1943,81,NA,6.5,15,0,0,0,4.5,24.5,24.5,4.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Crystal Brawl, The",1957,8,NA,5,12,0,0,0,24.5,24.5,4.5,34.5,0,4.5,0,"",0,1,1,0,0,0,1 -"Crystal Clear",2000,16,NA,7.2,12,4.5,4.5,4.5,0,0,4.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Crystal Voyager",1975,78,NA,4.6,38,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Crystalstone",1988,95,NA,5.1,15,4.5,0,0,24.5,0,24.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Crystania no densetsu",1995,85,NA,6.1,25,0,0,0,0,24.5,24.5,4.5,34.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Csajok",1996,93,NA,7.7,20,0,0,4.5,4.5,14.5,0,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Csapd le csacsi!",1992,80,NA,8.5,141,0,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Csinibaba",1997,100,NA,6.8,218,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Cuadecuc, vampir",1970,70,NA,3.8,11,24.5,0,0,0,4.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,1,0,0 -"Cuando los hijos se van",1941,139,NA,8.3,6,0,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Cuando vuelvas a mi lado",1999,91,NA,6.6,89,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cuarteles de invierno",1984,115,NA,4.8,5,0,0,0,44.5,0,0,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Cuarteto de La Habana",1999,113,NA,6.7,62,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cuarteto para el fin del tiempo",1983,27,NA,4.4,6,0,14.5,0,14.5,0,14.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,1 -"Cuatro salvajes, Los",1967,102,NA,6.6,9,0,0,0,0,14.5,34.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cuba",1979,122,NA,5.5,318,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cuba 15",1997,13,NA,8.5,8,0,0,0,0,0,14.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Cuba Crossing",1980,90,NA,3.8,22,14.5,4.5,24.5,4.5,4.5,14.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cuba feliz",2000,96,NA,5.6,37,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Cuban Love Song, The",1931,86,NA,5.9,8,0,0,0,14.5,14.5,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,1,0 -"Cuban Pete",1946,60,NA,5.7,7,0,0,0,0,24.5,24.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Cuban Rebel Girls",1959,68,NA,2.1,23,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Cuban Rhythm",1941,10,NA,6.9,7,0,0,0,0,0,14.5,74.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Cubbyhouse",2001,89,NA,4.2,186,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cube",1997,90,NA,7.4,16205,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Cube 2: Hypercube",2002,95,NA,5.6,4536,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Cube Zero",2004,97,NA,5.7,1570,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Cucaracha, La",1959,97,NA,7.5,22,0,0,0,0,0,14.5,14.5,34.5,0,34.5,"",0,0,0,1,0,1,0 -"Cucciolo",1998,96,NA,3.4,12,45.5,0,0,14.5,0,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Cuchillo",1978,85,NA,5.8,9,0,0,0,0,24.5,14.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Cuckoo",2002,4,NA,6.4,16,4.5,0,0,0,4.5,0,34.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Cuckoo Clock, The",1950,6,NA,6.6,29,4.5,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Cuckoo in the Nest, A",1933,85,NA,4.8,20,0,4.5,4.5,14.5,4.5,34.5,34.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Cuckoo on a Choo-Choo",1952,15,NA,5.6,41,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Cuckoos, The",1930,97,NA,6.8,26,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Cuddler",2003,17,NA,8.3,7,0,0,0,0,0,0,0,74.5,24.5,0,"",0,0,0,1,0,0,1 -"Cudnovate zgode segrta Hlapica",1997,75,NA,3.3,13,24.5,0,0,0,0,14.5,14.5,4.5,24.5,14.5,"",0,1,0,0,0,0,0 -"Cudo nevidjeno",1984,92,NA,8.9,14,0,0,4.5,0,0,4.5,0,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Cudotvorni mac",1950,101,NA,8.6,19,14.5,0,4.5,0,0,0,0,0,14.5,74.5,"",0,0,0,0,0,0,0 -"Cudowne dziecko",1987,106,NA,4.6,37,4.5,4.5,0,24.5,24.5,24.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Cudowne miejsce",1995,94,NA,4.1,20,14.5,0,0,0,4.5,14.5,14.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Cudzoziemka",1986,99,NA,5.2,8,0,0,0,24.5,0,34.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Cue Ball Cat",1950,7,NA,7.3,36,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Cuento de hadas para dormir cocodrilos",2002,108,NA,6.8,34,4.5,0,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Cuervos, Los",1962,96,NA,3.1,9,24.5,0,34.5,14.5,24.5,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Cuesta abajo",1934,74,NA,7.9,10,0,0,0,0,24.5,0,24.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Cugino americano, Il",1986,99,NA,6.4,34,4.5,4.5,0,0,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cuibul salamandrelor",1976,95,NA,5.9,10,24.5,0,24.5,0,0,14.5,24.5,14.5,24.5,0,"",1,0,0,0,0,0,0 -"Cuidado con el amor",1954,93,NA,6.2,8,0,0,0,0,14.5,0,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Cuisine au beurre, La",1963,82,NA,6,80,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Cuisinier, le poulet, la femme et son mari",1996,7,NA,8.4,8,14.5,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,1,0,0,0,1 -"Cujo",1983,93,5000000,5.4,2922,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cul de Sac: A Suburban War Story",2002,55,NA,6.2,24,4.5,0,4.5,4.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Cul de sac",2000,27,NA,6.9,14,0,0,0,4.5,0,24.5,44.5,24.5,4.5,0,"",0,0,0,1,0,0,1 -"Cul de sac",2003,10,NA,4.1,9,24.5,0,0,14.5,14.5,0,24.5,14.5,24.5,0,"",0,0,1,0,0,0,1 -"Cul-de-sac",1966,111,NA,7.3,952,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Culastrisce nobile veneziano",1976,110,NA,6.7,9,0,0,0,14.5,0,34.5,0,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Culo e camicia",1981,100,NA,5,14,14.5,0,0,4.5,34.5,24.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Culpepper Cattle Company, The",1972,92,NA,6.2,164,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cult of the Cobra",1955,82,NA,5.8,57,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cultivision (Collapsing Stars)",2002,88,1000,8.4,5,0,0,0,0,0,0,44.5,0,44.5,24.5,"",0,0,1,0,0,0,0 -"Culture",1998,29,NA,8.1,13,0,0,4.5,0,4.5,0,4.5,0,34.5,44.5,"",0,0,1,0,0,0,1 -"Culture",1999,1,NA,5.3,59,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Culture Jam: Hijacking Commercial Culture",2001,50,NA,7.2,13,14.5,0,0,0,0,0,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cum to Live",1999,90,NA,8.2,5,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,0 -"Cumhuriyet",1998,150,NA,8.1,14,0,0,4.5,0,0,14.5,14.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Cumple, El",2002,80,NA,6.6,12,4.5,0,0,0,4.5,34.5,4.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Cunnamulla",2000,82,NA,6.7,63,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Cuore altrove, Il",2003,107,NA,6,203,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Cuore di cane",1975,113,NA,4.1,15,4.5,4.5,0,0,24.5,4.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Cuore di mamma",1969,92,NA,6.4,5,0,0,0,24.5,24.5,0,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Cuore napoletano",2002,94,NA,6,8,0,0,14.5,0,0,64.5,0,24.5,0,0,"",0,0,0,0,1,0,0 -"Cuore sacro",2005,120,NA,6.7,66,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Cuori al verde",1996,103,NA,6.1,31,4.5,0,0,4.5,4.5,24.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Cuori nella tormenta",1984,102,NA,4,17,4.5,14.5,14.5,14.5,34.5,14.5,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Cup of Kindness, A",1934,81,NA,5.8,6,0,0,0,0,14.5,64.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Cupid",1997,95,NA,4.1,96,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Cupid Gets his Man",1936,7,NA,5.7,20,0,14.5,0,4.5,24.5,34.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Cupid's Mistake",2001,70,0,8.1,11,14.5,0,0,0,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,0 -"Cuppa Cabby, Piece o' Pie",2000,28,NA,6.3,6,0,0,14.5,14.5,14.5,14.5,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Curacha, ang babaing walang pahinga",1998,141,NA,5.8,10,0,14.5,14.5,14.5,14.5,0,0,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Curdled",1991,30,NA,4.8,43,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Curdled",1996,88,2309723,5.5,959,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Cure Show, The",1993,90,NA,6.4,47,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Cure for Boredom, The",2000,87,NA,4.4,21,14.5,0,14.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Cure for Insomnia, The",1987,5220,NA,3.8,59,44.5,4.5,4.5,4.5,0,0,0,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Cure for Love, The",1950,98,NA,7.1,7,0,0,0,14.5,0,14.5,14.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Cure for Pokeritis, A",1912,13,NA,6.9,21,0,4.5,0,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Cure for Serpents, A",1997,15,NA,3.1,9,14.5,14.5,0,0,0,0,24.5,0,0,45.5,"",0,0,0,1,0,0,1 -"Cure in Orange, The",1987,113,NA,8,66,0,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Cure, The",1917,31,NA,7.5,286,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Cure, The",1995,97,NA,6.9,1568,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Cured Duck",1945,7,NA,6.8,26,0,0,0,0,4.5,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Curfew Breakers",1957,78,NA,5.5,6,0,0,0,14.5,14.5,0,0,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Curiosity & the Cat",1999,80,45000,4.1,46,4.5,0,4.5,14.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Curious Contests",1950,9,NA,6.5,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Curious Female, The",1970,87,NA,3.3,14,24.5,4.5,14.5,4.5,24.5,0,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Curious Puppy, The",1939,7,NA,6.3,10,0,0,0,0,14.5,34.5,34.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Curley",1947,53,NA,6.2,7,0,14.5,0,0,0,24.5,0,44.5,0,14.5,"",0,0,1,0,0,0,0 -"Curly Sue",1991,101,30000000,4.7,2097,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Curly Top",1935,75,NA,6.5,151,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Curral de Mulheres",1982,99,NA,5.1,26,34.5,0,14.5,14.5,14.5,4.5,4.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Curse II: The Bite",1988,98,NA,3.8,78,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Curse III: Blood Sacrifice",1991,91,NA,3,32,14.5,14.5,24.5,14.5,14.5,4.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Curse of Bigfoot",1976,88,NA,1.8,37,45.5,14.5,4.5,0,4.5,0,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Curse of El Charro, The",2004,90,200000,6,29,14.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Curse of Frankenstein, The",1957,83,500000,6.8,648,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Curse of Her Flesh, The",1968,75,NA,4.6,21,4.5,4.5,14.5,4.5,0,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Curse of Inferno, The",1997,87,NA,3.5,85,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Curse of Kilimanjaro",1978,82,NA,1.3,6,84.5,0,14.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Curse of Simba",1965,77,NA,2.5,13,34.5,0,24.5,4.5,4.5,0,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Curse of the Blue Lights",1988,104,NA,3.1,22,24.5,24.5,24.5,4.5,14.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Curse of the Cat People, The",1944,70,NA,6.8,386,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Curse of the Catwoman",1992,71,NA,5.5,54,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Curse of the Crimson Altar",1968,87,NA,4.6,146,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Curse of the Dragon",1993,90,NA,6.9,95,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Curse of the Faceless Man",1958,67,NA,2.9,43,14.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Curse of the Fly",1965,86,NA,5,78,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Curse of the Forty-Niner",2003,86,NA,3,99,24.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Curse of the Headless Horseman",1974,75,NA,2.4,21,34.5,24.5,4.5,4.5,4.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Curse of the Jade Scorpion, The",2001,103,26000000,6.8,5846,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Curse of the Living Corpse, The",1964,84,120000,3.9,40,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Curse of the Mummy's Tomb, The",1964,81,NA,4.5,170,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Curse of the Pink Panther",1983,109,NA,4,762,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Curse of the Puppet Master",1998,77,250000,2.7,267,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Curse of the Queerwolf",1988,90,10000,3.5,55,24.5,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Curse of the Screaming Dead, The",1982,91,NA,1.8,60,45.5,14.5,4.5,4.5,4.5,4.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Curse of the Starving Class",1994,102,NA,2.6,370,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Curse of the Undead",1959,79,NA,5.5,75,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Curse of the Werewolf, The",1961,91,NA,6.2,360,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cursed",2005,97,35000000,4.7,1277,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Curtain Call",1940,63,NA,5.9,22,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Curtain Call at Cactus Creek",1950,86,NA,6.4,19,4.5,0,0,4.5,34.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Curtain Pole, The",1909,13,NA,5.3,9,14.5,0,0,0,44.5,14.5,0,0,24.5,14.5,"",0,0,1,0,0,0,1 -"Curtain Razor",1949,7,NA,6.7,23,0,0,0,0,14.5,24.5,34.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Curtain Up",1953,81,NA,6.2,33,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Curtains",1983,89,NA,3.9,112,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Curtis",2004,34,NA,9.3,7,0,0,0,0,0,0,14.5,0,24.5,45.5,"",0,0,0,0,0,0,1 -"Curtis's Charm",1995,74,NA,5.4,61,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Curucu, Beast of the Amazon",1956,76,155000,5.6,27,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cusp",2000,25,60000,7.3,12,0,0,0,0,0,14.5,24.5,4.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Custer of the West",1967,143,NA,5.1,124,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Custodial Code, The",2003,15,12000,9.7,7,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,1,0,0,0,1 -"Custodian, The",1993,109,NA,5.6,56,14.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Customers Wanted",1939,7,NA,6.4,27,0,0,0,24.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Cut",1998,14,NA,5,10,24.5,14.5,14.5,0,14.5,34.5,0,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Cut",2000,98,NA,4.2,868,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Cut Runs Deep, The",1998,110,NA,6.8,22,14.5,0,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Cut Ups, The",1966,19,NA,7.8,14,0,0,0,0,4.5,4.5,4.5,45.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Cut and Run",2004,14,NA,9.1,10,14.5,0,0,0,0,0,0,0,0,94.5,"",1,0,1,0,0,0,1 -"Cut-Throats, The",1969,75,NA,3.6,12,14.5,24.5,14.5,4.5,4.5,4.5,4.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Cutaway",2000,104,9000000,5.1,390,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Cutman, The",2003,27,NA,7.2,11,14.5,0,0,0,0,24.5,0,4.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Cutter's Way",1981,105,NA,6.9,523,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Cutthroat Island",1995,119,92000000,5.1,3942,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,1,0 -"Cutting Class",1989,91,NA,3.9,423,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Cutting Edge, The",1992,97,NA,6.5,3735,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cutting Edge: The Magic of Movie Editing, The",2004,98,NA,5.6,73,24.5,0,0,0,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Cutting Moments",1997,29,NA,4.7,70,14.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Cutting Room Floor, The",2002,6,NA,4.7,6,14.5,0,0,0,0,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Cutting Room, The",2001,15,NA,6.9,47,4.5,0,0,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Cutting, The",2000,90,NA,3.3,24,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cuvar plaze u zimskom periodu",1976,90,NA,6.3,35,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Cvetje v jeseni",1973,122,NA,6.8,31,0,0,0,0,4.5,4.5,0,34.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Cwal",1996,104,NA,7.1,43,4.5,0,0,0,4.5,4.5,34.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Cyber Bandits",1995,86,NA,3.2,33,24.5,4.5,14.5,4.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Cyber Vengeance",1995,90,NA,3.1,33,14.5,14.5,14.5,14.5,0,4.5,4.5,4.5,0,24.5,"",1,0,0,0,0,0,0 -"Cyber-Tracker 2",1995,97,NA,3.1,67,24.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"CyberTracker",1994,91,NA,3.3,80,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"CyberWorld",2000,44,NA,6.5,185,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Cyberella: Forbidden Passions",1996,87,NA,2.7,40,14.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,1,0 -"Cyberjack",1995,99,NA,3.7,106,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Cyberman",2001,87,NA,5.2,17,14.5,0,4.5,4.5,4.5,34.5,14.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Cyberstalker",1995,96,NA,3.7,20,24.5,14.5,4.5,14.5,0,0,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cyberteens in Love",1994,93,NA,5.4,9,34.5,14.5,0,0,0,0,0,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Cyborg",1989,86,2000000,3.8,2320,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cyborg 2",1993,99,NA,3.2,700,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cyborg 2087",1966,86,NA,4.2,55,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Cyborg 3: The Recycler",1994,90,NA,3.5,110,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Cyborg Cop",1993,95,NA,3,139,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Cyborg Cop III",1995,94,NA,2.9,37,34.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Cyborg, il guerriero d'acciaio",1989,90,NA,2.7,11,44.5,24.5,0,0,0,0,0,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Cycle Psycho",1975,82,NA,2.8,19,14.5,24.5,34.5,0,0,0,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cycle Savages, The",1969,82,NA,4.6,43,14.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Cycle Vixens",1978,80,NA,3.3,16,45.5,4.5,4.5,4.5,4.5,0,0,0,0,24.5,"",1,0,0,1,0,0,0 -"Cyclomania",2001,93,NA,6.5,187,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Cyclone",1978,100,NA,3.1,15,24.5,4.5,14.5,14.5,0,14.5,0,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Cyclone",1987,89,NA,3.3,99,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Cyclone Fury",1951,53,NA,6,7,14.5,14.5,0,14.5,24.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Cyclone on Horseback",1941,60,NA,5.6,14,0,0,0,4.5,34.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Cyclope de la mer, Le",1999,13,NA,5.3,18,14.5,0,4.5,14.5,14.5,14.5,4.5,24.5,14.5,4.5,"",0,1,0,1,0,0,1 -"Cyclops, The",1957,75,NA,3.3,81,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Cynara",1932,75,NA,6.2,47,0,0,4.5,14.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Cynara: Poetry in Motion",1996,40,NA,6.3,12,34.5,0,14.5,0,4.5,0,24.5,0,0,14.5,"",0,0,0,1,0,1,1 -"Cynthia",1947,98,NA,5.3,28,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Cypher",2002,95,7500000,7.2,3160,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Cypress Edge",1999,90,NA,2.9,37,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,1,0,0,0 -"Cyrano de Bergerac",1950,112,NA,7.4,617,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Cyrano de Bergerac",1990,137,NA,7.5,5148,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Cyrano et d'Artagnan",1963,120,NA,6.2,19,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Czechoslovakia 1968",1969,20,NA,6.3,5,0,0,24.5,0,0,0,0,24.5,44.5,24.5,"",0,0,0,0,1,0,1 -"Czesc Tereska",2001,91,NA,8.2,244,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Czlowiek na torze",1957,79,NA,7.1,19,0,0,0,4.5,14.5,0,24.5,24.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Czlowiek z M-3",1969,92,NA,7.1,8,0,0,0,0,14.5,24.5,0,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Czlowiek z marmuru",1977,160,NA,8.2,343,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Czlowiek z zelaza",1981,153,NA,7.7,232,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Czlowiek z...",1993,100,NA,5.1,13,24.5,4.5,0,0,14.5,0,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Cztery pory roku",1985,73,NA,6.2,6,0,0,0,14.5,0,14.5,0,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Czy Lucyna to dziewczyna",1934,80,NA,4.4,5,0,0,24.5,0,0,0,64.5,0,24.5,0,"",0,0,1,0,0,0,0 -"D' Fightin' Ones",1961,6,NA,6.3,26,0,0,14.5,0,4.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"D'Annunzio",1985,113,NA,5.6,8,0,0,0,14.5,0,45.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"D'Artagnan contro i tre moschettieri",1963,90,NA,4.9,5,24.5,24.5,0,24.5,0,0,24.5,24.5,0,0,"",1,0,0,1,0,0,0 -"D'Est",1993,110,NA,5,32,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,45.5,"",0,0,0,0,1,0,0 -"D-Day Remembered",1994,54,NA,9.4,16,0,0,0,0,0,0,14.5,0,4.5,74.5,"",0,0,0,0,1,0,0 -"D-Day the Sixth of June",1956,106,NA,6.3,179,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"D-Tox",2002,92,55000000,4.7,2742,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"D-Zaka no satsujin jiken",1998,95,NA,6.7,9,0,0,0,0,14.5,14.5,0,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"D.A.R.Y.L.",1985,99,NA,5.5,1701,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"D.C. Cab",1983,100,NA,4.4,689,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"D.E.B.S.",2003,11,NA,6.9,80,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",1,0,1,0,0,0,1 -"D.E.B.S.",2004,91,3500000,6,300,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"PG-13",1,0,1,0,0,0,0 -"D.I., The",1957,106,NA,7.1,184,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"D.I.L.",2002,77,NA,5.7,16,14.5,0,0,0,14.5,14.5,14.5,24.5,0,4.5,"",1,0,0,1,0,0,0 -"D.I.Y. Hard",2002,10,NA,6,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"D.I.Y. or Die: How to Survive as an Independent Artist",2002,55,5000,9.4,10,0,0,0,0,0,0,0,34.5,0,74.5,"",0,0,0,0,1,0,0 -"D.O.A.",1950,83,NA,7.4,1290,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"D.O.A.",1980,95,NA,6.9,133,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"D.O.A.",1988,96,NA,6,2425,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"D.W. Griffith: Father of Film",1993,155,NA,7.7,11,0,0,4.5,0,4.5,0,0,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"D2: The Mighty Ducks",1994,106,NA,4.7,3039,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"D3: The Mighty Ducks",1996,104,NA,4.2,2276,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"DEF",2003,14,NA,6.5,18,0,0,0,0,4.5,24.5,14.5,24.5,0,34.5,"",0,0,0,0,0,0,1 -"DMZ, bimujang jidae",2004,100,NA,3.3,12,0,34.5,14.5,4.5,34.5,0,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Da",1988,102,NA,6.3,138,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Da Corleone a Brooklyn",1979,95,NA,5.3,38,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Da Jue Zhan I: Liao Shen Zhan Yi",1990,222,NA,7.4,10,24.5,0,0,0,14.5,14.5,0,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Da Jue Zhan II: Huai Hai Zhan Yi",1990,219,NA,7.3,8,0,0,0,0,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Da Jue Zhan III: Ping Jin Zhan Yi",1990,218,NA,7.2,6,0,0,0,0,14.5,14.5,14.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Da Svante forsvandt",1975,83,NA,5.6,9,0,0,24.5,0,34.5,14.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Da Vinci's War",1993,94,NA,3.8,25,14.5,14.5,4.5,14.5,4.5,14.5,0,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Da di qin qing",1999,112,NA,2.7,14,45.5,14.5,4.5,0,0,0,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Da grande",1987,94,NA,6.9,59,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Da hong deng long gao gao gua",1991,125,NA,8.1,4413,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Da jeg traff Jesus... med sprettert",2000,88,NA,6.9,105,24.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Da jue dou",1971,98,NA,5.8,16,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Da mao xian jia",1995,108,NA,5.9,63,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Da mi je biti morski pas",1999,75,NA,5,18,14.5,4.5,14.5,0,24.5,0,14.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Da mo mi zong",1976,90,NA,6.7,8,0,0,14.5,0,14.5,24.5,0,34.5,0,14.5,"",1,0,0,1,0,0,0 -"Da no tien gu",1965,114,NA,9.5,94,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,74.5,"",0,1,0,0,0,0,0 -"Da obichash na inat",1986,92,NA,8.7,29,4.5,0,0,0,0,0,4.5,24.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Da sha shou",1972,94,NA,6.2,11,0,0,0,14.5,0,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Da sha xing yu xiao mei tou",1978,90,NA,3.9,15,24.5,4.5,4.5,0,0,0,24.5,14.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Da taijian Li Lianying",1991,110,NA,6.5,12,0,0,0,4.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Da uomo a uomo",1968,120,NA,6.5,228,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Da wan",2001,100,NA,6,259,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Da yue bing",1986,94,NA,5,21,0,14.5,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Da zui xia",1966,95,NA,7.5,221,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Daag",1952,149,NA,8.7,6,0,0,0,0,14.5,0,14.5,0,0,64.5,"",0,0,0,0,0,1,0 -"Daag",1973,146,NA,7.9,12,0,0,0,0,0,0,34.5,44.5,24.5,0,"",0,0,0,0,0,1,0 -"Daai laap mat taam 008",1996,89,NA,6.9,235,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,1,1,0,1,0 -"Daan",1998,90,NA,7.1,16,0,4.5,0,4.5,0,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Daana Veera Shura Karna",1977,233,NA,6.8,6,34.5,0,0,0,0,0,0,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Daayraa",1996,103,NA,7.1,20,0,0,4.5,14.5,14.5,4.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dablova past",1961,85,NA,6.9,27,0,0,0,4.5,14.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Dacii",1966,92,NA,8.8,121,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Dad",1989,117,NA,5.8,860,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Dad Rudd, M.P.",1940,83,NA,5.7,10,0,0,0,14.5,14.5,0,34.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Dad Savage",1998,104,NA,5.9,110,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dad and Dave Come to Town",1938,73,NA,6.8,9,14.5,0,0,0,0,24.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Dad and Dave: On Our Selection",1995,107,NA,4.6,47,4.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Dad's Army",1971,95,NA,6,211,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Daddy Cool",2002,85,150000,5.7,17,4.5,0,14.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Daddy Day Care",2003,92,60000000,5.7,3803,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Daddy Duck",1948,7,NA,6.8,17,0,0,0,0,0,24.5,44.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Daddy Long Legs",1931,80,NA,5.8,10,0,0,0,0,14.5,24.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Daddy Long Legs",1955,126,NA,6.7,360,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Daddy Nostalgie",1990,105,NA,6.9,151,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Daddy and Papa",2002,57,NA,8,28,0,0,0,0,0,4.5,24.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Daddy and Them",2001,101,4000000,5,364,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Daddy and the Muscle Academy",1992,55,NA,6.1,27,0,14.5,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Daddy's Boys",1988,90,300000,2.7,6,34.5,0,0,0,34.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Daddy's Deadly Darling",1972,80,NA,2.9,64,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Daddy's Dyin'... Who's Got the Will?",1990,95,NA,5.4,213,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Daddy's Girl",2001,9,NA,6.5,12,14.5,4.5,0,0,4.5,4.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"Daddy's Gone A-Hunting",1969,108,NA,5.7,64,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Daddy, Darling",1968,83,NA,5.3,6,0,0,0,0,14.5,14.5,45.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Daddy-Long-Legs",1919,85,NA,7,103,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Daddy-O",1958,74,100000,2.5,158,34.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dadetown",1995,93,NA,6.7,110,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Daehakno-yeseo maechoon-hadaka tomaksalhae danghan yeogosaeng ajik Daehakno-ye Issda",2000,60,NA,4.9,46,14.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Daens",1993,138,NA,7.9,696,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Daffy - The Commando",1943,7,NA,7.5,76,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Daffy Dilly",1948,7,NA,7.3,40,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Daffy Doc, The",1938,7,NA,7,49,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Daffy Doodles",1946,7,NA,7.4,49,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Daffy Duck Hunt",1949,7,NA,7.4,88,0,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Daffy Duck Slept Here",1948,7,NA,7.4,58,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Daffy Duck and Egghead",1938,7,NA,6.8,42,0,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Daffy Duck and the Dinosaur",1939,8,NA,7.1,81,0,0,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Daffy Duck in Hollywood",1938,8,NA,7.5,53,4.5,0,4.5,0,0,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Daffy Duck's Movie: Fantastic Island",1983,78,NA,6.2,193,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Daffy Duck's Quackbusters",1988,72,NA,6.7,224,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Daffy Duckaroo, The",1942,7,NA,6,25,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Daffy Rents",1966,6,NA,5.7,26,0,4.5,14.5,4.5,14.5,34.5,14.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Daffy's Diner",1967,6,NA,5.7,23,0,0,4.5,4.5,14.5,34.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Daffy's Inn Trouble",1961,6,NA,6.5,38,0,0,0,4.5,14.5,24.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Daffy's Southern Exposure",1942,7,NA,6.8,28,4.5,0,4.5,0,14.5,14.5,14.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Dag i oktober, En",1992,97,NA,6.6,73,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dag och natt",2004,95,NA,6.7,175,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dagboek van een oude dwaas",1987,90,NA,7.3,19,14.5,0,34.5,4.5,0,4.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Dagens Donna",1990,90,NA,5.4,9,0,0,24.5,0,34.5,44.5,0,0,0,0,"",0,0,0,1,0,1,0 -"Dagje naar het strand, Een",1984,85,NA,6.8,15,0,0,0,24.5,4.5,0,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Dagli Appennini alle Ande",1960,90,NA,5.4,11,0,14.5,0,14.5,4.5,24.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Dagmars Heta Trosor",1971,91,NA,4.6,9,0,0,24.5,14.5,14.5,24.5,14.5,0,0,24.5,"",0,0,1,0,0,1,0 -"Dagny",1977,85,NA,4.3,13,14.5,24.5,0,14.5,14.5,4.5,0,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Dagon",2001,97,4800000,6,1549,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dags",1998,83,NA,3.8,24,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Daguerreotypes",1978,80,NA,5.9,10,14.5,0,0,0,0,0,24.5,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Dahab",1953,120,NA,5.7,7,0,14.5,0,14.5,14.5,0,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Dahan",1997,145,NA,8,10,0,0,0,14.5,0,0,14.5,34.5,45.5,0,"R",0,0,0,1,0,0,0 -"Daheim sterben die Leut'",1985,109,NA,8.3,24,0,4.5,0,0,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Dahil may isang ikaw",1999,117,NA,7,5,0,0,0,0,44.5,0,24.5,24.5,0,24.5,"",0,0,1,1,0,1,0 -"Dahmer",2002,101,NA,5.4,971,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Dahucapra rupidahu",2004,7,NA,7,5,0,0,0,0,0,0,84.5,0,0,24.5,"",0,1,1,0,1,0,1 -"Dai chushingura",1957,157,NA,9.2,11,0,0,0,4.5,0,0,0,0,34.5,45.5,"",1,0,0,1,0,0,0 -"Dai si gein",2004,90,NA,6.7,416,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Daibyonin",1993,116,NA,6.5,18,0,14.5,0,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Daichi no komoriuta",1976,111,NA,7.7,8,0,0,0,0,0,0,24.5,64.5,0,14.5,"",0,0,0,1,0,0,0 -"Daijiga umule pajinnal",1996,115,NA,6.8,97,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Dail el samakah",2003,120,NA,4.1,6,0,14.5,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Daily Beauty Rituals",1937,5,NA,5,9,0,0,0,0,84.5,0,0,0,0,14.5,"",0,0,0,0,1,0,1 -"Daimajin",1966,84,NA,6.9,99,4.5,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Daimajin ikaru",1966,79,NA,6.5,52,0,0,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Daisy Kenyon",1947,99,NA,6.3,125,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Daisy Miller",1974,91,2000000,5.5,172,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Daisy Town",1971,71,NA,6.3,108,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Daisy and Simon",1988,106,NA,4.5,7,14.5,14.5,14.5,14.5,0,14.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Daisy: The Story of a Facelift",1982,58,NA,6.4,7,0,0,0,0,14.5,14.5,14.5,44.5,14.5,0,"",0,0,0,0,1,0,0 -"Daitozoku",1963,96,NA,5,21,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,0,24.5,"",1,0,0,0,0,0,0 -"Daiyukai",1991,120,NA,7.7,14,0,0,0,0,14.5,0,4.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Dak miu mai shing",2001,87,NA,5.8,1429,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Dak van de Walvis, Het",1982,90,NA,7,21,0,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Dakan",1997,87,NA,4.8,22,4.5,0,0,0,4.5,44.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Dakhtaran-e khorshid",2000,92,NA,7,22,0,0,0,14.5,4.5,24.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dakota",1945,82,NA,5,144,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dakota",1974,100,NA,5,22,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dakota",1988,92,NA,4.5,62,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dakota Bound",2001,90,NA,5.7,11,4.5,4.5,0,4.5,24.5,0,14.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Dakota Incident",1956,88,NA,5.8,64,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Dakota Lil",1950,88,NA,6,21,0,0,0,4.5,24.5,34.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Dakota Road",1992,88,NA,6.1,15,0,0,4.5,0,0,24.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Dakrya gia tin Ilektra",1966,84,NA,5.5,12,14.5,0,0,0,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dal polo all'equatore",1987,96,NA,6,8,0,0,24.5,0,0,0,24.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Daleko od okna",2000,104,NA,6.4,26,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Daleko od siebie",1995,95,NA,5.3,6,0,0,0,0,45.5,14.5,0,34.5,0,0,"",0,0,0,1,0,0,0 -"Daleko ot Sankt-Peterburga",1992,79,NA,7,6,0,0,0,0,0,14.5,0,34.5,14.5,34.5,"",1,0,1,1,0,0,0 -"Daleks' Invasion Earth: 2150 A.D.",1966,81,NA,5.7,416,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dalia Vehamalahim",1964,104,NA,7.4,6,0,0,0,0,0,0,34.5,45.5,14.5,0,"",0,0,0,1,0,0,0 -"Dalkeith",2001,93,NA,7,9,0,14.5,14.5,0,0,0,14.5,44.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Dalkullan",2000,120,NA,7.9,5,0,0,24.5,0,0,24.5,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Dalla nube alla resistenza",1979,103,NA,6.3,10,24.5,0,0,0,0,24.5,34.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Dallas",1950,94,NA,6,118,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dallas",1985,9,NA,5.6,5,44.5,0,0,0,0,0,0,44.5,0,24.5,"",0,0,0,0,1,0,1 -"Dallas 362",2003,100,NA,6.4,46,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Dallas Connection, The",1994,94,NA,4.1,117,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Dallas Doll",1994,104,NA,5.8,29,14.5,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Dalmaya nolja",2001,95,NA,6.1,62,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Dalton Girls, The",1957,71,NA,5,12,0,0,0,24.5,14.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dalton en cavale, Les",1983,82,NA,6.1,58,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Dalton, Les",2004,86,27000000,2.7,89,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Daltons Ride Again, The",1945,70,NA,7.4,9,0,0,0,14.5,14.5,24.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Daltons' Women, The",1950,70,NA,5.7,9,24.5,0,0,14.5,0,34.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Dalu",1934,104,NA,9.4,25,4.5,0,0,0,0,0,4.5,24.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Dam Busters, The",1954,105,NA,7.6,926,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Dama de Porto Pim",2001,90,NA,4.3,22,4.5,4.5,4.5,14.5,4.5,14.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dama do Cine Shanghai, A",1987,115,NA,7.1,34,4.5,0,0,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dama na kolejich",1966,83,NA,4.5,15,14.5,0,4.5,24.5,4.5,24.5,4.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Dama regresa, La",1996,100,NA,1.9,19,45.5,24.5,0,0,4.5,0,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Dama rossa uccide sette volte, La",1972,98,NA,3.4,27,14.5,0,0,4.5,24.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dama s sobachkoy",1960,89,NA,7.5,50,0,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Dama spathi",1966,87,NA,6.2,5,0,0,0,24.5,24.5,24.5,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Damage",1974,12,NA,5.5,39,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Damage",1992,111,NA,6.5,1938,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Damaged Lives",1933,61,10000,4.2,14,24.5,4.5,24.5,0,24.5,0,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Damals",1943,94,NA,5.1,8,0,0,0,14.5,0,14.5,14.5,0,34.5,24.5,"",0,0,0,0,0,0,0 -"Dame algo",1997,86,NA,4,17,14.5,0,0,24.5,4.5,14.5,34.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Dame d'onze heure, La",1948,91,NA,6.8,29,4.5,0,0,0,14.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Dame la mano",2004,112,NA,4.7,8,0,0,14.5,24.5,0,14.5,14.5,14.5,24.5,0,"",0,0,0,0,1,0,0 -"Dame tu cuerpo",2003,100,NA,4.3,25,24.5,14.5,0,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Damen i svart",1958,110,NA,6.5,49,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Damen tango",2004,95,NA,6.9,13,14.5,0,0,0,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Damen und Herren ab 65",2002,70,NA,7.8,7,0,0,0,0,0,14.5,45.5,0,24.5,0,"",0,0,0,0,1,0,0 -"Dames",1934,91,NA,6.7,156,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Dames Ahoy",1930,64,NA,5.7,6,0,0,0,14.5,14.5,45.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Dames du Bois de Boulogne, Les",1945,84,NA,7.2,287,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Dami kanyat",1980,95,NA,9,39,0,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Damien's Seed",1996,90,NA,4.6,66,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Damien: Omen II",1978,107,NA,5.7,2973,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Damini - Lightning",1993,175,NA,6.4,39,4.5,0,0,4.5,4.5,4.5,4.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Damn Citizen",1958,88,NA,5.9,13,0,0,0,4.5,4.5,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Damn Whitey",1997,4,NA,7.2,10,24.5,0,0,14.5,0,14.5,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Damn Yankees!",1958,111,NA,7.3,415,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Damnation Alley",1977,91,NA,4.7,590,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Damned Don't Cry, The",1950,103,NA,6.6,112,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Damned If You Do",1999,18,NA,6.3,31,0,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Damned If You Don't",1987,42,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Damned in the U.S.A.",1991,68,NA,5.5,24,4.5,4.5,4.5,0,4.5,24.5,24.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Damned, The",1963,96,500000,7,130,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Damned, The",2001,90,30000,2.2,22,44.5,14.5,0,0,0,0,4.5,4.5,0,34.5,"R",0,0,0,0,0,0,0 -"Damon and Pythias",1962,99,NA,3.9,25,14.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Damsel in Distress, A",1937,98,1035000,6.9,181,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Dan Kolov - tzaryat na kecha",1999,194,NA,7.6,5,24.5,0,0,0,0,0,24.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Dance Contest, The",1934,7,NA,6,10,0,0,0,14.5,14.5,24.5,34.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Dance Craze",1982,50,NA,8,19,4.5,0,0,0,0,4.5,0,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Dance Fever",1985,75,NA,5.3,5,0,24.5,0,24.5,24.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Dance Goes On, The",1992,110,NA,4.4,7,24.5,14.5,14.5,0,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Dance Hall",1941,72,NA,5.9,5,0,0,0,0,24.5,24.5,44.5,24.5,0,0,"",0,0,1,0,0,1,0 -"Dance Hall",1950,80,NA,6,7,0,0,0,14.5,0,45.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Dance Hall Racket",1953,60,NA,1.7,13,44.5,14.5,4.5,24.5,0,0,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Dance Lexie Dance",1996,14,75000,4,15,14.5,0,4.5,4.5,0,0,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Dance Macabre",1991,97,NA,3.3,25,24.5,24.5,14.5,24.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Dance Me Outside",1995,84,NA,6.9,286,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Dance Me to My Song",1998,101,NA,7.3,117,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Dance of Shiva, The",1998,26,NA,6.3,22,4.5,4.5,0,14.5,4.5,0,4.5,14.5,14.5,14.5,"",1,0,0,1,0,0,1 -"Dance of the Cookoos",1982,91,NA,6.4,5,0,0,0,0,0,44.5,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Dance of the Damned",1988,82,NA,5.2,75,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Dance of the Dwarfs",1983,93,NA,3.4,49,24.5,4.5,24.5,14.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Dance of the Weed",1941,8,NA,9.4,9,0,0,0,0,0,14.5,0,0,14.5,74.5,"",0,1,0,0,0,0,1 -"Dance of the Wind",1997,88,NA,6.8,33,0,0,4.5,0,4.5,14.5,4.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Dance with Death",1991,86,NA,4.2,26,4.5,4.5,14.5,14.5,0,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dance with Me",1997,9,NA,6,5,24.5,0,0,0,0,44.5,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Dance with Me",1998,126,NA,5.7,906,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Dance with Me Henry",1956,79,NA,4.1,57,14.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dance with a Stranger",1985,102,NA,6.7,434,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dance, Fools, Dance",1931,80,NA,6.4,95,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dance, Girl, Dance",1940,90,NA,6.3,109,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Dancehall Queen",1997,98,NA,6,62,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dancemaker",1998,98,NA,7.1,35,0,0,0,4.5,0,4.5,24.5,24.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Dancer Upstairs, The",2002,133,NA,7,1585,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Dancer in the Dark",2000,140,NA,7.8,15686,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Dancer, Texas Pop. 81",1998,97,NA,6.6,941,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG",0,0,1,1,0,0,0 -"Dancers",1987,82,NA,3.2,42,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dancers in the Dark",1932,74,NA,5.7,13,0,14.5,4.5,4.5,4.5,14.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Dances Sacred and Profane",1987,90,NA,8.2,7,14.5,0,0,14.5,0,14.5,0,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Dances with Wolves",1990,236,19000000,7.8,28561,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dancin' Thru the Dark",1990,95,NA,5.9,50,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Dancing",2003,94,NA,4.4,31,14.5,0,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dancing Boxing Match, Montgomery and Stone",1907,1,NA,3.1,9,0,14.5,44.5,44.5,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Dancing Co-Ed",1939,81,NA,5.9,34,0,0,0,14.5,4.5,24.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Dancing Cow, The",1999,21,NA,7,69,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Dancing Fool, The",1932,7,NA,5.2,9,0,0,14.5,14.5,24.5,44.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Dancing Lady",1933,92,923055,6.4,170,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Dancing Machine",1990,107,NA,3.3,103,14.5,34.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dancing Masters, The",1943,63,NA,5.6,47,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Dancing Mothers",1926,66,NA,7.3,26,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dancing North",2000,98,NA,3.7,7,14.5,14.5,24.5,0,14.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Dancing Pirate",1936,83,NA,3.9,24,4.5,24.5,4.5,24.5,4.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Dancing Sweeties",1930,62,NA,4.4,11,14.5,0,4.5,4.5,24.5,14.5,14.5,0,0,0,"",0,0,1,1,0,1,0 -"Dancing Town, The",1928,20,NA,8.6,10,14.5,0,14.5,0,0,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Dancing at Lughnasa",1998,95,NA,6.2,833,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Dancing at the Blue Iguana",2000,126,NA,5.8,778,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Dancing in September",2000,102,850000,6.4,166,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Dancing in the Dark",1949,92,NA,5.3,38,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Dancing in the Dark",1986,93,NA,6.8,30,14.5,0,4.5,14.5,4.5,0,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dancing on the Moon",1935,8,NA,6.3,18,0,0,24.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Dancing on the Moon",1997,87,NA,6.2,66,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,1,0,0,0 -"Dancing with Agnes",1999,8,NA,5.3,12,44.5,4.5,0,0,0,0,4.5,0,0,44.5,"",0,0,1,0,0,0,1 -"Dancing with Crime",1947,83,NA,7.6,7,0,0,0,0,24.5,0,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Dandelion",2004,93,NA,6.7,120,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Dandin",1987,120,NA,6,6,0,0,0,0,0,64.5,0,0,34.5,0,"",0,0,1,1,0,0,0 -"Dando y dando",1990,95,NA,4.6,7,24.5,0,0,0,0,74.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Dandy",1987,93,NA,4.2,24,4.5,4.5,4.5,14.5,4.5,4.5,4.5,0,4.5,44.5,"",0,0,0,0,1,0,0 -"Dandy Dick",1935,70,NA,4.6,8,0,0,14.5,14.5,24.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Dandy Dust",1998,94,NA,4.6,11,0,0,14.5,14.5,4.5,4.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Dandy in Aspic, A",1968,107,NA,5.4,56,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Danehaye rize barf",2003,80,NA,6.7,14,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Dang bu zhu de feng qing",1993,83,NA,4.2,11,14.5,14.5,0,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Dang doi lai ming",1983,100,NA,7,137,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Dang kou tan",1972,94,NA,2.7,15,24.5,4.5,14.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Dangan ranna",1996,82,NA,7.1,173,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Danger Ahead",1926,20,NA,6.6,8,0,0,0,24.5,14.5,24.5,14.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Danger Ahead",1935,65,NA,5.7,5,0,24.5,0,44.5,0,24.5,0,24.5,0,0,"",1,0,0,1,0,0,0 -"Danger Ahead",1940,60,NA,5.5,5,0,24.5,0,0,24.5,44.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Danger Has Two Faces",1967,95,NA,4.7,5,0,44.5,0,0,0,0,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Danger Lights",1930,74,NA,5.7,47,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Danger Patrol",1937,59,NA,5.9,10,0,0,0,14.5,24.5,64.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Danger Route",1968,92,NA,5.1,21,4.5,4.5,0,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Danger Signal",1945,78,NA,6.7,44,0,0,4.5,0,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Danger Within",1959,101,NA,6.8,49,0,0,0,4.5,4.5,14.5,24.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Danger Zone",1996,92,NA,4.2,149,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Danger Zone",2004,12,NA,3.5,7,14.5,0,0,14.5,0,14.5,0,14.5,0,44.5,"",0,0,1,0,0,0,1 -"Danger Zone II: Reaper's Revenge",1990,95,NA,4.9,9,0,34.5,0,0,14.5,14.5,0,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Danger Zone, The",1986,90,NA,4.1,8,24.5,14.5,14.5,0,34.5,0,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Danger by My Side",1962,63,NA,6.1,5,0,0,24.5,0,0,44.5,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Danger on the Air",1938,70,NA,6.8,7,0,0,0,0,0,24.5,24.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Danger-Love at Work",1937,84,NA,5.5,5,0,0,0,0,44.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Dangereux, Les",2002,108,NA,4.3,96,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dangerous",1935,79,NA,6.9,268,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Dangerous Acts",1998,96,NA,7.3,6,0,0,0,0,0,0,34.5,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Dangerous Age, A",1959,71,NA,8.2,6,0,0,0,0,0,0,45.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Dangerous Attraction",2000,94,NA,4.1,77,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dangerous Beauty",1998,111,NA,7,2714,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Dangerous Blondes",1943,81,NA,8.6,11,0,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,1,1,0,0,0 -"Dangerous Corner",1934,66,NA,5.1,26,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dangerous Crossing",1953,75,NA,6.9,45,0,4.5,0,0,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dangerous Curves",1929,75,NA,7.6,14,0,0,0,0,4.5,24.5,14.5,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Dangerous Curves",1988,93,NA,3.5,46,4.5,14.5,24.5,14.5,14.5,4.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Dangerous Dan McFoo",1939,8,NA,6.4,23,4.5,0,0,4.5,4.5,45.5,4.5,4.5,14.5,0,"",0,1,1,0,0,0,1 -"Dangerous Davies - The Last Detective",1981,120,NA,7.4,23,0,0,0,0,0,0,14.5,34.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Dangerous Exile",1957,88,NA,4.8,26,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,0,0,"",0,0,0,1,0,1,0 -"Dangerous Females",1929,21,NA,6.7,16,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Dangerous Game",1987,98,NA,4,55,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dangerous Game",1993,108,NA,4.9,649,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dangerous Ground",1997,95,NA,4.2,428,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dangerous Indiscretion",1994,81,NA,4.2,52,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dangerous Invitation",1998,95,NA,4.5,53,4.5,14.5,4.5,14.5,4.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Dangerous Liaisons",1988,119,14000000,7.6,12559,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Dangerous Lives of Altar Boys, The",2002,105,12000000,7.2,3274,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Dangerous Love",1988,96,NA,3.3,26,14.5,14.5,14.5,14.5,14.5,4.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Dangerous Minds",1995,99,NA,5.7,6177,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Dangerous Mission",1954,75,NA,4.9,47,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dangerous Money",1946,66,75000,6.2,88,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Dangerous Moonlight",1941,82,NA,6.7,67,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dangerous Number",1937,71,NA,4.5,23,4.5,4.5,0,24.5,14.5,24.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Dangerous Paradise",1930,58,NA,3.9,9,0,14.5,24.5,24.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Dangerous Partners",1945,74,NA,6,20,0,0,0,14.5,24.5,34.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Dangerous Passage",1944,60,NA,4.8,5,0,0,0,44.5,44.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Dangerous Place, A",1995,91,NA,4.5,64,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Dangerous Prey",1995,93,NA,3.5,74,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Dangerous Profession, A",1949,79,NA,6,42,0,0,4.5,4.5,4.5,34.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Dangerous Proposition",1998,105,NA,5.5,40,14.5,14.5,4.5,0,4.5,4.5,4.5,0,14.5,44.5,"",0,0,0,1,0,0,0 -"Dangerous Seductress",1992,95,NA,5.4,23,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Dangerous Stranger, The",1950,10,1000,3.6,14,24.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,0,4.5,"",0,0,0,1,0,0,1 -"Dangerous Summer, A",1981,100,NA,3.1,27,14.5,14.5,24.5,24.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Dangerous Touch",1994,97,NA,4.2,144,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dangerous Venture",1947,59,NA,6.5,18,14.5,0,0,0,14.5,14.5,4.5,14.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Dangerous When Wet",1953,95,NA,5.8,86,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Dangerous Woman, A",1993,102,NA,5.7,376,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Dangerous World of 'Deliverance', The",1972,10,NA,6.7,11,14.5,0,0,0,4.5,34.5,4.5,4.5,0,14.5,"",0,0,0,0,1,0,1 -"Dangerous Years",1947,62,NA,5.4,13,0,0,4.5,4.5,14.5,4.5,0,4.5,0,45.5,"",0,0,0,1,0,0,0 -"Dangerous to Know",1938,70,NA,7.4,10,0,14.5,0,0,24.5,0,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dangerous, The",1994,96,NA,3.2,71,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Dangerously Close",1986,88,NA,4.4,71,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Dangerously They Live",1942,77,NA,5.9,60,0,4.5,4.5,4.5,4.5,44.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dangers of the Canadian Mounted",1948,156,NA,6.2,12,0,0,0,14.5,34.5,24.5,14.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Dangle",2003,6,NA,6.4,20,0,0,0,4.5,14.5,14.5,34.5,34.5,14.5,0,"",0,0,1,0,0,0,1 -"Dani, Michi, Renato & Max",1987,138,NA,9.1,7,0,0,0,14.5,0,0,14.5,0,44.5,24.5,"",0,0,0,0,1,0,0 -"Daniel",1983,130,NA,6.4,162,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Daniel - Der Zauberer",2004,81,NA,1.8,2698,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Daniel Boone",1936,75,NA,6.1,20,4.5,0,4.5,14.5,14.5,24.5,34.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Daniel Boone, Trail Blazer",1956,76,NA,5.2,31,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Daniel and the Superdogs",2004,102,NA,5.1,14,14.5,0,0,4.5,4.5,4.5,0,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Daniel's Spark",2004,14,NA,9.1,9,0,0,0,0,0,0,14.5,14.5,34.5,44.5,"",0,0,1,1,0,0,1 -"Danjeogbiyeonsu",2000,117,NA,5.4,133,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Danji geudaega yeojalaneun iyumaneulo",1990,105,NA,6.4,11,0,0,0,0,4.5,34.5,24.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Danmark er lukket",1980,91,NA,3.1,8,24.5,0,24.5,34.5,0,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Danny",1977,90,NA,5.9,23,14.5,0,0,4.5,0,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Danny Deckchair",2003,90,NA,6.5,643,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Danny in the Sky",2001,88,NA,3.8,78,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dans l'oeil du chat",2004,94,NA,4.1,53,14.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dans la nuit",1929,75,NA,7.3,27,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Dans la nuit",2002,22,NA,5.4,15,4.5,14.5,0,4.5,4.5,4.5,45.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Dans la ville blanche",1983,108,NA,6.5,113,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Dans le rouge du couchant",2003,90,NA,4,6,0,0,0,45.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Dans le ventre du dragon",1989,100,NA,6.1,93,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Dans les coulisses de 'Pourvu qu'elle soient douces'",1988,23,NA,8.9,7,0,0,0,0,14.5,0,14.5,0,0,74.5,"",0,0,0,0,0,0,1 -"Dans les coulisses du clip 'California'",1996,27,NA,6.2,7,14.5,0,0,0,0,14.5,0,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Dans ma peau",2002,93,NA,6.5,263,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dans van de reiger, De",1966,92,NA,7,12,0,4.5,0,4.5,4.5,0,45.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Dans, Grozny dans",2003,75,NA,5.9,22,4.5,0,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Dansen med Regitze",1989,102,NA,7.4,120,4.5,4.5,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dansinn",1998,87,NA,5.3,26,14.5,0,4.5,4.5,0,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dansk sexualitet",1969,75,15000,2.4,6,14.5,14.5,0,14.5,0,0,14.5,0,0,34.5,"",0,0,0,0,1,0,0 -"Danske piger viser alt",1996,93,NA,6,19,14.5,0,0,14.5,0,14.5,0,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Dante Quartet, The",1987,6,NA,8.4,53,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Dante's Inferno",1924,53,NA,6.2,5,0,0,44.5,0,0,24.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Dante's Inferno",1935,88,748900,6.6,80,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dante's Peak",1997,104,104000000,5.6,9203,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Dante's View",1998,85,NA,4.2,20,14.5,14.5,14.5,14.5,14.5,24.5,14.5,14.5,4.5,0,"R",0,0,0,0,0,0,0 -"Danton",1921,60,NA,7.4,8,0,14.5,0,14.5,14.5,0,0,34.5,24.5,0,"",0,0,0,0,0,0,0 -"Danton",1983,136,NA,7.5,527,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dany, bitte schreiben Sie",1956,99,NA,4.5,12,0,4.5,0,4.5,45.5,0,4.5,24.5,0,0,"",0,0,1,0,0,1,0 -"Danza macabra",1964,87,NA,6.8,127,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Dao",1995,101,NA,7.2,427,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Dao ma zei",1986,88,NA,6.8,76,0,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dar alanda kisa paslasmalar",2000,120,NA,7.4,83,14.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Darby O'Gill and the Little People",1959,93,NA,6.6,1144,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Darby's Rangers",1958,121,NA,6.1,143,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Darcy's Off-White Wedding",2005,10,7000,9.4,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,1,0,0,0,1 -"Dardos del amor, Los",1998,21,NA,6,5,24.5,0,0,0,0,0,64.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Dare mo shiranai",2004,141,NA,8.2,850,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Daredevil",2003,133,75000000,5.7,20642,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Daredevil Droopy",1951,6,NA,7.2,47,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Daredevil, The",1972,70,NA,4.3,7,0,0,0,24.5,14.5,14.5,14.5,0,24.5,0,"",1,0,0,0,0,0,0 -"Daredevil: The Teaser",2001,6,NA,4.3,9,14.5,14.5,0,24.5,14.5,0,34.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Daredevils of the Red Circle",1939,211,126118,7.8,48,4.5,0,0,0,0,14.5,4.5,14.5,14.5,45.5,"",1,0,0,0,0,0,0 -"Daresalam",2000,100,NA,6.4,17,0,0,0,4.5,14.5,24.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Daring Daylight Burglary",1901,5,NA,6,29,4.5,4.5,4.5,0,4.5,24.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,1 -"Daring Dobermans, The",1973,90,NA,5.8,29,14.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Daring Game",1968,100,NA,5.8,6,0,0,0,14.5,34.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Daring Young Man, The",1942,73,NA,7.4,5,0,0,0,24.5,0,24.5,0,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Dario Argento: Master of Horror",1991,60,NA,3.1,21,24.5,4.5,0,0,4.5,14.5,34.5,0,0,4.5,"",0,0,0,0,1,0,0 -"Dark Age",1987,91,NA,4.5,27,14.5,0,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dark Agent and the Passing of the Torch Chapter 7, The",2004,13,10000,9.2,11,4.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,0,0,0,1 -"Dark Alibi",1946,61,75000,7,83,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Dark Angel, The",1935,110,NA,6.5,63,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dark Asylum",2001,83,NA,3.7,202,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dark August",1976,87,NA,4.9,8,14.5,14.5,0,14.5,14.5,14.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Dark Avenger, The",1955,85,NA,5.1,36,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Dark Backward, The",1991,101,NA,4.6,353,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Dark Blue",2002,118,15000000,6.6,3882,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Dark Breed",1996,104,NA,4.2,85,4.5,14.5,24.5,14.5,24.5,14.5,4.5,0,4.5,0,"R",0,0,0,0,0,0,0 -"Dark Circle",1983,82,NA,6.5,6,0,0,0,0,0,34.5,14.5,0,34.5,14.5,"",0,0,0,0,1,0,0 -"Dark City",1950,98,NA,6.7,125,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dark City",1990,97,NA,6,9,24.5,14.5,0,0,0,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Dark City",1998,100,27000000,7.6,23508,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Dark Command",1940,94,1000000,6.4,301,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Dark Confessions",1998,92,NA,3.8,20,14.5,0,34.5,4.5,14.5,4.5,0,14.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"Dark Corner, The",1946,95,NA,7.3,217,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dark Crystal, The",1982,93,15000000,6.9,6531,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dark Dancer, The",1995,98,NA,2.5,89,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Dark Days",2000,84,NA,7.5,786,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Dark Dealer, The",1992,85,NA,4.3,21,4.5,4.5,4.5,4.5,0,24.5,4.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Dark Delusion",1947,90,NA,6.3,12,0,0,0,0,4.5,24.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Dark Descent",2002,96,NA,2.9,75,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Dark End of the Street, The",1981,89,NA,3.9,25,24.5,4.5,14.5,4.5,14.5,0,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Dark Eyes of London, The",1940,76,NA,4.9,122,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dark Half, The",1993,122,15000000,5.5,1757,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dark Harbor",1998,96,NA,4.9,322,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Dark Hazard",1934,73,NA,5.9,45,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dark Heaven",2002,87,80000,2.4,47,44.5,14.5,4.5,0,0,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Dark Heritage",1989,94,NA,4.1,21,14.5,0,14.5,4.5,4.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Dark Horse",1992,98,NA,5.3,84,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dark Horse, The",1932,75,NA,7,105,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Dark Hour, The",1936,64,NA,4.8,10,0,0,0,34.5,34.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Dark Intruder",1965,59,NA,6.1,21,4.5,0,4.5,0,14.5,14.5,4.5,44.5,0,4.5,"",0,0,0,0,0,0,0 -"Dark Journey",1937,77,NA,5.9,90,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Dark Justice",2004,11,NA,2.4,6,34.5,0,45.5,0,0,0,0,0,0,14.5,"",1,0,0,0,0,0,1 -"Dark Legacy",2004,18,NA,7.4,8,24.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Dark Magic",1939,10,NA,7.7,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Dark Man, The",1951,73,NA,5.6,18,14.5,0,0,4.5,14.5,14.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Dark Manhattan",1937,70,24900,5.1,11,4.5,0,0,14.5,14.5,4.5,4.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Dark Mirror, The",1946,85,NA,7,248,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dark Mountain",1944,56,NA,5.6,8,0,0,0,0,34.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Dark Nova",1999,93,NA,4.4,16,44.5,4.5,0,14.5,14.5,4.5,14.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Dark Odyssey",1961,85,NA,5.6,10,0,0,0,14.5,0,45.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Dark Passage",1947,106,NA,7.3,1506,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dark Past, The",1948,75,NA,6.6,67,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dark Places",1973,91,NA,4.7,40,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dark Planet",1996,99,NA,3.3,155,24.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dark Power, The",1985,78,NA,3.3,27,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dark Redemption, The",1999,35,NA,4.8,62,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,1 -"Dark Riders, The",2001,3,NA,7.1,7,0,0,0,0,0,24.5,45.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Dark Room, The",1982,94,NA,4.7,11,4.5,4.5,0,4.5,0,14.5,0,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Dark Secrets",1998,91,NA,3.2,43,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Dark Shadows",1944,21,NA,6.1,6,0,0,0,0,45.5,14.5,34.5,0,0,0,"",0,0,0,1,0,0,1 -"Dark Shadows Bloopers",1993,45,NA,7.6,11,0,0,4.5,0,0,4.5,4.5,44.5,0,24.5,"",0,0,0,0,1,0,0 -"Dark Side of Genius",1994,85,NA,2.8,23,14.5,0,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dark Side of Hollywood, The",1998,54,NA,6.5,10,14.5,0,0,0,0,34.5,34.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Dark Side of Midnight, The",1984,108,NA,3.5,17,24.5,0,4.5,14.5,4.5,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Dark Side of the Moon, A",1986,85,NA,7.9,11,0,0,0,4.5,4.5,4.5,4.5,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Dark Side of the Moon, The",1990,85,NA,4.3,190,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Dark Star",1974,83,60000,6.6,3527,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Dark Star",1991,87,NA,5,34,4.5,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Dark Summer",1999,97,NA,4.7,108,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dark Sunday",1976,99,NA,3.6,9,14.5,24.5,0,24.5,14.5,14.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Dark Tide",1993,94,NA,3.4,86,14.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dark Tomorrow",2002,84,NA,5,7,24.5,14.5,0,0,14.5,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Dark Tower",1987,91,NA,3,50,24.5,24.5,14.5,24.5,4.5,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Dark Tower, The",1999,3,NA,7.5,45,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Dark Universe",1993,83,NA,2.3,57,45.5,4.5,14.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Dark Vengeance",1992,92,NA,1.4,18,84.5,14.5,0,0,0,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Dark Victory",1939,104,NA,7.4,1208,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Dark Water",2001,92,NA,5.6,91,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dark Waters",1944,90,NA,6.6,61,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dark Waters",1994,94,NA,4.7,125,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dark Woods",2002,75,NA,4.8,28,34.5,0,4.5,0,14.5,14.5,4.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Dark at the Top of the Stairs, The",1960,124,NA,7,209,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dark, The",1979,92,NA,3,106,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dark, The",1994,87,NA,4.4,171,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Darkdrive",1996,88,NA,2.8,75,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Darkend Room",2002,8,NA,6.1,199,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Darkening, The",1995,80,NA,4.5,13,4.5,14.5,34.5,0,14.5,14.5,0,0,14.5,0,"PG-13",0,0,0,0,0,0,0 -"Darker Side of Black, The",1993,55,NA,5.3,9,0,0,0,14.5,24.5,14.5,24.5,0,34.5,0,"",0,0,0,0,1,0,0 -"Darker Than Amber",1970,96,NA,5.5,60,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Darkest Africa",1936,269,NA,5.2,14,4.5,0,0,0,14.5,4.5,34.5,24.5,0,14.5,"",1,0,0,0,0,0,0 -"Darkest Light, The",1999,92,NA,5.3,44,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Darklands",1996,90,750000,4,103,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Darkling",1995,16,NA,5.9,20,4.5,0,4.5,4.5,24.5,34.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Darkman",1990,96,16000000,6.1,6130,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Darkness Falling",2002,85,NA,3.9,49,14.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Darkness Falls",1999,90,NA,5.5,112,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Darkness Falls",2003,86,11000000,4.5,4928,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Darkness Minus Twelve",2004,12,4400,8.9,8,14.5,0,0,0,0,0,0,0,0,84.5,"",1,0,0,0,0,0,1 -"Darkness at High Noon: The Carl Foreman Documents",2002,120,NA,3.8,19,24.5,4.5,0,0,14.5,0,0,14.5,14.5,34.5,"",0,0,0,1,1,0,0 -"Darkness in Tallinn",1993,99,NA,6.4,99,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Darkroom",1988,93,NA,4.3,24,14.5,24.5,0,14.5,14.5,0,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Darkside Blues",1994,83,NA,4.3,88,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Darkside, The",2004,5,NA,7.2,8,24.5,0,0,0,0,0,0,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Darktown Strutters",1975,90,NA,4.9,29,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,0,"",1,0,1,0,0,0,0 -"Darling",1965,128,NA,7.2,576,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Darling Lili",1970,107,25000000,5.9,287,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Darling, How Could You",1951,96,NA,6.5,14,0,0,0,14.5,4.5,0,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Darmozjad polski",1997,117,NA,9,6,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,1,1,0,0,0 -"Darna: Ang pagbabalik",1994,105,NA,4.2,9,0,0,24.5,34.5,14.5,0,24.5,0,14.5,0,"",1,0,0,0,0,0,0 -"Darr",1993,178,NA,4.3,167,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Darse cuenta",1984,106,NA,7.2,35,0,0,4.5,4.5,4.5,0,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Darth Vader's Psychic Hotline",2002,5,NA,4.5,45,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Darvo bez koren",1974,86,NA,8,5,0,0,0,0,0,0,0,64.5,0,44.5,"",0,0,0,1,0,0,0 -"Darwin Adventure, The",1972,91,NA,7.9,10,0,0,0,0,0,14.5,0,44.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Darwin's Nightmare",2004,107,NA,7.6,138,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Das Bus",2003,94,NA,6.4,11,0,0,4.5,0,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,1,0,0 -"Das Clown",1999,8,NA,6.3,70,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Das kann jedem passieren",1952,91,NA,6.8,15,4.5,4.5,0,0,4.5,14.5,34.5,34.5,0,0,"",0,0,1,1,0,0,0 -"Dash Through the Clouds, A",1912,12,NA,6.2,8,0,0,0,0,14.5,34.5,24.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Daskala me ta xantha mallia, I",1969,96,NA,5.9,17,0,4.5,24.5,0,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Daskalakos itan leventia, O",1970,83,NA,5.9,9,14.5,0,0,24.5,0,34.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Dastak",1970,140,NA,8.8,5,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Dastaneh natamam",2004,84,NA,7,20,0,0,4.5,0,14.5,14.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Dastforoush",1987,95,NA,6.9,45,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Date Double",2002,2,NA,7.3,11,4.5,0,0,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,1,1,0,0,1,1 -"Date Less",2000,80,NA,6.2,12,4.5,0,4.5,4.5,24.5,0,14.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Date to Skate, A",1938,7,NA,5.1,17,4.5,0,4.5,24.5,4.5,14.5,14.5,4.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Date with Death",1959,74,NA,7.5,6,0,14.5,0,0,14.5,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Date with Duke",1947,7,NA,7.2,14,4.5,0,0,14.5,4.5,4.5,14.5,24.5,0,24.5,"",0,1,0,0,0,0,1 -"Date with Judy, A",1948,113,NA,5.7,128,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Date with Your Family, A",1950,10,NA,2.1,74,44.5,24.5,14.5,4.5,4.5,0,0,0,4.5,4.5,"",0,0,0,0,1,0,1 -"Date with a Kidnapper",1976,76,NA,4.3,19,4.5,14.5,14.5,24.5,4.5,0,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Date with an Angel",1987,105,NA,4.6,464,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Date with the Falcon, A",1941,63,NA,6.1,67,0,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Date, The",1997,5,NA,5.2,21,0,0,4.5,4.5,0,0,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Date, The",1999,7,NA,6.2,11,0,0,0,0,4.5,0,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Date, The",2004,12,3000,9.2,11,4.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,0,0,0,1 -"Dating",2005,11,NA,9.4,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,1,0,0,0,1 -"Dating the Enemy",1996,97,NA,6.1,428,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Dating: Do's and Don'ts",1949,13,NA,4,13,14.5,4.5,24.5,0,24.5,4.5,14.5,0,4.5,0,"",0,0,0,1,0,0,1 -"Datsche, Die",2002,90,NA,7.4,13,0,14.5,0,4.5,0,0,14.5,44.5,0,14.5,"",0,0,0,0,0,0,0 -"Daughter",2002,14,NA,5.3,31,4.5,0,4.5,4.5,0,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Daughter From Danang",2002,83,NA,7.8,152,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Daughter Rite",1979,49,NA,2.9,17,4.5,24.5,0,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Daughter of Darkness",1948,91,NA,5.1,5,0,0,0,24.5,44.5,0,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Daughter of Don Q",1946,167,NA,7.8,12,0,0,0,0,4.5,4.5,14.5,24.5,44.5,0,"",1,0,0,0,0,0,0 -"Daughter of Dr. Jekyll",1957,71,NA,4.2,49,4.5,4.5,14.5,34.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Daughter of Rosie O'Grady, The",1950,104,NA,5.8,45,0,0,0,0,34.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Daughter of Shanghai",1937,63,NA,5.9,11,4.5,0,4.5,0,4.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Daughter of Suicide",2000,72,NA,1.9,5,24.5,0,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Daughter of the Dragon",1931,79,NA,4.9,20,0,4.5,4.5,14.5,14.5,44.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Daughter of the Jungle",1949,69,NA,2.7,8,34.5,0,14.5,24.5,0,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Daughter of the Sun",1962,60,11000,1.2,9,64.5,24.5,14.5,0,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Daughters Courageous",1939,107,NA,6.4,76,4.5,0,4.5,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Daughters of Lesbos",1968,64,NA,4.1,8,14.5,0,14.5,0,34.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Daughters of Satan",1972,90,275000,3.2,77,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Daughters of the Dust",1991,112,NA,5.4,231,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Daun di atas bantal",1998,83,NA,7.2,66,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dauriya",1971,182,NA,8.6,6,0,0,0,0,14.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Davandeh",1985,94,NA,7.8,63,0,0,0,0,0,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Dave",1993,110,NA,7,10421,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"David & Dee",2004,18,50000,8.6,17,14.5,0,0,0,0,4.5,0,0,4.5,74.5,"",0,1,1,0,0,0,1 -"David Cronenberg: I Have to Make the World Be Flesh",1999,68,NA,7.1,33,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"David Cronenberg: Long Live the New Flesh",1986,50,NA,6.5,23,4.5,0,4.5,0,4.5,4.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"David Golder",1930,86,NA,5.6,8,0,14.5,0,14.5,14.5,14.5,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"David Harum",1934,83,NA,5.4,12,14.5,0,0,4.5,4.5,14.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"David Holzman's Diary",1967,74,NA,7.1,129,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"David Lean's Film of Doctor Zhivago",1965,7,NA,7.4,34,0,0,0,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"David Nelson Live",2000,42,0,9.7,6,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,1,0,0,0,1 -"David O. Selznick: 'Your New Producer'",1935,25,NA,7,22,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"David Searching",1997,101,22500,7.3,34,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"David and Bathsheba",1951,116,NA,5.5,187,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"David and Lisa",1962,95,NA,7.4,299,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"David e Golia",1960,95,NA,4.9,43,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"David im Wunderland",1998,103,NA,8.6,19,0,0,0,0,0,4.5,0,14.5,44.5,34.5,"",0,0,0,1,0,0,0 -"David, Moffett, and Ornette: The Ornette Coleman Trio",1966,26,NA,8.6,5,0,0,0,0,0,24.5,0,0,64.5,24.5,"",0,0,0,0,1,0,1 -"Davids bog",1996,97,NA,4.7,43,14.5,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Davitelj protiv davitelja",1984,93,NA,8,103,0,0,4.5,4.5,4.5,0,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Davy",1957,83,NA,6.1,25,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,1,1,0,0,0 -"Davy Crockett and the River Pirates",1956,85,NA,6.5,176,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Davy Crockett, Indian Scout",1950,71,NA,5.8,19,0,0,0,14.5,24.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Davy Crockett, King of the Wild Frontier",1954,150,NA,6.9,381,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Dawn",2003,99,NA,8.1,9,0,0,0,0,0,24.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Dawn Express, The",1942,54,NA,6,6,14.5,0,0,14.5,34.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Dawn Flight",1975,29,NA,6.1,7,0,0,0,14.5,0,0,24.5,0,14.5,44.5,"",0,0,0,0,0,0,1 -"Dawn Patrol, The",1930,108,NA,7.1,70,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Dawn Patrol, The",1938,103,NA,7.6,306,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dawn Rider, The",1935,53,NA,4.6,113,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dawn at Socorro",1954,80,NA,6.2,34,0,0,0,4.5,4.5,44.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dawn of the Dead",1978,139,1500000,7.7,12621,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Dawn of the Dead",2004,109,28000000,7.4,16283,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Dawn of the Friend",2004,22,10000,6.2,11,4.5,0,0,0,0,0,0,4.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Dawn of the Mummy",1981,80,NA,3.3,108,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dawn on the Great Divide",1942,63,NA,6.4,9,0,0,0,14.5,0,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Dawn!",1979,109,NA,5.5,9,14.5,0,0,14.5,14.5,0,24.5,14.5,34.5,0,"",0,0,0,1,0,0,0 -"Dawn, The",1938,89,NA,1.9,15,64.5,0,0,0,4.5,0,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Dawning, The",1988,97,NA,6.1,92,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Day After Day",2001,24,NA,6,6,0,45.5,0,0,0,0,0,0,0,45.5,"",0,0,0,1,0,0,1 -"Day After Tomorrow",2002,65,NA,5.6,324,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Day After Tomorrow, The",2004,124,125000000,6.3,23749,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Day After Trinity, The",1980,88,NA,7.1,56,0,0,0,4.5,0,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Day Grandad Went Blind, The",1998,29,NA,8.2,8,0,0,0,0,0,0,34.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Day I Became a Man, The",2003,6,NA,7.2,10,0,34.5,0,0,0,0,0,14.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Day I Will Never Forget, The",2002,90,NA,7.7,27,0,0,0,4.5,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Day Mars Invaded Earth, The",1963,70,NA,4.3,65,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Day My God Died, The",2003,70,NA,8,67,4.5,0,0,0,4.5,4.5,14.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Day Out, A",2000,9,NA,9.4,9,0,0,0,0,0,0,0,0,45.5,44.5,"",0,0,0,1,0,0,1 -"Day They Robbed the Bank of England, The",1960,85,NA,6.5,120,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Day Time Ended, The",1980,79,NA,4.2,107,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Day Will Dawn, The",1942,99,NA,7,36,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Day Without a Mexican, A",1998,28,NA,3.6,19,14.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Day Without a Mexican, A",2004,100,1500000,5,561,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Day and an Arabian Knight",1999,13,NA,1.9,6,14.5,84.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Day at the Beach",1998,93,NA,5.4,17,0,4.5,14.5,14.5,4.5,24.5,4.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Day at the Beach, A",1970,90,NA,6.7,14,0,0,0,24.5,0,14.5,4.5,4.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Day at the Fair, A",1947,10,NA,2.2,27,45.5,34.5,0,0,0,4.5,0,0,4.5,4.5,"",0,0,0,0,1,0,1 -"Day at the Races, A",1937,105,NA,7.5,2448,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Day at the Zoo, A",1939,7,NA,7.4,29,0,0,0,0,4.5,14.5,44.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Day in Black and White, A",1999,80,NA,5.3,31,4.5,0,4.5,4.5,0,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Day in the Death of Joe Egg, A",1972,106,NA,6.4,59,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Day in the Life of a Coal Miner, A",1910,9,NA,6.4,21,0,0,0,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Day of Defense",2003,102,500000,3,8,45.5,0,24.5,0,0,0,0,0,0,24.5,"PG",0,0,0,1,0,0,0 -"Day of Fury, A",1956,78,NA,5.6,25,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Day of Independence",2003,27,200000,2.8,11,14.5,0,4.5,4.5,0,0,4.5,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Day of Reckoning",1933,67,NA,6.2,25,0,4.5,4.5,4.5,14.5,14.5,4.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Day of Rest, The",1939,9,NA,6.8,7,0,0,14.5,0,24.5,0,44.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Day of Triumph",1953,110,NA,5.8,14,0,24.5,0,0,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Day of the Animals",1977,97,1200000,4.2,158,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Day of the Assassin",1979,95,NA,4.6,20,14.5,14.5,4.5,24.5,24.5,0,14.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Day of the Bad Man",1958,82,NA,5.5,33,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Day of the Dead",1957,15,NA,3,11,14.5,0,4.5,0,0,4.5,14.5,0,0,44.5,"",0,0,0,0,1,0,1 -"Day of the Dead",1985,97,3500000,6.5,5053,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Day of the Dolphin, The",1973,104,8500000,5.6,397,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Day of the Evil Gun",1968,90,NA,5.7,126,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Day of the Fight",1951,16,3900,6.1,272,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Day of the Jackal, The",1973,145,NA,7.8,5310,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Day of the Locust, The",1975,144,NA,7,679,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Day of the Nightmare",1965,89,NA,2.9,16,14.5,14.5,14.5,4.5,14.5,14.5,0,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Day of the Outlaw",1959,92,NA,7.1,102,0,0,0,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Day of the Triffids, The",1962,93,NA,5.9,1103,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Day of the Warrior",1996,96,NA,3.1,130,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Day of the Wolves",1973,95,NA,6.6,28,0,0,4.5,0,4.5,14.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Day of the Woman",1978,96,NA,4.4,1728,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Day on Treasure Island, A",1939,10,NA,6,6,0,0,0,14.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Day the Bookies Wept, The",1939,64,NA,4.9,14,4.5,4.5,14.5,4.5,34.5,4.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Day the Earth Caught Fire, The",1961,98,NA,7.1,552,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Day the Earth Stood Still, The",1951,85,960000,8.1,10148,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Day the Fish Came Out, The",1967,109,NA,4.8,69,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Day the Lord Got Busted, The",1976,81,NA,8.9,7,0,0,0,0,14.5,0,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Day the Music Died, The",1977,100,NA,7.8,8,0,0,0,0,0,0,24.5,24.5,0,45.5,"",0,0,0,0,0,0,0 -"Day the Ponies Come Back, The",2000,104,NA,4.8,21,4.5,0,4.5,14.5,4.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Day the Women Took Over or I Was a Teenage Neo-Impressionist, The",2001,8,NA,8.4,15,24.5,0,0,0,0,0,4.5,24.5,0,45.5,"",1,0,1,1,0,0,1 -"Day the World Ended",1956,79,96000,4.7,241,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Day to Remember, A",1953,92,NA,7.2,15,0,14.5,0,0,0,34.5,0,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Day with the Boys, A",1969,18,NA,6.6,42,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Day with the Meatball, A",2002,2,NA,5.7,30,4.5,0,0,4.5,14.5,24.5,4.5,14.5,4.5,24.5,"PG",0,0,1,0,0,0,1 -"Day's Pleasure, A",1919,25,NA,6.8,243,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Day-Time Wife",1939,71,NA,6.2,18,0,4.5,0,0,14.5,34.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Daybreak",1931,85,NA,7.1,9,0,0,0,0,24.5,24.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Daybreak",1947,75,NA,5.9,18,0,0,14.5,4.5,14.5,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Daybreak Express",1953,5,NA,7.6,32,0,0,0,0,4.5,0,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Daydream Believer",2001,79,NA,5.2,16,14.5,0,14.5,0,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Daydreamer, The",1966,101,NA,6,50,0,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Daydreams",1922,17,NA,7.3,162,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Daydrift",1999,82,NA,5.7,6,14.5,0,0,14.5,14.5,0,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Dayereh",2000,90,10000,7.1,755,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dayereh mina",1978,101,NA,7.7,13,0,4.5,4.5,0,0,14.5,0,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Daylight",1996,110,80000000,5.4,6979,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Days of Fury",1978,91,NA,6.4,9,0,0,34.5,14.5,14.5,0,14.5,24.5,0,14.5,"",0,0,0,0,1,0,0 -"Days of Glory",1944,86,NA,5.6,103,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Days of Heaven",1978,95,NA,7.8,3216,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Days of Jesse James",1939,63,NA,6.1,12,0,0,4.5,0,45.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Days of Our Years, The",1955,20,NA,3,32,45.5,14.5,14.5,4.5,4.5,4.5,4.5,0,0,0,"",0,0,0,0,1,0,1 -"Days of Thrills and Laughter",1961,93,NA,7.5,46,0,4.5,0,0,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,1,0,1,0,0 -"Days of Thunder",1990,107,60000000,5.4,9660,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Days of Wine and Roses",1962,117,NA,7.8,1725,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Dayte zhalobnuyu knigu",1964,91,NA,6,25,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Dayton's Devils",1968,103,NA,5,14,0,0,24.5,4.5,44.5,4.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Daytrippers, The",1996,87,NA,6.9,1300,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Dazed and Confused",1993,103,NA,7.3,13926,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Dazhe ne dumay!",2003,82,NA,4.3,50,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dazzle",1999,88,NA,4.9,62,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"De Artificiali Perspectiva",1991,15,NA,7.7,47,0,0,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"De Cara Limpa",2000,96,NA,3.7,16,34.5,4.5,14.5,0,4.5,0,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"De Passagem",2003,87,NA,8.2,42,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"De Sade",1969,120,NA,3.7,73,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"De bruit et de fureur",1988,90,NA,8,57,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"De cierta manera",1977,78,NA,5.4,15,0,4.5,0,0,24.5,24.5,14.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"De eso no se habla",1993,102,NA,6.6,118,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"De ida y vuelta",2000,86,NA,5.6,26,4.5,14.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"De l'amour",1964,90,NA,5.4,8,0,0,0,24.5,24.5,0,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"De l'amour",2001,90,NA,6,142,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"De l'histoire ancienne",2001,124,NA,4.8,28,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"De la calle",2001,84,NA,7.7,139,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"De la part des copains",1970,94,NA,5,165,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"De mi barrio con amor",1996,100,NA,3.2,14,14.5,0,0,0,0,14.5,4.5,24.5,24.5,4.5,"",0,0,1,0,0,1,0 -"De nens",2004,180,NA,9,5,0,0,0,0,0,0,24.5,0,44.5,44.5,"",0,0,0,0,1,0,0 -"De noche vienes, Esmeralda",1997,103,NA,6.6,104,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"De que estamos hechos",1987,80,NA,8.4,7,0,0,0,0,0,0,44.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"De sable et de sang",1987,101,NA,6,16,4.5,0,4.5,0,4.5,4.5,0,45.5,14.5,14.5,"",0,0,0,1,0,0,0 -"De-Lovely",2004,125,NA,6.7,2039,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"De-as fi Harap Alb",1965,91,NA,7.1,7,0,0,0,14.5,0,0,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Dead",1996,120,NA,6.6,6,34.5,0,0,0,0,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dead & Breakfast",2004,88,NA,5.8,135,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Dead & Buried",1981,94,3000000,6.1,614,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dead Again",1991,107,NA,7.1,6817,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Dead Aim",1987,88,NA,4.4,17,4.5,0,4.5,34.5,4.5,4.5,14.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Dead Babies",2000,100,1000000,4.3,172,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Dead Badge",1995,95,NA,5.5,33,4.5,4.5,4.5,4.5,34.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Dead Bang",1989,102,NA,5.4,526,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Dead Beat",1994,93,NA,4.9,66,4.5,0,4.5,4.5,24.5,4.5,4.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Dead Birds",1965,85,NA,7.3,27,14.5,0,4.5,0,4.5,14.5,4.5,4.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Dead Birds",2004,91,NA,5.9,421,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Dead Bolt Dead",1999,89,NA,5.7,25,14.5,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dead Boys' Club, The",1992,25,NA,7.9,17,0,0,0,0,14.5,4.5,24.5,14.5,44.5,4.5,"",0,0,0,0,0,0,1 -"Dead Boyz Can't Fly",1994,102,NA,2,39,44.5,14.5,14.5,0,0,0,4.5,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Dead Bunnies",1983,30,NA,5,12,4.5,0,0,0,0,0,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Dead Calm",1989,96,NA,6.9,5527,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dead Cert",1974,99,NA,5.1,28,4.5,4.5,14.5,14.5,14.5,24.5,4.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Dead Cold",1995,91,NA,4.7,64,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Dead Connection",1994,93,NA,4.6,130,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dead Dogs",1999,90,NA,4.9,32,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dead Dogs Lie",2001,98,NA,7.1,15,4.5,4.5,0,4.5,0,24.5,0,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Dead Don't Dream, The",1948,62,NA,6.9,24,0,0,4.5,0,24.5,14.5,24.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Dead Dudes in the House",1991,95,NA,4.7,86,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dead Easy",1982,90,NA,4.7,13,4.5,4.5,0,14.5,34.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Dead Easy",2004,97,NA,2.7,18,4.5,14.5,14.5,4.5,0,4.5,0,34.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Dead End",1937,93,900000,7.5,750,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dead End",1996,95,NA,4.2,18,24.5,14.5,0,14.5,4.5,24.5,0,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Dead End Kids",1986,87,NA,5.9,58,94.5,0,0,0,0,4.5,4.5,4.5,0,0,"",0,0,0,0,1,0,0 -"Dead End Road",2004,94,100000,5.8,5,0,24.5,0,24.5,0,24.5,0,24.5,24.5,0,"",1,0,0,0,0,0,0 -"Dead Eye Dick",1997,8,NA,8.4,5,0,0,0,0,0,44.5,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Dead Father, The",1986,26,NA,6.3,65,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Dead Funny",1994,96,NA,4.3,119,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Dead Girls",1990,90,NA,2.8,14,45.5,0,4.5,14.5,24.5,0,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Dead Hate the Living!, The",2000,90,150000,4.3,496,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Dead Heart",1996,104,NA,6,91,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dead Heat",1988,86,5000000,4.8,470,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Dead Heat",2002,106,NA,5.5,253,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Dead Heat on a Merry-Go-Round",1966,104,2000000,6,167,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Dead Inn",1997,72,NA,2,6,84.5,0,0,0,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Dead Innocent",1996,91,NA,5.5,64,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dead Leaves",1998,80,NA,6.7,15,0,0,0,4.5,0,4.5,0,14.5,34.5,44.5,"",0,0,0,0,0,0,0 -"Dead Letter Office",1998,95,NA,6.3,181,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Dead London",1996,20,NA,4.5,15,4.5,0,0,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Dead Man",1995,120,9000000,7.6,10097,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Dead Man 2: Return of the Dead Man, The",1994,26,NA,3,16,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Dead Man Walking",1995,122,11000000,7.6,16177,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Dead Man on Campus",1998,96,14000000,5.4,2829,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Dead Man's Curve",1998,90,1000000,5.7,1241,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Dead Man's Dream",2002,94,NA,6.8,10,34.5,0,0,0,0,0,0,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Dead Man's Eyes",1944,64,NA,5.7,29,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Dead Man's Float",1980,75,NA,4.9,12,0,0,4.5,24.5,0,14.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Dead Man's Gulch",1943,55,NA,5.1,5,0,0,0,0,64.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Dead Man's Run",2001,97,NA,7.5,11,4.5,14.5,0,0,0,0,0,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Dead Man's Shoes",2004,90,NA,7.5,696,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Dead Meat",2004,80,NA,7.8,28,4.5,4.5,0,4.5,0,0,14.5,24.5,14.5,34.5,"",1,0,1,0,0,0,0 -"Dead Men Can't Dance",1997,97,NA,4.4,179,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"Dead Men Don't Wear Plaid",1982,84,NA,6.5,3983,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Dead Men Tell",1941,61,NA,6.9,62,0,0,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Dead Men Walk",1943,64,NA,4.7,72,4.5,14.5,4.5,24.5,24.5,4.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Dead Next Door, The",1988,84,75000,4.8,275,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dead On",1993,92,NA,3.8,73,34.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dead On Time",1982,30,NA,5.5,12,0,0,0,4.5,0,4.5,4.5,24.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Dead On Time",1999,15,NA,5.4,20,14.5,0,0,4.5,24.5,14.5,14.5,24.5,14.5,0,"",0,0,0,0,0,0,1 -"Dead On: Relentless II",1992,93,NA,5,66,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Dead One, The",1961,71,NA,3.7,7,0,44.5,0,0,14.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Dead People",1973,90,NA,6,98,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dead Pit, The",1989,95,NA,4.9,154,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dead Poets Society",1989,128,16400000,7.7,43294,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dead Pool, The",1988,91,NA,5.8,3801,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Dead Presidents",1995,119,15000000,6.3,2641,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Dead Reckoning",1947,100,NA,7.1,450,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dead Ringer",1964,115,1200000,6.8,430,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dead Ringer",1981,101,NA,6.4,32,4.5,0,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dead Ringers",1988,115,NA,7.1,4308,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dead Room",2001,102,NA,4.2,15,34.5,4.5,4.5,4.5,0,0,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Dead Silent",1999,95,NA,4.2,62,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dead Skunk",1973,3,NA,9.4,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,1,0,0,0,0,1 -"Dead Sleep",1990,100,NA,4.2,27,14.5,24.5,14.5,0,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Dead Soul: A Fairy Tale",2001,30,8000,5,6,45.5,0,0,0,0,0,0,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Dead Space",1991,80,NA,3,43,44.5,4.5,4.5,14.5,14.5,4.5,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Dead Tides",1997,100,NA,4.9,99,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"Dead Women in Lingerie",1991,86,NA,4.3,37,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Dead World",2001,32,NA,6.2,9,34.5,0,0,0,0,0,14.5,24.5,0,34.5,"",0,0,1,0,0,0,1 -"Dead Wrong",1983,92,NA,6.4,7,0,14.5,0,0,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Dead Zone, The",1983,103,10000000,7.2,6338,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dead as a Doorman",1986,84,NA,7.4,5,0,24.5,0,0,24.5,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Dead by Dawn",1998,91,NA,3.9,90,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dead by Monday",2001,94,NA,6,72,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dead in the Water",2002,90,NA,4.8,225,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dead of Night",1945,102,NA,7.8,959,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Dead of Night",1974,88,235000,6,206,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dead of Night",1977,76,NA,7.2,18,0,4.5,0,14.5,0,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dead of Night",1987,95,NA,4.2,16,14.5,14.5,14.5,14.5,14.5,14.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Dead of Night",1996,95,NA,4.4,54,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Dead of Winter",1987,100,NA,6.2,389,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dead on Sight",1994,101,NA,4.6,73,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dead or Alive",1944,56,NA,4.6,5,0,0,24.5,0,64.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Dead or Alive: Hanzaisha",1999,105,NA,6.9,1260,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Dead, The",1960,11,NA,7.7,11,0,14.5,4.5,0,0,4.5,4.5,0,4.5,44.5,"",0,0,0,0,0,0,1 -"Dead, The",1987,79,NA,7.1,970,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dead-End Drive In",1986,92,NA,4.2,119,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Deadbeat",1976,88,NA,4,10,0,44.5,14.5,34.5,14.5,0,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Deadbeat at Dawn",1988,80,NA,6.5,157,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Deadfall",1968,120,NA,5.1,81,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Deadfall",1993,98,NA,2.8,542,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Deadfall",2000,86,13000,5.4,26,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Deadhead Miles",1972,93,NA,5.2,26,0,0,14.5,4.5,14.5,0,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Deadlier Than the Male",1966,98,NA,5.9,92,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Deadline",1981,85,NA,5.1,27,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Deadline",1987,100,NA,5.1,87,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Deadline",1988,85,NA,4.9,13,24.5,0,4.5,24.5,4.5,4.5,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Deadline",2002,21,NA,6.1,60,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Deadline - U.S.A.",1952,87,NA,7.2,283,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Deadline Auto Theft",1983,98,NA,5,11,4.5,4.5,0,0,24.5,0,24.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Deadline at Dawn",1946,83,NA,6.9,102,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Deadlines",2004,103,NA,7.4,7,0,0,14.5,0,0,24.5,0,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Deadlock",1970,85,NA,6.2,35,4.5,0,0,4.5,4.5,4.5,34.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Deadlock: A Passion for Murder",1997,88,NA,3.2,24,4.5,4.5,14.5,14.5,4.5,4.5,0,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Deadly",1991,99,NA,4.5,14,4.5,14.5,0,14.5,14.5,24.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadly Advice",1993,91,NA,6.1,85,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Deadly Affair, The",1966,107,NA,6.8,195,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Deadly Bees, The",1966,83,NA,3.8,231,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadly Bet",1990,92,NA,5,25,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Deadly Blessing",1981,100,2500000,4.5,308,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadly Boring",2001,9,NA,5.8,5,0,0,64.5,0,0,0,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Deadly Breed",1989,90,NA,5,9,14.5,14.5,0,0,24.5,0,34.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Deadly Charades",1996,92,NA,3.3,11,4.5,4.5,4.5,44.5,0,4.5,0,0,0,14.5,"R",0,0,0,0,0,0,0 -"Deadly Companions, The",1961,93,NA,6.3,106,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deadly Currency",1999,89,NA,4.9,16,34.5,4.5,14.5,14.5,0,0,4.5,4.5,0,24.5,"",1,0,0,0,0,0,0 -"Deadly Currents",1991,115,NA,7.7,10,0,0,0,0,0,24.5,24.5,44.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Deadly Daphne's Revenge",1987,98,NA,2.5,16,34.5,34.5,14.5,14.5,0,0,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Deadly Delusions",1999,93,NA,4.8,18,24.5,0,0,24.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deadly Desire",1994,86,NA,3.9,20,4.5,14.5,4.5,34.5,24.5,14.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadly Dreams",1988,79,NA,3.9,22,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Deadly Duo",1962,70,NA,4.4,6,14.5,0,0,14.5,14.5,0,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Deadly Embrace",1989,82,NA,2.6,24,24.5,14.5,0,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Deadly Exposure",1993,95,NA,3.8,25,44.5,14.5,14.5,4.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Deadly Eyes",1982,87,NA,3.1,106,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deadly Eyes",1994,87,NA,1.8,8,45.5,24.5,0,14.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Deadly Females, The",1976,105,NA,4.1,10,24.5,0,0,64.5,14.5,0,0,14.5,0,0,"",1,0,0,0,0,0,0 -"Deadly Force",1983,95,NA,3.5,37,14.5,4.5,44.5,14.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadly Friend",1986,91,NA,4.3,639,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadly Games",1982,92,NA,3.8,26,4.5,14.5,14.5,34.5,14.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deadly Games",1990,21,NA,5.9,21,0,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Deadly Harvest",1977,87,250000,5,35,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Deadly Heroes",1994,105,NA,2.5,97,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Deadly Illusion",1987,87,NA,4.5,41,4.5,4.5,14.5,24.5,34.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Deadly Innocents",1990,95,NA,2.9,20,14.5,4.5,14.5,34.5,14.5,4.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Deadly Intruder",1985,86,NA,3.2,11,4.5,4.5,0,44.5,24.5,0,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Deadly Is the Female",1949,86,NA,7.9,749,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Deadly Little Secrets",2001,92,NA,4.2,62,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Deadly Love",1992,5,NA,9,6,0,0,0,0,0,0,0,34.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Deadly Mantis, The",1957,79,NA,4,378,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadly Mantis, The",1966,9,NA,1.5,5,64.5,24.5,0,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Deadly Nightshade",1953,61,NA,5.5,8,0,0,0,0,34.5,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Deadly Outbreak",1995,87,NA,3.6,105,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Deadly Past",1995,90,NA,4.6,53,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Deadly Prey",1988,88,NA,4.1,65,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Deadly Ransom",1997,92,NA,1.6,29,45.5,14.5,0,0,4.5,0,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Deadly Reactor",1989,88,NA,2,18,64.5,14.5,14.5,0,0,4.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Deadly Rhapsody",2001,95,NA,2.7,16,45.5,0,4.5,0,14.5,0,0,0,0,24.5,"R",0,0,0,0,0,0,0 -"Deadly Rivals",1993,92,NA,3.6,22,24.5,14.5,0,24.5,14.5,4.5,4.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Deadly Run",1995,94,NA,5,5,44.5,0,0,24.5,0,0,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Deadly Secret, The",1994,98,NA,1.4,6,45.5,14.5,0,0,0,0,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Deadly Sins",1995,98,NA,4.1,173,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Deadly Spygames",1989,85,NA,3.7,17,84.5,0,0,0,14.5,0,0,0,0,4.5,"",0,0,1,1,0,0,0 -"Deadly Stingers",2003,73,150000,5.5,15,24.5,0,0,0,4.5,24.5,0,4.5,4.5,34.5,"",1,0,1,0,0,0,0 -"Deadly Stranger",1988,94,NA,3.2,7,24.5,0,0,24.5,0,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Deadly Strangers",1974,88,NA,6.3,38,4.5,0,0,0,14.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Deadly Strike, The",1980,90,NA,4.4,16,14.5,4.5,4.5,14.5,0,4.5,4.5,4.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Deadly Sunday",1982,105,NA,2,7,14.5,45.5,14.5,0,0,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Deadly Swarm",2003,120,NA,2.9,54,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadly Trackers, The",1973,110,NA,4.3,61,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Deadly Twins",1985,87,NA,2.8,6,45.5,34.5,0,0,0,0,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Deadly Vengeance",1981,84,NA,3.2,5,44.5,44.5,0,0,0,0,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Deadly Weapon",1989,89,NA,4.2,50,14.5,4.5,24.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deadly Weapon",1994,93,NA,2.9,11,14.5,14.5,14.5,4.5,4.5,0,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Deadly Weapons",1973,75,NA,3.6,124,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Deadman, The",1987,38,NA,7.7,18,0,0,0,0,4.5,0,0,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Deadroom",2005,98,NA,5.8,24,14.5,0,4.5,14.5,0,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Deadsy and the Sexo-Chanjo",1990,5,NA,5.3,5,0,0,0,0,24.5,24.5,0,0,24.5,44.5,"",0,1,0,0,0,0,1 -"Deadtime",1999,28,NA,6.7,20,0,4.5,0,0,4.5,14.5,4.5,24.5,14.5,44.5,"",0,0,1,1,0,1,1 -"Deadtime Stories",1987,93,NA,2.8,117,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadwait",1985,5,NA,1,7,84.5,0,0,0,0,0,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Deadwood '76",1965,97,NA,1.8,19,44.5,4.5,0,14.5,14.5,0,24.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Deadwood Dick",1940,285,NA,8.1,8,0,0,0,0,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Deafula",1975,95,NA,4,14,14.5,24.5,0,0,4.5,14.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Deal of a Lifetime",1999,94,NA,4.2,136,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,1,0 -"Deal of the Century",1983,99,NA,4.3,809,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dealer",1999,74,NA,7.7,35,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Dealer",2004,160,NA,7,100,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Dealers",1989,92,NA,6,95,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dealing: Or the Berkeley-to-Boston Forty-Brick Lost-Bag Blues",1972,99,NA,6,46,4.5,0,0,0,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dealt",1999,16,NA,6.2,22,14.5,0,0,4.5,0,14.5,4.5,0,4.5,45.5,"",1,0,1,0,0,0,1 -"Dear Brat",1951,82,NA,6,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Dear Brigitte",1965,100,NA,5.7,221,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dear Cardholder",1987,90,NA,4.2,5,0,0,0,24.5,44.5,0,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Dear Claudia",1999,92,NA,5.7,95,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Dear Dead Delilah",1975,95,NA,4,17,14.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dear Diary",1996,38,NA,6.2,20,0,4.5,4.5,0,24.5,4.5,0,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Dear Diary: A Film About Female Puberty",1981,26,NA,6.1,6,0,0,14.5,0,0,0,14.5,34.5,14.5,14.5,"",0,1,1,0,1,0,1 -"Dear Emily",2001,7,NA,7.5,11,4.5,0,0,0,0,24.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Dear Frankie",2004,105,NA,8.4,880,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"PG-13",0,0,0,1,0,0,0 -"Dear God",1996,112,NA,4.9,911,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Dear Heart",1964,114,NA,6.7,153,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Dear Hunter",2003,32,NA,5.9,7,0,0,0,14.5,14.5,44.5,14.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Dear Jesse",1998,82,NA,7,73,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Dear Mr. Prohack",1949,91,NA,5.7,14,4.5,0,0,4.5,24.5,14.5,14.5,34.5,0,0,"",0,0,1,0,0,1,0 -"Dear Mr. Wonderful",1982,100,NA,6.3,8,14.5,0,0,0,24.5,24.5,0,34.5,0,0,"",0,0,0,1,0,0,0 -"Dear Murderer",1947,90,NA,6.3,33,0,0,4.5,0,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dear Pam",1976,84,NA,4.7,5,0,0,24.5,0,0,24.5,24.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Dear Phone",1977,17,NA,7.1,80,4.5,4.5,4.5,0,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Dear Pillow",2004,85,NA,5.7,54,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Dear Ruth",1947,95,NA,6.8,85,0,4.5,0,0,4.5,14.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Dear Santa",1998,90,NA,4.5,22,14.5,4.5,14.5,0,0,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dear Wendy",2005,105,NA,4.9,230,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dear Wife",1949,88,NA,6.2,40,0,0,0,0,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Death 4 Told",2004,96,85000,1.7,45,24.5,14.5,4.5,0,4.5,0,14.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Death Affair, The",2001,20,NA,7.1,7,24.5,0,0,0,0,0,0,0,24.5,44.5,"",0,0,1,0,0,0,1 -"Death Becomes Her",1992,99,55000000,5.6,9887,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Death Bed: The Bed That Eats",1977,80,30000,6.1,55,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Death Before Dishonor",1987,91,NA,4.3,128,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Death Chase",1990,88,NA,4,9,24.5,0,24.5,14.5,0,14.5,24.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Death Code: Ninja",1987,86,NA,7.5,6,14.5,0,0,14.5,0,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Death Collector, The",1976,85,NA,3.9,102,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Death Curse of Tartu",1966,87,NA,2.7,60,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Death Dimension",1978,90,NA,2,47,24.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Death Driver",1977,93,NA,1.1,10,64.5,24.5,0,14.5,14.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Death Drives Through",1935,63,NA,5.3,6,14.5,0,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Death Drug",1978,73,NA,4.4,23,44.5,0,0,4.5,4.5,0,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Death Drums Along the River",1963,83,NA,5,10,0,14.5,14.5,14.5,24.5,44.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Death Duel of Kung Fu",1979,88,NA,6,11,0,0,0,0,4.5,64.5,4.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Death Falls",1991,83,NA,5.1,9,0,14.5,24.5,14.5,0,24.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Death Force",1978,96,NA,3.4,21,24.5,24.5,0,24.5,0,14.5,0,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Death Game",1977,91,NA,4.2,71,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Death Hunt",1981,97,NA,6.5,532,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Death In Venice, CA",1994,30,NA,7.3,50,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Death Journey",1976,90,NA,3.9,23,4.5,4.5,14.5,34.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Death Kiss, The",1932,74,NA,6.1,90,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Death Line",1972,87,NA,5.3,264,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Death Machine",1995,120,NA,5.2,453,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Death Machines",1976,93,NA,1.9,16,45.5,14.5,0,0,4.5,4.5,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Death Magic",1992,93,NA,3.4,8,24.5,14.5,14.5,24.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Death Mask",1998,87,NA,4.1,34,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Death Match",1994,94,NA,3.1,30,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Death May Be Your Santa Claus",1969,50,NA,1,8,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Death Merchant, The",1991,87,NA,3.9,7,24.5,0,24.5,14.5,14.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Death Mills",1945,22,NA,8.3,5,0,24.5,0,0,0,0,24.5,0,0,64.5,"",0,0,0,0,1,0,1 -"Death Nurse",1987,60,NA,3,12,74.5,0,0,0,0,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Death Promise",1977,95,NA,5.2,24,4.5,4.5,0,0,14.5,4.5,14.5,14.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Death Race 2000",1975,79,300000,5.8,2909,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Death Riders",1976,88,NA,1,7,74.5,0,0,0,0,0,14.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Death Rides the Range",1939,58,NA,4.9,6,0,14.5,0,34.5,34.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Death Row Diner",1988,68,NA,1.8,14,44.5,14.5,4.5,4.5,0,0,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Death Row the Tournament",1998,12,NA,8.9,11,4.5,0,0,0,0,0,0,4.5,4.5,74.5,"",1,0,0,0,0,0,1 -"Death Screams",1983,88,NA,3.8,40,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Death Sentence: Mrityu Dand, The",1997,150,NA,7.3,39,0,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Death Ship",1980,91,NA,3.3,262,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Death Spa",1988,88,NA,3.8,75,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Death Takes a Holiday",1934,79,NA,7.2,263,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Death Valley",1982,87,NA,3.9,114,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Death Valley 69",1986,7,NA,6.9,37,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Death Valley: The Revenge of Bloody Bill",2004,88,NA,4,69,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Death Warmed Up",1985,78,NA,4,68,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Death Warrant",1990,93,NA,4.7,1259,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Death Weekend",1976,87,NA,4.9,100,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Death Wish",1974,93,NA,6.5,2458,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Death Wish 3",1985,92,NA,4.1,1113,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Death Wish 4: The Crackdown",1987,99,NA,3.6,611,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Death Wish Club",1983,85,NA,1.9,20,34.5,14.5,0,14.5,14.5,0,0,0,0,34.5,"R",0,0,0,0,0,0,0 -"Death Wish II",1982,95,NA,4.8,998,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Death Wish V: The Face of Death",1994,95,NA,3.7,449,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Death and Texas",2004,77,NA,6.7,18,4.5,0,0,4.5,14.5,14.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Death and a Salesman",1995,9,NA,5.7,34,4.5,0,0,4.5,4.5,4.5,4.5,4.5,34.5,44.5,"",0,0,1,0,0,0,1 -"Death and the Compass",1992,96,3500000,6,115,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Death and the Maiden",1994,103,NA,7.1,3465,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Death and the Mother",1988,10,NA,4.1,13,14.5,0,4.5,34.5,0,14.5,0,14.5,0,14.5,"",0,1,0,1,0,0,1 -"Death by Design: Where Parallel Worlds Meet",1997,70,NA,9.3,10,0,0,0,0,0,0,14.5,24.5,0,74.5,"",0,0,0,0,1,0,0 -"Death by Dialogue",1988,89,NA,2.4,17,34.5,14.5,14.5,4.5,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Death by Misadventure",1993,92,NA,6.3,23,4.5,0,0,4.5,4.5,4.5,14.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Death from a Distance",1935,68,NA,6.5,12,0,0,0,0,4.5,24.5,24.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Death in Brunswick",1991,109,NA,6.6,218,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Death in Gaza",2004,80,NA,8.1,152,4.5,4.5,4.5,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Death in Small Doses",1957,78,NA,5.6,7,0,0,0,14.5,14.5,14.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Death in the Air",1936,69,NA,5,10,0,0,14.5,24.5,44.5,24.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Death of Bruce Lee",1975,90,NA,5.2,11,14.5,0,4.5,14.5,14.5,0,4.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Death of Daniel Whately, The",2004,111,5000,6.6,5,24.5,0,0,0,0,24.5,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Death of Klinghoffer, The",2003,120,NA,6,35,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Death of Stalinism in Bohemia, The",1990,10,NA,7.5,77,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Death of a Composer: Rosa, a Horse Drama, The",1999,90,NA,5.8,25,4.5,0,0,4.5,14.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Death of a Dog",2000,86,NA,8.6,5,0,0,0,0,0,0,0,44.5,64.5,0,"",0,0,0,0,0,0,0 -"Death of a Gunfighter",1969,100,NA,5.8,79,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Death of a Nation: The Timor Conspiracy",1994,60,NA,7,16,0,0,0,0,0,14.5,14.5,0,4.5,64.5,"",0,0,0,0,1,0,0 -"Death of a Prophet",1981,60,NA,3.5,19,24.5,4.5,4.5,24.5,4.5,0,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Death of a Salesman",1951,115,NA,7.6,171,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Death of a Saleswoman",2005,74,NA,2.2,249,94.5,0,0,0,0,4.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Death of a Scoundrel",1956,119,NA,6.2,68,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Death of a Soldier",1986,93,NA,4.2,46,14.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Death of an Angel",1985,91,NA,5.8,10,0,14.5,24.5,0,24.5,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Death on the Diamond",1934,71,NA,6.8,29,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Death on the Nile",1978,140,NA,6.8,2653,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Death to Smoochy",2002,109,55000000,6.3,8003,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Death's Marathon",1913,17,NA,6.2,28,0,4.5,0,14.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Death, Can I Buy You a Drink?",2004,22,50000,8.9,15,0,0,0,0,0,0,0,24.5,45.5,24.5,"",0,0,0,1,0,0,1 -"Death, Deceit & Destiny Aboard the Orient Express",2001,92,NA,3.6,22,34.5,14.5,14.5,14.5,4.5,4.5,0,0,4.5,0,"",1,0,0,0,0,0,0 -"Death: A Love Story",1999,64,NA,7.4,7,0,0,14.5,0,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Deathcheaters",1976,93,NA,4.4,13,4.5,0,4.5,14.5,4.5,4.5,24.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Deathdealer: A Documentary",2004,15,NA,9.1,19,4.5,0,0,0,0,0,0,14.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Deathhead Virgin, The",1974,90,NA,3.9,15,44.5,0,4.5,14.5,14.5,4.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Deathmask",1984,103,NA,3.8,19,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Deathmaster",1972,88,NA,4.5,40,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Deathrow",2000,118,NA,5.4,12,4.5,0,0,4.5,14.5,45.5,0,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Deathrow Gameshow",1987,83,200000,3.8,57,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Deathsport",1978,82,NA,3.7,144,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Deathstalker",1983,80,NA,3.5,279,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Deathstalker and the Warriors from Hell",1989,86,NA,2,313,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Deathtrap",1982,116,NA,6.9,1813,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Deathwalkers",1989,85,NA,2.5,13,4.5,4.5,4.5,0,0,0,0,0,0,74.5,"",0,0,0,0,0,0,0 -"Deathwatch",1966,88,NA,6.7,18,0,4.5,4.5,14.5,4.5,4.5,24.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Deathwatch",2002,94,NA,5.6,1295,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Debajo del mundo",1987,100,NA,8.2,13,0,0,0,0,0,24.5,0,4.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Debbie Does Dallas",1978,80,NA,5.4,741,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Debbie Does Dallas Part II",1981,79,NA,4.8,73,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Debito coniugale, Il",1970,91,NA,4.5,6,0,0,45.5,0,34.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Debout les crabes, la mer monte!",1983,90,NA,4.6,6,0,14.5,45.5,0,0,0,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Debt Collector, The",1999,109,NA,6.6,212,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Debt, The",1993,12,NA,5.6,36,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Debtors, The",1999,90,14000000,6.9,38,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Deburau",1951,93,NA,7,8,0,0,0,0,0,14.5,45.5,14.5,0,24.5,"",0,0,1,1,0,0,0 -"Debutante",1998,11,NA,4.8,70,4.5,0,4.5,4.5,14.5,14.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Debutantes, Los",2003,116,NA,7.2,128,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Debuut, Het",1977,94,NA,6.1,73,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Decade Under the Influence, A",2003,108,NA,7,311,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Decade for Decision",1957,15,NA,3.7,9,0,24.5,14.5,14.5,44.5,14.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Decaf",1996,100,NA,5.8,5,0,0,24.5,24.5,0,0,44.5,24.5,0,0,"",0,0,1,0,0,1,0 -"Decameron Nights",1953,129,NA,5,36,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,1,0 -"Decameron, Il",1971,112,NA,6.8,777,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Decampitated",1998,92,NA,4.3,100,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Decasia",2002,70,NA,7.7,104,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Decathlon Champion: The Story of Glenn Morris",1937,10,NA,7.1,7,0,0,0,0,14.5,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Decay",1998,80,15000,6.5,8,34.5,0,0,0,0,14.5,0,0,24.5,24.5,"",1,0,0,1,0,0,0 -"Deceived",1991,104,NA,6,989,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deceiver",1997,101,NA,6.4,1486,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Deceivers, The",1988,103,NA,5.4,170,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"December 7th",1943,82,NA,5.8,79,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,1 -"December Bride",1990,88,NA,6.7,98,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Deception",1946,110,NA,7.2,301,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Deceptions II: Edge of Deception",1995,100,NA,3.5,39,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Decima vittima, La",1965,92,NA,6.9,302,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Decision",1995,90,5000,8,6,14.5,0,0,0,0,0,14.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Decision Before Dawn",1951,119,NA,7.4,188,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Decision at Sundown",1957,77,NA,6.4,98,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Decision of Christopher Blake, The",1948,75,NA,5.5,10,14.5,24.5,0,0,14.5,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Decisionista, Il",1997,90,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Deck Dogz",2005,90,NA,5.3,11,44.5,0,4.5,0,0,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Decko koji obecava",1981,106,NA,8.6,45,0,0,0,0,0,4.5,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Decks Ran Red, The",1958,84,NA,6.1,56,0,0,4.5,14.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Declaration of Independence, The",1938,17,NA,6.5,25,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Decline and Fall... of a Birdwatcher",1968,113,NA,5.4,23,4.5,4.5,0,4.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Decline of Western Civilization Part II: The Metal Years, The",1988,93,500000,6.6,297,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Decline of Western Civilization Part III, The",1998,86,NA,5.2,38,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Decline of Western Civilization, The",1981,100,100000,7.3,296,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Decoder",1984,87,NA,8.2,21,0,4.5,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Decodings",1988,15,NA,4.3,5,0,0,24.5,24.5,44.5,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Deconstructing Harry",1997,96,20000000,7.1,7342,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Decoy",1946,76,NA,7.4,22,0,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Decoy",1995,98,NA,4.6,118,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Decoys",2004,95,5000000,4.2,580,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Dedicato a una stella",1976,94,NA,5.7,19,0,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Dedo del destino, El",1967,91,NA,6,6,0,14.5,0,0,0,0,14.5,45.5,0,14.5,"",0,0,1,0,0,0,0 -"Dedo en la llaga, El",1996,115,NA,6.4,18,4.5,4.5,4.5,0,0,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Deduce, You Say",1956,7,NA,7.2,103,0,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Deedar",1951,130,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,0,0,0,1,0 -"Deedeh-Ban",1990,80,NA,6.6,9,14.5,0,0,0,24.5,0,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Deep Blue",2003,91,5000000,7.2,363,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Deep Blue Sea",1999,105,78000000,5.5,17666,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Deep Blue Sea, The",1955,96,NA,6.4,25,0,0,0,14.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Deep Blues",1991,91,NA,5.6,28,0,4.5,0,0,14.5,0,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Deep Core",2000,80,NA,3.3,257,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Deep Cover",1992,107,NA,6.6,1399,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Deep Cover",1996,108,NA,3.7,15,4.5,4.5,24.5,4.5,24.5,4.5,0,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Deep Down",1994,85,NA,3.5,43,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Deep Down in Florida",2004,19,NA,9.2,16,0,4.5,0,0,0,0,4.5,0,14.5,74.5,"",0,0,0,0,0,1,1 -"Deep End",1971,88,NA,7.5,171,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Deep End",1985,87,NA,8.8,10,0,14.5,0,0,0,0,14.5,34.5,0,45.5,"",0,0,0,0,0,0,0 -"Deep End of the Ocean, The",1999,106,40000000,5.9,2890,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Deep End, The",2001,101,3000000,6.8,3524,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Deep Freeze",2003,80,NA,2.1,116,34.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Deep Impact",1998,120,75000000,5.9,22684,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Deep Inside Annie Sprinkle",1981,97,NA,5,30,14.5,0,0,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Deep Inside Vanessa del Rio",1986,67,NA,6,19,14.5,4.5,0,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Deep Red",1994,86,NA,4.4,187,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deep Rising",1998,97,45000000,5.4,4626,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Deep Rub",1979,80,NA,6.5,10,0,0,24.5,24.5,0,0,24.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Deep Six, The",1958,105,NA,5.9,53,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Deep Space",1987,90,NA,4.1,52,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deep Throat",1972,67,22000,5.1,1097,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Deep Throat Part II",1974,88,NA,4.9,38,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Deep Valley",1947,104,NA,6.6,65,0,4.5,0,0,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Deep Waters",1948,85,NA,5.5,21,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Deep in My Heart",1954,132,NA,6.4,98,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Deep in the Heart",1998,90,NA,2.8,14,4.5,24.5,14.5,14.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,1,1,0,0,0 -"Deep, The",1977,123,9000000,5.8,1565,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"DeepStar Six",1989,99,NA,4.4,926,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deeply",2000,101,NA,5.9,443,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Deer Hunter, The",1978,183,15000000,8.1,28210,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Deerslayer, The",1957,78,NA,4.8,57,4.5,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deewaar",1975,174,NA,7.5,190,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",1,0,0,1,0,0,0 -"Def by Temptation",1990,95,NA,4.4,208,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Def-Con 4",1985,88,NA,3.6,296,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Defector, The",1966,106,NA,5.3,63,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Defence of the Realm",1985,96,NA,6.8,340,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Defender, The",2004,90,6000000,6.3,58,14.5,4.5,4.5,4.5,0,14.5,4.5,14.5,14.5,34.5,"R",1,0,0,0,0,0,0 -"Defending Our Lives",1993,30,NA,8.2,5,0,0,0,0,0,44.5,0,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Defending Your Life",1991,112,NA,7,2973,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Defense Play",1988,88,NA,4.3,17,24.5,14.5,14.5,14.5,4.5,14.5,14.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Defenseless",1991,104,NA,5.9,206,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Defiance",1980,103,NA,5.5,140,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Defiance",2002,72,NA,3.4,23,44.5,4.5,4.5,4.5,0,4.5,14.5,0,0,14.5,"R",0,0,0,0,0,0,0 -"Defiance of Good, The",1975,78,NA,5.2,12,0,0,4.5,4.5,14.5,0,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Defiant Ones, The",1958,97,NA,7.5,1323,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Defilada",1989,60,NA,9.9,8,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,1,0,0 -"Defilers, The",1965,69,11000,4.8,49,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Defining Edward",2003,93,NA,7.1,7,14.5,0,14.5,0,0,0,0,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Defining Reason",2003,5,2000,8.3,6,0,0,0,0,14.5,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Definite Maybe, The",1997,102,NA,3.8,38,44.5,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deflation",2001,3,NA,7,10,14.5,0,24.5,0,14.5,0,0,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Defying Gravity",1997,92,NA,6.5,331,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Deham",2001,120,NA,2.8,8,24.5,34.5,0,24.5,0,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Dei seung chui keung",2001,89,NA,4.9,17,0,0,24.5,0,14.5,14.5,14.5,14.5,14.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Deilig er fjorden!",1985,102,NA,5.9,70,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Deka meres sto Parisi",1962,89,NA,5.7,6,0,0,0,34.5,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Dekigokoro",1933,101,NA,8.2,30,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Del olvido al no me acuerdo",1999,75,NA,7.4,26,4.5,0,0,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Del perduto amore",1998,95,NA,6.7,36,0,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Del rosa al amarillo",1963,90,NA,5.4,25,0,0,4.5,4.5,24.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Delantal de Lili, El",2004,90,NA,6.7,7,0,0,0,0,14.5,14.5,14.5,44.5,14.5,0,"",0,0,1,0,0,0,0 -"Delayed",2002,103,20000,2.6,18,24.5,4.5,4.5,14.5,0,0,4.5,0,34.5,14.5,"",0,0,1,1,0,0,0 -"Delayed Action",1954,58,NA,4.8,5,0,0,24.5,0,44.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Delbaran",2001,96,NA,7.4,90,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Delfim, O",2002,88,NA,7.1,83,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Delfinakia tou Amvrakikou, Ta",1993,98,NA,8.6,13,4.5,0,0,0,4.5,0,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Delfini, I",1960,100,NA,4.7,5,0,0,24.5,0,0,64.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Deli, The",1997,99,NA,3.7,140,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Delicacies of Molten Horror Synapse",1991,10,NA,7.6,38,4.5,4.5,4.5,0,0,4.5,24.5,44.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Delicate Art of the Rifle, The",1996,93,NA,6.8,73,14.5,4.5,4.5,0,0,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Delicate Balance, A",1973,133,NA,6.9,81,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Delicate Delinquent, The",1957,101,460000,5.9,161,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Delicatessen",1991,95,NA,7.8,11486,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Delicious",1931,106,NA,5.2,27,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,0,"",0,0,1,0,0,1,0 -"Delicious",1981,85,NA,4.7,23,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Delicious, The",2003,16,NA,5.9,23,4.5,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Delightfully Dangerous",1945,92,NA,5.8,18,4.5,0,4.5,14.5,4.5,24.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Delinquent",1995,84,NA,5,26,14.5,14.5,0,4.5,4.5,0,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Delinquents, The",1957,72,65000,4.8,33,4.5,4.5,4.5,14.5,14.5,34.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Delinquents, The",1989,101,NA,4.8,172,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Deliria",1987,91,NA,6.6,380,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Delirio di sangue",1988,90,NA,4.3,11,34.5,14.5,0,4.5,0,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Delirious",1991,96,NA,5.2,1086,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Delirious",1998,118,NA,6.5,25,4.5,4.5,4.5,0,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Delirium",1979,90,NA,3.5,20,14.5,14.5,34.5,14.5,0,0,24.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Delitti e profumi",1988,95,NA,3.4,12,4.5,0,34.5,0,14.5,14.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Delitto Matteotti, Il",1973,115,NA,6.4,12,0,0,4.5,0,0,34.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Delitto a Porta Romana",1980,92,NA,5.7,21,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Delitto al Blue Gay",1985,96,NA,5.3,28,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Delitto al ristorante cinese",1981,95,NA,6.3,46,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Delitto d'amore",1974,108,NA,7.6,13,0,0,0,0,4.5,0,34.5,44.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Delitto impossibile, Un",2001,100,NA,6.6,11,0,0,0,0,14.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Delitto poco comune, Un",1988,88,NA,4.6,45,4.5,4.5,24.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deliver Us from Eva",2003,105,NA,5.8,786,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Deliverance",1919,90,NA,5.4,11,14.5,4.5,0,0,0,0,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Deliverance",1972,109,2000000,7.8,14417,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Delivered",1998,93,1000000,5.1,73,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Delivering Milo",2001,94,NA,4.9,201,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Delivery",1997,91,NA,4.9,8,14.5,24.5,0,0,34.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Delivery Boy, The",1931,8,NA,5.3,10,0,14.5,14.5,0,0,34.5,24.5,0,0,34.5,"",0,1,1,0,0,0,1 -"Delivery Boys",1984,91,NA,2.4,33,45.5,14.5,4.5,4.5,4.5,0,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Delivery Day",2001,26,NA,7.2,11,0,0,4.5,0,0,4.5,0,4.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Delivery, The",1998,22,NA,3.5,18,14.5,4.5,4.5,4.5,34.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Delivery, The",1999,105,NA,5.1,276,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Dellamorte Dellamore",1994,105,4000000,7.3,2313,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,1,0,0,1,0 -"Dellistavrou kai ios",1957,88,NA,6,14,0,0,0,0,24.5,24.5,24.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Delo 205/1913",1984,147,NA,8,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Delo Rumyantseva",1955,103,NA,7.7,11,0,0,0,0,0,24.5,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Delo bylo v Penkove",1957,100,NA,8.1,12,0,0,0,14.5,0,4.5,0,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Delos Adventure, The",1987,98,NA,3.5,9,24.5,14.5,14.5,44.5,0,0,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Delovye lyudi",1962,84,NA,5.5,42,4.5,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Delphine 1, Yvan 0",1996,91,NA,5.4,116,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Delta Factor, The",1970,91,NA,3.3,14,0,24.5,24.5,14.5,4.5,0,4.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Delta Fever",1987,90,NA,7.6,9,14.5,14.5,0,0,0,14.5,0,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Delta Force 2: The Colombian Connection",1990,111,NA,4,598,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Delta Force 3: The Killing Game",1991,97,NA,2.8,119,34.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Delta Force One: The Lost Patrol",1999,93,NA,3.1,57,24.5,14.5,4.5,14.5,4.5,0,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Delta Force, The",1986,125,NA,5.1,1634,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Delta Fox",1979,93,NA,6,17,0,0,14.5,4.5,4.5,14.5,4.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Delta Heat",1992,97,NA,4.7,96,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Delta Pi",1985,87,NA,4.6,17,4.5,14.5,4.5,24.5,0,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Delta of Venus",1995,95,NA,4.8,312,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"NC-17",0,0,0,1,0,0,0 -"Delta, The",1996,85,NA,4.6,134,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Deluge",1933,70,NA,6.5,24,0,0,0,0,34.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Delusion",1991,88,1000000,6,242,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Delusions in Modern Primitivism",2000,17,NA,7.2,84,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Demasiado amor",2002,100,NA,5.1,31,14.5,0,4.5,4.5,0,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Demasiado caliente para ti",1996,90,NA,3.8,5,64.5,0,0,0,0,0,0,44.5,0,0,"",0,0,1,0,0,0,0 -"Demasiado miedo a la vida o Plaff",1988,92,NA,5.9,26,0,0,4.5,4.5,14.5,14.5,4.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Demented",1980,92,NA,2.3,37,44.5,14.5,14.5,0,0,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dementia",1955,56,NA,6.5,103,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Dementia 13",1963,75,30000,5.4,641,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dementia: An Experiment in Terror",2004,85,300000,8.9,10,0,0,0,0,0,14.5,0,14.5,45.5,34.5,"",0,0,0,0,0,0,0 -"Demetrius and the Gladiators",1954,101,4500000,6.3,374,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Demi-Paradise, The",1943,114,NA,6.3,61,4.5,0,0,4.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Demi-tarif",2003,63,NA,5.9,27,4.5,4.5,0,14.5,0,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Demo Crew, The",2001,108,100000,2.5,23,34.5,0,0,4.5,4.5,4.5,4.5,0,4.5,24.5,"",1,0,0,1,0,0,0 -"Demoiselle d'honneur, La",2004,110,NA,6.2,132,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Demoiselle sauvage, La",1991,105,NA,6.2,39,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Demoiselles de Rochefort, Les",1967,125,NA,7.5,567,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Demoiselles ont eu 25 ans, Les",1993,64,NA,7,18,4.5,0,0,4.5,0,14.5,14.5,34.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Demokratiske terroristen, Den",1992,96,NA,5.8,236,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Demolishing and Building Up the Star Theatre",1901,2,NA,6.7,36,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Demolition High",1996,84,NA,3.7,187,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Demolition Highway",1996,86,NA,1,8,45.5,14.5,0,14.5,0,0,0,0,14.5,14.5,"",1,0,0,1,0,0,0 -"Demolition Man",1993,115,NA,6.1,15100,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Demolitionist, The",1995,100,1000000,4.1,238,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Demon Island",2002,85,NA,2.7,465,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Demon Knight",1995,92,12000000,6,2215,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Demon Lover Diary",1980,90,NA,2.6,49,24.5,4.5,0,0,0,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Demon Lover, The",1977,83,NA,2.5,43,34.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Demon Seed",1977,94,NA,6,759,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Demon Warrior",1988,85,NA,1.5,14,44.5,14.5,14.5,0,0,0,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Demon Wind",1990,96,NA,3.3,103,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Demon and the Mummy, The",1976,120,NA,7.8,13,0,0,0,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Demon of Paradise",1987,86,NA,2.5,26,34.5,4.5,24.5,14.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Demoner",1986,127,NA,5,31,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Demoni",1985,88,1800000,5.7,1188,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Demoni 2",1986,91,NA,4.7,662,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Demoni 3",1991,84,NA,2.6,74,24.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Demonia",1990,85,NA,4.3,173,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Demonic Toys",1992,86,NA,3.5,227,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Demonio, Il",1963,94,NA,4.3,9,0,14.5,0,0,14.5,14.5,14.5,44.5,0,14.5,"",0,0,0,0,0,0,0 -"Demonium",2001,85,2200000,3.7,55,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Demonlover",2002,117,NA,5.6,829,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Demonoid, Messenger of Death",1981,78,NA,3.3,61,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Demons of Ludlow, The",1983,83,NA,2.7,30,24.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Demons of the Mind",1972,89,NA,5.4,69,4.5,4.5,4.5,4.5,24.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Demonsoul",1994,81,NA,1.4,16,34.5,14.5,14.5,4.5,0,0,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Demonstone",1989,88,NA,3.9,16,4.5,0,24.5,4.5,34.5,0,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Demonwarp",1988,91,NA,3.4,58,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Demystifying the Devil: Biography Marilyn Manson",2000,90,NA,4.8,34,14.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Den gang jeg slog tiden ihjel",2002,17,NA,6,8,0,0,0,0,14.5,24.5,34.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Den gneva",1985,84,NA,7.8,10,14.5,0,0,0,24.5,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Den khomyachka",2003,97,NA,4.6,14,24.5,0,0,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Den polnoluniya",1998,94,NA,6.2,34,4.5,4.5,14.5,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Den som frykter ulven",2004,106,NA,6.2,132,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Den-en ni shisu",1974,102,NA,7.4,21,0,0,0,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Denchu Kozo no boken",1987,47,NA,6.2,46,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dendro pou Pligoname, To",1986,75,NA,7,32,4.5,4.5,0,0,4.5,4.5,24.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Denei shoujo Ai",1992,180,NA,8.7,157,4.5,4.5,4.5,0,0,4.5,14.5,14.5,14.5,45.5,"",0,1,1,0,0,1,0 -"Denial",1990,103,NA,4.7,67,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Denial",1998,93,5000000,5.3,285,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Denied",2004,96,NA,4,51,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Denise Calls Up",1995,80,NA,6.8,493,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Denk ich an Deutschland - Herr Wichmann von der CDU",2003,80,NA,7.8,68,0,0,0,4.5,0,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Dennis the Menace",1993,94,NA,4.8,3579,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Denso Ningen",1960,85,NA,4.9,17,0,0,0,24.5,4.5,14.5,14.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Denti",2000,96,NA,6.7,153,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Dentist II, The",1998,100,1800000,4.1,401,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dentist in the Chair",1960,84,NA,4.4,7,14.5,14.5,14.5,0,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Dentist on the Job",1961,88,NA,4.3,33,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Dentist, The",1932,21,NA,7.3,256,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Dentist, The",1996,92,NA,4.7,1026,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dents du singe, Les",1960,11,NA,5.6,26,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Denver Kid, The",1948,60,NA,4.3,6,0,0,14.5,14.5,45.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Denver and Rio Grande",1952,89,NA,5.5,46,0,0,4.5,14.5,14.5,34.5,24.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Departamento compartido",1980,89,NA,5.9,16,0,0,0,0,14.5,14.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Departamento de soltero",1971,90,NA,7.7,6,0,0,14.5,0,0,0,34.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Departure",2001,80,NA,7.6,11,0,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dependencia sexual",2003,104,NA,6,169,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dependiente, El",1969,87,NA,8,26,0,0,0,0,0,4.5,4.5,34.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Deportate della sezione speciale SS, Le",1976,94,NA,5.1,30,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Deported",1950,89,NA,5.9,19,0,0,0,14.5,14.5,24.5,44.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Depraved",1996,104,NA,2.3,79,24.5,34.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Depraved, The",1956,70,NA,4.6,8,0,0,34.5,24.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Deprisa, deprisa",1981,99,NA,6.8,85,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Depuis qu'Otar est parti...",2003,103,NA,7.6,564,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Deputat Baltiki",1937,96,NA,6.3,7,0,0,0,0,0,24.5,14.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Deputy Droopy",1955,7,NA,7.5,61,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Deputy Marshal",1949,60,NA,5.9,5,0,0,0,0,24.5,64.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Der Fuehrer's Face",1942,8,NA,8.4,266,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,1,1,0,0,0,1 -"Der er en yndig mand",2002,30,NA,6.7,194,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Der er et yndigt land",1983,106,NA,6.7,7,0,0,0,0,0,44.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Der var engang",1922,75,NA,7.5,15,0,0,0,0,4.5,14.5,44.5,24.5,14.5,0,"",0,0,0,1,0,1,0 -"Der var engang en krig",1966,95,NA,7.1,12,0,0,0,0,0,14.5,45.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Derailed",2002,89,18000000,3.4,1075,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Derailroaded",2005,86,NA,8.3,6,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Derakht-e-jan",1998,75,NA,5.2,15,4.5,4.5,0,14.5,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Deranged",1974,78,200000,6.2,306,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deranged",1987,83,NA,4.4,45,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Derby",1971,96,NA,5.9,10,0,0,0,14.5,0,0,24.5,0,34.5,44.5,"",0,0,0,0,1,0,0 -"Derech L'Ein Harod, Ha-",1990,90,NA,6.2,8,0,14.5,0,14.5,24.5,0,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Derecho de nacer, El",1952,90,NA,6.4,10,24.5,0,14.5,0,0,34.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Derek and Clive Get the Horn",1979,89,NA,5.5,73,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Derevenskiy detektiv",1968,87,NA,7.8,9,0,0,0,0,14.5,14.5,24.5,0,44.5,14.5,"",0,0,1,0,0,0,0 -"Derevyannaya komnata",1995,65,NA,5.6,7,0,0,14.5,0,0,0,44.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Dernier amant romantique, Le",1978,104,NA,5.5,19,0,4.5,14.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dernier atout",1942,105,NA,6.8,8,0,0,14.5,14.5,14.5,0,14.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Dernier bip, Le",1998,16,NA,7.6,7,0,0,0,0,24.5,0,24.5,24.5,14.5,0,"",0,0,0,0,0,0,1 -"Dernier chaperon rouge, Le",1996,26,NA,7.6,80,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Dernier combat, Le",1983,90,NA,6.7,602,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dernier des immobiles, Le",2003,105,NA,4.7,7,0,14.5,0,14.5,0,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Dernier des six, Le",1941,90,NA,7.6,16,0,0,0,4.5,14.5,4.5,4.5,44.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dernier domicile connu",1970,105,NA,7.2,106,0,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Dernier jour, Le",2004,105,NA,5.5,10,0,24.5,14.5,0,14.5,24.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Dernier milliardaire, Le",1934,90,NA,6.6,24,4.5,0,4.5,14.5,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Dernier plan, Le",2000,90,NA,2.5,12,24.5,0,0,4.5,4.5,24.5,0,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dernier souffle, Le",1999,104,NA,6.6,109,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Dernier tournant, Le",1939,90,NA,7.3,10,0,0,0,0,24.5,24.5,24.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Dernier trappeur, Le",2004,94,NA,7,58,4.5,4.5,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Dernier tunnel, Le",2004,109,NA,6.8,54,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Derniers feux",2004,8,50000,9.7,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,1,0,0,1 -"Derrick - Die Pflicht ruft!",2004,80,NA,3.6,63,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Derrida",2002,84,NA,6.5,133,4.5,4.5,14.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Dersu Uzala",1975,141,4000000,8.1,2565,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Dervis i smrt",1974,105,NA,7.3,10,0,0,0,0,0,0,44.5,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Derviscio, Il",2001,115,NA,6.8,12,0,0,4.5,4.5,14.5,14.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Des Hoyaa Pardes",2005,163,NA,9.1,10,0,0,0,0,0,14.5,0,24.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Des anges",2000,15,NA,6.7,8,14.5,0,0,0,0,34.5,24.5,24.5,0,0,"",0,0,0,1,0,0,1 -"Des chiens dans la neige",2002,90,NA,6.3,20,4.5,0,0,0,14.5,24.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Des diamants pour l'enfer",1975,75,NA,4.1,12,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,0,34.5,"",1,0,0,0,0,0,0 -"Des femmes disparaissent",1959,85,NA,5.6,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Des gens sans importance",1955,101,NA,8.1,36,0,0,0,0,4.5,4.5,24.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Des majorettes dans l'espace",1996,6,NA,7.9,36,4.5,0,0,0,4.5,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Des morceaux de ma femme",2000,9,NA,7.1,28,0,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Des morts",1981,105,NA,4.2,13,34.5,4.5,4.5,0,14.5,14.5,4.5,14.5,0,0,"",0,0,0,0,1,0,0 -"Des nouvelles du bon Dieu",1996,100,NA,6.8,203,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Des pissenlits par la racine",1964,95,NA,6.1,41,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Desafio, O",1965,94,NA,7.2,9,0,0,0,0,14.5,0,34.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Desant na Drvar",1963,105,NA,6.8,13,4.5,0,0,0,14.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Descanse en piezas",1987,90,NA,2.7,36,24.5,14.5,14.5,24.5,14.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Descanso, El",2002,95,NA,7.1,32,4.5,0,4.5,4.5,0,14.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Descent",2004,15,NA,9.5,14,0,0,0,0,0,4.5,0,4.5,4.5,74.5,"",0,0,0,0,0,0,1 -"Descobrimento do Brasil, O",1937,62,NA,6.3,7,0,0,0,0,44.5,14.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Desde el abismo",1980,90,NA,5.2,6,14.5,0,0,45.5,0,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Desecration",1999,88,150000,4.3,97,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Desencanto, El",1976,97,NA,9,54,0,0,0,4.5,4.5,0,4.5,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Deseo",2002,106,NA,6,59,14.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Deseo de ser piel roja, El",2002,90,NA,5.4,16,4.5,4.5,0,14.5,34.5,14.5,0,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Desert Bloom",1986,105,NA,6.4,310,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Desert Blue",1998,90,NA,6.2,677,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Desert Blues",1995,90,NA,2.3,8,24.5,0,14.5,0,0,0,14.5,14.5,0,34.5,"R",0,0,1,0,0,0,0 -"Desert Command",1946,70,NA,3.9,36,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Desert Dogs",2001,42,NA,8.7,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,1 -"Desert Fox: The Story of Rommel, The",1951,88,NA,7.1,534,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Desert Fury",1947,96,NA,6.7,76,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Desert Gold",1936,58,NA,6,8,0,0,14.5,0,14.5,64.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Desert Hawk, The",1950,77,NA,5.1,25,0,0,4.5,24.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Desert Hearts",1985,96,350000,6.4,608,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Desert Legion",1953,86,NA,5.4,38,4.5,4.5,4.5,14.5,14.5,24.5,24.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Desert Lunch",1993,103,NA,5.7,12,4.5,0,0,0,24.5,14.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Desert Mesa",1935,55,NA,1.3,10,64.5,14.5,14.5,0,0,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Desert Mice",1959,85,NA,4.9,8,0,0,0,34.5,14.5,14.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Desert Nights",1929,62,NA,7.2,11,14.5,0,0,4.5,0,24.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Desert Passage",1952,62,NA,5.4,16,0,4.5,4.5,4.5,34.5,34.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Desert Patrol",1938,56,NA,5,10,0,24.5,14.5,0,45.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Desert Phantom",1936,60,NA,4.8,8,14.5,0,14.5,14.5,24.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Desert Rats, The",1953,88,NA,6.8,387,0,4.5,4.5,4.5,4.5,24.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Desert Raven, The",1965,90,NA,7.4,7,14.5,0,0,0,14.5,0,0,0,45.5,14.5,"",0,0,0,0,0,0,0 -"Desert Regatta",1932,10,NA,4.5,15,4.5,4.5,4.5,24.5,24.5,24.5,4.5,0,0,4.5,"",0,0,0,0,1,0,1 -"Desert Saints",2002,91,NA,6.1,554,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Desert Sands",1955,87,NA,5.2,17,0,4.5,4.5,0,34.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Desert Song, The",1929,123,NA,5.4,11,0,0,0,14.5,0,0,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Desert Song, The",1943,90,NA,7.5,36,4.5,0,4.5,4.5,4.5,0,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Desert Song, The",1953,110,NA,5.8,70,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Desert Trail, The",1935,54,NA,4.2,83,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Desert Victory",1943,60,NA,7.8,32,0,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Desert Vigilante",1949,56,NA,5.6,8,0,0,0,14.5,24.5,24.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Desert Warrior",1988,89,NA,3.5,13,64.5,0,0,14.5,4.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Desert Winds",1995,97,NA,5.1,51,14.5,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Deserter, The",2003,75,35000,8,7,0,0,0,0,0,0,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Deserto dei Tartari, Il",1976,138,NA,7,169,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Deserto rosso, Il",1964,120,NA,7.5,636,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Desesperados, Los",1969,105,NA,5.6,27,0,0,14.5,4.5,24.5,4.5,4.5,14.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Desi Arnaz and His Orchestra",1946,10,NA,5.5,7,0,0,0,14.5,14.5,45.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Desi's Looking for a New Girl",2000,68,NA,6.6,11,0,0,0,24.5,0,24.5,24.5,0,0,14.5,"",0,0,1,0,0,1,0 -"Desiderando Giulia",1985,87,NA,5.3,14,14.5,4.5,0,4.5,0,24.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Desideri",1990,94,NA,3.2,29,24.5,14.5,0,4.5,4.5,0,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Desideria: La vita interiore",1980,104,NA,4.7,11,14.5,4.5,4.5,4.5,14.5,4.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Desiertos mares",1995,93,NA,5.8,15,24.5,0,4.5,0,4.5,0,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Design",2002,112,NA,6.3,48,0,4.5,0,14.5,14.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Design for Dreaming",1956,10,NA,5.1,41,34.5,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Design for Leaving",1954,7,NA,6.9,31,0,0,0,0,14.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Design for Living",1933,91,NA,7.9,331,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Design for Scandal",1941,85,NA,6,43,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Designated Mourner, The",1997,94,NA,6.5,102,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Designing Woman",1957,118,NA,6.8,513,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Designs on Jerry",1955,6,NA,7.2,32,0,0,0,0,4.5,4.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Desinformatsia",2002,35,NA,7,5,0,0,0,0,24.5,0,64.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Desirable",1934,68,NA,6.2,11,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,1,0,1,0 -"Desire",1936,95,1200000,7.2,174,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Desire",1984,82,NA,6.5,9,0,14.5,0,0,24.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Desire",1993,95,1000000,4.5,34,4.5,14.5,4.5,24.5,24.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Desire",2000,97,NA,5.6,44,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Desire Me",1947,91,NA,4.9,52,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Desire Under the Elms",1958,111,NA,6.1,107,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Desire and Hell at Sunset Motel",1992,87,NA,4.8,92,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Desire in the Dust",1960,102,NA,5.5,15,0,0,4.5,24.5,24.5,0,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Desires Within Young Girls",1977,104,NA,6.4,17,0,0,0,4.5,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Desires of Innocence",1997,88,NA,1.7,23,45.5,14.5,14.5,4.5,4.5,0,0,0,0,0,"R",0,0,0,0,0,0,0 -"Desistfilm",1954,7,NA,6,81,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Desk Set",1957,102,NA,7.2,1096,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Desmundo",2002,101,NA,7.2,62,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Desnudo con naranjas",1994,110,NA,7.8,13,4.5,0,0,0,4.5,0,14.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Desnudos",2004,98,NA,2.9,10,34.5,14.5,0,14.5,14.5,0,0,0,14.5,34.5,"",0,0,0,1,0,1,0 -"Desolation Angels",1995,94,NA,6.7,53,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Despair",1978,119,NA,7,173,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Desperado",1995,106,7000000,6.8,17929,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,0,0,0,0 -"Desperado, El",1967,103,NA,4.8,7,14.5,0,14.5,24.5,0,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Desperado, The",1954,80,NA,4.9,5,0,0,0,24.5,24.5,24.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Desperadoes of Dodge City",1948,60,NA,6.3,5,0,0,0,0,24.5,0,84.5,0,0,0,"",0,0,0,0,0,0,0 -"Desperadoes' Outpost",1952,54,NA,4.9,6,0,0,34.5,0,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Desperadoes, The",1943,86,NA,6.6,86,0,4.5,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Desperados Are In Town, The",1956,73,NA,5.3,5,0,0,24.5,0,44.5,24.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Desperados, The",1969,91,NA,4,50,14.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Desperate",1947,73,NA,7.1,149,0,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Desperate Adventure, A",1938,53,NA,6.9,5,44.5,0,0,0,0,24.5,44.5,0,0,0,"",0,0,1,0,0,1,0 -"Desperate But Not Serious",1999,94,NA,3.9,137,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Desperate Cargo",1941,67,NA,4.4,12,0,14.5,4.5,4.5,24.5,4.5,14.5,0,4.5,4.5,"",0,0,0,1,0,1,0 -"Desperate Chance for Ellery Queen, A",1942,70,NA,6.2,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Desperate Characters",1971,87,400000,5.6,42,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Desperate Hours",1990,105,NA,4.9,843,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Desperate Hours, The",1955,112,2388000,7.4,1082,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Desperate Journey",1942,107,NA,6.1,253,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Desperate Living",1977,90,65000,7.1,598,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Desperate Man Blues",2003,52,NA,6.2,15,0,0,0,4.5,0,24.5,14.5,34.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Desperate Measures",1998,100,NA,5.6,2956,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Desperate Moment",1953,88,NA,6.6,19,0,0,0,14.5,4.5,0,45.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Desperate Moves",1981,98,NA,4.4,12,4.5,14.5,34.5,0,0,0,24.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Desperate Ones, The",1968,104,NA,4.5,9,14.5,0,0,34.5,34.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Desperate Poaching Affray, A",1903,3,NA,6.2,63,4.5,0,4.5,4.5,44.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Desperate Remedies",1993,93,NA,6.6,125,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Desperate Search",1952,71,NA,6.3,27,4.5,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Desperate Teenage Lovedolls",1984,70,NA,5.7,24,14.5,4.5,0,0,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Desperate Women, The",1955,66,NA,1,7,84.5,0,0,0,0,0,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Desperate bekjentskaper",1998,94,NA,7,31,34.5,4.5,4.5,14.5,4.5,0,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Desperately Seeking Susan",1985,104,4500000,5.6,4853,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Despinis Diefthindis",1964,90,NA,7.9,38,0,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Despinis eton... 39",1954,80,NA,7.7,31,0,0,0,0,0,0,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Desquite, El",1983,95,NA,3.1,8,24.5,0,24.5,14.5,0,14.5,14.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Desquite, El",1999,120,NA,5.6,48,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Desserts",1998,5,NA,7.6,193,0,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Destination Earth",1956,13,NA,4.9,7,0,0,24.5,0,24.5,14.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Destination Gobi",1953,90,NA,6.5,71,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Destination Inner Space",1966,83,NA,4.3,56,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Destination Moon",1950,92,NA,6.3,396,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Destination Murder",1950,72,NA,5.6,66,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Destination Tokyo",1943,135,NA,7.1,503,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Destination Unknown",1933,66,NA,2.3,5,0,24.5,0,0,0,24.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Destination Unknown",1997,90,NA,4.1,11,0,4.5,0,44.5,0,0,0,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Destination Vegas",1995,78,NA,2.5,45,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Destinazione Piovarolo",1955,89,NA,7.2,25,0,0,0,0,14.5,4.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Destinazione, La",2003,124,NA,7.6,12,0,0,0,0,0,14.5,14.5,44.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Destino",2003,7,1500000,7.8,156,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"PG",0,1,0,0,0,0,1 -"Destino no tiene favoritos, El",2003,90,NA,8,22,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Destino se disculpa, El",1945,110,NA,4.6,6,14.5,0,0,0,64.5,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Destiny",1944,65,NA,5.6,6,0,0,0,0,14.5,14.5,14.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Destiny Stalled",2000,25,NA,8.9,11,0,4.5,0,0,0,0,0,4.5,14.5,64.5,"",0,0,0,1,0,0,1 -"Destiny Turns on the Radio",1995,102,NA,4.1,658,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Destiny in Space",1994,40,NA,6,60,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Destiny of Marty Fine, The",1996,85,NA,5.2,19,14.5,0,0,0,14.5,4.5,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Destroyer",1988,92,NA,3.3,56,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Destruction Inc.",1942,9,NA,7.1,37,4.5,0,4.5,4.5,0,14.5,24.5,24.5,4.5,14.5,"",1,1,0,0,0,0,1 -"Destructor de monstruos, El",1962,74,NA,4,10,14.5,0,14.5,14.5,34.5,14.5,0,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Destructors, The",1968,97,NA,3.3,14,24.5,14.5,0,14.5,14.5,0,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Destry",1954,95,NA,6.2,74,0,0,4.5,14.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Destry Rides Again",1932,61,NA,5,14,0,14.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Destry Rides Again",1939,94,NA,7.7,1540,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Desyat negrityat",1987,137,NA,7.7,90,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Deszczowy zolnierz",1996,102,NA,6.5,10,14.5,0,0,14.5,0,0,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Det Yani Dokhtar",1994,86,NA,5.9,9,0,0,0,24.5,14.5,34.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Det bli'r i familien",1994,98,NA,4.2,12,0,4.5,0,14.5,24.5,14.5,4.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Det brenner i natt!",1955,96,NA,6.4,16,0,0,0,0,34.5,14.5,0,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Det brinner en eld",1943,107,NA,6.7,8,0,0,0,0,14.5,14.5,64.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Det er nat med fru Knudsen",1971,86,NA,5.9,9,14.5,0,0,0,34.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Detail, The",1997,87,200000,3.3,12,14.5,0,0,14.5,14.5,24.5,0,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Details",2000,27,NA,5.2,5,0,0,0,24.5,24.5,24.5,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Detained",2004,10,NA,7.2,5,24.5,0,0,0,0,0,0,24.5,64.5,0,"",0,0,0,0,0,0,1 -"Detaljer",2003,114,NA,5.3,102,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Detective Fiction",2003,102,200000,4.9,41,4.5,0,4.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Detective Lovelorn und die Rache des Pharao",2002,92,NA,5.6,37,14.5,0,0,4.5,4.5,0,4.5,0,4.5,64.5,"",0,0,1,0,0,0,0 -"Detective School Dropouts",1985,92,NA,4.9,79,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Detective Story",1951,103,NA,7.4,500,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Detective, The",1968,114,NA,6.3,317,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Detective, Un",1969,103,NA,4.8,12,0,4.5,4.5,24.5,14.5,14.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Detectress, The",1919,21,NA,5.8,10,0,0,14.5,14.5,44.5,24.5,14.5,0,14.5,0,"",0,0,1,0,0,0,1 -"Detektor",2000,104,NA,7.2,494,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Detention",2003,98,10000000,4.1,223,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Detenute violente",1985,90,NA,2.9,15,24.5,24.5,4.5,24.5,14.5,0,0,0,0,4.5,"",1,0,0,0,0,0,0 -"Detenuto in attesa di giudizio",1971,99,NA,7.3,47,0,0,4.5,0,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Determination of Death",2001,90,NA,5.1,49,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Deterrence",1999,101,800000,6.6,796,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Deti Don-Kikhota",1965,78,NA,7.7,7,0,0,0,0,0,24.5,24.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Deti chugunnykh bogov",1993,80,NA,8.5,11,0,0,0,4.5,0,0,0,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Deti kapitana Granta",1936,83,NA,7.7,14,0,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Detonate",2004,7,NA,3.2,29,14.5,0,0,0,0,0,4.5,4.5,4.5,74.5,"",0,0,0,0,0,0,1 -"Detonator",1998,84,NA,3.5,26,14.5,4.5,4.5,4.5,4.5,4.5,0,0,0,45.5,"",1,0,0,0,0,0,0 -"Detonator",2003,92,NA,4,52,24.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Detour",1945,67,30000,7.3,1114,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Detour",1999,93,NA,4.3,94,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Detour",2002,70,NA,5.7,12,0,0,0,14.5,4.5,24.5,4.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Detouring America",1939,7,NA,7.3,22,0,0,0,4.5,14.5,4.5,34.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Detroit 9000",1973,106,NA,5.4,124,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Detroit Rock City",1999,95,15000000,6,4607,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Detskiy sad",1983,136,NA,8.3,15,0,4.5,4.5,0,14.5,14.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Detstvo Gorkogo",1938,98,NA,7.8,49,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Deuce Bigalow: Male Gigolo",1999,88,18000000,5.6,9897,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Deuce Coupe",1992,106,NA,4.3,26,14.5,4.5,0,14.5,0,14.5,0,14.5,14.5,34.5,"PG-13",0,0,1,0,0,0,0 -"Deuces",2001,90,NA,4.1,41,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deuces Wild",2002,100,10000000,5.3,1511,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Deuda",2004,90,NA,6.5,31,4.5,0,0,0,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Deuda interna, La",1988,95,NA,7.6,57,0,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Deuda, La",1997,90,NA,7.6,21,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Deus E o Diabo na Terra do Sol",1964,120,NA,7.6,268,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Deus Ex",1971,35,NA,8.8,9,14.5,0,0,0,0,0,14.5,34.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Deus Ex Machina",2003,16,NA,7.4,5,24.5,0,0,0,0,0,24.5,0,24.5,44.5,"",0,0,0,1,0,0,1 -"Deus Ex-machina",1995,25,NA,7.9,10,0,0,0,0,0,0,24.5,64.5,24.5,0,"",0,0,0,0,0,0,1 -"Deus ex Machina",1993,18,NA,5,13,4.5,0,0,0,4.5,0,14.5,4.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Deuses E Os Mortos, Os",1970,97,NA,4.9,6,0,34.5,14.5,0,14.5,0,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Deutsche Polizisten: Viele Kulturen - Eine Truppe",1999,60,NA,8.7,19,0,0,0,0,0,4.5,14.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Deutsche Wochenschau Nr. 681",1943,12,NA,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Deutschen Volke, Dem",1996,98,NA,8.9,8,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,0,0,0,1,0,0 -"Deutschland bleiche Mutter",1980,123,NA,8.1,89,4.5,0,4.5,0,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Deutschland im Herbst",1978,134,NA,7.2,138,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Deutschland privat - Eine Anthologie des Volksfilms",1980,85,NA,7.7,5,0,0,0,0,0,44.5,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Deutschmeister, Die",1955,106,NA,5,28,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Deux",2002,121,NA,5.5,38,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Deux actrices",1993,95,NA,6.3,21,4.5,0,4.5,4.5,0,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Deux anglaises et le continent, Les",1971,108,NA,7.4,592,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Deux cents dirhams",2002,15,NA,4.8,5,0,0,24.5,44.5,0,24.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Deux femmes en or",1970,106,NA,4.7,59,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Deux hommes dans Manhattan",1959,84,NA,6.8,49,0,0,4.5,0,4.5,24.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deux hommes dans la ville",1973,100,NA,7.2,292,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Deux lions au soleil",1980,110,NA,6.1,11,4.5,0,0,14.5,4.5,4.5,24.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Deux orphelines vampires, Les",1997,103,NA,6,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Deux orphelines, Les",1965,95,NA,5.1,9,0,0,0,14.5,24.5,24.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Deux papas et la maman, Les",1996,90,NA,3.6,57,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Deux timides, Les",1928,62,NA,7.7,13,0,0,0,0,4.5,0,14.5,64.5,14.5,0,"",0,0,1,0,0,0,0 -"Dev",2004,172,NA,8.1,96,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Devadasu",1953,191,NA,9.4,7,0,0,0,0,0,0,0,24.5,0,74.5,"",0,0,0,1,0,0,0 -"Devastator, The",1985,79,NA,5,16,4.5,0,14.5,4.5,14.5,34.5,4.5,0,14.5,4.5,"",1,0,0,0,0,0,0 -"Devasuram",1993,187,NA,7,7,0,0,0,0,0,14.5,24.5,14.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Devchata",1961,98,NA,9.2,50,0,0,0,0,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,1,0 -"Devdas",1955,159,NA,7.1,56,4.5,0,4.5,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,0,1,0 -"Devdas",2002,182,NA,7.3,1025,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Deveeri",1999,100,NA,1.8,5,24.5,0,0,24.5,0,0,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Devek Metoraf",1994,7,NA,8.1,7,0,0,0,0,24.5,0,14.5,0,0,45.5,"",0,0,1,1,0,0,1 -"Developing",1995,28,NA,6.2,64,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,1 -"Deveti krug",1960,107,NA,7.9,18,4.5,0,0,0,0,0,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Devi",1960,93,NA,7.6,141,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Deviants, The",2004,80,NA,5.2,93,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Devil Bat's Daughter",1946,67,NA,4.1,25,4.5,14.5,14.5,14.5,24.5,0,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Devil Bat, The",1940,68,NA,4.7,293,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Devil Commands, The",1941,65,NA,5.9,53,4.5,0,0,14.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Devil Diamond",1937,61,NA,5.6,8,24.5,0,0,0,24.5,24.5,14.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Devil Dogs of the Air",1935,85,350000,5.7,43,4.5,4.5,4.5,4.5,24.5,14.5,34.5,14.5,4.5,4.5,"",1,0,1,1,0,1,0 -"Devil Doll",1964,81,NA,3.9,280,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Devil Doll/Ring Pull",1999,1,NA,5.5,11,0,0,0,4.5,24.5,0,44.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Devil Girl From Mars",1954,77,NA,3.9,108,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Devil Goddess",1955,70,NA,5,16,4.5,0,4.5,14.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Devil Inside Her, The",1977,69,NA,4.2,8,34.5,0,0,0,0,0,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Devil Is a Sissy, The",1936,92,NA,6.3,43,4.5,0,4.5,4.5,4.5,34.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Devil Is a Woman, The",1935,79,800000,7.3,197,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Devil Made Me Do It, The",2000,26,NA,7.5,8,24.5,0,0,0,0,0,0,14.5,0,64.5,"",0,0,0,0,0,0,1 -"Devil Makes Three, The",1952,90,NA,5,51,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Devil May Hare",1954,7,NA,7.3,98,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Devil Monster",1946,60,NA,5.1,10,45.5,0,14.5,0,24.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Devil Rides Out, The",1968,95,NA,7.3,517,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Devil Talk",2003,5,NA,9.6,11,24.5,0,0,0,0,0,0,4.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Devil Thumbs a Ride, The",1947,63,NA,7,66,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Devil Times Five",1974,88,NA,3.9,39,14.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Devil You Know: Inside the Mind of Todd McFarlane, The",2001,44,NA,4.9,30,14.5,0,0,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Devil and Daniel Johnston, The",2005,109,NA,8.1,38,0,0,4.5,0,0,0,4.5,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Devil and Daniel Webster, The",1941,85,NA,7.9,441,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Devil and Max Devlin, The",1981,96,NA,4.6,214,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Devil and Miss Jones, The",1941,92,NA,7.5,333,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Devil and the Deep",1932,78,NA,5.4,40,14.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Devil at 4 O'Clock, The",1961,126,NA,6,226,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Devil in Miss Jones, Part II, The",1982,83,NA,4.6,52,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Devil in Miss Jones, The",1973,68,NA,6.1,255,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Devil in a Blue Dress",1995,102,NA,6.5,2483,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Devil in the Flesh",1989,90,NA,4,16,0,14.5,4.5,0,34.5,14.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Devil in the Flesh",1998,88,NA,4.6,622,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Devil in the Holy Water, The",2002,95,NA,6.2,6,0,0,0,14.5,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Devil on Wheels, The",1947,67,NA,5.7,12,0,0,24.5,0,0,4.5,0,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Devil to Pay!, The",1930,73,NA,5.6,32,0,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Devil with Women, A",1930,64,NA,8,11,0,0,0,4.5,0,4.5,4.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Devil's 8, The",1969,97,NA,4.6,24,14.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Devil's Advocate, The",1997,144,57000000,7,26904,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Devil's Angels",1967,84,NA,3.5,37,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Devil's Brigade, The",1968,130,NA,6.4,491,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Devil's Brother, The",1933,90,NA,7.1,229,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Devil's Cabaret, The",1931,16,NA,5.8,43,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Devil's Canyon",1953,92,NA,5.1,58,4.5,0,14.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Devil's Daughter, The",1939,52,NA,5.2,11,4.5,0,4.5,24.5,24.5,4.5,0,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Devil's Disciple, The",1959,85,NA,6.9,185,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Devil's Doorway",1950,84,NA,7.1,83,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Devil's Feud Cake",1963,8,NA,6.9,37,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Devil's Gift, The",1984,112,NA,1.7,29,45.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Devil's Hairpin, The",1957,83,NA,5.1,5,0,0,24.5,0,0,64.5,24.5,0,0,0,"",1,0,0,1,0,0,0 -"Devil's Hand, The",1962,71,NA,4.6,31,0,0,14.5,24.5,24.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Devil's Harvest",2003,92,NA,3.7,23,24.5,0,4.5,0,4.5,0,0,4.5,14.5,44.5,"R",0,0,0,1,0,0,0 -"Devil's Holiday, The",1930,80,NA,6.7,9,0,0,0,0,24.5,24.5,34.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Devil's Island",1939,62,NA,6.3,75,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Devil's Keep, The",1995,110,NA,6.2,15,0,14.5,24.5,4.5,14.5,14.5,14.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Devil's Mask, The",1946,65,NA,5.2,10,0,0,0,14.5,44.5,34.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Devil's Messenger",1961,72,NA,4.4,16,14.5,0,0,4.5,74.5,0,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Devil's Miner, The",2005,82,NA,8.3,6,0,0,0,0,0,0,14.5,45.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Devil's Own, The",1997,111,80000000,5.7,8485,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Devil's Party, The",1938,65,NA,6.6,10,0,0,0,14.5,14.5,44.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Devil's Playground",2002,77,NA,7.3,428,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Devil's Playground, The",1946,65,NA,7,16,0,0,0,4.5,14.5,14.5,4.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Devil's Playground, The",1976,107,NA,6.9,104,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Devil's Pond",2003,92,5000000,5.6,370,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Devil's Prey",2001,88,NA,3.2,237,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Devil's Rain, The",1975,86,NA,4,355,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Devil's Saddle Legion, The",1937,52,NA,4.9,18,14.5,14.5,14.5,14.5,14.5,34.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Devil's Triangle, The",1974,52,NA,5.8,28,14.5,4.5,4.5,0,24.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Devil's in Love, The",1933,70,NA,6,13,0,4.5,4.5,0,34.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Devil-Doll, The",1936,79,NA,6.6,244,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Devil-May-Care",1929,97,NA,8.3,9,0,0,0,0,0,14.5,24.5,0,24.5,44.5,"",0,0,0,0,0,1,0 -"Devil-Ship Pirates, The",1964,86,NA,5,52,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Devils Are Dreaming",2004,97,NA,9.1,11,0,0,0,0,0,14.5,0,4.5,0,74.5,"",0,0,1,0,0,0,0 -"Devils of Darkness",1965,88,NA,3.3,25,14.5,24.5,4.5,24.5,4.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Devils, The",1971,111,NA,7.2,976,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Devious Beings",2002,97,NA,3.5,83,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Devojacki most",1976,95,NA,6.9,5,0,0,0,0,0,24.5,64.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Devojka",1965,80,NA,7,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Devonsville Terror, The",1983,82,NA,3.7,134,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Devot",2003,89,NA,8.7,87,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Devotion",1931,84,NA,7.6,11,0,4.5,0,0,4.5,4.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Devotion",1946,107,NA,6.3,73,4.5,4.5,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Devotion",1995,123,NA,5.1,9,0,0,0,14.5,14.5,0,24.5,14.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Devotions",1983,22,NA,3.6,5,0,0,24.5,64.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Devushka bez adresa",1957,90,NA,6.9,21,0,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Devushka s korobkoy",1927,80,NA,7.8,36,0,0,4.5,0,4.5,0,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dexter's Laboratory",1995,6,NA,9,16,4.5,0,0,0,4.5,0,4.5,4.5,14.5,64.5,"",0,1,0,0,0,0,1 -"Dexter's Laboratory: Chicken Scratch",2002,5,NA,6.1,33,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Dexterity",1937,9,NA,6.5,7,0,0,0,14.5,24.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Deystvuy, Manya!",1991,110,NA,2.1,9,34.5,14.5,14.5,0,14.5,14.5,0,0,24.5,0,"",0,0,1,0,0,0,0 -"Deza-Femijet (Kosovo 2000)",2001,90,NA,6.4,15,0,0,0,0,4.5,24.5,4.5,4.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Dezember, 1-31",1999,97,NA,4.6,13,0,14.5,0,0,4.5,4.5,4.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Dezerter",1992,109,NA,7.2,11,0,4.5,0,4.5,0,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dezertir",1933,105,NA,7.4,33,0,0,4.5,0,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dhaai Akshar Prem Ke",2000,167,NA,4.3,34,14.5,14.5,14.5,0,4.5,4.5,14.5,14.5,0,24.5,"",0,0,0,1,0,1,0 -"Dharam Veer",1977,165,NA,7.7,37,0,0,0,4.5,4.5,0,4.5,44.5,24.5,14.5,"",1,0,0,0,0,0,0 -"Dharavi",1992,120,NA,8.4,17,4.5,0,0,0,0,0,14.5,24.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Dharkan",1995,125,NA,1,5,100,0,0,0,0,0,0,0,0,0,"",0,0,0,1,0,1,0 -"Dharmaga tongjoguro kan kkadalgun",1989,137,NA,7.7,242,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Dhoktor Zi-Vengos",1968,76,NA,7.6,28,4.5,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Dhool",2003,180,NA,7.3,11,4.5,0,0,0,0,14.5,14.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Dhoom",2004,129,NA,7,143,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Dhund",1973,130,NA,8.4,27,0,0,0,0,0,0,4.5,24.5,45.5,14.5,"",0,0,0,0,0,0,0 -"Di Cavalcanti",1977,18,NA,5.6,13,4.5,4.5,0,0,14.5,4.5,14.5,34.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Di che segno sei?",1975,130,NA,4.7,23,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Di yi lei xing wei xian",1980,92,NA,7.7,60,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",1,0,0,0,0,0,0 -"DiG!",2004,107,NA,8,350,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,0,1,0,0 -"Dia do Desespero, O",1992,75,NA,5.3,18,14.5,0,14.5,0,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dia em Que Dorival Encarou a Guarda, O",1986,14,NA,8.3,24,0,0,0,0,4.5,4.5,4.5,4.5,44.5,34.5,"",0,0,0,0,0,0,1 -"Diabelska edukacja",1995,29,NA,6.4,27,0,4.5,0,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Diable au corps, Le",1946,122,NA,7.6,51,0,0,4.5,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Diable boiteux, Le",1948,125,NA,4.7,19,4.5,0,0,14.5,14.5,0,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Diable est parmi nous, Le",1972,89,NA,6.6,8,0,0,0,14.5,14.5,14.5,24.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Diable et les dix commandements, Le",1962,120,NA,6.9,89,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Diable noir, Le",1905,4,NA,6.9,62,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Diable par la queue, Le",1969,90,NA,6.2,58,4.5,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Diable probablement, Le",1977,95,NA,7.3,192,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Diables, Les",2002,105,NA,6.9,107,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Diablo nunca duerme, El",1994,87,NA,7.4,8,0,24.5,0,0,0,0,14.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Diably, diably",1991,86,NA,6.1,9,0,14.5,0,0,0,24.5,14.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Diabo a Quatro, O",2004,108,NA,6.5,12,0,0,0,0,24.5,0,44.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Diabolik",1968,99,400000,4.7,637,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Diabolique",1996,107,NA,5,3103,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Diaboliques, Les",1955,116,NA,8.2,3068,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Diabolo menthe",1977,97,NA,6.5,112,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Diafanoidi vengono da Marte, I",1966,99,NA,2.3,36,34.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Diagnosis Trauma",2002,10,NA,7.4,7,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Diagnosis: Murder",1975,95,NA,6.1,34,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Diagogi miden",1949,75,NA,7,5,0,0,24.5,0,0,24.5,0,24.5,44.5,0,"",0,0,1,0,0,0,0 -"Diagonale du fou, La",1984,95,NA,6.6,109,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Diakopes stin Aigina",1958,89,NA,6.6,10,14.5,0,0,0,24.5,14.5,34.5,0,24.5,14.5,"",0,0,1,0,0,0,0 -"Dial 'P' for Pink",1965,6,NA,6.2,10,0,0,0,0,24.5,24.5,44.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Dial 1119",1950,75,NA,6.3,52,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dial H-I-S-T-O-R-Y",1998,68,NA,7.8,19,0,14.5,4.5,0,4.5,24.5,4.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Dial M for Murder",1954,105,1400000,7.8,7989,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Dial Red O",1955,63,NA,6.3,5,0,0,0,0,0,44.5,0,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Dialectique peut-elle casser des briques?, La",1973,90,NA,6.9,17,4.5,4.5,0,0,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Dialogo di Roma, Il",1982,62,NA,5.3,6,0,0,0,34.5,0,0,14.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Dialogues with Madwomen",1994,90,NA,6.8,11,0,0,0,0,0,14.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Diamante Lobo",1976,94,NA,3.4,103,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Diamond Baby",1983,82,NA,5.5,5,0,24.5,0,0,24.5,44.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Diamond City",1949,90,NA,5.8,12,0,0,0,0,44.5,44.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Diamond Demon",1947,9,NA,6.7,6,0,0,0,0,14.5,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Diamond Head",1963,107,NA,5.2,111,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Diamond Horseshoe",1945,104,NA,6.3,49,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Diamond Jim",1935,88,NA,6.5,37,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Diamond Men",2000,100,NA,6.8,511,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Diamond Ninja Force",1986,92,NA,3,13,34.5,4.5,14.5,0,0,4.5,0,0,4.5,34.5,"",1,0,0,0,0,0,0 -"Diamond Queen",1940,155,NA,6.3,6,0,0,0,0,14.5,0,64.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Diamond Queen, The",1954,80,NA,3.9,9,0,14.5,24.5,24.5,34.5,0,0,14.5,0,0,"",0,0,0,0,0,1,0 -"Diamond Run",1996,110,NA,2.6,18,14.5,24.5,34.5,4.5,4.5,0,0,14.5,0,14.5,"R",1,0,0,0,0,0,0 -"Diamond Skulls",1989,84,NA,4.1,83,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Diamondbacks",1998,91,NA,1.9,26,34.5,14.5,4.5,4.5,0,4.5,0,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Diamonds",1975,108,NA,5,56,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Diamonds",1999,91,NA,5.4,407,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Diamonds Are Forever",1971,120,7200000,6.6,8738,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Diamonds and Rust",2001,73,NA,8,6,0,0,0,34.5,0,34.5,14.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Diamonds for Breakfast",1968,102,NA,4.3,14,4.5,0,14.5,14.5,34.5,0,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Diamonds in the Rough",1996,100,NA,1.6,14,45.5,14.5,0,4.5,0,14.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Diamonds on Wheels",1974,84,NA,5.1,13,0,0,0,24.5,4.5,44.5,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Dian zhi gong fu gan chian chan",1980,94,NA,5.4,242,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Diana & Me",1997,98,NA,5.6,79,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"Diane",1956,110,NA,5.6,62,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Diane Linkletter Story, The",1969,10,NA,6.3,47,4.5,0,0,4.5,14.5,14.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Dianetics: The Dynamics of Life",1990,23,NA,5,12,45.5,0,0,0,0,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Diaries of Vaslav Nijinsky, The",2001,95,NA,6.4,52,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Diaries, Notebooks and Sketches",1969,177,NA,6.4,12,4.5,0,0,0,4.5,14.5,14.5,4.5,0,44.5,"",0,0,0,0,1,0,0 -"Diario de una becaria",2003,108,NA,3.9,10,14.5,14.5,14.5,0,24.5,34.5,0,24.5,0,0,"",0,0,1,1,0,0,0 -"Diario di un vizio",1993,94,NA,4.8,21,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Diario di una siciliana ribelle",1997,56,NA,3.3,20,14.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Diario para un cuento",1998,96,NA,4.8,17,4.5,0,14.5,0,0,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Diario segreto da un carcere femminile",1973,100,NA,4,19,14.5,14.5,24.5,0,4.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Diarios de motocicleta",2004,128,NA,8,8479,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Diary",1998,8,NA,6.6,23,0,0,0,4.5,0,44.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Diary for Timothy, A",1945,40,NA,6.8,35,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Diary of a Bad Lad",2005,92,NA,9.5,11,0,0,0,0,0,0,4.5,0,14.5,74.5,"",0,0,0,0,0,0,0 -"Diary of a Chambermaid, The",1946,91,NA,7,110,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Diary of a City Priest",2001,77,NA,6.1,36,0,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Diary of a High School Bride",1959,72,NA,3,6,14.5,14.5,0,0,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Diary of a Hitman",1991,90,NA,5.1,257,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Diary of a Mad Black Woman",2005,116,5500000,3.9,837,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"PG-13",0,0,1,1,0,0,0 -"Diary of a Mad Housewife",1970,104,NA,6.6,223,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Diary of a Madman",1963,96,NA,5.8,157,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Diary of a Nudist",1961,72,NA,3.9,23,14.5,0,0,14.5,24.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Diary of a Sex Addict",2001,93,NA,2.9,333,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Diary of an Unknown Soldier, The",1959,20,NA,7.1,13,0,0,0,0,0,34.5,14.5,44.5,4.5,0,"",0,0,0,0,0,0,1 -"Dias de Nietzsche em Turim",2001,85,NA,6.5,51,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Diasparagmos",1980,18,NA,4.7,6,0,0,14.5,0,14.5,0,45.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Diavoli della guerra, I",1969,100,NA,5.1,9,0,0,14.5,14.5,14.5,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Diavoli dello spazio, I",1965,78,NA,3.6,8,14.5,24.5,14.5,0,14.5,14.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Diavolo in corpo, Il",1986,114,NA,5.6,222,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Diavolo, Il",1963,103,NA,6.2,9,0,0,0,0,0,34.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Dibu 2: La venganza de Nasty",1998,90,NA,1.2,7,84.5,0,0,0,0,0,0,0,0,14.5,"",0,1,1,0,0,0,0 -"Dibu 3",2002,80,NA,3.3,10,45.5,14.5,14.5,0,0,14.5,14.5,0,0,14.5,"",0,1,1,0,0,0,0 -"Dice Rules",1991,88,NA,4.6,176,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,1,0,0 -"Dicen que soy mujeriego",1949,120,NA,6.9,9,14.5,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Diceria dell'untore",1990,96,NA,4,6,14.5,0,0,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Dichiarazioni d'amore",1994,91,NA,5.1,16,4.5,0,4.5,0,0,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Diciottenni al sole",1962,100,NA,6.6,10,0,14.5,0,24.5,0,14.5,14.5,44.5,0,14.5,"",0,0,1,0,0,0,0 -"Dick",1999,94,13000000,6.3,5004,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Dick Barton Strikes Back",1949,73,NA,4.6,8,24.5,0,14.5,0,45.5,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Dick Deadeye, or Duty Done",1975,81,NA,8,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,1,0,0,0,0,0 -"Dick Tracy",1945,61,NA,5.4,118,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Dick Tracy",1990,105,47000000,5.7,9939,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Dick Tracy Meets Gruesome",1947,65,NA,5.5,219,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Dick Tracy Returns",1938,254,NA,7.8,95,0,0,4.5,4.5,4.5,0,4.5,14.5,34.5,44.5,"",1,0,0,0,0,0,0 -"Dick Tracy vs. Crime Inc.",1941,263,NA,8,85,0,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",1,0,0,0,0,0,0 -"Dick Tracy vs. Cueball",1946,62,NA,5.3,188,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Dick Tracy's Dilemma",1947,60,NA,5.4,138,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Dick Tracy's G-Men",1939,302,NA,7.5,85,0,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",1,0,0,0,0,0,0 -"Dick Turpin",1925,70,NA,7.1,10,14.5,0,0,0,14.5,44.5,0,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Dick and Maria",2000,10,NA,7.3,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Dicker Hund, Ein",1982,86,NA,3.1,16,34.5,4.5,14.5,14.5,4.5,0,0,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Dickie Roberts: Former Child Star",2003,98,17000000,5.5,2076,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Dicky Moe",1962,7,NA,2.5,26,34.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Did Anyone Notice Us? Gay Visibility in the Irish Media 1973-1993",2003,74,NA,2.8,7,24.5,14.5,14.5,14.5,0,0,14.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Did I Wake You?",2001,4,NA,5.8,5,0,0,24.5,0,24.5,0,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Did You Ever",2002,28,NA,6.7,15,14.5,14.5,0,4.5,0,4.5,4.5,0,14.5,44.5,"",0,0,0,0,0,0,1 -"Did You Hear the One About the Traveling Saleslady?",1968,96,NA,3.2,26,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Didi auf vollen Touren",1986,92,NA,4.8,62,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Didi und die Rache der Enterbten",1985,88,NA,6,114,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Didier",1997,105,NA,6.4,420,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Didn't Do It for Love",1997,81,NA,3.3,15,14.5,0,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Die Alive",2001,90,NA,7.6,9,14.5,0,0,0,0,0,14.5,45.5,0,24.5,"",0,0,0,0,0,0,0 -"Die Another Day",2002,133,142000000,6.4,22136,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Die Hard",1988,131,28000000,8,58870,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",1,0,0,0,0,0,0 -"Die Hard",1997,2,NA,7.5,15,14.5,4.5,14.5,0,4.5,4.5,0,4.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Die Hard 2",1990,124,70000000,6.7,22987,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Die Hard Dracula",1998,88,NA,1.5,79,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Die Hard: With a Vengeance",1995,131,90000000,7,25258,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,0,0,0,0 -"Die Laughing",1980,108,NA,3.6,77,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Die Screaming, Marianne",1971,84,NA,4,30,4.5,14.5,14.5,14.5,14.5,24.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Die Sister, Die!",1972,82,NA,4.1,31,4.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Die You Zombie Bastards!",2005,97,NA,6.1,6,0,0,0,0,0,14.5,0,0,14.5,64.5,"",0,0,1,0,0,0,0 -"Die bian",1979,88,NA,6.1,60,4.5,0,4.5,4.5,4.5,24.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Die xue jie tou",1990,126,3500000,7.6,1805,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Die xue shuang xiong",1989,104,NA,8,9323,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"R",1,0,0,1,0,0,0 -"Die, Faggot, Die!",2003,10,NA,6.6,5,24.5,24.5,0,0,0,0,0,0,0,64.5,"",0,0,1,0,0,0,1 -"Die, Mommie, Die",2003,90,NA,6.2,538,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Die, Monster, Die!",1965,75,NA,5,262,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Diebinnen",1996,93,NA,5.2,8,24.5,0,0,0,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Dieci bianchi uccisi da un piccolo indiano",1977,81,NA,5.1,7,0,14.5,44.5,0,0,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Dieci gladiatori, I",1963,104,NA,3.9,10,24.5,14.5,0,0,24.5,0,24.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Dies rigorose Leben",1983,100,NA,7.1,6,0,0,0,0,0,34.5,14.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Dieses Jahr in Czernowitz",2004,134,NA,9.1,14,0,4.5,0,0,4.5,0,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Dieu est grand, je suis toute petite",2001,100,NA,5.7,467,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Dieu que les femmes sont amoureuses",1994,90,NA,3.8,5,0,24.5,24.5,24.5,24.5,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Dieu seul me voit",1998,120,NA,7.3,168,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Diez minutos",2004,15,NA,5,10,14.5,14.5,14.5,0,0,0,0,45.5,0,24.5,"",0,0,0,0,0,0,1 -"Diferente",1962,102,NA,4.4,14,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Different",2004,11,5000,7.5,13,0,0,0,0,0,24.5,0,4.5,4.5,64.5,"",0,0,1,0,0,0,1 -"Different Loyalty, A",2004,96,13000000,5,135,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Different Story, A",1978,108,NA,5.1,82,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Different Strokes",1998,75,NA,3.1,116,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Different for Girls",1996,92,NA,6.8,534,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Dig That Uranium",1956,61,NA,5.7,27,4.5,0,0,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Digby, the Biggest Dog in the World",1973,88,NA,5,94,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Digger",1993,95,NA,4.5,67,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Diggin' Up Business",1990,85,NA,2.1,11,4.5,24.5,4.5,4.5,4.5,0,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Digging to China",1998,98,NA,6.4,528,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Diggity: A Home at Last",2001,91,NA,5,28,4.5,0,4.5,14.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Diggstown",1992,98,NA,6.6,1443,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Digimon: The Movie",2000,82,5000000,3.4,455,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"PG",1,1,0,0,0,0,0 -"Digital Man",1995,95,NA,4.6,83,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Digre daier",1997,5,NA,5.5,12,0,0,4.5,0,24.5,4.5,14.5,34.5,4.5,0,"",0,0,0,0,0,0,1 -"Dijk is Dicht, De",1950,100,NA,6.1,5,0,0,0,0,0,64.5,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Dik Trom en het circus",1960,89,NA,6.4,12,4.5,4.5,0,0,14.5,0,14.5,44.5,0,4.5,"",0,0,0,0,0,0,0 -"Dik Trom knapt het op",1974,88,NA,6.3,9,14.5,0,0,0,24.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Dik Trom weet raad",1976,81,NA,5.5,13,4.5,0,0,4.5,24.5,24.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Dikaya okhota korolya Stakha",1979,134,NA,4.6,14,0,0,24.5,4.5,4.5,14.5,4.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Dikaya sobaka Dingo",1962,97,NA,8.8,8,0,0,0,0,0,0,0,64.5,0,34.5,"",0,0,0,0,0,0,0 -"Dikiy vostok",1993,98,NA,3.8,22,4.5,4.5,0,0,4.5,4.5,24.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Diktator kalei Thanasi",1973,89,NA,6.6,8,0,0,0,0,14.5,0,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Dil",1990,172,NA,7,73,4.5,0,0,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Dil Aashna Hai",1992,164,NA,5.9,18,4.5,4.5,4.5,0,24.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Dil Chahta Hai",2001,183,NA,7.1,780,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Dil Deke Dekho",1959,187,NA,6.5,8,0,0,0,14.5,0,24.5,0,24.5,24.5,14.5,"",0,0,0,0,0,1,0 -"Dil Diya Dard Liya",1966,169,NA,8.5,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Dil Hai Tumhaara",2002,185,NA,6,53,4.5,0,4.5,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Dil Ka Rishta",2003,150,NA,5.5,88,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Dil Pe Mat Le Yaar",2000,148,NA,5.5,20,0,0,14.5,0,14.5,24.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Dil Se..",1998,151,NA,7.2,475,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Dil To Pagal Hai",1997,179,NA,6.5,257,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Dildo Diaries",2002,63,NA,8.6,30,4.5,4.5,0,0,0,0,4.5,14.5,24.5,45.5,"",0,0,1,0,1,0,0 -"Dildo Song, The",1999,2,NA,4.8,21,4.5,0,4.5,4.5,4.5,0,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Dile a Laura que la quiero",1997,100,NA,4.9,28,4.5,14.5,14.5,4.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Dilemma",1990,97,NA,6.1,5,24.5,0,0,0,24.5,0,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Dilemma",1997,83,2500000,3.9,49,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Dilettante, La",1999,118,NA,7.1,164,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Diliryo",1997,125,NA,7.4,7,0,0,0,14.5,14.5,0,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Dill Scallion",1999,91,500000,5.1,136,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"PG-13",0,0,1,0,0,0,0 -"Dillinger",1945,70,193000,6.3,99,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dillinger",1973,107,NA,6.4,554,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Dillinger and Capone",1995,95,NA,4.4,83,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Dillo con parole mie",2003,109,NA,6.4,114,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Dilwale Dulhania Le Jayenge",1995,181,NA,7.1,765,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,1,0,1,0 -"Dim Sum: A Little Bit of Heart",1985,88,NA,6.5,82,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dimanches de Ville d'Avray, Les",1962,110,NA,8.5,184,4.5,0,4.5,0,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Dimboola",1979,94,NA,6.3,13,4.5,0,0,0,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Dime to Retire",1955,7,NA,6.5,30,0,4.5,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Dime with a Halo",1963,94,NA,6.5,10,0,0,14.5,0,0,14.5,34.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Dimensia Minds Trilogy: The Hope Factor",2004,10,NA,10,5,0,0,0,0,0,0,0,0,0,100,"",0,0,0,0,0,0,1 -"Dimensia Minds Trilogy: The Reds",2004,8,1200,9.9,15,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,1 -"Dimension 5",1966,91,NA,4.7,18,14.5,0,4.5,4.5,24.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dimenticare Palermo",1990,100,NA,4.6,77,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dimenticare Venezia",1980,110,NA,6.8,53,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Diminutos del calvario",2002,16,NA,5,22,14.5,4.5,0,0,0,0,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,1 -"Dimitri mou... Dimitri mou",1967,95,NA,4.5,9,0,0,0,34.5,34.5,24.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Dimples",1936,79,NA,6.4,89,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Din for altid",1999,39,NA,5.8,7,0,0,14.5,0,14.5,74.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Dinamiteros, Los",1964,93,NA,6.5,6,0,0,0,0,0,14.5,34.5,45.5,0,0,"",0,0,1,0,0,0,0 -"Diner",1982,110,5000000,7.2,3250,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Ding Dog Daddy",1942,8,NA,6,23,0,0,4.5,0,14.5,34.5,34.5,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Ding Dong Williams",1946,61,NA,4,16,0,14.5,4.5,24.5,14.5,4.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Ding et Dong le film",1990,96,NA,6.3,192,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ding tian li di",1973,86,NA,4.1,79,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Ding-a-ling-Less",2001,81,1000000,8.1,22,4.5,4.5,0,0,0,4.5,4.5,0,24.5,45.5,"",0,0,1,0,0,0,0 -"Dingaka",1965,98,NA,6.6,20,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Dingles, The",1988,8,NA,5.2,15,0,0,14.5,14.5,24.5,24.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Dingo",1991,109,NA,6.3,64,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dinky",1935,65,NA,4.2,15,4.5,4.5,4.5,24.5,44.5,14.5,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Dinky Menace",2000,7,NA,6.1,9,0,0,24.5,0,0,14.5,14.5,34.5,0,24.5,"",0,1,1,0,0,0,1 -"Dinner Party",1997,9,NA,2.3,9,24.5,34.5,0,14.5,24.5,0,0,0,14.5,0,"",0,0,1,0,0,0,1 -"Dinner Rush",2000,99,NA,7.3,1231,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Dinner and Driving",1997,89,NA,5.3,64,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Dinner and a Movie",2001,85,NA,6.1,28,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Dinner at Eight",1933,113,435000,7.6,1031,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Dinner at Fred's",1999,93,NA,5.1,70,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Dinner at the Ritz",1937,77,NA,5.7,44,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Dinner for Two",1996,7,NA,8,16,0,0,0,0,0,14.5,14.5,44.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Dinner with Kip",2002,6,NA,8.6,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Dinner with the Devil(s)",2001,9,NA,5.1,8,24.5,14.5,14.5,14.5,0,0,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Dino",1957,94,NA,6.7,29,0,0,4.5,4.5,4.5,14.5,34.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Dinosaur",1980,13,NA,5.7,31,4.5,4.5,0,4.5,14.5,4.5,4.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Dinosaur",2000,82,127500000,6.3,5839,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",0,1,0,0,0,0,0 -"Dinosaur Babes",1996,86,NA,5.3,11,4.5,24.5,4.5,4.5,0,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Dinosaur Hunter, The",2000,91,NA,5.8,33,4.5,4.5,4.5,4.5,14.5,0,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dinosaur Island",1994,85,NA,3.2,198,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Dinosaur Valley Girls",1996,94,NA,4,28,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Dinosaur and the Missing Link: A Prehistoric Tragedy, The",1915,5,NA,5.8,29,4.5,0,14.5,14.5,24.5,4.5,14.5,4.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Dinosaurus!",1960,85,450000,4,119,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dio perdona... Io no!",1968,109,NA,5.8,179,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Dio, come ti amo!",1966,93,NA,4.8,13,0,0,0,24.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Dio, sei proprio un padreterno!",1973,85,NA,4.6,47,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Dionysus",1970,85,NA,5.4,21,0,0,14.5,4.5,14.5,24.5,0,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dios se lo pague",1948,120,NA,8,35,4.5,0,4.5,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Diosa arrodillada, La",1947,107,NA,5.8,13,0,0,0,4.5,14.5,14.5,4.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Diplomaniacs",1933,61,NA,6.8,47,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Diplomat, The",2000,52,NA,8.1,6,0,0,0,0,0,0,0,14.5,45.5,34.5,"",0,0,0,0,1,0,0 -"Diplomat, The",2002,29,77000,9,11,0,0,4.5,0,0,0,4.5,0,4.5,74.5,"",0,0,0,1,0,0,1 -"Diplomatic Corpse, The",1958,65,NA,5.8,10,0,0,14.5,24.5,24.5,14.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Diplomatic Courier",1952,97,NA,6.8,72,0,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Diplomatic Siege",1999,96,45000000,3.5,340,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Diplopennies",1966,74,NA,5.9,24,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Diputado, El",1979,110,NA,6.5,56,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Dirdy Birdy, The",1994,7,NA,7.9,24,0,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Direct Action",2004,97,NA,5.3,66,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",1,0,0,0,0,0,0 -"Direct Hit",1994,89,NA,4,54,14.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Direct Order",2003,55,500000,5.8,6,0,0,0,14.5,14.5,0,34.5,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Directed by John Ford",1971,99,NA,5.3,59,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Directed by William Wyler",1986,60,NA,7.7,135,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Directing Eddie",2001,86,NA,8.4,5,0,0,0,24.5,0,0,0,24.5,0,64.5,"",0,0,1,0,0,0,0 -"Directing Rye",2004,20,NA,9.4,7,0,0,0,0,0,0,14.5,0,14.5,74.5,"",0,0,1,0,0,0,1 -"Direction d'acteur par Jean Renoir, La",1968,27,NA,5.5,5,0,0,24.5,0,0,24.5,44.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Direktan prenos",1982,99,NA,8,6,0,0,0,14.5,0,14.5,0,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Dirigible",1931,100,650000,5.9,48,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dirigible, El",1994,80,NA,1.8,16,14.5,14.5,0,4.5,0,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Dirk and Betty",2000,92,NA,6.9,9,0,14.5,0,0,14.5,0,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Dirndljagd am Kilimandscharo",1983,81,NA,3.5,9,24.5,14.5,14.5,14.5,14.5,0,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Dirt",1979,95,NA,5.8,7,0,14.5,0,14.5,0,14.5,24.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Dirt",2001,102,NA,5.5,95,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"R",0,0,1,0,0,0,0 -"Dirt",2003,91,NA,7.3,7,0,0,0,0,0,44.5,24.5,0,14.5,14.5,"",0,0,1,1,0,0,0 -"Dirt Bike Kid, The",1986,96,NA,3.9,146,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dirt Boy",2001,90,NA,5.3,42,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dirt Gang, The",1972,89,NA,2,37,45.5,24.5,4.5,4.5,0,4.5,0,0,0,4.5,"",1,0,0,1,0,0,0 -"Dirt Merchant",1999,85,NA,4.2,62,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dirty",1998,94,NA,6.5,66,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Dirty Baby Does Fire Island",1998,9,NA,4.5,39,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Dirty Dancing",1987,100,6000000,5.9,14407,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Dirty Dancing Concert Tour",1988,87,NA,3.5,15,14.5,4.5,0,4.5,0,0,0,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Dirty Dancing: Havana Nights",2004,86,NA,5.4,1667,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"PG-13",0,0,0,1,0,1,0 -"Dirty Daughters oder Die Hure und der Hurensohn",1982,80,NA,4.4,5,0,0,44.5,0,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Dirty Deeds",2002,97,NA,6.2,761,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Dirty Diamonds",2002,10,0,9.1,12,4.5,0,0,0,0,0,0,4.5,0,84.5,"",0,0,0,0,0,0,1 -"Dirty Dingus Magee",1970,91,NA,5.2,145,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"PG-13",0,0,1,0,0,0,0 -"Dirty Dozen, The",1967,145,NA,7.7,7340,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Dirty Game, The",1965,91,NA,5.6,23,4.5,0,0,14.5,24.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Dirty Gertie from Harlem U.S.A.",1946,65,NA,5,18,0,4.5,14.5,14.5,14.5,44.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Dirty Girls",1984,90,NA,6.5,5,0,0,0,0,0,24.5,24.5,0,44.5,24.5,"",0,0,0,0,0,0,0 -"Dirty Girls, The",1964,82,NA,4,19,4.5,4.5,14.5,14.5,14.5,24.5,4.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Dirty Harry",1971,99,NA,7.6,11108,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Dirty Harry's Way",1971,7,NA,5.8,13,0,0,4.5,4.5,14.5,34.5,0,4.5,0,24.5,"",1,0,0,0,1,0,1 -"Dirty Immigrants: All for One, The",2004,29,NA,7.8,6,0,14.5,0,0,0,0,14.5,14.5,0,45.5,"",0,0,1,0,0,0,1 -"Dirty Laundry",1987,79,NA,2.7,13,14.5,44.5,0,14.5,4.5,0,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Dirty Little Billy",1972,93,NA,5.2,76,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dirty Mary Crazy Larry",1974,93,NA,5.8,566,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,1,0 -"Dirty Mind of Young Sally, The",1970,84,NA,6,12,0,4.5,4.5,4.5,0,0,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Dirty Money",1995,105,NA,4.5,35,14.5,4.5,0,14.5,14.5,14.5,4.5,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Dirty O'Neil",1974,89,NA,7.3,7,0,0,14.5,24.5,0,0,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Dirty Pretty Things",2002,97,10000000,7.6,6274,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Dirty Rotten Scoundrels",1988,110,NA,6.9,7993,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Dirty Sanchez, The",1999,91,NA,4.3,17,14.5,14.5,0,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dirty Shame, A",2004,89,NA,6.1,472,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Dirty Shary",1985,70,NA,7.5,8,14.5,0,0,0,14.5,0,0,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Dirty Story",1984,99,NA,4.6,5,0,0,0,24.5,44.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Dirty Tricks",1981,91,NA,3.6,24,14.5,14.5,14.5,24.5,14.5,14.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Dirty Weekend",1993,102,NA,4.4,119,24.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dirty Western, A",1975,75,NA,5.2,19,4.5,0,14.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Dirty Woman",1989,98,NA,2.4,10,14.5,24.5,14.5,0,34.5,0,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dirty Work",1933,19,NA,7.5,140,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Dirty Work",1934,70,NA,4.1,9,14.5,0,14.5,14.5,34.5,14.5,24.5,0,0,0,"",0,0,1,0,0,1,0 -"Dirty Work",1998,82,13000000,5.9,4252,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Dis-moi oui...",1995,107,NA,6.3,65,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Disappearance of Andy Waxman, The",2004,25,30000,8.8,5,0,0,0,24.5,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Disappearance of Finbar, The",1996,120,NA,5.7,159,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Disappearance of Garcia Lorca, The",1997,114,NA,5.9,292,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Disappearance of Kevin Johnson, The",1997,105,NA,5.8,108,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Disappearance, The",1977,100,NA,5.5,49,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Disappearing Girl Trick, The",2001,15,NA,8.1,10,14.5,0,0,0,0,0,24.5,14.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Disaster",2001,90,NA,2.6,45,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Disc",2003,105,2000,7.5,10,14.5,0,0,0,24.5,0,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Dischord",2001,102,NA,3.9,22,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Disciple of Death",1972,84,NA,1.7,9,24.5,24.5,14.5,0,0,14.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Disciple, The",1915,50,8000,7.6,7,0,0,0,0,14.5,0,14.5,45.5,14.5,0,"",0,0,0,0,0,0,0 -"Disciples of the Crow",1983,30,NA,4.4,28,4.5,14.5,4.5,14.5,24.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,1 -"Disclosure",1994,128,NA,5.9,7062,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Disco Godfather",1979,93,NA,3.3,147,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Disco Kung Fu",2002,44,NA,6,106,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Disco Pigs",2001,93,NA,5.9,364,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Disco Years, The",1991,30,NA,6.5,55,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Disco volante, Il",1964,84,NA,5.5,11,0,0,0,4.5,14.5,4.5,44.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Discoverers, The",1993,40,NA,6.8,17,0,4.5,0,4.5,14.5,14.5,44.5,4.5,4.5,0,"",0,0,0,1,0,0,1 -"Discovering Hamlet",1990,53,NA,4.3,8,0,14.5,0,0,0,24.5,0,0,24.5,34.5,"",0,0,0,1,1,0,0 -"Discovery of Heaven, The",2001,127,NA,7,1365,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Discretion Assured",1993,97,NA,4.2,9,14.5,14.5,24.5,0,24.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Disembodied, The",1957,65,NA,3.5,14,14.5,14.5,14.5,24.5,0,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Disgraced!",1933,66,NA,7.8,6,0,0,0,0,0,0,45.5,14.5,34.5,0,"",0,0,0,0,0,1,0 -"Dish",2001,10,NA,6.4,46,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Dish Ran Away with the Spoon, The",1933,7,NA,5,11,0,0,4.5,4.5,34.5,24.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Dish, The",2000,97,NA,7.3,4629,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Disha",1990,135,NA,9,19,0,0,0,0,0,4.5,4.5,4.5,14.5,74.5,"",0,0,0,1,0,0,0 -"Dishonored",1931,91,NA,7.2,142,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dishonored Lady",1947,85,NA,6,52,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Disi duboko",2004,80,NA,6.9,7,0,0,14.5,0,14.5,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Diskoli apocheretismi: O babas mou",2002,113,NA,6.8,78,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Diskret Ophold",1946,95,NA,8.2,8,0,0,0,0,0,14.5,14.5,14.5,45.5,14.5,"",0,0,0,0,0,0,0 -"Disorder in the Court",1936,16,NA,7.6,240,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Disorderlies",1987,86,NA,3.7,340,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Disorderly Orderly, The",1964,90,NA,6.1,355,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Disordine, Il",1962,105,NA,6.4,9,0,0,0,0,14.5,34.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Disorganized Crime",1989,98,NA,5.2,409,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Disoriented",1999,90,NA,8.3,6,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Disparen a matar",1990,109,NA,7.3,9,0,0,0,14.5,0,14.5,24.5,44.5,0,14.5,"",1,0,0,0,0,0,0 -"Disparus",1998,100,NA,5.6,10,0,0,0,0,34.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Disparus de Saint-Agil, Les",1938,100,NA,7.2,67,4.5,4.5,0,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dispatch from Reuters, A",1940,90,NA,7.1,73,0,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dispositif meurtre et inauguration",1985,3,NA,8.7,6,0,0,0,0,0,0,0,45.5,45.5,0,"",0,0,0,0,0,0,1 -"Disraeli",1929,87,NA,6.9,137,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dissarray",1991,68,NA,8.9,15,0,0,0,0,4.5,0,14.5,4.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Dissonances",2003,107,NA,6.6,27,0,0,4.5,4.5,0,24.5,14.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Distance",1975,93,NA,6.1,8,14.5,0,14.5,0,14.5,24.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Distance",2001,135,NA,6.7,102,0,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Distant Cousins",1993,92,NA,4.6,46,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Distant Drums",1951,101,NA,6.1,171,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Distant Justice",1992,94,NA,3.8,10,0,44.5,24.5,0,14.5,34.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Distant Shadow",1999,100,NA,4.5,59,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Distant Thunder",1988,114,NA,5.1,168,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Distant Trumpet, A",1964,96,NA,5.7,79,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Distant Voices, Still Lives",1988,85,NA,7,244,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Distel, Die",1992,96,NA,5.7,6,0,0,0,0,14.5,14.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Distinct Smell of Red, The",2000,81,NA,8.2,5,0,0,24.5,0,0,0,0,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Distinguished Gentleman, The",1992,112,NA,5.7,2699,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Distinto amanecer",1943,108,NA,9.8,11,0,0,0,0,0,0,4.5,4.5,14.5,64.5,"",0,0,0,1,0,1,0 -"Distortions",1987,98,NA,4.8,29,4.5,14.5,4.5,14.5,24.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Distraction, The",1999,86,NA,5.9,19,14.5,4.5,0,0,4.5,14.5,24.5,14.5,24.5,4.5,"R",0,0,0,1,0,0,0 -"Distrait, Le",1970,85,NA,6.3,109,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Distributing a War Extra",1899,1,NA,3.6,9,14.5,0,0,45.5,14.5,0,14.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Distrito quinto",1958,94,NA,4.9,12,0,0,4.5,4.5,4.5,24.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Disturbed",1990,96,NA,4.7,94,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Disturbing Behavior",1998,84,15000000,5.1,4620,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Disubbidienza, La",1981,98,NA,5,12,0,0,4.5,14.5,0,24.5,4.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Dites-le avec des fleurs",1974,100,NA,7,5,0,0,24.5,0,0,24.5,0,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Dites-lui que je l'aime",1977,102,NA,7,82,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Dito nella piaga, Il",1969,98,NA,4.7,14,0,0,14.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Ditt Hus",1997,11,NA,8.5,12,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Ditte menneskebarn",1946,99,NA,8.7,78,0,0,0,0,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Ditto",1937,17,NA,6.6,9,0,0,0,0,14.5,34.5,44.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Ditya bolshogo goroda",1914,37,NA,7,18,14.5,0,0,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Diva",1981,123,NA,7.2,2835,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,1,0 -"Divan",2003,90,NA,6.2,28,4.5,0,4.5,0,0,14.5,4.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Dive",2003,45,NA,8.9,7,0,0,0,0,0,0,24.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Dive Bomber",1941,132,NA,6.5,189,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Diversions",1976,87,NA,1.8,10,24.5,0,14.5,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Divertimento",2000,93,NA,5.1,33,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Divide and Conquer",1943,57,NA,7.3,64,0,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Divided Heart, The",1954,89,NA,6.6,26,0,0,0,0,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Divided Highways: The Interstates and the Transformation of American Life",1997,87,NA,9,7,0,0,0,0,0,0,14.5,24.5,0,45.5,"",0,0,0,0,1,0,0 -"Divided Into Zero",1999,34,NA,4.8,26,34.5,4.5,0,14.5,14.5,4.5,0,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Divided Loyalties",1989,102,NA,5.4,16,0,0,0,4.5,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Divina creatura",1976,115,NA,4.4,19,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Divinas palabras",1987,107,NA,7.1,18,0,0,4.5,14.5,0,24.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Divine",2003,14,NA,6.2,6,0,0,0,0,0,14.5,0,45.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Divine Enforcer, The",1991,90,NA,2.9,17,24.5,0,14.5,0,14.5,0,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Divine Fate",1993,11,NA,4.8,6,0,0,34.5,0,14.5,0,0,45.5,0,0,"",0,1,0,0,0,0,1 -"Divine Horsemen: The Living Gods of Haiti",1985,52,NA,5.8,18,0,0,4.5,0,14.5,14.5,0,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Divine Lady, The",1929,99,NA,6.6,32,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Divine Madness!",1980,110,NA,6.4,203,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Divine Reality",2001,100,3000,7.1,8,24.5,0,0,0,0,0,14.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Divine Ryans, The",1999,93,NA,5.7,50,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Divine Secrets of the Ya-Ya Sisterhood",2002,116,27000000,5.5,4288,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Divine Trash",1998,97,NA,7.1,203,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Divine Waters",1985,110,NA,5.6,10,14.5,0,0,14.5,0,14.5,14.5,44.5,24.5,0,"",0,0,0,0,1,0,0 -"Divine carcasse",1998,88,NA,5.5,22,0,0,74.5,0,0,4.5,14.5,0,0,4.5,"",0,0,0,0,1,0,0 -"Divine poursuite, La",1997,102,NA,3.9,24,4.5,0,24.5,14.5,14.5,4.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Diving In",1990,92,NA,3.1,122,34.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Divorce",1945,71,NA,3.5,10,14.5,0,24.5,24.5,14.5,34.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Divorce American Style",1967,109,NA,6,204,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Divorce Iranian Style",1998,80,NA,7,38,0,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Divorce Law",1993,83,NA,4.4,13,14.5,4.5,24.5,4.5,14.5,4.5,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Divorce in the Family",1932,81,NA,5.2,21,0,4.5,4.5,4.5,4.5,44.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Divorce of Lady X, The",1938,91,NA,6.8,152,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Divorce, Le",2003,117,NA,4.9,2314,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Divorce: A Contemporary Western",1998,100,NA,6,11,4.5,0,14.5,0,4.5,0,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Divorce: The Musical",2002,86,1500000,3.4,8,24.5,0,14.5,14.5,14.5,0,0,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Divorcee, The",1930,82,340691,6.7,184,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Divorcing Jack",1998,110,NA,6.8,592,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Divorcio que viene, El",1980,106,NA,1.9,9,14.5,34.5,0,14.5,14.5,24.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Divorzio all'italiana",1961,104,NA,8,489,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Dix minutes de silence pour John Lennon",1980,10,NA,8.3,14,4.5,0,0,0,0,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Dix-sept ans",2003,83,NA,6,7,0,14.5,0,0,14.5,24.5,14.5,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Dixiana",1930,100,NA,6.1,41,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dixie",1943,89,NA,6.2,22,0,0,0,0,14.5,34.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dixie",1976,65,NA,6,5,0,0,0,0,0,64.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Dixie Dynamite",1976,88,NA,4.5,22,4.5,0,14.5,34.5,24.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Dixie Fryer, The",1960,6,NA,6.5,18,0,4.5,4.5,14.5,0,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Dixie Jamboree",1944,72,NA,4.6,8,14.5,14.5,0,24.5,14.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Dixie Lanes",1988,90,NA,4.1,18,24.5,0,14.5,14.5,34.5,0,4.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Dixieland Droopy",1954,8,NA,7.6,47,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Dizengoff 99",1979,110,NA,5.3,41,4.5,4.5,0,0,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Dizzy Detectives",1943,18,NA,7.4,62,4.5,4.5,0,4.5,0,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Dizzy Dishes",1930,6,NA,5.5,16,0,4.5,0,4.5,24.5,44.5,4.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Dizzy Divers",1935,7,NA,6,8,0,0,0,0,24.5,34.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Dizzy Doctors",1937,20,NA,7.7,70,4.5,0,0,4.5,0,14.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Dizzy Pilots",1943,17,NA,7.1,79,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Dizzy Red Riding Hood",1931,6,NA,6,8,0,0,0,14.5,14.5,24.5,24.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Dizzy, lieber Dizzy",1997,88,NA,8.8,5,0,0,0,24.5,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Django",1966,91,NA,7.1,772,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Django 2: il grande ritorno",1987,88,NA,4.6,129,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Django il bastardo",1969,107,NA,5.4,61,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Django spara per primo",1966,83,NA,5.4,11,0,4.5,0,14.5,24.5,0,34.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Djariskatsis mama",1964,83,NA,6.8,36,0,0,0,0,4.5,14.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Djen prischjol",2004,29,NA,7.9,8,24.5,0,0,0,0,0,14.5,14.5,45.5,0,"",0,0,0,1,0,0,1 -"Djinn",1994,24,NA,7,8,0,14.5,14.5,14.5,0,0,0,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Djogo",2002,98,NA,6.7,8,0,0,0,0,24.5,34.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Djomeh",2000,94,NA,6.8,64,0,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Djungelsaga, En",1957,75,NA,5.8,12,0,0,0,4.5,4.5,4.5,4.5,45.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dlug",1999,106,NA,7.7,300,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Dnevnik Glumova",1923,5,NA,6,25,4.5,0,0,14.5,14.5,14.5,14.5,0,4.5,44.5,"",0,0,0,0,0,0,1 -"Dnevnik direktora shkoly",1975,78,NA,7.6,5,0,0,0,0,24.5,0,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Dnevnik kamikadze",2003,105,NA,2.3,8,34.5,0,14.5,14.5,0,14.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Dnevnik ryzhego",2000,80,NA,6.4,5,24.5,0,0,0,24.5,0,0,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Dni zatmeniya",1988,133,NA,8.5,67,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Do Ankhen Barah Haath",1957,124,NA,8.5,30,0,0,0,4.5,0,0,24.5,24.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Do Bigha Zamin",1953,142,NA,8.4,52,4.5,0,0,4.5,0,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Do Detectives Think?",1927,19,NA,7.8,42,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Do Geese See God?",2004,10,NA,5.9,131,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Do I Love You?",2002,73,NA,3.8,8,0,0,24.5,0,14.5,0,34.5,14.5,0,14.5,"",0,0,1,1,0,1,0 -"Do It",2000,97,NA,6.1,19,4.5,0,0,0,0,0,34.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Do Me a Favor",1997,103,NA,5.1,101,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Do Not Disturb",1965,102,NA,5.5,126,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Do Not Disturb",1999,94,NA,4.7,678,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Do Nothing Til You Hear from Me",1994,4,NA,7.4,9,0,0,0,0,14.5,34.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Do Raaste",1969,165,NA,7.8,12,0,0,0,0,4.5,0,14.5,44.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Do Someone a Favor!",1954,9,NA,6.4,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,1,0,0,0,1 -"Do You Love Me",1946,91,NA,6,30,0,4.5,0,14.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Do You Remember Laurie Zimmer?",2003,54,NA,7.6,7,0,0,0,0,0,24.5,14.5,24.5,24.5,0,"",0,0,0,0,1,0,1 -"Do You Remember the First Time?",1994,26,NA,8.5,6,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,0,0,0,1,0,1 -"Do You Wanna Dance?",1997,104,NA,3.8,25,14.5,0,4.5,24.5,14.5,14.5,4.5,4.5,0,24.5,"",0,0,1,0,0,1,0 -"Do You Wanna Know a Secret?",2001,90,NA,2.8,205,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Do koske",1998,97,NA,6.8,55,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Do ma daan",1986,104,NA,7.5,419,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",1,0,1,0,0,0,0 -"Do or Die",1991,97,NA,3.9,99,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Do pivnice",1983,15,NA,7.6,63,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,0,0,0,0,1 -"Do sing daai hang II ji ji juen mo dik",1992,114,NA,2.9,5,44.5,0,24.5,0,24.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Do svidaniya, malchiki!",1964,82,NA,6.3,15,4.5,0,0,0,4.5,0,14.5,24.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Do the Right Thing",1989,120,6500000,7.7,9324,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Do widzenia, do jutra",1960,88,NA,6.4,25,0,0,0,14.5,4.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,1,0 -"Do-It-Yourself Cartoon Kit, The",1961,6,NA,6.2,10,0,0,0,0,24.5,24.5,0,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Do-re-mi-fa-musume no chi wa sawagu",1985,80,NA,4.9,14,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Dobbelte mand, Den",1976,91,NA,5.1,5,0,24.5,0,0,64.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Doberman Gang, The",1972,87,NA,5.7,118,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Dobermann",1997,103,NA,6.5,2791,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Dobermann",1999,4,NA,6.3,41,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Doberuman deka",1977,90,NA,7.1,17,0,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Dobro pozhalovat, ili postoronnim vkhod vospreshchyon",1964,74,NA,8.3,68,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Dobrovoltsy",1958,97,NA,5.9,12,0,0,0,4.5,0,14.5,0,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Dobutsu takarajima",1971,78,NA,7.8,21,14.5,4.5,0,0,0,4.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Doc",1971,96,NA,5.4,106,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Doc Hollywood",1991,104,NA,5.8,6398,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Doc Hooker's Bunch",1976,88,NA,1.6,9,24.5,34.5,14.5,0,0,24.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Doc Savage: The Man of Bronze",1975,100,NA,4.8,290,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Doc's Kingdom",1987,90,NA,7.3,7,0,14.5,0,0,14.5,0,0,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Doce sillas, Las",1962,94,NA,8.2,11,0,0,0,0,0,0,14.5,24.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Doces Poderes",1997,102,NA,6.6,22,0,0,0,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Dochki-materi",1974,101,NA,4.9,6,0,0,14.5,0,0,14.5,0,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dock Brief, The",1962,76,NA,6.3,77,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Dockhem, Ett",1956,78,NA,5,6,0,0,0,14.5,34.5,14.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Dockpojken",1993,93,NA,8,8,14.5,0,14.5,0,0,0,0,0,0,74.5,"",0,0,0,1,0,0,0 -"Docks of New Orleans",1948,64,NA,5.6,72,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Docks of New York",1945,62,NA,7,51,0,0,4.5,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Docks of New York, The",1928,76,NA,7.8,122,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Docteur Chance",1997,100,NA,4,17,24.5,0,0,4.5,14.5,14.5,14.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Docteur Jekyll et les femmes",1981,90,NA,5,42,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Docteur Justice",1975,105,NA,4.1,6,0,14.5,34.5,14.5,14.5,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Docteur Petiot",1990,102,NA,6.7,74,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Docteur Popaul",1972,100,NA,6.2,104,14.5,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Doctor Bull",1933,77,NA,5.1,49,14.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Doctor DeSoto",1984,7,NA,8.2,6,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,1,0,0,0,0,1 -"Doctor Detroit",1983,89,NA,4.4,1233,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Doctor Dolittle",1967,145,18000000,5.8,1069,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Doctor Dolittle",1998,85,71500000,5.4,8287,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Doctor Dracula",1978,88,NA,1.6,35,44.5,14.5,14.5,0,14.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Doctor Duck's Super Secret All-Purpose Sauce",1985,90,NA,4,32,14.5,0,0,4.5,0,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Doctor Faustus",1967,93,NA,4.7,90,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Doctor Hackenstein",1988,88,NA,3,20,14.5,14.5,24.5,14.5,14.5,14.5,14.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Doctor Jack",1922,60,NA,7,53,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Doctor Mordrid",1992,74,NA,5.3,158,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Doctor Sleep",2002,108,10000000,6.2,609,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Doctor Syn",1937,78,NA,5.6,33,0,0,4.5,4.5,34.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Doctor Takes a Wife, The",1940,89,NA,6.5,39,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Doctor X",1932,76,NA,6.3,184,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Doctor Zhivago",1965,200,11000000,7.9,10283,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,0,1,0,1,0 -"Doctor and the Devils, The",1985,93,NA,5.2,115,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Doctor and the Girl, The",1949,98,NA,5.6,12,0,0,4.5,0,4.5,34.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Doctor at Large",1957,98,NA,6,92,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Doctor at Sea",1955,93,NA,5.7,125,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Doctor in Clover",1966,97,NA,5.3,42,0,0,4.5,4.5,34.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Doctor in Distress",1963,102,NA,5.3,66,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Doctor in Love",1960,93,NA,5.6,51,0,0,14.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Doctor in Trouble",1970,90,NA,5.3,61,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Doctor in the House",1954,92,NA,6.8,195,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Doctor's Dilemma, The",1958,99,NA,6.3,67,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Doctor, The",1991,122,NA,6.7,1034,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Doctor, You've Got to Be Kidding",1967,94,NA,4.1,46,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Doctores las prefieren desnudas, Los",1973,90,NA,3.7,14,24.5,4.5,4.5,0,0,24.5,14.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Doctors' Wives",1971,101,NA,3.5,57,14.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Document of the Dead",1989,84,NA,5.2,135,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Documentary on the Making of 'Gore Vidal's Caligula', A",1981,56,NA,3.7,20,14.5,14.5,4.5,4.5,14.5,34.5,14.5,0,4.5,14.5,"",0,0,0,0,1,0,0 -"Documenteur",1981,65,NA,2.2,5,44.5,0,0,24.5,0,0,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Dodesukaden",1970,140,NA,7.3,655,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dodge City",1939,104,NA,7,435,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dodgeball",1995,81,NA,7,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,1,0,0,0,0 -"Dodgeball",2001,20,NA,7,53,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Dodgeball: A True Underdog Story",2004,92,20000000,6.6,14584,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Dodsworth",1936,101,NA,8.2,639,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Doe Boy, The",2001,85,NA,6.3,88,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Does God Play Football",2003,10,NA,5.4,9,14.5,14.5,0,0,0,24.5,0,0,14.5,44.5,"",0,0,1,1,0,0,1 -"Does This Mean We're Married?",1991,94,NA,4.5,34,4.5,14.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dog",2002,5,NA,8.2,38,4.5,0,14.5,0,4.5,0,14.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Dog Baseball",1986,10,NA,8.8,8,0,0,0,0,0,0,0,24.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Dog Brain",1988,3,NA,4.2,8,24.5,0,14.5,14.5,0,0,24.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Dog Collared",1951,7,NA,6.4,16,0,0,0,0,24.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Dog Day Afternoon",1975,124,NA,8,14962,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Dog Days",2000,24,NA,5,37,4.5,4.5,4.5,4.5,0,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Dog Daze",1937,7,NA,6.2,11,0,0,4.5,0,0,45.5,24.5,0,4.5,0,"",0,1,1,0,0,0,1 -"Dog Eat Dog",1964,84,NA,5,24,24.5,4.5,4.5,4.5,14.5,0,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dog Factory",1904,4,NA,5.7,33,0,0,14.5,4.5,34.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Dog Gone Love",2004,89,NA,5.8,27,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Dog Gone Modern",1939,7,NA,6.1,21,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Dog Gone People",1960,6,NA,7,19,0,0,0,0,14.5,0,34.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Dog Gone South",1950,7,NA,6.9,27,0,4.5,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Dog Gone: A True Story",2003,28,NA,7.2,8,0,0,24.5,0,0,14.5,14.5,0,14.5,34.5,"",0,0,0,1,0,0,1 -"Dog House, The",1952,6,NA,6.4,25,0,0,4.5,4.5,4.5,24.5,24.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Dog Me: Potluck",2003,110,NA,7.9,8,0,14.5,0,0,0,0,14.5,34.5,0,34.5,"",0,0,1,0,0,0,0 -"Dog Park",1998,91,NA,5.4,802,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Dog Pounded",1954,7,NA,7.7,27,0,0,4.5,0,4.5,14.5,24.5,44.5,14.5,0,"",0,1,1,0,0,0,1 -"Dog Run",1996,104,NA,3.6,23,24.5,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Dog Shy",1926,21,NA,8.7,11,0,0,0,0,4.5,0,0,44.5,44.5,0,"",0,0,1,0,0,0,1 -"Dog Soldiers",2002,104,NA,6.8,5782,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Dog Star",2002,124,NA,7.1,29,0,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Dog Star Man: Part I",1962,30,NA,6,119,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Dog Star Man: Part II",1963,7,NA,7.1,71,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Dog Star Man: Part III",1964,11,NA,6.6,69,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Dog Star Man: Part IV",1964,6,NA,6.7,81,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Dog Tags",1990,93,NA,4.4,18,14.5,4.5,14.5,4.5,14.5,14.5,14.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Dog Tales",1958,8,NA,6.2,23,0,0,0,4.5,24.5,34.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Dog Tired",1942,7,NA,6.5,20,0,0,0,0,14.5,34.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Dog Trouble",1942,8,NA,6.3,27,0,0,0,14.5,0,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Dog Walker, The",2003,13,NA,5.6,22,0,0,4.5,4.5,4.5,24.5,4.5,24.5,0,24.5,"",0,0,1,0,0,1,1 -"Dog Watch",1945,7,NA,6.6,8,0,0,0,14.5,0,24.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Dog Years",1997,75,NA,2.7,16,14.5,14.5,4.5,0,0,4.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Dog of Flanders, A",1935,72,NA,5.7,21,0,0,4.5,4.5,14.5,14.5,4.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Dog of Flanders, A",1960,96,NA,6.9,52,0,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dog of Flanders, A",1999,100,7000000,6,179,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Dog's Life, A",1918,40,NA,7.7,435,4.5,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Dog's Tale, A",1999,91,NA,3.6,8,14.5,0,14.5,14.5,0,0,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Dogadjaj",1969,88,NA,5.6,11,4.5,0,0,4.5,4.5,4.5,4.5,44.5,0,4.5,"",0,0,0,1,0,0,0 -"Dogfight",1991,89,NA,7.1,1503,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Doggone Cats",1947,7,NA,7.5,21,0,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Doggone Tired",1949,8,NA,7.6,35,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Doggy Bag",1999,85,NA,3,28,14.5,14.5,14.5,4.5,14.5,0,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Doggy Poo",2003,60,NA,7.6,44,14.5,0,0,4.5,14.5,4.5,4.5,24.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Dogma",1999,130,10000000,7.3,43391,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Dogmatic",1999,91,NA,2.9,31,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Dognapper, The",1934,7,NA,6.4,26,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Dogodilo se na danasnji dan",1987,99,NA,8,20,0,0,0,0,0,4.5,24.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Dogora - Ouvrons les yeux",2004,80,NA,6.4,24,4.5,4.5,4.5,14.5,4.5,0,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Dogpound Shuffle",1975,98,NA,6.3,33,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Dogs",1976,90,NA,3.3,45,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dogs Bark",2002,84,NA,7,7,0,0,0,14.5,0,0,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Dogs in Space",1987,103,NA,5.8,231,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Dogs in the Basement",2003,75,NA,6,12,0,4.5,14.5,0,0,4.5,34.5,0,4.5,24.5,"",0,0,1,1,0,0,0 -"Dogs of Hell",1982,93,NA,3.9,30,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Dogs of War",1923,24,NA,6.4,29,4.5,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Dogs of War, The",1981,102,NA,6,1022,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Dogs: The Longest Running Musical in Off-Off Broadway History",2002,14,NA,8,8,0,0,0,0,24.5,0,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,1 -"Dogs: The Rise and Fall of an All-Girl Bookie Joint",1996,80,NA,3.8,28,4.5,24.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Dogsbody",1999,13,NA,6.8,8,0,0,0,14.5,0,34.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Dogtown",1997,92,NA,5.8,154,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dogtown and Z-Boys",2001,91,NA,7.4,1555,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,0,1,0,0 -"Dogura magura",1988,109,NA,7,5,0,0,0,24.5,0,24.5,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Dogville",2003,135,NA,8,14307,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Dogville Confessions",2003,52,NA,3.6,180,24.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,1,0,0 -"Dogwalker, The",1999,105,NA,6.5,43,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dogwalker, The",2002,99,NA,6.2,50,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Dogwatch",1999,97,NA,4.3,7,14.5,14.5,0,0,14.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Dogway Melody, The",1930,17,NA,5.4,18,4.5,14.5,0,0,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Doh laai tin sai",1998,25,NA,7.3,235,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Dohyosai",1944,78,NA,9.1,8,24.5,0,0,0,0,0,0,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Doi cat",1999,90,NA,5.7,18,0,0,0,14.5,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Doida Demais",1989,105,NA,5,23,14.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Doigts dans le ventre, Les",1988,12,NA,4.7,5,24.5,44.5,0,0,0,44.5,0,0,0,0,"",0,0,0,1,0,0,1 -"Doin' Time",1985,81,NA,4.1,38,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Doin' Time on Planet Earth",1988,85,NA,4.6,65,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Doing Impossikible Stunts",1940,7,NA,5.3,8,0,0,0,24.5,24.5,14.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Doing Time for Patsy Cline",1997,95,NA,6.1,119,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Doing Time, Doing Vipassana",1997,52,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,0,1,0,0 -"Dois Perdidos Numa Noite Suja",2002,100,NA,7.7,61,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dois na Lona",1968,87,NA,4,15,24.5,14.5,4.5,4.5,4.5,14.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Dokfa nai meuman",2000,83,NA,7,44,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dokhtari ba kafsh-haye-katani",1999,110,NA,7,42,0,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Doki-Doki",2003,34,5000,7.6,38,0,0,0,0,0,4.5,4.5,4.5,24.5,64.5,"",0,0,0,1,0,1,1 -"Dokonjo monogatari - zeni no odori",1963,90,NA,8.6,7,14.5,0,0,0,0,24.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Dokter Pulder zaait papavers",1975,105,NA,6.5,65,0,4.5,0,0,4.5,14.5,44.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dokter Vlimmen",1977,107,NA,6,47,0,0,0,4.5,14.5,24.5,44.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Doktor Aybolit",1985,66,NA,7.9,14,0,0,0,0,0,4.5,0,14.5,24.5,45.5,"",0,1,0,0,0,0,0 -"Doktor Faustus",1982,137,NA,6.9,9,0,0,0,14.5,0,24.5,14.5,0,44.5,14.5,"",0,0,0,1,0,0,0 -"Doktor Glas",1942,89,NA,4.5,16,0,0,14.5,14.5,34.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Doktor Glas",1968,83,NA,5,10,0,0,0,14.5,24.5,44.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Doktor Mladen",1975,102,NA,5.5,5,24.5,0,0,0,0,44.5,0,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Dokument Fanny och Alexander",1986,110,NA,8,124,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Dokuritsu gurentai",1959,109,NA,7.6,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Dokuritsu shonen gasshoudan",2000,129,NA,7.2,48,4.5,0,4.5,0,14.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dokuz",2002,91,NA,8.7,70,4.5,4.5,0,0,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Dolai",1985,110,NA,3.6,5,64.5,0,0,0,24.5,24.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Dolce",2000,61,NA,5.5,27,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Dolce corpo di Deborah, Il",1968,91,NA,4.7,22,0,0,4.5,14.5,34.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Dolce far niente",1998,119,NA,5.2,39,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dolce pelle di Angela",1987,85,NA,2.2,40,34.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,1,0 -"Dolce rumore della vita, Il",1999,95,NA,5.7,30,4.5,0,4.5,14.5,4.5,14.5,14.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Dolce vita",1989,9,NA,4.2,10,14.5,0,14.5,14.5,64.5,0,0,0,0,14.5,"",0,0,0,1,0,0,1 -"Dolce vita, La",1960,180,NA,8,5285,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Dolci inganni, I",1960,95,NA,6.8,23,4.5,0,0,0,24.5,4.5,24.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Dolci signore, Le",1968,105,NA,4,11,4.5,0,4.5,0,4.5,14.5,0,0,4.5,44.5,"",0,0,1,0,0,0,0 -"Dolemite",1975,90,NA,5.4,534,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Dolgaya schastlivaya zhizn",1966,70,NA,8.6,10,0,0,0,0,0,14.5,0,0,34.5,64.5,"",0,0,0,1,0,1,0 -"Dolina Issy",1982,110,NA,6.8,16,0,0,14.5,14.5,0,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Dolina miru",1955,82,NA,6.6,37,0,0,0,4.5,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Doll Face",1945,80,NA,5.5,34,0,0,0,14.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Doll Squad, The",1974,101,NA,4,75,4.5,4.5,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Dollar",1938,78,NA,6.4,40,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dollar Bottom, The",1981,33,NA,5.8,10,24.5,14.5,0,0,14.5,0,34.5,0,0,34.5,"",0,0,0,0,0,0,1 -"Dollaro bucato, Un",1965,96,NA,6.2,32,4.5,0,0,4.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Dollaro tra i denti, Un",1967,86,NA,3.1,19,4.5,14.5,14.5,4.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Dollman",1991,79,NA,4.2,186,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Dolls",1987,77,NA,5.8,407,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dolls",2002,115,NA,7.7,2162,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Dolly Dearest",1992,93,NA,3.7,168,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dolly Sisters, The",1945,114,NA,6.3,74,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Doloma, To",1964,96,NA,7.3,32,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Dolor de pagar la renta, El",1960,98,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,1,1,0,0,0 -"Dolores Claiborne",1995,132,NA,7.2,5446,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Dolphins",1999,45,NA,6.8,77,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Dolphins",2000,40,NA,7.3,107,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Dolphins: The Ride",1997,4,NA,7.2,9,0,0,0,14.5,0,0,34.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Dom",1958,12,NA,7.6,8,0,0,0,0,14.5,0,24.5,34.5,0,24.5,"",0,1,0,0,0,0,1 -"Dom",2003,91,NA,7.6,64,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dom durakov",2002,104,2500000,6.8,382,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Dom kallar oss mods",1968,100,NA,7.2,159,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Dom na Trubnoy",1928,64,NA,8.5,21,0,0,0,0,0,0,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Dom pod zvyozdnym nebom",1991,121,NA,8.2,21,0,0,0,0,0,14.5,4.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Dom za vesanje",1988,142,NA,7.8,1697,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Dom, v kotorom ya zhivu",1957,100,NA,6.3,18,0,0,0,4.5,4.5,0,24.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Domani",2001,88,NA,6.2,30,0,4.5,0,0,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Domani si balla!",1983,100,NA,8.6,8,0,24.5,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Domaren",1960,112,NA,6.6,10,0,0,14.5,14.5,14.5,44.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Domeinen Ditvoorst, De",1992,112,NA,5.5,5,0,24.5,24.5,0,0,0,24.5,44.5,0,0,"",0,0,0,0,1,0,0 -"Domenica",2001,95,NA,6.6,26,0,0,0,0,4.5,24.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Domenica d'agosto",1950,84,NA,6.9,22,0,0,0,0,0,14.5,14.5,44.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Domenica della buona gente, La",1953,95,NA,4,6,0,0,34.5,34.5,0,14.5,14.5,0,0,0,"",0,0,1,1,0,0,0 -"Domenica specialmente, La",1991,118,NA,6.4,51,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Domestic Disturbance",2001,91,53000000,5.4,4445,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Domestic Violence",2001,196,NA,7,33,0,0,4.5,0,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Domestic Violence 2",2002,160,NA,7.3,16,0,0,0,0,0,34.5,34.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Domestico, Il",1974,94,NA,6,5,0,0,0,0,0,84.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Domicile conjugal",1970,100,NA,7.5,793,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Domik v Kolomne",1913,30,NA,7,8,0,0,0,0,14.5,34.5,14.5,14.5,24.5,0,"",0,0,1,0,0,0,1 -"Dominans",1994,38,NA,4.4,7,0,0,0,24.5,24.5,0,0,0,0,44.5,"",0,0,0,0,1,0,1 -"Dominant Seventh",1999,23,NA,6.1,12,0,4.5,0,0,0,24.5,0,0,4.5,45.5,"",0,0,0,0,0,0,1 -"Dominator",2003,75,NA,2.3,24,34.5,4.5,0,4.5,0,0,4.5,4.5,0,34.5,"",0,1,0,0,0,0,0 -"Dominatore dei sette mari, Il",1962,102,NA,5,40,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dominatrix Without Mercy",1976,64,NA,4,6,14.5,0,0,0,14.5,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Dominee, De",2004,110,NA,6.8,216,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Domineering Male, The",1940,10,NA,6.4,14,0,0,0,24.5,4.5,24.5,14.5,4.5,0,24.5,"",0,0,1,0,0,0,1 -"Domingo de carnaval",1945,77,NA,5.7,10,0,14.5,0,0,34.5,44.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Dominick and Eugene",1988,111,NA,6.8,720,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dominion",1995,95,1300000,5,85,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Dominique",1978,100,NA,4,60,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Domino",1988,97,NA,2.9,91,34.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Domino Kid",1957,74,NA,6.5,7,0,0,0,14.5,24.5,14.5,14.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Domino Principle, The",1977,97,NA,4.8,242,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Don Bosco",1988,108,NA,5.3,15,0,4.5,0,0,14.5,4.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Don Camillo",1983,126,NA,4.9,179,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Don Camillo e i giovani d'oggi",1972,111,NA,4.2,22,4.5,0,34.5,4.5,24.5,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Don Camillo e l'onorevole Peppone",1955,97,NA,6.7,179,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Don Camillo monsignore ma non troppo",1961,115,NA,6.5,165,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Don Daredevil Rides Again",1951,167,NA,6.6,7,0,0,0,14.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Don Donald",1937,8,NA,7.4,62,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Don Erre que erre",1970,92,NA,4.1,42,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Don Giovanni",1970,80,NA,8,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Don Giovanni",1979,184,7000000,7.2,130,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Don Is Dead, The",1973,115,NA,5.2,74,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Don Juan",1926,112,NA,7.2,78,0,0,0,0,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Don Juan",1998,104,NA,5.2,52,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Don Juan 67",1967,83,NA,8.4,7,0,0,0,0,0,0,44.5,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Don Juan DeMarco",1995,97,25000000,6.5,6857,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Don Juan Quilligan",1945,75,NA,6.2,12,4.5,0,0,0,14.5,14.5,44.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Don Juan, mi querido fantasma",1990,100,NA,5.4,22,4.5,0,4.5,4.5,24.5,4.5,4.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Don Kikhot",1957,110,NA,7.5,43,0,0,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Don Kikhot vozvrashchaetsya",1996,110,NA,6,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Don Olsen kommer til byen",1964,89,NA,7,26,0,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Don Q Son of Zorro",1925,111,NA,7.4,47,0,0,0,0,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,1,0 -"Don Quijote cabalga de nuevo",1973,132,NA,4.1,11,4.5,0,4.5,4.5,14.5,14.5,4.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"Don Quijote de Orson Welles",1992,111,NA,5,73,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Don Quijote de la Mancha",1947,107,NA,6.8,18,4.5,0,0,14.5,0,14.5,14.5,14.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Don Quixote",1933,73,NA,5.6,21,0,4.5,4.5,4.5,14.5,4.5,4.5,34.5,0,14.5,"",0,0,1,1,0,0,0 -"Don Quixote",1973,111,NA,6.7,11,0,0,0,0,0,4.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Don Redman & His Orchestra",1934,10,NA,5.1,5,0,0,0,0,64.5,24.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Don Ricardo Returns",1946,63,NA,5.9,5,0,24.5,24.5,0,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Don Sanche",1970,30,NA,7.6,14,0,0,0,4.5,0,4.5,14.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Don Segundo Sombra",1969,100,NA,4.8,14,24.5,4.5,0,0,4.5,4.5,0,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Don Winslow of the Coast Guard",1943,245,NA,6.9,11,0,0,4.5,14.5,4.5,14.5,14.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Don Winslow of the Navy",1942,237,NA,5.7,17,0,0,0,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Don's Fountain of Youth",1953,6,NA,7.6,39,0,0,4.5,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Don's Party",1976,90,NA,6.8,170,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Don's Plum",2001,89,NA,5,324,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Don't Answer the Phone!",1980,94,NA,3.2,94,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Don't Axe Me",1958,6,NA,6.8,32,0,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Don't Be a Menace to South Central While Drinking Your Juice in the Hood",1996,89,NA,5.7,3515,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Don't Bet on Blondes",1935,59,NA,5.9,41,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,0,4.5,"",0,0,1,0,0,1,0 -"Don't Bet on Women",1931,70,NA,6.1,7,0,0,0,0,14.5,14.5,45.5,0,0,14.5,"",0,0,1,0,0,1,0 -"Don't Bother to Knock",1952,76,NA,6.5,464,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Don't Bother to Knock",1961,89,NA,6.3,10,0,0,14.5,0,0,14.5,45.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Don't Call Me Frankie",1993,70,40000,9.1,7,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Don't Cry, It's Only Thunder",1982,108,NA,5.9,57,0,0,0,4.5,14.5,24.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Don't Do It",1994,90,NA,3.6,70,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Don't Drink the Water",1969,100,NA,5.5,147,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Don't Ever Leave Me",1949,85,NA,5.6,10,0,0,0,14.5,24.5,44.5,0,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Don't Fence Me In",1945,71,NA,7,29,0,0,4.5,0,4.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Don't Get Me Started",1994,76,NA,6,5,24.5,0,0,0,0,44.5,24.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Don't Give Up the Sheep",1953,7,NA,7.7,104,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Don't Give Up the Ship",1959,89,NA,6.3,100,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Don't Go Breaking My Heart",1999,95,NA,5.1,134,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Don't Go In the Woods",1982,82,NA,2.2,154,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Don't Go Near the Park",1981,80,NA,2.8,47,34.5,14.5,14.5,4.5,0,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Don't Go Near the Water",1957,107,NA,6.2,99,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Don't Go in the House",1980,82,NA,3.1,214,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Don't Just Lie There, Say Something",1973,91,NA,3.6,41,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Don't Just Stand There!",1968,99,NA,5.8,28,0,4.5,4.5,4.5,4.5,34.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Don't Knock the Rock",1956,84,NA,5,50,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Don't Knock the Twist",1962,86,NA,3.9,34,14.5,4.5,14.5,14.5,24.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Don't Let Go",2002,87,NA,7.9,9,0,0,14.5,0,0,14.5,0,45.5,0,24.5,"R",0,0,0,1,0,0,0 -"Don't Look Back!",2003,89,2300000,1.3,10,34.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,0 -"Don't Look Now",1936,7,NA,7.3,15,0,0,0,0,14.5,0,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Don't Look Now",1973,110,NA,7.5,3666,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Don't Lose Your Head",1966,90,NA,6.3,257,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Don't Make Waves",1967,97,NA,5.8,153,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Don't Mess with My Sister",1985,94,NA,2.5,40,45.5,14.5,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Don't Open 'Til Christmas",1984,86,NA,2.2,67,34.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Don't Open the Door!",1975,90,NA,4.3,28,34.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Don't Panic",1989,90,NA,4.5,18,14.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Don't Play Us Cheap",1973,90,NA,2.8,99,64.5,4.5,4.5,4.5,4.5,0,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Don't Raise the Bridge, Lower the River",1967,99,NA,4,81,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Don't Run, Johnny",1998,8,NA,2.5,19,14.5,4.5,4.5,0,0,14.5,4.5,0,14.5,44.5,"",0,0,0,0,0,0,1 -"Don't Say a Word",2001,113,50000000,6.2,10098,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Don't Shove",1919,11,NA,5.9,10,0,0,0,0,34.5,44.5,34.5,0,0,0,"",0,0,1,0,0,0,1 -"Don't Sleep Alone",1997,97,NA,1.9,17,34.5,14.5,14.5,0,14.5,0,0,0,4.5,14.5,"R",0,0,0,0,0,0,0 -"Don't Take It to Heart",1944,90,NA,6.3,21,0,4.5,4.5,0,4.5,24.5,24.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Don't Talk",1942,22,NA,6.3,12,0,0,0,0,34.5,24.5,34.5,4.5,0,0,"",0,0,0,1,0,0,1 -"Don't Talk to Strange Men",1962,65,NA,8.6,7,0,0,0,0,0,24.5,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Don't Tell Her It's Me",1990,101,NA,4.9,383,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Don't Tell Mom the Babysitter's Dead",1991,102,NA,5.2,3648,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Don't Tell the Wife",1937,62,NA,5.5,12,4.5,0,0,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Don't Think Twice",1999,3,NA,6.1,29,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Don't Throw That Knife",1951,16,NA,6.2,41,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Don't Turn 'em Loose",1936,68,NA,6.7,6,0,0,0,0,0,34.5,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Don't Walk",2001,10,NA,6.3,14,0,4.5,4.5,0,4.5,24.5,34.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Don't Worry, We'll Think of a Title",1966,83,NA,6.2,12,14.5,0,14.5,4.5,4.5,24.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Dona Flor e Seus Dois Maridos",1976,110,NA,7,400,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Dona Xepa",1959,87,NA,8.2,12,0,0,0,0,0,4.5,24.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Donald Applecore",1952,7,NA,7.7,58,4.5,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Donald Cammell: The Ultimate Performance",1998,75,NA,7,32,0,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Donald Duck and his Companions",1960,80,NA,7.8,7,0,0,0,0,0,0,24.5,45.5,0,14.5,"",0,1,1,0,0,0,0 -"Donald Duck and the Gorilla",1944,7,NA,7,64,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Donald Gets Drafted",1942,9,NA,7.1,77,0,0,4.5,0,4.5,24.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Donald and Pluto",1936,8,NA,6.9,66,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Donald and the Wheel",1961,17,NA,6.7,34,4.5,0,0,14.5,14.5,4.5,34.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Donald in Mathmagic Land",1959,27,NA,7.9,239,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,0,0,1,0,1 -"Donald's Better Self",1938,8,NA,7.2,51,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Donald's Camera",1941,7,NA,6.9,50,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Donald's Cousin Gus",1939,7,NA,6.9,67,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Donald's Crime",1945,8,NA,7.6,45,4.5,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Donald's Decision",1942,5,NA,6,29,0,0,4.5,0,24.5,34.5,24.5,0,0,4.5,"",0,1,0,0,0,0,1 -"Donald's Diary",1954,7,NA,7.1,39,0,0,0,0,0,14.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Donald's Dilemma",1947,7,NA,6,22,0,0,0,4.5,24.5,14.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Donald's Dog Laundry",1940,8,NA,7.2,46,0,0,0,4.5,4.5,14.5,34.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Donald's Double Trouble",1946,7,NA,7.3,40,0,0,0,4.5,4.5,14.5,14.5,44.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Donald's Dream Voice",1948,7,NA,6.9,24,0,0,0,4.5,0,14.5,44.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Donald's Garden",1942,7,NA,6,29,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Donald's Gold Mine",1942,7,NA,7.8,23,0,0,0,4.5,0,4.5,44.5,4.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Donald's Golf Game",1938,8,NA,7.2,58,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Donald's Happy Birthday",1949,7,NA,6.6,57,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Donald's Lucky Day",1939,8,NA,8.1,51,4.5,0,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Donald's Nephews",1938,8,NA,6.9,80,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Donald's Off Day",1944,7,NA,7.3,30,0,0,0,0,0,4.5,44.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Donald's Ostrich",1937,9,NA,6.7,65,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Donald's Penguin",1939,7,NA,6.7,41,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Donald's Snow Fight",1942,7,NA,8.5,90,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Donald's Tire Trouble",1943,7,NA,6.6,21,0,0,0,0,4.5,14.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Donald's Vacation",1940,8,NA,7.4,49,0,0,4.5,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Donau, Duna, Dunaj, Dunav, Dunarea",2003,89,NA,5.9,26,4.5,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Donde acaban los caminos",2004,82,500000,8,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Donde cae el sol",2002,84,NA,8.7,7,0,0,0,0,0,0,0,45.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Dondi",1961,80,NA,3,59,34.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Doneul gajgo twieola",1995,101,NA,5.5,10,14.5,0,0,14.5,45.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Dong",1998,69,NA,7.5,443,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dong ci bian wei",2001,97,NA,7.7,8,0,0,0,0,14.5,0,24.5,0,45.5,14.5,"",0,0,0,0,0,0,0 -"Dong er shi er tiao",1997,14,2000,3.7,10,24.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,0,1,0,0,1 -"Dong gong xi gong",1996,94,NA,6.5,226,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dong ong x sat yun fan",1997,86,NA,6.6,8,0,0,0,0,0,24.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Dong seung",2002,102,NA,6.6,43,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Dongchun de rizi",1993,85,NA,7.3,19,0,4.5,0,4.5,14.5,14.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Dongdong de jiaqi",1984,93,NA,8.4,74,0,0,0,4.5,0,4.5,14.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Donggam",2000,110,NA,7.4,153,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Donkeyhead",1998,2,NA,4.8,9,34.5,14.5,14.5,0,34.5,0,0,0,14.5,0,"",0,1,0,0,0,0,1 -"Donna Donna!!",1987,85,NA,4.6,58,4.5,14.5,14.5,4.5,34.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Donna allo specchio, Una",1984,83,NA,5.9,13,0,4.5,0,4.5,34.5,34.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Donna che venne dal mare, La",1957,96,NA,5.4,5,0,0,0,0,44.5,44.5,0,0,0,24.5,"",1,0,0,1,0,0,0 -"Donna chiamata Apache, Una",1976,85,NA,5,5,0,0,24.5,0,0,64.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Donna del fiume, La",1955,105,NA,5.9,19,0,0,0,0,14.5,34.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Donna della domenica, La",1976,105,NA,6.6,44,4.5,0,0,4.5,4.5,14.5,44.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Donna della luna, La",1988,90,NA,5.9,17,14.5,4.5,0,4.5,14.5,14.5,14.5,0,4.5,14.5,"",0,0,0,1,0,1,0 -"Donna di notte, Una",1979,90,NA,2.4,5,0,24.5,24.5,24.5,24.5,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Donna libera, Una",1956,93,NA,6.9,6,0,0,0,0,0,34.5,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Donna lupo, La",1999,77,NA,4.8,32,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Donna nel mondo, La",1963,110,NA,5.6,31,4.5,0,14.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Donna scimmia, La",1963,92,NA,6.8,44,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Donne con le gonne",1991,115,NA,5.1,31,14.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Donne senza nome",1949,89,NA,5.7,8,0,14.5,0,0,0,14.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Donner, Blitz und Sonnenschein",1936,92,NA,7.4,9,0,0,0,0,0,14.5,14.5,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Donneuse, La",1975,74,NA,5.1,6,14.5,0,14.5,0,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Donnie Brasco",1997,127,35000000,7.6,20029,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Donnie Darko",2001,133,4500000,8.3,51961,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,0,1,0,0,0 -"Dono, Il",2003,80,NA,4.1,30,4.5,14.5,0,4.5,4.5,44.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Donor Party",1993,4,NA,3.4,7,14.5,0,24.5,14.5,14.5,14.5,0,0,0,14.5,"",0,1,0,0,0,0,1 -"Donor, The",1997,94,NA,4.6,67,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Donor, The",2000,95,NA,5.4,8,34.5,0,24.5,0,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,1,0 -"Donovan's Brain",1953,83,NA,5.7,213,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Donovan's Reef",1963,109,2686585,6.5,1062,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,1,0,0,1,0 -"Dont Look Back",1967,96,NA,7.5,1026,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Donten seikatsu",1999,84,NA,5.2,22,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Donuts for Breakfast",2000,15,NA,6.2,6,0,0,0,0,0,34.5,0,64.5,0,0,"",0,0,0,1,0,0,1 -"Donzoko",1957,125,NA,7.3,360,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Dood van een non",1975,107,NA,6,22,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dood water",1934,106,NA,6.8,6,0,0,0,0,14.5,0,14.5,0,34.5,34.5,"",0,0,0,0,0,0,0 -"Doodle Circus, The",1996,6,NA,6.7,16,0,0,14.5,0,34.5,4.5,14.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Doolins of Oklahoma, The",1949,90,NA,6.1,28,0,0,4.5,4.5,24.5,14.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Doom Asylum",1987,77,NA,2.9,44,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Doom Generation, The",1995,72,NA,5,2780,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Doomed Caravan",1941,62,NA,7.8,14,0,0,0,4.5,0,14.5,14.5,4.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Doomed to Die",1940,68,NA,5.1,75,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Doomed to Failure",2004,7,1000,7.8,9,14.5,0,0,0,0,0,14.5,34.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Doomsday Machine, The",1972,83,NA,4.5,35,24.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Doomsday Man",1999,89,NA,3.6,222,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Doomsday Voyage",1972,88,NA,2.3,8,34.5,24.5,14.5,14.5,14.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Doomsdayer",2000,93,NA,4.3,70,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Doomwatch",1972,92,NA,5.5,88,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Doonesbury Special, The",1977,9,NA,7.4,22,0,0,0,4.5,0,4.5,4.5,14.5,24.5,34.5,"",0,1,0,0,0,0,1 -"Door in the Floor, The",2004,111,NA,6.9,1947,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Door to Silence",1991,91,NA,6.2,26,4.5,0,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Door with Seven Locks, The",1940,79,NA,5.9,51,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Door-to-Door Maniac",1961,80,100000,4.3,21,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Doors, The",1991,140,38000000,6.7,10363,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Doorway to Hell, The",1930,78,NA,6.1,78,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Doorway, The",2000,90,NA,4,118,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Doosaboo ilchae",2001,98,NA,6.2,90,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Dopamine",2003,85,NA,5.2,355,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Dopey Dicks",1950,15,NA,7.7,44,0,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Dopo mezzanotte",2004,89,NA,6.9,211,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"DoppelPack",2000,88,NA,6.3,71,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Doppelganger",1993,104,3000000,4.1,481,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Doppelganger",2001,14,NA,7.7,33,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Doppelpass",2000,12,NA,6.5,15,14.5,0,0,0,0,24.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Doppelte Lottchen, Das",1950,105,NA,7,63,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Dora-heita",2000,111,NA,7,87,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",1,0,1,1,0,0,0 -"Dorian",2001,89,NA,4.3,86,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dorian Blues",2004,88,NA,6.3,101,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Dorian Gray",1970,93,NA,4.9,87,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dorm That Dripped Blood, The",1981,84,90000,2.5,101,34.5,14.5,4.5,4.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Dorme",2000,75,NA,8,21,4.5,4.5,0,4.5,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Dormez, je le veux!",1998,98,NA,5.6,7,0,14.5,0,0,24.5,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Doro no kawa",1981,105,NA,8.3,48,0,0,4.5,0,0,4.5,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Doroga",2002,78,NA,6.3,8,0,0,0,14.5,24.5,24.5,14.5,0,14.5,14.5,"",0,0,0,1,0,1,0 -"Doroga k zvezdam",1958,48,NA,6,37,4.5,0,0,4.5,0,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Dorogaya Yelena Sergeevna",1988,94,NA,7.9,33,0,0,0,4.5,0,14.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Dorogoy moy chelovek",1958,105,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,1,0,1,0 -"Dorotej",1981,98,NA,7.3,7,0,0,0,0,14.5,0,44.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dorotheas Rache",1974,92,NA,6.2,13,0,0,4.5,0,14.5,14.5,24.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Dorothy Vernon of Haddon Hall",1924,135,750000,7.2,7,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Dorp aan de rivier",1958,92,NA,6.9,31,0,4.5,0,0,0,14.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Dortoir des grandes",1953,100,NA,5.7,9,0,0,0,14.5,14.5,34.5,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Dos Blokes",2005,4,0,4.3,14,4.5,0,0,0,0,0,4.5,4.5,34.5,44.5,"",0,0,0,0,0,0,1 -"Dos au mur, Le",1958,93,NA,6.5,18,0,0,0,0,14.5,14.5,34.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Dos fantasmas y una muchacha",1959,80,NA,6.8,7,0,0,0,0,0,24.5,14.5,44.5,0,14.5,"",0,0,1,0,0,0,0 -"Dos hermanos",2000,90,NA,7.1,13,24.5,0,0,0,0,0,14.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dos locos en el aire",1976,94,NA,1,5,64.5,0,0,0,24.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Dos orillas, Las",1987,112,NA,3.2,5,24.5,0,0,24.5,0,24.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Dos por dos",1997,110,NA,8,6,0,0,0,0,0,0,14.5,64.5,14.5,0,"",0,0,1,0,0,0,0 -"Dos putas, o historia de amor que termina en boda",1974,10,NA,2.4,5,44.5,24.5,24.5,0,24.5,0,0,0,0,0,"",0,0,1,0,0,0,1 -"Dos tipos de cuidado",1953,123,NA,8.5,52,4.5,4.5,0,0,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Dos tipos duros",2003,99,NA,6.2,65,4.5,4.5,0,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Dos veces Judas",1969,92,NA,3.3,9,14.5,34.5,0,14.5,14.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Dos y media y... veneno, Las",1959,78,NA,5.3,5,0,0,0,0,64.5,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Dossier 1413",1962,100,NA,2.3,5,44.5,0,0,24.5,0,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Dossier 51, Le",1978,108,NA,8,50,0,0,4.5,4.5,0,4.5,14.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Dossier noir, Le",1955,115,NA,6.1,11,0,0,0,0,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Dostana",1980,152,NA,7,40,0,0,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,"",1,0,0,1,0,1,0 -"Dosti",1964,163,NA,9.2,28,0,0,0,4.5,0,0,4.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Dostoyanie respubliki",1971,138,NA,7,33,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Dot",2002,92,NA,6.3,35,4.5,0,4.5,0,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,1,0,1,0,0 -"Dot and Keeto",1986,75,NA,6.2,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,1,0,0,0,0,0 -"Dot and the Bunny",1984,81,NA,6.2,11,0,4.5,14.5,0,4.5,4.5,4.5,34.5,0,4.5,"",0,1,0,0,0,0,0 -"Dot and the Koala",1985,70,NA,6.1,13,14.5,0,0,0,34.5,14.5,14.5,4.5,0,14.5,"",0,1,0,0,0,0,0 -"Dot and the Line, The",1965,10,NA,8.2,146,0,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,1,1,0,0,0,1 -"Dot and the Smugglers",1987,75,NA,5.2,6,0,0,0,34.5,14.5,14.5,0,14.5,0,14.5,"",0,1,0,0,0,0,0 -"Dot and the Whale",1986,75,NA,4.6,14,4.5,0,4.5,4.5,14.5,0,14.5,4.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Dot the I",2003,92,NA,6.7,617,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Dot.Kill",2004,87,6000000,5,36,14.5,0,4.5,14.5,14.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dotknieci",1988,118,NA,5.9,8,0,0,0,14.5,14.5,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Dotkniecie nocy",1962,88,NA,6.2,5,0,0,24.5,0,0,24.5,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Dotkniecie reki",1992,96,NA,5.9,50,4.5,0,4.5,14.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dotknij mnie",2003,82,NA,4.5,16,14.5,4.5,14.5,0,0,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Dots",1940,3,NA,6.7,8,0,0,0,0,14.5,14.5,34.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Dotsuitarunen",1989,110,NA,7.2,5,0,0,0,0,24.5,0,24.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Dottoressa ci sta col colonello, La",1980,94,NA,3.7,23,14.5,4.5,4.5,14.5,0,4.5,24.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Dottoressa del distretto militare, La",1976,91,NA,4.2,21,14.5,4.5,0,14.5,14.5,0,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dou hap",1991,120,NA,6.9,132,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Dou san 3 tsi siunin dou san",1997,110,NA,7.1,52,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Double 0 Kid, The",1992,95,NA,3.4,150,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Double Agent 73",1974,73,NA,3.1,117,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Double Bang",2001,104,NA,5.2,135,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Double Blast",1994,89,NA,2.2,34,34.5,24.5,14.5,0,4.5,4.5,4.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Double Bunk",1961,92,NA,5.9,13,0,0,4.5,0,4.5,34.5,24.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Double Chaser",1942,7,NA,6.1,13,0,0,0,0,24.5,34.5,44.5,0,0,0,"",0,1,1,0,0,0,1 -"Double Cross",1994,94,NA,4.4,119,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Double Danger",1938,62,NA,6,21,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Double Dare",2004,81,NA,4.6,142,4.5,4.5,4.5,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Double Deal",1950,64,NA,6.6,31,0,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Double Deal",1981,90,NA,4.4,10,24.5,14.5,14.5,24.5,0,14.5,24.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Double Deception",2001,87,NA,4.3,43,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Double Dragon",1994,89,NA,3.1,1497,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Double Dribble",1946,7,NA,6.4,38,4.5,0,0,4.5,4.5,4.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Double Dynamite",1951,80,NA,5,103,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Double Exposure",1954,61,NA,5.3,10,0,0,14.5,34.5,14.5,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Double Exposure",1982,94,NA,4.6,30,4.5,4.5,24.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Double Exposure",1993,93,NA,3.5,51,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Double Frame",2000,93,NA,6.1,12,0,0,0,4.5,0,44.5,34.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Double Happiness",1994,87,NA,7.2,356,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Double Harness",1933,69,NA,7.7,13,0,0,0,0,0,4.5,14.5,45.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Double Impact",1991,109,16000000,4.5,2749,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Double Indemnity",1944,110,927262,8.5,11592,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Double Jeopardy",1955,70,NA,6.1,6,0,0,0,0,0,45.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Double Jeopardy",1999,105,40000000,5.9,13587,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Double Life, A",1947,104,NA,7.2,361,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Double Man, The",1967,105,NA,5.3,101,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Double McGuffin, The",1979,101,NA,5.5,89,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Double Negative",1980,96,NA,4.3,34,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Double Nickels",1977,87,NA,2.9,11,4.5,34.5,0,0,14.5,4.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Double Obsession",1994,84,NA,3.4,29,34.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Double Parked",2000,98,NA,6.4,47,4.5,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Double Revenge",1990,95,NA,2.9,17,4.5,14.5,24.5,14.5,0,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Double Take",1997,86,NA,5,103,4.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Double Take",2001,91,24000000,4.8,1503,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Double Talk",1937,10,NA,5.8,9,0,0,14.5,0,34.5,24.5,14.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Double Tap",1997,87,8000000,5.3,184,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Double Target",1987,102,NA,2.9,24,24.5,24.5,14.5,14.5,0,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Double Team",1997,93,NA,3.9,2857,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Double Threat",1993,94,NA,3.9,27,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Double Trouble",1967,90,NA,3.9,165,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Double Wedding",1937,87,NA,7.1,126,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Double Whammy",2001,100,4000000,5.6,886,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Double Whoopee",1929,20,NA,7.4,60,4.5,0,0,0,14.5,4.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Double X: The Name of the Game",1992,95,NA,3.4,23,24.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Double jeu",1997,8,NA,7.4,13,0,0,0,0,4.5,14.5,4.5,34.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Double messieurs",1986,90,NA,6.6,18,14.5,0,4.5,4.5,4.5,0,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Double or Mutton",1955,7,NA,8,40,0,0,0,0,4.5,14.5,24.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Double or Nothing",1937,90,NA,6.9,12,0,0,0,0,4.5,24.5,44.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Double or Nothing",1940,18,NA,8.1,8,0,0,0,0,0,24.5,14.5,45.5,0,14.5,"",0,0,1,0,0,0,1 -"Doublecross On Costa's Island",1997,88,NA,8.7,13,4.5,0,0,0,0,0,14.5,4.5,0,64.5,"",1,0,0,0,0,0,0 -"Doubting Thomas",1935,73,NA,6.4,14,0,0,0,0,4.5,24.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Douce",1943,109,NA,7.5,23,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Doucement les basses",1971,85,NA,5.8,87,0,4.5,4.5,4.5,4.5,14.5,45.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Douche de colonel, La",1901,1,NA,3.3,5,24.5,0,0,0,0,84.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Douche, La",2000,10,NA,7,6,0,0,0,0,14.5,45.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Doug's 1st Movie",1999,77,5000000,4.5,290,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Dougal and the Blue Cat",1970,82,NA,8.6,28,0,0,0,0,0,0,14.5,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Dough Ray Me-ow",1948,7,NA,6.8,18,0,0,0,4.5,0,24.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Dough and Dynamite",1914,33,NA,6.7,24,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Dough for the Do-Do",1949,7,NA,7.7,85,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Doughboys",1930,81,NA,5.7,49,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Doughboys in Ireland",1943,61,NA,1,8,84.5,0,0,0,0,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Doughgirls, The",1944,102,NA,6.3,36,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Doughnuts and Society",1936,63,NA,4.7,7,14.5,0,0,0,0,14.5,24.5,0,0,44.5,"",0,0,1,0,0,1,0 -"Doughnuts, The",1963,26,NA,7.2,5,0,0,0,0,24.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Douglas",1970,90,NA,5.8,8,14.5,0,0,14.5,34.5,0,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Douglas Coupland: Close Personal Friend",1996,25,NA,7.8,10,0,0,0,0,14.5,0,14.5,24.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Doulaye, une saison des pluies",2000,80,NA,6.3,9,0,0,0,0,14.5,24.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Doulos, Le",1962,108,NA,8,350,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Douro, Faina Fluvial",1931,18,NA,7.5,27,0,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Doux amour des hommes, Le",2002,80,NA,5.4,24,4.5,0,4.5,14.5,24.5,4.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Dove comincia la notte",1991,94,NA,7.4,14,0,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Dove siete? Io sono qui",1993,148,NA,6.9,10,0,0,0,0,24.5,24.5,34.5,24.5,14.5,0,"",0,0,0,1,0,1,0 -"Dove vai in vacanza?",1978,115,NA,5.8,21,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Dove vai se il vizietto non ce l'hai?",1979,86,NA,6.1,14,14.5,0,0,14.5,0,14.5,24.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Dove, The",1974,105,NA,5.8,91,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dover Boys at Pimento University or The Rivals of Roquefort Hall, The",1942,9,NA,7.7,78,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Dovidenia v pekle priatelia",1970,73,NA,6.5,12,0,0,0,4.5,4.5,14.5,0,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Dovidjenja u sledecem ratu",1980,118,NA,6,17,0,0,4.5,0,0,4.5,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Down",2001,110,15000000,4.5,637,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Down",2003,5,NA,6.5,6,0,0,0,14.5,34.5,14.5,0,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Down 'n Dirty",2000,102,NA,3.1,57,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Down Among the Sheltering Palms",1953,87,NA,5.6,22,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Down Among the Z Men",1952,82,NA,5,58,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Down Argentine Way",1940,89,NA,6.6,108,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Down Beat Bear",1956,6,NA,6.1,24,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Down Dakota Way",1949,67,NA,5.5,18,4.5,0,0,14.5,14.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Down From the Mountain",2000,98,NA,6.9,193,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Down Into Happiness",2003,82,NA,8.9,8,0,0,0,0,0,0,34.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Down Laredo Way",1953,54,NA,6,6,0,14.5,0,0,14.5,0,14.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Down Mexico Way",1941,77,NA,5.3,13,4.5,0,0,4.5,14.5,0,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Down Missouri Way",1946,75,NA,4.7,13,0,4.5,34.5,14.5,4.5,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Down On Us",1984,117,NA,2.4,29,34.5,14.5,4.5,4.5,14.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Down Periscope",1996,92,NA,5.2,3247,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Down Rusty Down",1996,15,NA,5.5,13,0,4.5,14.5,0,4.5,0,0,0,24.5,44.5,"",0,0,1,0,0,0,1 -"Down Three Dark Streets",1954,85,NA,7.4,30,4.5,0,0,4.5,14.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Down Time",2001,90,20000,3.5,55,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Down Twisted",1987,89,NA,4.2,79,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Down and Derby",2005,93,NA,5.8,17,14.5,4.5,0,14.5,14.5,4.5,14.5,4.5,14.5,14.5,"PG",0,0,1,0,0,0,0 -"Down and Dirty Duck, The",1974,75,NA,6.7,35,14.5,4.5,4.5,0,4.5,14.5,4.5,4.5,24.5,24.5,"",0,1,1,0,0,0,0 -"Down and Out in America",1986,57,NA,6,14,4.5,0,0,4.5,14.5,34.5,4.5,4.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Down and Out in Beverly Hills",1986,103,NA,5.9,3503,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Down and Out with the Dolls",2001,88,1200000,6,37,4.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Down and Outing",1961,7,NA,3.4,19,24.5,4.5,14.5,14.5,14.5,14.5,0,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Down by Law",1986,107,1100000,7.6,4449,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Down for the Barrio",1997,87,NA,1.3,13,64.5,4.5,4.5,0,0,4.5,0,0,0,14.5,"R",1,0,0,0,0,0,0 -"Down in the Delta",1998,112,NA,7,427,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Down the Stretch",1936,66,NA,5.9,7,0,0,24.5,14.5,0,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Down to Earth",1947,101,NA,6,85,4.5,4.5,0,4.5,4.5,34.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Down to Earth",2001,87,30000000,5.1,3720,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Down to Hell",1997,47,NA,5.9,54,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Down to Their Last Yacht",1934,64,NA,5.4,20,0,4.5,14.5,24.5,24.5,4.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Down to You",2000,91,9000000,4.7,3232,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Down to the Sea in Ships",1922,83,NA,6.4,70,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Down to the Sea in Ships",1949,120,NA,7.1,101,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Down with Love",2003,101,NA,6.5,7426,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Downhearted Duckling",1954,6,NA,5.9,24,4.5,0,0,4.5,24.5,24.5,34.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Downhill",1927,74,NA,6.4,86,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Downhill City",1999,103,NA,5.5,75,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Downhill Racer",1969,101,NA,6,488,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Downpour",2000,8,NA,7.8,6,0,14.5,0,0,0,14.5,0,0,14.5,45.5,"",0,1,0,0,0,0,1 -"Downpour Resurfacing",2003,28,NA,4.6,6,0,0,0,14.5,14.5,0,0,34.5,0,34.5,"",0,0,0,0,0,0,1 -"Downstairs",1932,77,NA,6.6,60,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Downtime",1985,62,16000,5.6,8,14.5,0,0,14.5,24.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Downtime",1997,90,NA,3.6,90,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Downtown",1990,96,NA,5.2,295,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Downtown - Die nackten Puppen der Unterwelt",1975,82,NA,3.4,5,0,24.5,0,24.5,24.5,0,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Downtown Switzerland",2004,94,NA,6.8,11,0,0,0,0,4.5,34.5,14.5,14.5,14.5,0,"",0,0,0,0,1,0,0 -"Downward Angel",2001,97,NA,3.9,41,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Dozd aroosakha",1990,81,NA,5.7,6,0,0,0,14.5,34.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Dozen Kliks, A",1998,12,NA,9.7,7,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,0,1,0,0,1 -"Dozhivyom do ponedelnika",1969,106,NA,6.1,33,4.5,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,0,1,0 -"Dr",1962,87,NA,5.6,8,14.5,0,14.5,0,0,0,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Dr T and the Women",2000,122,12000000,4.8,4776,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Dr. Alien",1988,90,NA,3.3,132,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dr. Benderfax",1997,85,NA,7.8,8,0,14.5,14.5,0,0,0,0,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Dr. Black, Mr. Hyde",1976,85,NA,3.9,31,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dr. Blood's Coffin",1961,92,NA,4.1,82,4.5,4.5,14.5,34.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dr. Broadway",1942,68,NA,5.1,9,0,0,0,24.5,24.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Dr. Caligari",1989,80,NA,6.5,162,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Dr. Christian Meets the Women",1940,68,NA,5.6,8,14.5,0,0,0,14.5,34.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Dr. Crippen",1962,98,NA,5.3,17,4.5,14.5,0,14.5,4.5,24.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dr. Cyclops",1940,76,NA,6,172,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dr. Death: Seeker of Souls",1973,87,NA,3.6,13,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Dr. Devil and Mr. Hare",1964,7,NA,6.1,37,0,0,4.5,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Dr. Dolittle 2",2001,87,72000000,5.1,4920,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Dr. Dolittle und seine Tiere",1928,25,NA,7.9,14,14.5,0,4.5,14.5,0,24.5,0,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Dr. Ehrlich's Magic Bullet",1940,103,NA,7.4,176,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dr. Giggles",1992,95,NA,3.8,757,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dr. Gillespie's Criminal Case",1943,89,NA,5.5,23,0,0,0,24.5,14.5,34.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Dr. Gillespie's New Assistant",1942,87,NA,6,10,0,14.5,0,24.5,0,24.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Dr. Goldfoot and the Bikini Machine",1965,88,NA,4.7,254,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dr. Heckyl and Mr. Hype",1980,99,NA,3.8,36,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dr. Jekyll & Mr. Hyde Rock 'n Roll Musical, The",2003,91,NA,3,28,4.5,4.5,4.5,0,0,4.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Dr. Jekyll and Mr. Hyde",1912,12,NA,4.8,19,0,14.5,4.5,14.5,34.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Dr. Jekyll and Mr. Hyde",1931,96,1140000,7.6,1018,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dr. Jekyll and Mr. Hyde",1932,10,NA,5.1,33,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Dr. Jekyll and Mr. Hyde",1941,90,NA,6.7,804,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dr. Jekyll and Mr. Mouse",1947,7,NA,7.1,59,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Dr. Jekyll and Ms. Hyde",1995,90,8000000,4.2,573,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Dr. Jekyll and Sister Hyde",1971,94,NA,6,201,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dr. Jekyll y el Hombre Lobo",1972,96,NA,5.5,33,4.5,4.5,0,14.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dr. Jekyll's Dungeon of Death",1982,88,NA,2.2,27,44.5,14.5,14.5,14.5,0,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Dr. Jerkyl's Hide",1954,7,NA,7.1,30,0,0,0,4.5,4.5,14.5,34.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Dr. Kildare Goes Home",1940,79,NA,6.1,36,4.5,0,4.5,14.5,4.5,24.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Dr. Kildare's Crisis",1940,75,NA,5.9,31,4.5,0,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dr. Kildare's Strange Case",1940,77,NA,6.2,47,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Dr. Kildare's Victory",1942,92,NA,6.2,26,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Dr. Kildare's Wedding Day",1941,83,NA,5.7,32,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dr. M",1990,112,NA,4.5,58,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dr. Mabuse, der Spieler - Ein Bild der Zeit",1922,231,NA,7.5,350,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Dr. Minx",1975,94,NA,4.8,9,0,0,0,44.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Dr. Monica",1934,53,167000,5.4,26,4.5,4.5,0,4.5,34.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dr. Morelle: The Case of the Missing Heiress",1949,73,NA,5.8,5,0,0,0,0,24.5,84.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Dr. No",1962,110,1100000,7.2,11864,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Dr. Otto and the Riddle of the Gloom Beam",1986,97,NA,3.8,88,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Dr. Penetration",1986,80,NA,6.8,7,0,0,0,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Dr. Phibes Rises Again",1972,89,75000,6.3,663,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Dr. Renault's Secret",1942,58,NA,5.6,37,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dr. Rhythm",1938,80,NA,5.6,8,14.5,0,0,14.5,0,45.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Dr. Socrates",1935,70,NA,6.4,45,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dr. Strange Glove",1990,75,NA,1.2,5,24.5,24.5,0,0,0,0,0,24.5,44.5,0,"",0,0,0,0,0,0,0 -"Dr. Strangelove or: How I Learned to Stop Worrying and Love the Bomb",1964,93,1800000,8.7,63471,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG",0,0,1,0,0,0,0 -"Dr. Terror's Gallery of Horrors",1966,79,NA,2.3,47,44.5,14.5,4.5,4.5,4.5,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Dr. Terror's House of Horrors",1965,98,NA,6.3,449,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dr. Who and the Daleks",1965,82,NA,5.4,444,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dr. Wong's Virtual Hell",1999,97,NA,4.9,10,34.5,0,0,0,0,34.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Drachenfutter",1987,75,NA,6,24,0,0,0,14.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dracula",1958,82,NA,7.4,1718,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Dracula",1979,109,NA,5.8,994,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Dracula",1992,128,40000000,7.1,19972,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Dracula (The Dirty Old Man)",1969,80,NA,4.1,33,34.5,4.5,0,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dracula 2000",2000,99,28000000,4.9,5364,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dracula 3000",2004,86,NA,1.8,392,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dracula A.D. 1972",1972,96,NA,4.8,383,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dracula Bites the Big Apple",1979,22,NA,4.4,6,14.5,34.5,0,0,0,0,34.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Dracula Exotica",1981,100,NA,4.7,24,14.5,4.5,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dracula Has Risen from the Grave",1968,92,NA,6.1,483,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Dracula II: Ascension",2003,85,NA,4.2,537,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Dracula Rising",1993,85,NA,2.3,106,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Dracula Sucks",1979,86,NA,3.8,58,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dracula Vs. Frankenstein",1971,90,NA,2.3,288,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dracula the Impaler",2002,90,NA,2.6,14,45.5,4.5,0,0,0,14.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Dracula's Daughter",1936,71,NA,6.4,429,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dracula's Dog",1978,90,NA,3.4,130,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dracula's Widow",1989,86,NA,2.6,51,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Dracula: Dead and Loving It",1995,88,NA,4.6,3557,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Dracula: Pages from a Virgin's Diary",2002,73,NA,7.3,292,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dracula: Prince of Darkness",1966,86,NA,6.4,793,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Draegerman Courage",1937,58,NA,5.9,29,14.5,14.5,0,14.5,4.5,34.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Draft Horse, The",1942,8,NA,6.7,13,0,14.5,0,0,0,4.5,14.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Draftee Daffy",1945,7,NA,7.2,58,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Drafty, Isn't It?",1957,6,NA,6.4,17,24.5,0,0,4.5,4.5,4.5,24.5,0,14.5,14.5,"",0,1,1,0,0,0,1 -"Drag",1993,40,25000,7.8,5,24.5,0,0,0,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,1 -"Drag Queen Heist",2004,20,5000,8.6,7,0,0,0,0,0,24.5,0,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Drag, The",1966,9,NA,6.9,7,0,0,0,0,24.5,0,24.5,44.5,0,0,"",0,1,0,0,0,0,1 -"Drag-A-Long Droopy",1954,7,NA,7.6,38,0,0,0,4.5,0,14.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Dragnet",1947,71,NA,6.9,5,0,0,0,0,0,44.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Dragnet",1954,88,500000,6.3,115,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dragnet",1987,106,NA,5.5,6042,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Dragon Against Vampire",1985,82,NA,2.3,14,24.5,4.5,4.5,0,0,4.5,4.5,24.5,0,24.5,"",1,0,1,0,0,0,0 -"Dragon Around",1954,7,NA,6.9,37,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Dragon Ball Z 6: Gekitotsu!! Hyakuoku power no senshitachi",1992,45,NA,6.3,95,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Dragon Ball Z 7: Kyokugen battle!! San dai super saiyajin",1992,46,NA,5.8,71,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Dragon Ball Z 9: Ginga girigiri!! Butchigiri no sugoi yatsu",1993,43,NA,7.4,61,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Dragon Blue",1996,75,NA,4,8,0,14.5,0,24.5,14.5,0,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Dragon Fire",1993,90,NA,4.2,39,4.5,14.5,4.5,4.5,0,14.5,4.5,4.5,4.5,44.5,"",1,0,0,1,0,0,0 -"Dragon Murder Case, The",1934,68,NA,6.5,42,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dragon Seed",1944,145,NA,6,128,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dragon rapide",1986,100,NA,6,13,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dragon, the Hero",1979,87,NA,5.7,18,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Dragon: The Bruce Lee Story",1993,119,14000000,6.7,3244,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Dragonard",1987,86,NA,2.7,26,44.5,4.5,14.5,14.5,4.5,14.5,0,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Dragonfight",1990,83,NA,2.5,21,44.5,4.5,4.5,14.5,4.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Dragonflies, the Baby Cries",2000,10,NA,5.5,9,14.5,0,34.5,0,0,0,34.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Dragonfly",1976,98,NA,4.7,39,4.5,4.5,4.5,14.5,4.5,34.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Dragonfly",2002,104,60000000,5.8,5431,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Dragonfly Squadron",1954,82,NA,5.7,6,0,0,0,0,34.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Dragons Never Die",1986,79,NA,3.4,5,44.5,0,24.5,0,24.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Dragonslayer",1981,109,18000000,6.4,1965,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Dragonstrike",1993,33,NA,7.9,13,24.5,0,0,0,0,0,0,0,0,74.5,"",0,0,0,0,0,0,1 -"Dragonworld",1994,86,NA,5.4,115,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dragonwyck",1946,103,1900000,6.7,222,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Dragoon Wells Massacre",1957,88,NA,5.1,32,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Dragstrip Girl",1957,69,100000,4.7,14,4.5,14.5,0,4.5,14.5,24.5,0,4.5,0,24.5,"",1,0,0,1,0,0,0 -"Dragstrip Riot",1958,68,NA,5.1,12,0,14.5,0,0,0,44.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dragueurs, Les",1959,78,NA,6.9,11,0,0,0,0,0,24.5,24.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Drakos, O",1956,85,NA,8.4,94,0,0,4.5,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Dramatic School",1938,80,NA,6,31,0,0,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dramma della gelosia - tutti i particolari in cronaca",1970,106,NA,6.5,89,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Dramma nella Kasbah",1953,81,NA,6.2,6,0,0,0,34.5,14.5,14.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Drango",1957,92,NA,5.1,29,0,4.5,4.5,4.5,34.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Draughtsman's Contract, The",1982,103,NA,6.9,1249,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Draw",1993,2,NA,6.4,18,0,0,0,4.5,4.5,34.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Draw the Pirate",2004,7,50000,8.5,5,0,0,0,0,0,0,0,24.5,44.5,44.5,"",0,0,1,0,0,0,1 -"Drawing Flies",1996,76,NA,5,509,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Drawing Lesson #2",1985,6,NA,6.2,23,4.5,4.5,0,4.5,4.5,34.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Drawn to the Flame",1997,92,NA,4.5,20,14.5,24.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,0,"R",0,0,0,0,0,0,0 -"Dreaded, The",1990,85,NA,2.4,16,44.5,14.5,4.5,4.5,4.5,0,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Dream Catcher, The",1999,99,NA,7.1,215,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dream Comes True, A",1935,8,NA,6.5,38,0,0,0,4.5,14.5,24.5,45.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Dream Deceivers: The Story Behind James Vance Vs. Judas Priest",1992,60,NA,6.1,27,4.5,0,0,0,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Dream Demon",1988,86,NA,4.3,70,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dream Follies",1954,61,NA,1.1,12,74.5,4.5,0,0,0,0,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Dream Girl",1948,85,NA,4.5,9,0,0,14.5,0,24.5,0,0,14.5,0,45.5,"",0,0,1,0,0,1,0 -"Dream Girls",1994,50,NA,6.7,11,0,0,0,0,14.5,4.5,44.5,14.5,0,4.5,"",0,0,0,0,1,0,0 -"Dream House",1933,19,NA,7,7,0,0,0,0,0,0,74.5,0,14.5,14.5,"",0,0,1,0,0,0,1 -"Dream Is Alive, The",1985,37,NA,7.8,107,0,0,4.5,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Dream Kitchen",1999,8,NA,5.7,40,4.5,0,14.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,1,0,0,1 -"Dream Lover",1994,103,NA,5.7,680,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dream On!",1981,98,NA,5.1,27,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Dream Street",1921,102,NA,5.8,18,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Dream Team, The",1989,113,NA,6.1,2216,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dream Trap",1990,90,NA,4.3,43,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,0,24.5,"",0,0,1,0,0,1,0 -"Dream Walking, A",1934,7,NA,7.5,26,4.5,0,0,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Dream Warrior",2004,95,NA,2.7,57,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Dream Wife",1953,100,NA,5.4,186,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Dream Work",2002,10,NA,7.2,14,0,14.5,0,0,0,0,24.5,4.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Dream a Little Dream",1989,114,NA,5.2,995,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Dream a Little Dream 2",1995,91,NA,3.1,160,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dream for an Insomniac",1996,90,NA,6,865,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Dream of Kings, A",1969,107,NA,6.6,35,4.5,0,0,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Dream of Passion, A",1978,110,NA,6.8,62,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Dream of a Rarebit Fiend, The",1906,7,NA,6.9,60,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Dream on Silly Dreamer",2005,40,65000,7.7,13,0,0,0,0,0,4.5,14.5,4.5,24.5,44.5,"",0,0,0,0,1,0,1 -"Dream with the Fishes",1997,97,1000000,6.5,647,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Dream, De",1985,96,NA,6,25,0,0,4.5,0,14.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dream, The",1911,11,NA,5.7,21,0,0,14.5,4.5,4.5,34.5,14.5,4.5,0,0,"",0,0,0,1,0,0,1 -"Dream-Quest of Unknown Kadath, The",2003,100,5000,7.6,30,14.5,4.5,4.5,0,0,4.5,14.5,14.5,4.5,44.5,"",0,1,0,0,0,0,0 -"Dreamaniac",1986,82,60000,4.3,36,34.5,24.5,14.5,4.5,0,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Dreamboat",1952,83,NA,6.7,58,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dreamcatcher",2003,134,68000000,5.2,10403,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Dreamchasers",1982,95,NA,6,7,0,0,24.5,0,0,74.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Dreamchild",1985,94,NA,7,321,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Dreamer: The Movie",2004,93,23500,9,7,0,0,0,0,0,0,14.5,24.5,0,45.5,"",0,0,0,1,0,0,0 -"Dreamers",1999,93,NA,7,57,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Dreamers, The",2003,112,NA,7,4936,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Dreaming Out Loud",1940,81,NA,6.2,10,0,0,0,0,24.5,14.5,44.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Dreaming of Joseph Lees",1999,92,NA,5.1,257,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Dreaming of Julia",2003,109,NA,6.6,73,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Dreaming, The",1988,87,NA,3,19,14.5,34.5,0,14.5,4.5,14.5,0,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dreamland: A History of Early Canadian Movies 1895-1939",1974,86,NA,8.4,6,0,0,0,0,0,14.5,0,45.5,34.5,0,"",0,0,0,0,1,0,0 -"Dreammaster: The Erotic Invader",1996,86,NA,4.2,45,14.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Dreamrider",1993,92,NA,3.1,48,4.5,0,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Dreams",1940,10,NA,5.5,7,0,0,0,24.5,14.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Dreams Come True",1982,95,NA,3.9,11,34.5,0,0,4.5,0,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Dreams That Money Can Buy",1947,99,NA,8,26,0,0,0,0,0,14.5,4.5,24.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Dreams of Glass",1970,83,NA,4.4,9,0,14.5,14.5,0,34.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Dreamscape",1984,99,NA,6.3,1603,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dreamscapes",2003,6,NA,6.5,18,0,0,0,4.5,24.5,14.5,24.5,24.5,4.5,0,"",0,1,0,0,0,0,1 -"Dreamwood",1972,45,NA,3.3,5,44.5,0,0,24.5,0,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Drei Bayern in Bangkok",1976,72,NA,4.8,5,0,24.5,0,24.5,0,24.5,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Drei D",1988,50,NA,6.4,13,4.5,0,0,14.5,4.5,14.5,4.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Drei Dirndl in Paris",1981,91,NA,2.4,7,0,24.5,24.5,44.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Drei Herren",1998,90,NA,6.8,84,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Drei Mann in einem Boot",1961,87,NA,5.9,72,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Drei Schwedinnen in Oberbayern",1977,95,NA,4,10,34.5,14.5,14.5,34.5,14.5,0,0,0,14.5,0,"",0,0,1,0,0,0,0 -"Drei Stern Rot",2002,96,NA,7.5,8,0,0,0,0,0,34.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Drei gegen drei",1985,105,NA,8.2,23,4.5,0,0,0,0,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Drei von der Tankstelle, Die",1930,99,NA,7.3,153,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Dreigroschenoper, Die",1962,124,NA,5.5,38,4.5,0,4.5,14.5,24.5,24.5,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Dreizehn alte Esel",1958,97,NA,5.4,11,0,4.5,0,24.5,4.5,24.5,14.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Drenge",1977,83,NA,6.2,40,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Drengen der forsvandt",1984,80,NA,5.5,12,0,0,24.5,24.5,0,34.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Drengene Fra Sankt Petri",1991,111,NA,6.7,181,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dresden",1999,84,NA,4.6,13,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Dress, The",1984,30,80000,8.4,9,0,0,0,0,0,0,34.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Dressage",1986,98,NA,4.6,17,0,14.5,0,4.5,14.5,0,14.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Dressed to Kill",1941,74,NA,6.2,35,0,0,4.5,14.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dressed to Kill",1946,76,NA,6.4,464,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dressed to Kill",1980,104,6500000,6.9,3481,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Dresser, The",1983,118,NA,7.6,649,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dressmaker, The",1988,90,NA,6.7,43,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Dreszcze",1981,106,NA,7.8,21,0,4.5,0,0,4.5,24.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dribble",2004,32,NA,7.4,5,24.5,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,1,0,0,0,1 -"Drie beste dingen in het leven, De",1992,103,NA,5.3,26,4.5,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Drift",2001,89,NA,8,107,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Drift Fence",1936,56,NA,5.8,11,0,0,4.5,4.5,24.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Drifter, The",1932,71,NA,4.5,6,0,14.5,0,14.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Drifter, The",1988,89,NA,4.6,81,4.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Drifters",1929,49,NA,7.6,21,0,4.5,0,0,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Driftin' River",1946,59,NA,4.4,7,0,14.5,24.5,0,0,44.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Drifting",1999,10,NA,5,7,0,0,24.5,14.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Drifting",2004,21,3000,9.9,41,0,4.5,4.5,0,0,4.5,4.5,0,0,94.5,"",0,0,0,1,0,0,1 -"Driftwood",1947,88,NA,5.1,29,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Driftwood",1997,100,NA,5.2,148,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Driftwood",2003,20,5000,4.1,13,4.5,4.5,14.5,14.5,0,0,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Driller Killer, The",1979,96,20000,4.4,593,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Drillinge an Bord",1959,79,NA,6.8,53,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Drinking Crude",1997,84,NA,3.3,42,14.5,4.5,4.5,4.5,44.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Drinking Games",1998,94,NA,6.1,81,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Drip Dippy Donald",1948,7,NA,7.7,16,0,0,0,0,0,4.5,4.5,64.5,0,24.5,"",0,1,1,0,0,0,1 -"Drip-Along Daffy",1951,7,NA,7.7,125,0,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Dritte Generation, Die",1979,111,NA,6.9,143,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Dritte Grad, Der",1976,111,NA,7.2,7,0,0,0,0,0,14.5,14.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Dritte, Der",1972,107,NA,6.9,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Drive",1997,117,3500000,6.4,1086,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",1,0,1,0,0,0,0 -"Drive",2002,102,NA,6.6,162,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Drive Baby Drive",1995,13,NA,6.9,10,0,0,14.5,14.5,14.5,0,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Drive Me Crazy",1999,91,8000000,5.1,2934,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Drive Me Crazy",2004,5,NA,6.8,6,0,14.5,0,0,0,14.5,34.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Drive a Crooked Road",1954,83,NA,6,43,0,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Drive, He Said",1971,90,NA,5.3,88,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Drive-In",1976,96,NA,5.6,56,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Drive-In Madness!",1987,60,NA,2.4,17,14.5,14.5,14.5,4.5,14.5,14.5,4.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Drive-In Massacre",1976,78,NA,2.1,133,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Drive-by Shooting",1994,120,NA,9.8,8,0,24.5,0,0,0,0,14.5,0,0,64.5,"",0,0,0,0,1,0,0 -"Drive-in Movie Memories",2001,57,225000,8.3,6,0,0,0,0,14.5,0,0,14.5,45.5,14.5,"",0,0,0,0,1,0,0 -"Driven",1996,103,NA,4.7,25,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Driven",2001,116,72000000,4.4,7129,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Driven to Kill",1991,97,NA,5.7,7,24.5,0,14.5,0,0,14.5,0,0,44.5,0,"",0,0,0,0,0,0,0 -"Driver dagg faller regn",1946,102,NA,6.1,20,0,0,0,0,24.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Driver, The",1978,91,NA,6.7,778,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Drivetime, The",1995,88,NA,9,6,0,0,0,0,0,0,0,14.5,64.5,14.5,"",0,0,0,0,0,0,0 -"Driving Cattle to Pasture",1904,1,NA,3.3,6,0,14.5,34.5,14.5,14.5,14.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Driving Fish",2002,35,NA,9.6,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,0,0,0,1 -"Driving Miss Daisy",1989,99,7500000,7.4,8656,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Drogadictos, Los",1979,86,NA,1.8,9,64.5,14.5,14.5,0,0,0,0,0,0,14.5,"",0,0,1,1,0,0,0 -"Droh Kaal",1994,162,NA,8.8,30,4.5,4.5,0,0,0,0,4.5,34.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Droid",1988,70,NA,5.2,7,24.5,0,0,14.5,0,0,14.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Droid Gunner",1995,90,NA,3.1,77,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Droit dans le mur",1997,95,NA,2.1,23,24.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Dronningens vagtmester",1963,95,NA,4.3,13,0,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Droopy Leprechaun",1958,6,NA,4.6,30,14.5,0,4.5,14.5,14.5,0,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Droopy's Double Trouble",1951,7,NA,6.9,35,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Droopy's Good Deed",1951,7,NA,7.1,44,4.5,0,0,0,4.5,24.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Drop Back Ten",2000,93,600000,4.8,30,14.5,4.5,14.5,0,0,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Drop Dead Darling",1966,100,NA,4.8,71,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Drop Dead Fred",1991,103,NA,4.5,3336,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Drop Dead Roses",2001,93,NA,2,118,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"R",0,0,0,0,0,0,0 -"Drop Kick, The",1927,62,NA,4,14,24.5,4.5,4.5,4.5,14.5,0,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Drop Squad",1994,86,2000000,3.9,150,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Drop Zone",1994,101,45000000,5.5,3104,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Dropouts",1999,105,NA,5.2,26,4.5,0,0,14.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Dropping the Gloves",2004,9,NA,7.7,6,14.5,0,0,0,0,0,0,34.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Drowned Out",2002,75,NA,7.1,6,0,0,0,14.5,0,0,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Drowning",2001,7,0,5,11,4.5,0,4.5,0,0,0,0,4.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Drowning Lessons",2002,20,NA,6.4,9,0,0,0,0,14.5,0,34.5,24.5,34.5,0,"",0,0,0,1,0,0,1 -"Drowning Mona",2000,95,16000000,5.4,3454,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Drowning Pool, The",1975,109,NA,6.3,528,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Drowning by Numbers",1988,118,NA,7.1,1697,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Drowning in Dreams",1997,72,NA,2.7,18,14.5,0,4.5,0,0,4.5,14.5,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Drowning on Dry Land",1999,88,NA,5.1,42,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Druckbolzen",2003,9,NA,7.1,10,0,0,0,0,0,14.5,34.5,0,44.5,24.5,"",0,0,0,0,0,0,1 -"Drug",1987,83,NA,7.3,24,4.5,0,0,14.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Drug Addiction",1951,22,NA,4.4,6,0,0,34.5,14.5,34.5,0,14.5,0,0,0,"",0,0,0,1,0,0,1 -"Drug Store Cowboy, The",1925,50,NA,8,7,24.5,0,0,0,0,0,0,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Drug moy Kolka",1961,88,NA,7.2,15,0,0,0,0,0,24.5,14.5,44.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Druga Zikina dinastija",1986,90,NA,3.4,17,14.5,4.5,0,4.5,4.5,4.5,0,4.5,0,45.5,"",0,0,1,0,0,0,0 -"Drugarcine",1979,96,NA,5.5,5,0,24.5,0,0,0,64.5,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Druggist's Dilemma, The",1933,17,NA,6.4,5,0,0,0,0,44.5,24.5,24.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Drugiyat nash vazmozhen zhivot",2004,117,NA,9.4,9,0,0,0,0,0,0,14.5,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Drugstore",2000,6,NA,6.1,20,4.5,0,0,0,0,4.5,4.5,4.5,44.5,44.5,"",0,0,0,0,0,0,1 -"Drugstore Cowboy",1989,100,2500000,7.4,4999,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Drum",1976,100,NA,4.2,115,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Drum",2004,94,3600,4,32,4.5,24.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Drum Struck",1991,26,NA,4.5,30,14.5,14.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,1 -"Drum, The",1938,96,NA,7.4,57,0,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Drumline",2002,118,20000000,5.3,7368,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Drums Across the River",1954,78,NA,6,44,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Drums Along the Mohawk",1939,103,NA,7.3,544,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Drums in the Deep South",1951,87,NA,5.9,39,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Drums of Africa",1963,92,NA,3.5,7,0,0,45.5,14.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Drums of Fu Manchu",1940,269,NA,8.3,29,4.5,0,0,0,0,4.5,14.5,24.5,4.5,45.5,"",1,0,0,0,0,0,0 -"Drums of Fu Manchu",1943,69,NA,6.3,5,0,0,0,0,24.5,0,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Drums of Jeopardy, The",1931,75,NA,4.9,20,14.5,0,4.5,14.5,14.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Drums of Love",1928,100,NA,4.8,9,0,0,34.5,0,34.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Drums of Tahiti",1954,73,NA,4.4,22,0,4.5,24.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Drunk Driving",1939,22,NA,5.7,12,0,0,4.5,0,24.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,1 -"Drunkard's Reformation, A",1909,13,NA,5.3,12,14.5,0,4.5,4.5,14.5,14.5,4.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Drunks",1995,90,NA,6,321,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Druzba Isusova",2004,95,NA,6.8,6,14.5,0,0,0,14.5,0,14.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Dry Cycle",2003,89,NA,8.1,8,0,0,0,0,14.5,14.5,14.5,0,34.5,24.5,"",0,0,1,0,0,1,0 -"Dry Mount",1996,8,NA,4.1,10,0,0,14.5,14.5,0,14.5,64.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Dry Rot",1956,87,NA,5.5,6,14.5,0,0,0,34.5,0,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Dry Spell, The",2005,76,NA,6.6,10,0,0,0,0,0,14.5,0,24.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Dry White Season, A",1989,97,NA,6.8,667,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dry and Thirsty",1920,12,NA,4.2,9,0,0,14.5,44.5,14.5,0,24.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Drying Up the Streets",1978,90,NA,3.8,9,0,24.5,24.5,0,0,14.5,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Drylanders",1963,69,NA,5.4,16,0,4.5,14.5,14.5,0,14.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Drylongso",1998,86,NA,6.5,24,14.5,0,0,0,4.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Drzanje za vazduh",1985,95,NA,6.7,6,0,0,0,0,34.5,0,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Du Barry Did All Right",1937,22,NA,6.1,5,0,24.5,0,0,0,44.5,0,0,24.5,24.5,"",0,0,1,0,0,0,1 -"Du Barry Was a Lady",1943,101,1239222,6.1,123,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Du Barry, Woman of Passion",1930,112,NA,3.3,8,0,24.5,0,0,24.5,14.5,0,34.5,0,0,"",0,0,0,1,0,1,0 -"Du Elvis, Ich Monroe",1989,70,NA,1,6,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Du Pappa",1994,90,NA,4.8,11,14.5,14.5,0,0,0,24.5,4.5,4.5,0,14.5,"",0,0,0,1,0,1,0 -"Du bi quan wang da po xue di zi",1975,81,NA,7.2,463,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Du bist Musik",1956,91,NA,2.5,6,14.5,14.5,14.5,0,0,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Du er ikke alene",1978,90,NA,8.1,159,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,1,0 -"Du mich auch",1986,90,NA,7.6,15,4.5,0,0,0,4.5,4.5,34.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Du pic au coeur",2001,85,NA,4.4,15,0,0,14.5,24.5,24.5,14.5,0,0,0,24.5,"",0,0,1,0,0,1,0 -"Du poil sous les roses",2000,85,NA,6.2,104,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Du rififi chez les hommes",1955,120,NA,8,1533,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Du shen",1989,126,NA,7.2,570,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Du shen xu ji",1994,126,NA,6.8,295,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Du sheng",1990,101,NA,6.7,113,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Du soleil pour les gueux",2001,55,NA,8.3,19,0,0,0,0,4.5,4.5,4.5,34.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Du xia II zhi Shang Hai tan du sheng",1991,116,NA,6.5,118,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Du xia da zhan Lasi Weijiasi",1999,93,NA,4.8,33,14.5,0,4.5,0,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Du-beat-e-o",1984,84,NA,4.2,16,14.5,0,4.5,34.5,4.5,4.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Dual Alibi",1946,81,NA,6.3,8,0,0,0,0,0,24.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Dual Citizen",2001,12,NA,6.3,10,0,0,14.5,0,0,24.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Duane Incarnate",2004,83,NA,9,7,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Duas Vezes com Helena",2000,75,NA,6.8,8,0,0,14.5,14.5,0,24.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Dubei dao",1967,111,NA,7.3,92,0,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Dublin Nightmare",1958,62,NA,5.5,10,0,0,0,0,34.5,45.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Duca nero, Il",1963,105,NA,5.3,13,0,4.5,0,34.5,34.5,4.5,4.5,0,0,14.5,"",0,0,0,1,0,1,0 -"Duchess and the Dirtwater Fox, The",1976,100,NA,5.2,270,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Duchess of Buffalo, The",1926,70,NA,8.5,9,0,0,14.5,0,0,0,14.5,14.5,34.5,34.5,"",0,0,1,0,0,1,0 -"Duchess of Idaho",1950,98,NA,5.9,74,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Duck Amuck",1953,7,NA,8.4,1260,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Duck Children",2001,8,NA,6.1,15,0,0,0,34.5,4.5,4.5,4.5,34.5,14.5,0,"",0,0,0,0,0,0,1 -"Duck Doctor, The",1952,7,NA,6.6,22,0,0,0,0,4.5,34.5,14.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Duck Hunt, The",1932,7,NA,6.6,35,0,0,0,4.5,14.5,24.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Duck Pimples",1945,8,NA,6.4,26,0,0,0,14.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Duck Soup",1927,20,NA,7.5,120,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Duck Soup",1933,68,NA,8.3,9870,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Duck Soup",1942,17,NA,9,17,14.5,0,4.5,0,4.5,0,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Duck Soup to Nuts",1944,7,NA,7,44,4.5,0,4.5,4.5,0,14.5,44.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Duck and Cover",1951,9,NA,6.2,78,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Duck! Rabbit, Duck!",1953,7,NA,8.4,209,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Duck, Duck, Goose!",2005,21,20000,8.8,16,4.5,0,0,0,0,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,1,1 -"DuckTales: The Movie - Treasure of the Lost Lamp",1990,74,NA,6.3,830,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Ducking the Devil",1957,7,NA,6.8,42,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Ducksters, The",1950,7,NA,7.2,105,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Ducktators",1997,46,NA,6.6,10,0,0,0,14.5,14.5,14.5,24.5,34.5,24.5,0,"",0,1,0,0,1,0,0 -"Ducktators, The",1942,7,NA,6.4,38,0,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Duct Tape Forever",2002,90,NA,5.7,216,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Duda, La",1972,92,NA,5.4,5,0,0,0,0,24.5,0,0,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Dude Cowboy",1941,59,NA,5.1,12,0,0,4.5,24.5,14.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Dude Duck",1951,8,NA,8.4,22,0,0,0,0,0,14.5,4.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Dude Goes West, The",1948,86,NA,6.5,21,0,4.5,0,0,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Dude Ranger, The",1934,65,NA,6.4,17,0,4.5,0,0,14.5,14.5,4.5,44.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dude, Where's My Car?",2000,83,13000000,4.6,13330,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Dudes",1987,90,NA,4.6,168,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dudley Do-Right",1999,77,22000000,3.6,1790,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Due Kennedy, I",1969,121,NA,6,8,0,14.5,0,0,0,24.5,24.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Due amici",2002,86,NA,6.7,35,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Due assi del guantone, I",1971,97,NA,6.3,5,24.5,0,0,0,24.5,24.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Due carabinieri, I",1984,120,NA,6.1,51,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Due colonnelli, I",1962,90,NA,8.1,28,0,0,0,0,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Due come noi, non dei migliori",2000,109,NA,5.8,5,44.5,0,0,0,0,0,0,0,64.5,0,"",0,0,0,0,0,0,0 -"Due cuori fra le belve",1943,90,NA,8.1,7,0,0,0,14.5,0,0,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Due della legione straniera, I",1962,97,NA,5.2,5,24.5,0,0,44.5,0,0,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Due evasi di Sing Sing, I",1964,99,NA,6,5,24.5,0,0,0,24.5,0,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Due figli di Ringo, I",1967,105,NA,6.2,5,24.5,0,0,0,0,24.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Due fratelli",1972,97,NA,4.4,11,0,4.5,14.5,4.5,14.5,4.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Due gladiatori, I",1964,93,NA,6.4,7,0,0,0,14.5,14.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Due gocce d'acqua salata",1982,92,NA,1.8,8,14.5,34.5,0,0,0,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Due mafiosi contro Al Capone",1966,93,NA,6.1,10,0,0,0,14.5,0,0,64.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Due mafiosi contro Goldginger",1965,89,NA,4.8,15,4.5,4.5,0,0,4.5,24.5,24.5,0,24.5,14.5,"",0,0,1,0,0,0,0 -"Due mafiosi nel Far West",1965,100,NA,6.9,9,14.5,0,14.5,0,0,14.5,45.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Due mafiosi, I",1964,90,NA,6.1,6,0,0,0,0,14.5,45.5,0,34.5,0,0,"",0,0,1,0,0,0,0 -"Due marescialli, I",1961,98,NA,7.3,41,0,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Due marines e un generale",1966,84,NA,3.4,18,14.5,14.5,0,14.5,14.5,14.5,0,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Due notti con Cleopatra",1953,78,NA,4.9,20,0,14.5,24.5,4.5,14.5,34.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Due occhi diabolici",1990,120,9000000,5.3,529,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Due once di piombo",1966,83,NA,5.3,5,0,24.5,0,0,24.5,0,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Due orfanelli, I",1947,90,NA,7.2,15,0,0,4.5,0,24.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Due rrringos nel Texas",1967,94,NA,5.4,8,14.5,0,0,14.5,14.5,24.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Due samurai per cento geishe",1962,98,NA,6.6,7,14.5,0,0,0,0,24.5,44.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Due soldi di speranza",1952,110,NA,6.7,21,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Due superpiedi quasi piatti, I",1976,98,NA,6.4,460,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Due vigili, I",1967,90,NA,5.3,7,0,24.5,0,14.5,0,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Due vite di Mattia Pascal, Le",1985,178,NA,6.3,19,14.5,0,0,0,0,0,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Duel",1969,1,NA,8,6,0,0,0,0,0,0,14.5,64.5,14.5,0,"",0,0,0,0,1,0,1 -"Duel Personality",1966,6,NA,4.4,25,4.5,14.5,4.5,14.5,4.5,24.5,4.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Duel Scene, 'By Right of Sword'",1904,2,NA,4.1,8,0,0,34.5,24.5,0,34.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Duel at Apache Wells",1957,69,150000,5.6,12,0,0,4.5,14.5,34.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Duel at Diablo",1966,103,NA,6.4,281,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Duel at Silver Creek, The",1952,77,NA,6,77,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Duel in the Jungle",1954,102,NA,5.8,16,0,0,4.5,4.5,14.5,34.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Duel in the Sun",1946,144,8000000,7,866,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Duel on the Mississippi",1955,72,NA,6.1,10,0,0,0,0,34.5,34.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Duelle (une quarantaine)",1976,121,NA,6.5,34,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Duellists, The",1977,95,900000,7.4,1929,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Duello nel Texas",1963,95,NA,5.4,15,0,14.5,4.5,0,24.5,14.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Duende y misterio del flamenco",1952,110,NA,5.4,5,24.5,24.5,0,0,0,24.5,0,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Duet for One",1986,107,NA,5.8,152,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Duets",2000,112,15000000,5.8,2414,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Duffy",1968,101,NA,4.9,48,0,0,4.5,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Duffy's Tavern",1945,97,NA,5,29,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Duga mracna noc",2004,200,NA,6.4,76,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Dugo ng vampira",1971,90,NA,5.2,15,0,4.5,4.5,4.5,14.5,24.5,24.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Duke Is Tops, The",1938,73,NA,5.1,30,0,4.5,4.5,14.5,44.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Duke of West Point, The",1938,96,NA,7,20,0,0,0,4.5,14.5,14.5,24.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Duke, The",1999,88,NA,5.1,80,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dukhovnyye golosa. Iz dnevnikov voyny. Povestvovanie v pyati chastyakh",1995,328,NA,7.8,14,0,0,0,0,0,4.5,24.5,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Dulcea sauna a mortii",2003,98,NA,6.8,13,24.5,0,4.5,0,4.5,0,0,4.5,0,45.5,"",0,0,0,0,0,0,0 -"Dulces horas",1982,106,NA,6.4,25,4.5,4.5,0,0,24.5,0,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Dulcima",1971,98,NA,5.1,18,0,0,4.5,4.5,4.5,34.5,4.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Dulcy",1940,73,NA,5.9,24,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dulhan, Made in USA",2005,109,NA,8.2,5,0,0,0,24.5,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,1,0 -"Duli shidai",1994,125,NA,6.9,82,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Dum pro dva",1987,78,NA,7.1,6,0,0,0,0,0,0,64.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Dum-Bom",1953,82,NA,3,13,0,44.5,0,14.5,24.5,4.5,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Duma",2005,100,NA,8.4,20,4.5,0,0,0,4.5,4.5,4.5,24.5,14.5,45.5,"PG",0,0,0,1,0,0,0 -"Duma Vez por Todas",1986,99,NA,6,9,0,0,0,14.5,14.5,24.5,24.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Dumb & Dumber",1994,101,16000000,6.6,27713,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Dumb Bell of the Yukon",1946,6,NA,7.3,13,0,0,0,0,4.5,24.5,4.5,34.5,0,34.5,"",0,1,1,0,0,0,1 -"Dumb Patrol",1931,7,NA,5.7,9,0,0,14.5,14.5,0,44.5,14.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Dumb Patrol",1964,7,NA,5.8,33,0,0,4.5,4.5,14.5,24.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Dumb and Dumberer: When Harry Met Lloyd",2003,85,19000000,3.3,4689,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Dumb-Hounded",1943,7,NA,7.7,49,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Dumbarton Bridge",1999,98,NA,3.9,19,14.5,24.5,14.5,0,4.5,4.5,0,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dumbo",1941,64,950000,7.4,6828,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,1,0,0,0 -"Dumm gelaufen",1997,88,NA,5.4,41,4.5,0,4.5,14.5,14.5,4.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Dummy",2002,90,NA,6.8,1022,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Dummy Doc",1993,5,NA,6.6,6,14.5,0,14.5,34.5,0,0,34.5,0,0,0,"",0,0,0,0,1,0,1 -"Dumping Elaine",2001,9,NA,7.6,13,0,0,0,4.5,0,4.5,4.5,64.5,0,14.5,"",0,0,0,0,0,0,1 -"Dun-Huang",1988,143,NA,6.2,43,0,4.5,14.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dunderklumpen!",1974,97,NA,6.7,172,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Dune",1984,190,45000000,6.3,16903,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Dune 7",2002,97,NA,4.6,9,44.5,0,0,14.5,0,0,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Dune Warriors",1990,80,NA,3.7,40,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Dung che sai duk",1994,100,NA,7.3,884,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Dung fong bat baai 2: fung wan joi hei",1992,107,NA,5.9,235,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,1,0 -"Dung fong saam hap",1993,86,NA,6.7,726,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Dung fong tuk ying",1986,93,NA,7.2,220,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Dungeon of Harrow",1962,74,NA,3.5,21,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Dungeonmaster, The",1985,73,NA,2.7,192,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Dungeons & Dragons",2000,107,35000000,4,7435,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Dunked in the Deep",1949,17,NA,6.8,44,0,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Dunkirk",1958,134,NA,6.8,166,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dunston Checks In",1996,88,NA,4.7,1017,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Dunwich Horror, The",1970,90,NA,4.4,426,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Duo luo tian shi",1995,96,NA,7.5,2179,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Duo-Sang",1994,167,NA,6.2,25,4.5,0,0,0,0,14.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Dupe od mramora",1995,86,NA,7.4,11,4.5,0,0,0,4.5,0,34.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Dupla do Barulho, A",1953,90,NA,6.4,5,0,0,0,0,0,44.5,64.5,0,0,0,"",0,0,1,0,0,0,0 -"Duplex",2003,89,40000000,5.7,4334,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Duplicate",1998,164,NA,5.9,87,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Dupont-Lajoie",1975,100,NA,7.4,98,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Duquesa roja, La",1997,84,NA,5.3,12,14.5,0,0,4.5,14.5,0,44.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Durango Kid, The",1940,61,NA,6.2,14,0,0,0,0,14.5,34.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Durango Kids",1999,87,NA,4.3,65,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Durchbruch Lok 234",1963,85,NA,5.7,8,14.5,0,0,0,24.5,14.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Durchs wilde Kurdistan",1965,95,NA,5.7,52,0,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Duri a morire",1978,88,NA,6.4,14,4.5,0,0,4.5,4.5,0,24.5,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"During One Night",1961,77,NA,4.9,10,0,0,0,14.5,34.5,0,24.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Durst",1993,90,NA,3.8,23,4.5,4.5,0,4.5,4.5,4.5,0,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Durusma",1999,101,NA,5.2,21,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Durval Discos",2002,96,NA,6.9,126,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Dusha",1981,93,NA,5.6,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Dushi qingyuan",1994,98,NA,5.6,41,0,0,4.5,0,64.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dushman",1971,177,NA,8.1,10,0,0,0,0,0,0,14.5,44.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Dusk",2002,33,NA,9.3,14,0,4.5,0,0,0,0,0,4.5,0,84.5,"",0,0,0,1,0,0,1 -"Dusk 'til Dawn",1997,50,NA,1.4,18,44.5,14.5,0,0,0,0,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dust",1985,96,NA,5.7,49,14.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Dust Be My Destiny",1939,88,NA,6.6,73,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dust Devil",1992,87,NA,5.6,321,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Dust Off the Wings",1997,78,NA,4.7,41,24.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Dust to Dust",1994,92,NA,5.8,11,34.5,0,0,0,14.5,0,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Dust to Glory",2005,97,NA,7.6,57,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,34.5,"PG",1,0,0,0,1,0,0 -"Dusting Cliff 7",1996,95,1300000,3.5,80,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,1,0,0,0 -"Dusty and Sweets McGee",1971,91,NA,6,15,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Dusza spiewa z cyklu 'Opowiesci weekendowe'",1997,56,NA,7.2,7,0,0,0,14.5,0,14.5,0,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Dutch",1991,107,NA,5.6,1509,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Dutch Girls",1985,83,NA,6.1,61,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Dutch Harbor: Where the Sea Breaks Its Back",1998,80,NA,9,10,0,0,0,0,0,0,24.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Dutch Master, The",1994,28,NA,5.5,51,4.5,0,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,1 -"Dutch Treat",1986,94,NA,4.4,43,24.5,4.5,4.5,4.5,0,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Dutchman",1967,55,NA,7,50,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Dutiful But Dumb",1941,17,NA,7.6,73,4.5,0,4.5,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Duty Dating",2002,94,NA,4.9,29,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Duvar",1983,117,NA,7.2,132,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Duxorcist, The",1987,8,NA,7.2,37,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Duze zwierze",2000,73,NA,6.6,151,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Dva boytsa",1943,80,NA,9.4,9,0,0,14.5,0,0,0,0,14.5,14.5,64.5,"",0,0,0,0,0,1,0 -"Dva dioptara dalekogledstvo",1976,89,NA,7,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,1,0,0,0,0 -"Dva kapitana",1955,98,NA,4.1,5,24.5,0,0,0,0,0,24.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Dva kapitana II",1993,70,NA,7.1,28,4.5,4.5,0,0,0,14.5,0,4.5,14.5,45.5,"",0,0,1,0,1,0,0 -"Dvadtsat dney bez voyny",1976,101,NA,6.6,45,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Dvadtsat shest dney iz zhizni Dostoevskogo",1980,90,NA,6.7,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,0,0,1,0 -"Dve strely. Detektiv kamennogo veka",1989,94,NA,4.3,17,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Dvenadtsat mesyatsev",1972,135,NA,7.6,7,0,0,0,0,0,0,45.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Dvenadtsataya noch",1955,90,NA,7.2,14,0,0,0,0,4.5,0,0,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Dvoryanskoe gnezdo",1969,111,NA,5.7,17,0,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Dvoynikat",1980,98,NA,9.2,27,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Dvoynoy kapkan",1985,139,NA,6.5,5,0,0,0,0,44.5,24.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Dwa ksiezyce",1993,133,NA,6.5,10,0,0,0,0,14.5,44.5,0,44.5,14.5,0,"",0,0,0,0,0,0,0 -"Dwa zebra Adama",1964,82,NA,7,6,0,0,0,0,0,34.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Dwaj ludzie z szafa",1958,14,NA,7,273,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Dweepa",2001,132,NA,6.3,13,0,0,0,4.5,0,44.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dworzec",1980,14,NA,4,11,4.5,0,4.5,4.5,14.5,4.5,24.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Dyadya Vanya",1970,104,NA,6.8,38,0,4.5,4.5,4.5,0,14.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Dybbuk B'sde Hatapuchim Hakdoshim, Ha",1998,93,NA,7.7,31,4.5,0,4.5,0,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Dybuk",1937,108,NA,6,33,0,0,4.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Dying Gaul, The",2005,101,4000000,4.3,70,4.5,24.5,4.5,0,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Dying Like Ophelia",2002,6,NA,8.9,9,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,1,0,0,1 -"Dying Young",1991,114,NA,5.2,2210,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Dying at Grace",2003,148,NA,8.4,29,0,0,4.5,0,0,14.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Dykkerdrengen",2003,30,NA,6,8,14.5,0,14.5,0,14.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Dykkerne",2000,91,NA,5.6,180,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Dykket",1989,90,NA,6.8,101,14.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Dymky",1966,85,NA,5.3,7,0,0,0,0,45.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Dynamit",1947,88,NA,6.8,8,0,0,0,0,24.5,45.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Dynamite",1929,126,NA,6.6,71,0,0,0,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Dynamite Brothers",1974,90,NA,1.3,21,44.5,14.5,4.5,4.5,0,0,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Dynamite Chicken",1972,76,NA,4.9,46,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Dynamite Jack",1961,103,NA,5.9,5,0,0,0,0,44.5,44.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Dynamite Johnson",1978,103,NA,4.2,5,24.5,0,0,24.5,0,0,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Dynamite Pass",1950,61,NA,5.1,13,0,0,4.5,4.5,24.5,34.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Dynamite Ranch",1932,59,NA,6.7,5,0,0,0,0,24.5,64.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Dynasteias, O",1986,89,NA,5.3,6,0,0,0,14.5,14.5,14.5,0,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Dyo modernoi glentzedes",1971,91,NA,3.7,5,0,24.5,24.5,0,24.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Dypets ensomhet",1995,7,NA,7.2,102,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,"",0,0,0,1,0,0,1 -"Dyrygent",1980,101,NA,6.2,50,4.5,4.5,4.5,0,4.5,24.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"DysEnchanted",2004,8,NA,5.8,44,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"DysFunktional Family",2003,89,3000000,5.6,207,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,1,0,0 -"Dyuba-Dyuba",1993,140,NA,7.8,20,0,0,0,0,0,14.5,14.5,24.5,44.5,14.5,"",0,0,0,1,0,1,0 -"Dzhamilya",1969,83,NA,6.5,11,0,0,0,0,4.5,4.5,4.5,45.5,0,14.5,"",0,0,0,1,0,0,0 -"Dzhek Vosmyorkin, amerikanets",1987,158,NA,3.9,6,14.5,0,14.5,14.5,34.5,0,0,0,14.5,0,"",0,0,1,0,0,0,0 -"Dzhentlmeny udachi",1972,88,NA,8.3,237,0,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Dzieci i ryby",1997,97,NA,5.9,12,4.5,0,4.5,0,4.5,34.5,0,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Dziecinne pytania",1981,110,NA,7.3,5,0,0,0,0,24.5,24.5,0,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Dzieciol",1970,85,NA,6.6,10,0,0,0,24.5,34.5,0,0,14.5,44.5,0,"",0,0,1,0,0,0,0 -"Dzieje grzechu",1975,130,NA,7,25,0,0,0,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Dzieje mistrza Twardowskiego",1996,97,NA,5.8,8,45.5,0,0,0,14.5,14.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Dzien swira",2002,93,NA,8.3,349,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Dzma",1981,80,NA,8,6,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,0,0,0,0,0,0 -"E Dio disse a Caino",1970,93,NA,6.7,35,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"E adesso sesso",2001,90,NA,2.1,25,64.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"E allora mambo!",1999,95,NA,6.5,119,0,4.5,0,4.5,4.5,14.5,44.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"E la nave va",1983,128,NA,7.4,632,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"E no naka no boku no mura",1996,112,NA,6.7,112,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"E poi lo chiamarono il magnifico",1972,123,NA,6.2,153,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"E tan qun hing ying hui",1976,96,NA,3.6,16,14.5,0,0,4.5,4.5,0,0,0,0,74.5,"",1,0,0,1,0,0,0 -"E venne un uomo",1965,90,NA,8.1,9,0,0,0,0,14.5,24.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"E-mail",2000,109,1000000,4.1,33,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"E.T. the Extra-Terrestrial",1982,120,10500000,7.8,44175,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"E=mc2",1996,94,NA,4.8,38,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"E=mc2",2002,93,NA,5.1,101,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"EGGcited Rooster, The",1952,6,NA,5.2,23,4.5,0,0,14.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"ELFilm",2001,21,NA,6.8,6,0,0,0,0,0,14.5,14.5,0,14.5,45.5,"",0,0,1,0,0,1,1 -"EMR",2004,87,NA,8,13,4.5,0,0,4.5,4.5,0,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Each Dawn I Crow",1949,8,NA,7.6,19,0,0,0,0,0,4.5,34.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Each Dawn I Die",1939,92,NA,7,210,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Eadweard Muybridge, Zoopraxographer",1974,59,NA,5.5,15,14.5,4.5,4.5,0,4.5,0,24.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Eager Beaver, The",1946,7,NA,6.3,33,4.5,0,4.5,0,14.5,24.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Eagle Has Landed, The",1976,131,6000000,6.7,2001,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Eagle Island",1986,90,NA,5.6,20,14.5,4.5,0,4.5,14.5,14.5,14.5,4.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Eagle Squadron",1942,109,NA,6.2,19,0,0,4.5,4.5,14.5,14.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Eagle and the Hawk, The",1933,68,NA,7,79,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Eagle and the Hawk, The",1950,104,NA,6.3,20,0,0,14.5,14.5,4.5,34.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Eagle in a Cage",1972,98,NA,6.9,10,14.5,0,0,0,0,24.5,45.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Eagle's Brood, The",1935,61,NA,7.3,24,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Eagle's Wing",1979,104,NA,5.2,79,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Eagle, The",1925,73,NA,6.7,128,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Earl Carroll Vanities",1945,91,NA,5.7,10,0,0,0,24.5,45.5,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Earl of Chicago, The",1940,87,NA,5.7,42,0,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Earl's Your Uncle",2004,19,10000,9.1,28,4.5,0,0,0,0,4.5,0,0,4.5,84.5,"",0,0,1,0,0,0,1 -"Early Abstractions",1987,23,NA,6.1,12,0,14.5,0,0,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Early Amateur Sound Film",1937,4,NA,6.2,7,0,0,0,0,44.5,14.5,14.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Early Bird",1983,5,NA,6.9,31,0,0,0,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Early Bird Dood It!, The",1942,9,NA,6.9,18,4.5,0,0,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Early Bloomer",2003,3,NA,5.2,26,0,4.5,14.5,0,0,24.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Early Frost",1982,92,NA,6.1,34,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Early Sports Quiz: What's Your I.Q. No. 13",1947,9,NA,5.3,8,0,24.5,0,24.5,14.5,0,34.5,0,0,0,"",0,0,0,0,1,0,1 -"Early Worm Gets the Bird, The",1940,8,NA,7,13,0,0,0,0,4.5,14.5,24.5,44.5,0,4.5,"",0,1,1,0,0,0,1 -"Early to Bed",1928,18,NA,7.1,45,0,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Early to Bed",1941,8,NA,7.4,41,0,0,0,4.5,4.5,14.5,4.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Early to Bet",1951,7,NA,5.8,58,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Earth",1998,110,NA,7.4,522,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Earth Dies Screaming, The",1965,62,NA,5.5,38,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Earth Girls Are Easy",1988,100,10000000,5,3952,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Earth vs the Spider",1958,73,NA,3.4,275,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Earth vs. the Flying Saucers",1956,83,NA,6,729,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"EarthQuake!",2002,2,NA,6.3,24,14.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Earthbound",1940,67,NA,4.8,16,4.5,0,0,34.5,4.5,14.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Earthbound",1981,94,NA,4.1,32,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Earthling, The",1980,97,NA,6.2,235,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Earthquake",1974,140,7000000,5.2,2106,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Earthworm Tractors",1936,69,NA,6.4,45,0,0,0,4.5,24.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Easier Said",1999,94,NA,3.4,39,34.5,4.5,24.5,0,4.5,4.5,4.5,4.5,0,14.5,"R",0,0,1,1,0,1,0 -"Easiest Way, The",1931,73,NA,6.2,28,0,4.5,0,4.5,4.5,24.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"East End Hustle",1976,91,NA,1.9,8,14.5,14.5,0,0,14.5,34.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"East Is East",1999,96,NA,6.9,4015,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"East Lynne",1931,102,NA,6.8,8,0,0,0,0,14.5,14.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"East Meets West",1936,75,NA,5.6,10,0,0,0,14.5,34.5,14.5,34.5,14.5,14.5,0,"",0,0,0,1,0,1,0 -"East Side Kids",1940,62,NA,5.9,29,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"East Side Story",1997,78,NA,7.2,70,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"East Side of Heaven",1939,88,NA,6.4,7,0,0,14.5,0,0,44.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"East Side, West Side",1927,90,NA,8.4,6,0,0,0,0,14.5,14.5,0,45.5,14.5,0,"",0,0,0,1,0,0,0 -"East Side, West Side",1949,108,NA,6.3,184,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"East of Borneo",1931,77,NA,5.3,14,0,0,14.5,14.5,14.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"East of Eden",1955,115,NA,7.8,3802,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"East of Elephant Rock",1977,93,NA,3.7,20,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"East of Euclid",2004,88,NA,7.1,10,14.5,0,0,14.5,0,14.5,0,45.5,0,24.5,"",0,0,1,0,0,0,0 -"East of Hope Street",1998,88,100000,5.6,14,4.5,14.5,14.5,0,14.5,4.5,4.5,0,0,34.5,"",0,0,0,1,0,0,0 -"East of Java",1935,72,NA,7.3,5,0,0,0,0,0,64.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"East of Sudan",1964,85,NA,4.8,16,4.5,14.5,4.5,0,34.5,14.5,14.5,0,4.5,14.5,"",0,0,0,1,0,1,0 -"East of Sumatra",1953,82,NA,5.1,35,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"East of the River",1940,74,NA,6.3,51,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Easter",2002,90,NA,7.1,9,0,0,0,0,24.5,14.5,24.5,0,0,44.5,"",0,0,1,1,0,0,0 -"Easter Parade",1948,107,2503654,7.4,1093,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Easter Yeggs",1947,7,NA,7,44,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Eastern Westerner, An",1920,24,NA,7,40,0,0,0,0,4.5,34.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Eastside",1999,94,NA,4.9,55,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Easy",1978,54,NA,6.4,28,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Easy",2003,99,NA,4.2,204,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Easy Come, Easy Go",1967,95,NA,3.8,165,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Easy Day",1997,20,NA,3.5,17,14.5,0,4.5,0,14.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Easy Does It",1946,25,NA,4.1,10,0,44.5,0,24.5,14.5,24.5,0,14.5,0,0,"",0,1,0,0,0,0,1 -"Easy Kill",1989,94,NA,3.5,10,64.5,0,24.5,0,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Easy Life",1944,20,NA,5.7,8,0,0,0,0,34.5,24.5,24.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Easy Listening",2002,85,NA,8.6,17,0,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,1,1,0,1,0 -"Easy Living",1937,88,NA,7.6,223,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Easy Living",1949,77,NA,6,74,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Easy Money",1948,94,NA,6.6,11,0,0,0,0,14.5,34.5,4.5,24.5,0,4.5,"",0,0,1,1,0,0,0 -"Easy Money",1983,95,NA,5.8,1019,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Easy Peckin's",1953,6,NA,6.7,16,0,0,4.5,0,4.5,34.5,24.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Easy Rider",1969,94,340000,7.2,10230,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Easy Riders, Raging Bulls: How the Sex, Drugs and Rock 'N' Roll Generation Saved Hollywood",2003,119,NA,7.1,307,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Easy Road",1978,94,NA,4.3,15,4.5,0,4.5,0,24.5,24.5,4.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Easy Six",2003,90,NA,5,37,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Easy Street",1917,19,NA,8,368,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Easy Virtue",1928,89,NA,5.8,226,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Easy Wheels",1989,94,NA,3.8,52,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Easy to Love",1934,65,NA,6.8,10,0,14.5,0,0,14.5,14.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Easy to Love",1953,96,NA,5.7,74,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Easy to Wed",1946,106,NA,6,63,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Eat",1963,45,NA,4.5,20,24.5,4.5,0,14.5,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Eat",2001,9,NA,6.6,64,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Eat My Dust!",1976,89,300000,4.5,95,14.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Eat This New York",2004,80,NA,5.9,14,0,0,0,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Eat Your Heart Out",1997,94,NA,5.7,136,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Eat Your Makeup",1968,45,NA,7.1,15,14.5,0,0,0,14.5,0,0,4.5,0,64.5,"",0,0,0,0,0,0,0 -"Eat a Bowl of Tea",1989,102,NA,6.3,182,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Eat and Run",1986,85,NA,3.2,55,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Eat at the Blue Fox",1983,77,NA,6.8,6,14.5,0,0,0,14.5,34.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Eat the Document",1972,54,NA,6.9,35,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Eat the Peach",1986,90,NA,5.2,72,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Eat the Rich",1987,90,NA,5.2,239,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Eaten Alive",1977,87,NA,5,364,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Eatin' on the Cuff or The Moth Who Came to Dinner",1942,7,NA,8,11,0,0,0,0,4.5,0,24.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Eating",1990,110,NA,6.7,78,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Eating",2005,13,60000,9.1,7,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Eating Air",1999,100,NA,5.2,43,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,4.5,0,"",1,0,0,0,0,1,0 -"Eating L.A.",1999,90,NA,3.9,25,14.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Eating Out",1993,6,NA,6.4,23,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Eating Out",2004,90,50000,6.8,182,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Eating Raoul",1982,87,350000,6.4,1351,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Eau chaude, l'eau frette, L'",1976,94,NA,6.8,47,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Eau de la vie",1993,13,NA,8.5,23,4.5,4.5,0,4.5,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Eau froide, L'",1994,92,NA,7.1,129,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Eau vive, L'",1957,96,NA,7.1,8,0,0,0,14.5,0,14.5,14.5,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Eaux d'artifice",1953,12,NA,6.7,85,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Eaux profondes",1981,94,NA,6.4,53,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Eban and Charley",2000,86,30000,4.5,110,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ebb Tide",1937,94,NA,6.8,14,0,0,4.5,0,0,4.5,34.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Ebba the Movie",1982,78,NA,6.5,35,0,4.5,0,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Ebbies Bluff",1993,91,NA,4.7,10,14.5,14.5,0,14.5,0,0,14.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Ebene 9",2000,14,NA,5.6,10,0,24.5,0,0,24.5,0,34.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Ebolusyon ng isang pamilyang pilipino",2004,647,NA,8.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Ebon Lundin",1973,78,NA,4.3,12,4.5,14.5,0,14.5,34.5,4.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Ecce Bombo",1978,103,NA,7.7,197,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ecce Homo Homolka",1969,85,NA,7.8,62,0,0,0,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Eccezzziunale... veramente",1982,95,NA,6.1,81,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Ecco fatto",1998,90,NA,7.1,61,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Ecco noi per esempio",1977,110,NA,4.5,13,4.5,0,24.5,0,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Echizen take-ningyo",1963,103,NA,6.4,9,0,0,0,24.5,0,14.5,14.5,44.5,0,14.5,"",0,0,0,1,0,1,0 -"Echo",1999,13,NA,5.4,16,0,14.5,0,0,24.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Echo",2001,12,NA,8.6,14,4.5,4.5,0,0,4.5,0,14.5,4.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Echo Murders, The",1945,75,NA,3.3,6,0,0,64.5,14.5,0,0,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Echo Park",1986,88,NA,5.6,155,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Echo of Diana",1963,61,NA,3.3,9,24.5,0,0,14.5,14.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Echoes",1983,89,NA,4.4,16,4.5,14.5,14.5,4.5,34.5,0,0,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Echoes of Paradise",1987,92,NA,5.3,21,0,0,14.5,14.5,14.5,4.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Echoes of a Summer",1976,99,NA,6,80,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Echos of Enlightenment",2001,86,NA,5.8,43,14.5,4.5,0,0,0,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Echte Kerle",1996,100,NA,7.2,364,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Eclipse",1995,95,NA,5.6,92,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Eclipse",2002,86,NA,7.1,7,14.5,0,0,0,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Eclipse of the Sun Virgin",1967,17,NA,6.4,6,0,0,0,0,34.5,0,45.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Eclisse, L'",1962,125,NA,7.6,622,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Ecstasies of Women, The",1969,80,NA,1,6,100,0,0,0,0,0,0,0,0,0,"",0,0,1,1,0,0,0 -"Ecstasy",1999,27,NA,3.5,14,24.5,4.5,0,4.5,24.5,0,0,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Ecstasy Girls, The",1979,97,NA,4.7,34,14.5,0,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Ed",1996,94,NA,2.8,562,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Ed",1999,11,NA,3.1,23,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Ed",2000,13,NA,6,5,0,0,0,0,24.5,64.5,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Ed Mort",1997,102,1500000,6.8,70,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ed Wood",1994,127,18000000,8,22612,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Ed and His Dead Mother",1993,86,1800000,5.3,413,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ed's Next Move",1996,88,NA,6.2,210,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Edad del sol, La",1999,95,NA,2.9,34,44.5,24.5,4.5,14.5,4.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,1,0 -"Eddie",1996,100,30000000,4.9,1348,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Eddie Cantor Story, The",1953,115,NA,5.2,39,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Eddie Duchin & His Orchestra",1933,10,NA,5.3,7,0,0,14.5,0,24.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Eddie Macon's Run",1983,95,NA,5.3,161,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Eddie Murphy Raw",1987,93,NA,6.7,2409,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Eddie Stargazer",1999,26,NA,4.9,10,44.5,14.5,0,0,0,0,14.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Eddie and the Cruisers",1983,95,NA,6.3,1217,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Eddie and the Cruisers II: Eddie Lives!",1989,104,NA,4.7,397,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Eddy Duchin Story, The",1956,123,NA,6.4,211,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Eden",1996,106,NA,5.7,138,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Eden",2001,91,NA,4.3,70,24.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Eden Myth, The",1999,88,NA,6.4,158,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,74.5,"R",0,0,0,1,0,0,0 -"Eden Valley",1994,95,NA,8.4,8,0,0,0,0,0,0,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Eden's Curve",2003,91,NA,4.5,74,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Edge of Darkness",1943,120,NA,7.2,192,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Edge of Doom",1950,99,NA,6.4,33,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Edge of Eternity",1959,80,700000,5.8,44,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Edge of Honor",1991,89,NA,5,72,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Edge of Madness",2002,99,NA,6.4,106,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Edge of Quarrel, The",2000,120,NA,8.4,19,24.5,0,0,4.5,14.5,0,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Edge of Sanity",1989,85,NA,4.5,154,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Edge of Seventeen",1998,103,NA,6.9,879,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Edge of the City",1957,85,NA,7,211,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Edge of the World, The",1937,74,NA,7.5,139,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Edge, The",1968,100,NA,7,5,0,0,0,0,44.5,0,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Edge, The",1997,117,NA,6.6,6035,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Edgeplay",2004,110,80000,7.2,17,14.5,4.5,0,0,4.5,4.5,4.5,0,4.5,45.5,"",0,0,0,0,1,0,0 -"Edges of the Lord",2001,95,7500000,7,639,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Edi",2002,97,NA,8.1,716,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Edin snimachen den",1969,54,NA,9,8,0,0,0,0,0,0,14.5,14.5,45.5,24.5,"",0,0,0,0,0,0,0 -"Edipo alcalde",1996,100,NA,7.2,67,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Edison's Frankenstein",1990,19,NA,1.5,5,24.5,24.5,0,0,0,0,0,0,24.5,44.5,"",0,0,0,0,0,1,1 -"Edison, the Man",1940,107,NA,7.3,193,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ediths Tagebuch",1984,102,NA,7,16,4.5,0,0,0,0,34.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Editing Is Everything",1999,7,NA,3.6,18,14.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,1 -"Edmund",2004,18,10000,8.7,7,0,0,0,0,0,0,14.5,14.5,45.5,14.5,"",0,0,0,1,0,0,1 -"Edogawa Rampo ryoki-kan: Yaneura no sanpo sha",1976,76,NA,6,12,4.5,0,4.5,4.5,24.5,0,4.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Edogawa ranpo taizen: Kyofu kikei ningen",1969,70,NA,6.1,7,0,0,14.5,0,14.5,0,14.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Edsville",1990,14,NA,9.3,10,0,0,0,0,0,14.5,0,14.5,14.5,74.5,"",0,0,1,0,0,0,1 -"Edtv",1999,122,60000000,6.2,10085,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Educating Kascha",1989,82,NA,4.7,8,0,0,24.5,0,14.5,14.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Educating Rita",1983,110,NA,6.9,2103,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Education for Death",1943,10,NA,7.7,156,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,1,0,1,0,0,1 -"Education of Allison Tate, The",1986,88,NA,4.6,8,0,24.5,0,0,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Education of Gore Vidal, The",2003,84,NA,6.3,14,4.5,0,0,0,0,44.5,14.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Education of Little Tree, The",1997,112,NA,6.9,291,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Education of Sonny Carson, The",1974,104,NA,6,33,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Edward II",1991,90,NA,7.1,431,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Edward Said: The Last Interview",2004,120,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Edward Scissorhands",1990,105,20000000,7.7,27017,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Edward, My Son",1949,112,NA,6.5,140,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Edwurd Fudwupper Fibbed Big",2000,7,NA,8.1,12,14.5,0,0,0,4.5,4.5,0,4.5,4.5,45.5,"",0,1,1,0,0,0,1 -"Eegah",1962,90,15000,1.9,1314,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Eenmaal geslagen, nooit meer bewogen",1995,82,NA,6.2,9,14.5,0,0,0,0,24.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Efecto mariposa, El",1995,110,NA,6.9,70,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Efeito Ilha, O",1994,100,NA,8.2,19,4.5,0,0,4.5,0,0,0,45.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Effect of Gamma Rays on Man-in-the-Moon Marigolds, The",1972,100,NA,6.9,253,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Effects",1978,87,NA,1,7,84.5,0,0,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Effects of Magic, The",1998,87,NA,4,18,14.5,0,4.5,14.5,14.5,24.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Effi Briest",1974,135,NA,6.9,270,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Effraction",1983,94,NA,5.3,6,0,0,0,14.5,14.5,34.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Effroyables jardins",2003,95,NA,6.9,248,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Efimeri poli",2000,82,NA,6.4,5,0,24.5,0,0,0,24.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Eftyhos trelathika",1961,91,NA,6,7,0,0,0,24.5,24.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Eger",2004,102,NA,5,10,0,0,24.5,0,24.5,44.5,0,14.5,14.5,0,"",1,0,0,0,0,0,0 -"Egg Collector, The",1940,8,NA,5.4,10,0,14.5,0,24.5,34.5,0,14.5,0,0,34.5,"",0,1,1,0,0,0,1 -"Egg Scramble, An",1950,7,NA,6.9,19,0,0,0,4.5,4.5,24.5,24.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Egg and I, The",1947,108,NA,6.9,372,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Egged On",1926,24,NA,8.8,17,0,0,0,0,4.5,0,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Egghead Rides Again",1937,7,NA,6.6,18,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Eggs",1995,86,NA,6.9,170,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Egoisci",2001,103,NA,5.3,18,14.5,14.5,4.5,4.5,4.5,14.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Egomania - Insel ohne Hoffnung",1986,84,NA,6.7,10,34.5,0,0,0,0,0,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Egon Schiele - Exzesse",1981,88,NA,6.4,30,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Egoshooter",2004,72,NA,6,19,14.5,4.5,0,14.5,0,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Egreti gelin",2005,100,NA,6.6,54,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Egri csillagok I",1968,71,NA,7.2,75,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,1,0 -"Egri csillagok II",1968,86,NA,7.6,49,0,0,0,4.5,0,4.5,4.5,4.5,24.5,45.5,"",0,0,0,0,0,1,0 -"Egyptian Melodies",1931,6,NA,7,43,0,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Egyptian, The",1954,139,5000000,5.7,376,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Egzekutor",1999,107,NA,5.6,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Ehad Mishelanu",1989,110,500000,7.1,30,4.5,0,0,4.5,0,4.5,34.5,4.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Ehe der Maria Braun, Die",1979,120,NA,7.6,1247,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ehe im Schatten",1947,105,NA,7.2,18,4.5,0,0,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ei",1987,58,NA,5.8,26,0,0,0,4.5,14.5,24.5,44.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Ei ist eine geschissene Gottesgabe, Das",1993,90,NA,8.4,15,4.5,0,0,0,0,14.5,14.5,14.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Ei, Das",1993,3,NA,6.9,14,14.5,0,4.5,0,4.5,0,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Eich Hifsakti L'fahed V'lamadeti L'ehov et Arik Sharon",1997,61,NA,8.2,6,0,0,0,14.5,0,0,14.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Eierdiebe",2003,87,NA,8.1,130,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Eifersucht",1925,58,NA,8.7,7,0,0,0,0,0,0,24.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Eiffeltornet",2004,13,NA,4.8,14,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,0,24.5,"",0,0,1,1,0,0,1 -"Eiga joyu",1987,130,NA,7.3,5,0,0,0,0,44.5,24.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Eiger Sanction, The",1975,123,NA,6.2,1701,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Eight",1998,13,NA,7.2,23,0,0,0,4.5,0,14.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Eight",2001,19,NA,8,12,4.5,0,4.5,0,4.5,0,4.5,0,0,64.5,"",0,0,0,0,0,0,1 -"Eight Crazy Nights",2002,76,NA,4.5,2074,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,1,1,0,0,0,0 -"Eight Days a Week",1997,92,NA,5.9,791,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Eight Iron Men",1952,80,NA,6.1,30,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Eight Lanes in Hamilton",2001,91,NA,5.6,13,34.5,0,0,0,0,4.5,4.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Eight Legged Freaks",2002,99,30000000,5.5,6362,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Eight Men Out",1988,119,6000000,7.3,3689,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Eight O'Clock Walk",1952,87,NA,6.6,15,4.5,0,0,0,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Eight on the Lam",1967,107,NA,4.5,57,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Eighteen Jade Arhats, The",1979,89,NA,5.6,12,0,0,0,0,34.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Eighteen and Anxious",1957,93,NA,4.1,5,0,24.5,0,0,0,0,0,0,64.5,24.5,"",0,0,0,1,0,0,0 -"Eighteenth Angel, The",1998,95,25000000,4.6,557,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Eijanaika",1981,151,NA,7.1,77,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Eikosi gynaikes kai ego",1973,98,NA,5.4,5,0,0,24.5,24.5,24.5,24.5,0,0,24.5,0,"",0,0,1,0,0,0,0 -"Ein Shemot Al Hadlatot",1997,84,NA,6.2,7,0,0,0,14.5,0,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Einai enas trelos... trelos... trelos Vengos",1965,87,NA,5.5,21,0,4.5,0,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Einayim G'dolot",1974,75,NA,6.9,11,0,0,0,0,4.5,0,0,44.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Einbrecher",1930,102,NA,7.5,5,0,0,24.5,24.5,0,0,44.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Eine murul",1987,25,NA,8.5,7,0,0,0,0,0,0,14.5,24.5,0,45.5,"",0,1,0,0,0,0,1 -"Einer spinnt immer",1971,84,NA,3,8,14.5,24.5,24.5,14.5,0,0,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Einer trage des anderen Last",1988,115,NA,8.8,29,0,0,0,0,0,0,4.5,24.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Einfach nur Liebe",1994,95,NA,7.8,20,4.5,0,4.5,0,0,14.5,4.5,64.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Einfach so bleiben",2002,15,NA,6.4,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Einleitung zu Arnold Schoenbergs Begleitmusik zu einer Lichtspielscene",1973,17,NA,5.6,5,24.5,0,0,24.5,0,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Einmal der liebe Herrgott sein",1942,93,NA,6.9,13,0,0,0,0,24.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Eins og skepnan deyr",1986,97,NA,5.1,6,0,0,34.5,14.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Einsamkeit der Krokodile, Die",2000,96,NA,7.7,62,4.5,4.5,0,0,4.5,14.5,14.5,34.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Einspruch III",2002,9,NA,5,6,0,0,0,45.5,14.5,34.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Einsteiger, Die",1985,100,NA,4.1,139,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Einstein des Sex, Der",1999,100,NA,7.5,154,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Einstein on the Beach: The Changing Image of Opera",1986,58,NA,7.1,13,0,0,4.5,0,0,0,14.5,4.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Einstein's Playground",2003,17,NA,5,17,0,4.5,0,14.5,4.5,14.5,0,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Eisenhans",1983,96,NA,8.2,5,0,0,0,0,0,44.5,0,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Eisenstein",2000,99,NA,5.8,54,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Eiserne Gustav, Der",1958,102,NA,6.2,49,4.5,4.5,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Eitoman - Subete no sabishii yoru no tame ni",1992,83,NA,4.3,18,4.5,14.5,4.5,14.5,24.5,24.5,0,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Ek Aur Ek Gyarah",2003,205,NA,6,36,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,"",1,0,1,1,0,1,0 -"Ek Chhotisi Love Story",2002,122,NA,2.8,19,24.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ek Din 24 Ghante",2003,95,NA,5.3,10,24.5,14.5,0,0,14.5,34.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Ek Din Pratidin",1979,95,NA,9,9,0,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Ek Rishtaa: The Bond of Love",2001,180,NA,5.4,58,14.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ekdromi, I",1966,85,NA,9.9,7,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,1,0,1,0 -"Ekeinos ki ekeini",1967,95,NA,7.8,6,0,0,0,0,0,14.5,14.5,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Eki Station",1981,132,NA,7.6,12,0,0,0,0,0,0,14.5,45.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Ekipazh",1980,144,NA,6.4,69,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Eko eko azaraku",1995,80,NA,5.4,107,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Eko eko azaraku II",1996,83,NA,5.5,39,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Eko eko azaraku III",1998,95,NA,5.1,33,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Eksamen",1993,7,NA,5.3,5,0,0,0,24.5,0,64.5,0,24.5,0,0,"",0,0,0,1,0,0,1 -"Ekspres, Ekspres",1996,76,NA,6.4,75,4.5,4.5,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"El",1953,92,NA,8.3,370,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,34.5,"",0,0,0,1,0,0,0 -"El 'Che' Guevara",1968,88,NA,5.1,13,0,14.5,4.5,4.5,0,34.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"El Alamein",2002,117,NA,7.3,131,0,4.5,0,0,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"El Cid",1961,182,6250000,7.1,1458,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"El Dorado",1966,126,NA,7.5,2432,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"El Gaucho Goofy",1943,8,NA,6.1,24,14.5,0,0,4.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"El Greco",1966,95,NA,6.5,15,0,0,0,0,14.5,14.5,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"El Paso",1949,103,NA,5.3,30,4.5,14.5,4.5,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"El Paso Kid, The",1946,54,NA,4.8,7,0,0,0,24.5,24.5,0,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"El Perro Negro: Stories from the Spanish Civil War",2005,84,NA,5.6,5,24.5,0,24.5,0,0,0,24.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"El Salvador: Another Vietnam",1981,53,NA,6.1,7,24.5,0,0,0,0,14.5,0,44.5,0,14.5,"",0,0,0,0,1,0,0 -"El less wal kilab",1962,120,NA,6.8,6,0,0,14.5,0,0,14.5,0,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Ela na agapithoume darling",1984,91,NA,6.1,15,14.5,0,24.5,0,0,0,0,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Ela sto thio",1950,89,NA,8,5,0,0,0,0,0,44.5,0,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Elaka Rune & Sune 4 - Domedagen",2003,90,NA,4.1,25,4.5,0,14.5,4.5,0,0,0,4.5,4.5,74.5,"",0,0,1,0,0,0,0 -"Elastic Affair, An",1930,10,NA,6.6,14,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Eldorado",1921,100,NA,7.6,36,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Eldorado",1995,104,NA,7,149,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Eldra",2002,93,NA,7.9,11,0,4.5,4.5,0,0,0,4.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Ele, o Boto",1987,108,NA,6.9,45,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Eleanor Roosevelt Story, The",1965,90,NA,7.5,10,0,0,0,0,14.5,24.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Election",1999,103,8500000,7.4,17521,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Electra",1996,87,NA,3.1,209,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Electra Glide in Blue",1973,114,NA,6.7,493,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Electric Boogie",1983,30,NA,5.5,6,0,0,0,0,45.5,0,14.5,0,0,34.5,"",0,0,0,0,1,0,1 -"Electric Dragon 80.000 V",2001,55,NA,6.9,226,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Electric Dreams",1984,95,NA,5.8,1355,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Electric Earthquake",1942,9,NA,7.1,48,14.5,0,0,0,4.5,14.5,34.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Electric Horseman, The",1979,122,NA,5.8,1293,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Electric House, The",1922,23,NA,7.5,157,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Electrical Power",1938,10,NA,5.8,7,14.5,0,0,0,24.5,14.5,24.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Electrocuting an Elephant",1903,1,NA,4.3,79,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Electronic Labyrinth THX 1138 4EB",1970,15,NA,6.2,418,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Elefante y la bicicleta, El",1994,81,NA,6.6,23,4.5,0,0,4.5,0,4.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Elefantenherz",2002,95,NA,8.3,62,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Elefteri katadissi",1995,120,NA,6.9,6,0,0,0,0,0,14.5,0,45.5,34.5,0,"",0,0,0,0,0,0,0 -"Elegante, El",2003,17,2500,8.6,7,0,14.5,0,0,0,0,0,14.5,0,74.5,"",0,0,1,0,0,0,1 -"Elegiya",1985,30,NA,9,7,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,0,1,0,1 -"Elektra",2005,96,43000000,4.9,5120,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Element of Doubt",1996,100,NA,6.5,43,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Elementary Phrases",1994,38,NA,9,5,0,0,0,0,0,0,0,24.5,44.5,44.5,"",0,0,0,0,0,0,1 -"Eleni",1985,114,NA,6.3,207,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Elenya",1992,87,NA,5.2,14,4.5,0,0,34.5,4.5,24.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Elephant",2003,81,3000000,7.3,9203,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Elephant Boy",1937,80,NA,6.6,64,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Elephant Boy",2004,25,NA,9.1,10,0,0,0,0,0,0,14.5,24.5,24.5,45.5,"",0,0,0,1,0,0,1 -"Elephant Called Slowly, An",1969,91,NA,4,10,0,0,24.5,34.5,0,14.5,0,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Elephant Juice",1999,86,NA,4.2,90,4.5,14.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Elephant Man, The",1980,124,5000000,8.2,16422,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Elephant Palm Tree",2004,10,NA,5.8,13,34.5,0,0,4.5,0,14.5,0,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Elephant Song",1994,59,NA,5.8,15,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Elephant Stampede",1951,71,NA,5.6,13,0,0,0,14.5,24.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Elephant Walk",1954,103,NA,5.8,235,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Elephant's Egg, The",2004,15,30000,4.6,12,0,0,4.5,0,0,4.5,14.5,0,14.5,45.5,"",0,0,1,0,0,0,1 -"Elevated",1997,17,NA,6.5,115,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Elevator Girls In Bondage",1972,56,NA,2.4,10,84.5,14.5,14.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Elevator Movie",2004,95,25000,6.1,13,24.5,0,0,0,4.5,0,0,4.5,0,64.5,"",0,0,0,1,0,0,0 -"Elevator World",1999,4,NA,4.9,42,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Eleventh Hour",1942,8,NA,6.7,33,0,4.5,4.5,0,4.5,34.5,24.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Elf",2003,95,33000000,7,10165,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,0,0,0,0 -"Eli's Lesson",1992,50,NA,4.5,6,0,0,0,34.5,14.5,14.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Elia Kazan: A Director's Journey",1995,75,NA,7,7,14.5,0,0,0,0,14.5,44.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Eliana em O Segredo dos Golfinhos",2005,94,NA,7.4,14,24.5,0,0,0,0,0,0,0,0,74.5,"",1,0,0,0,0,0,0 -"Eliana, Eliana",2002,90,NA,7,41,4.5,4.5,0,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Elimination Dance",1998,9,NA,7.3,27,0,0,4.5,4.5,0,4.5,14.5,4.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Eliminators",1986,96,NA,3.4,130,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Elina - Som om jag inte fanns",2002,77,NA,7.4,198,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Eline Vere",1991,132,NA,5.9,81,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Elippathayam",1981,121,NA,3.4,12,4.5,4.5,0,0,0,0,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Elisa antes del fin del mundo",1997,80,NA,6.6,37,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Elise",1985,106,NA,4,6,0,0,0,84.5,0,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Eliso",1928,90,NA,7.2,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Elite",2000,99,NA,3.8,157,24.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Elixir d'Anvers",1996,105,NA,5.4,15,4.5,0,0,24.5,14.5,24.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Eliza Fraser",1976,130,NA,5.4,25,4.5,4.5,0,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Eliza's Horoscope",1975,120,NA,6.3,12,24.5,4.5,0,14.5,0,0,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Elizabeth",1998,124,25000000,7.6,14733,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Elizabeth of Ladymead",1948,97,NA,6.2,13,4.5,0,0,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Elkerlyc",1975,94,NA,3.4,9,14.5,14.5,0,14.5,0,34.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ella Enchanted",2004,96,35000000,6.5,2502,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"Elle",1995,86,NA,5.1,6,0,0,0,0,45.5,0,0,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Elle cause plus, elle flingue",1972,87,NA,5,23,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Elle voit des nains partout!",1982,85,NA,5,38,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Elle voulait faire quelque chose",1994,14,NA,1.2,14,84.5,0,0,0,0,0,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Ellen's Energy Adventure",1996,45,NA,7.3,73,4.5,0,0,4.5,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Ellery Queen and the Murder Ring",1941,70,NA,6,5,0,0,0,24.5,0,24.5,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Ellery Queen and the Perfect Crime",1941,68,NA,5.3,7,0,0,14.5,0,44.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Ellery Queen's Penthouse Mystery",1941,69,NA,4.7,8,0,0,34.5,14.5,24.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Ellery Queen, Master Detective",1940,69,NA,5.2,12,0,0,0,4.5,34.5,24.5,24.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Elles",1997,98,NA,7.3,125,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Elles font tout",1978,80,NA,5.2,6,0,0,14.5,45.5,0,0,0,34.5,0,0,"",0,0,1,0,0,0,0 -"Elles n'oublient jamais",1994,107,NA,5.5,72,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Ellie",1984,88,NA,2.5,34,24.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Ellie Parker",2001,95,NA,4.6,24,14.5,4.5,0,4.5,0,0,4.5,4.5,0,45.5,"",0,0,1,0,0,0,1 -"Elling",2001,89,NA,7.6,3014,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,1,1,0,0,0 -"Elliot Flies",2003,13,1000,4.9,12,24.5,0,0,4.5,4.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,1 -"Ellis Island",1936,67,NA,6.3,8,0,0,24.5,0,14.5,24.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Ellis in Glamourland",2004,95,NA,5.6,137,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Elly Petersen",1944,100,NA,6.2,12,0,0,4.5,0,24.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Elmer Elephant",1936,8,NA,6.5,91,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Elmer Gantry",1960,146,3000000,7.8,1771,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Elmer's Candid Camera",1940,8,NA,5.9,90,0,4.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Elmer's Pet Rabbit",1941,8,NA,6,46,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Elmer, the Great",1933,72,NA,6.8,50,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Elokuu",1956,94,NA,8.5,24,0,0,0,4.5,0,4.5,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Elopement",1951,82,NA,5.9,9,0,0,14.5,0,24.5,14.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Elopement on Horseback",1898,1,NA,3.6,6,14.5,0,14.5,0,0,34.5,34.5,0,0,0,"",0,0,0,1,0,0,1 -"Elsewhere",2001,240,NA,8.5,30,0,0,0,0,0,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Elsker dig for evigt",2002,113,NA,7.7,1068,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Elsker elsker ikke...",1995,85,NA,5.4,12,0,0,0,24.5,14.5,45.5,4.5,0,0,0,"",0,0,0,1,0,1,0 -"Elskere",1963,97,NA,6.1,18,14.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Elstree Calling",1930,86,NA,5.9,32,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Elusive Pimpernel, The",1950,109,NA,6.6,107,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Elves",1990,89,NA,2.7,85,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Elvira's Haunted Hills",2001,90,1500000,5.2,307,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Elvira, Mistress of the Dark",1988,96,20000000,5.3,1238,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Elvis",1997,65,NA,1.2,6,34.5,0,0,14.5,0,0,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Elvis & June: A Love Story",2002,46,NA,1,8,74.5,0,0,0,0,0,0,0,0,24.5,"",0,0,0,0,1,0,0 -"Elvis Gratton",1981,20,NA,6.5,200,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Elvis Gratton 3: Le retour d'Elvis Wong",2004,105,NA,3.1,88,24.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Elvis Gratton: Le king des kings",1985,89,NA,6.6,262,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Elvis In Hollywood",1993,60,NA,2.5,20,24.5,14.5,4.5,14.5,4.5,24.5,0,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Elvis Is Alive! I Swear I Saw Him Eating Ding Dongs Outside the Piggly Wiggly's",1998,90,NA,5.6,43,34.5,0,0,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Elvis Lives!",1997,9,NA,3.3,20,24.5,14.5,4.5,4.5,0,0,4.5,14.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Elvis Meets the Spider-People From Hell",1989,3,NA,6.2,5,44.5,0,0,0,0,24.5,0,0,24.5,24.5,"",0,1,1,0,0,0,1 -"Elvis On Tour",1972,93,NA,6,219,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Elvis Stories",1989,30,NA,6.3,46,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Elvis Took a Bullet",2001,91,NA,2,17,14.5,14.5,4.5,14.5,0,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Elvis! Elvis!",1976,101,NA,6.1,28,0,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Elvis, Der",1987,23,NA,2.9,12,34.5,14.5,0,0,0,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Elvis: That's the Way It Is",1970,94,NA,7,422,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"PG",0,0,0,0,1,0,0 -"Elvjs e Merilijn",1998,93,NA,6.4,28,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Elysium",2003,85,NA,3.3,52,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,1,0,0,0,0,0 -"Em dic Sara",1999,90,NA,7.3,25,0,0,4.5,4.5,14.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Emak-Bakia",1926,18,NA,7.1,57,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Emanuelle e Lolita",1978,83,NA,6.4,11,4.5,14.5,0,14.5,0,0,4.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Emanuelle e gli ultimi cannibali",1977,90,NA,4.9,218,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Emanuelle fuga dall'inferno",1983,90,NA,5.1,46,4.5,0,14.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Emanuelle in America",1977,82,NA,5.1,191,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Emanuelle nera",1975,91,NA,4.9,129,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Emanuelle nera No. 2",1976,91,NA,4.2,13,24.5,4.5,0,24.5,14.5,4.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Emanuelle nera orient reportage",1976,87,NA,4.6,131,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Embajador de la India, El",1987,85,NA,4,9,0,0,14.5,0,24.5,0,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Embalmer, The",1996,85,50000,1.4,22,34.5,14.5,4.5,0,0,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Embassy",1972,90,NA,4.9,22,0,0,4.5,24.5,24.5,4.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Emberek a havason",1942,88,NA,8.6,117,0,0,0,0,0,4.5,4.5,4.5,4.5,94.5,"",0,0,0,0,0,0,0 -"Embezzler, The",1954,61,NA,4.8,11,0,4.5,0,14.5,14.5,44.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Embrace of the Vampire",1994,93,800000,4.2,1551,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Embrace the Darkness",1999,93,NA,2.8,88,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Embrasse-moi",1989,95,NA,7.4,5,0,0,0,0,24.5,24.5,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Embrassez qui vous voudrez",2002,103,NA,7.1,556,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Embrujo de Shanghai, El",2002,119,NA,6.4,115,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Embrujo, Un",1998,125,NA,7.7,62,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Embryo",1976,104,NA,4.6,136,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Embun",2002,135,NA,9.4,12,4.5,0,0,0,0,14.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Emerald City",1988,92,NA,5.4,83,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Emerald Forest, The",1985,110,NA,6.6,1447,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Emerald Isle, The",1949,7,NA,3.4,8,24.5,14.5,14.5,0,14.5,14.5,0,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Emergency",1962,63,NA,4,5,0,0,0,44.5,44.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Emergency Call",1933,65,NA,6.7,10,0,0,0,0,14.5,34.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Emergency Call",1952,84,NA,5.7,15,0,0,14.5,24.5,4.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Emigrante, L'",1973,115,NA,5.2,6,14.5,0,0,34.5,34.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Emil and the Detectives",1935,70,NA,7.4,21,4.5,0,0,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Emil and the Detectives",1964,99,NA,5.8,52,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Emil och griseknoen",1973,95,NA,7,137,0,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Emil und die Detektive",1931,75,NA,7.9,52,0,0,0,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Emil und die Detektive",1954,90,NA,6.7,39,4.5,4.5,0,4.5,14.5,4.5,44.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Emil und die Detektive",2001,111,NA,6.4,112,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Emile",2003,92,NA,6.1,119,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Emilie Muller",1993,20,NA,8.7,25,0,0,0,0,4.5,0,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Emilienne",1975,95,NA,4.9,23,4.5,0,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Emily",1976,87,NA,5.2,37,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Emily's Last Date",1996,24,NA,9.2,6,0,0,0,0,0,14.5,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Eminent Domain",1991,106,NA,5.6,102,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Emiris kai o kakomiris, O",1964,88,NA,4.2,6,0,0,14.5,34.5,14.5,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Emissary, The",1989,98,NA,4,8,0,24.5,14.5,24.5,14.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Emitai",1971,103,NA,7,8,0,0,0,0,0,24.5,24.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Emma",1932,72,NA,6.5,80,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Emma",1996,121,6000000,6.9,6431,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,0,0,1,0 -"Emma",1999,25,NA,6,19,0,0,4.5,4.5,4.5,24.5,24.5,14.5,0,14.5,"",0,0,1,0,0,1,1 -"Emma Mae",1976,100,NA,7.2,8,0,0,0,14.5,24.5,0,0,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Emma sono io",2002,87,NA,5.7,23,0,0,0,4.5,14.5,24.5,24.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Emma's War",1986,94,NA,4.2,15,0,14.5,0,34.5,14.5,4.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Emmanuel's Gift",2005,80,NA,6.7,7,0,0,0,0,0,14.5,0,0,14.5,74.5,"",0,0,0,0,1,0,0 -"Emmanuelle",1974,95,NA,4.7,1296,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Emmanuelle 2",1975,84,NA,4.5,391,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Emmanuelle 2: A World of Desire",1994,90,NA,3.6,60,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Emmanuelle 3: A Lesson In Love",1994,88,NA,3.6,43,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Emmanuelle 4",1984,89,NA,3.4,182,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Emmanuelle 4: Concealed Fantasy",1994,94,NA,3.1,37,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Emmanuelle 5: A Time to Dream",1994,93,NA,2.8,46,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Emmanuelle 6",1988,80,NA,2.9,74,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Emmanuelle 6: One Final Fling",1994,87,NA,3.5,51,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Emmanuelle 7: The Meaning of Love",1994,93,NA,3.1,38,24.5,4.5,4.5,14.5,14.5,0,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Emmanuelle Forever",1993,81,NA,2.8,45,34.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,34.5,"",0,0,0,1,0,1,0 -"Emmanuelle Goes to Cannes",1985,77,NA,1.5,15,44.5,14.5,24.5,0,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Emmanuelle V",1987,85,NA,3.1,138,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Emmanuelle in Soho",1981,72,NA,3.4,18,24.5,0,14.5,14.5,24.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Emmanuelle in Venice",1993,83,NA,2.3,23,24.5,4.5,4.5,4.5,0,4.5,4.5,0,4.5,44.5,"",0,0,0,1,0,1,0 -"Emmanuelle's Love",1993,83,NA,3.1,52,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Emmanuelle's Magic",1992,90,NA,2.3,49,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Emmanuelle's Perfume",1992,89,NA,2.4,28,14.5,14.5,14.5,4.5,4.5,0,0,0,0,45.5,"",0,0,0,1,0,1,0 -"Emmerdeur, L'",1973,90,NA,7.1,232,4.5,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Emmerdeuses, Les",1976,82,NA,6.4,5,44.5,0,0,0,0,0,0,0,0,64.5,"",1,0,1,0,0,0,0 -"Emmerich",2000,12,NA,2.3,12,24.5,0,0,0,0,0,0,4.5,0,64.5,"",0,0,1,0,0,0,1 -"Emmett's Mark",2002,104,4500000,6.2,427,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Emoh Ruo",1985,93,NA,6.1,16,0,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Emotional Backgammon",2003,93,NA,1.2,18,45.5,4.5,4.5,0,0,4.5,0,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Emperor Jones, The",1933,80,250000,6.1,98,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Emperor Waltz, The",1948,110,4070248,6.1,151,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Emperor of Peru, The",1982,81,NA,3.5,11,24.5,4.5,0,14.5,4.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Emperor of the Bronx",1988,104,NA,7.9,12,0,4.5,0,4.5,14.5,0,0,0,4.5,45.5,"",0,0,0,0,0,0,0 -"Emperor of the North Pole",1973,116,NA,7,708,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Emperor's Candlesticks, The",1937,89,NA,6.6,49,0,4.5,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Emperor's Club, The",2002,109,12500000,6.7,3056,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Emperor's New Clothes, The",2001,107,NA,7.1,680,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG",0,0,1,0,0,0,0 -"Emperor's New Groove, The",2000,78,100000000,7.4,8532,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Emperor's Wife, The",2003,100,NA,5.8,105,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Empire",1964,485,NA,5.5,46,34.5,0,0,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Empire",2002,90,3500000,6,1718,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Empire Records",1995,107,NA,6.2,8990,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Empire State",1987,104,NA,5.1,17,4.5,0,14.5,14.5,24.5,14.5,14.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Empire des loups, L'",2005,128,NA,4.4,54,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Empire of Ash II",1988,86,NA,3.3,24,24.5,4.5,24.5,4.5,0,4.5,0,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Empire of Ash III",1989,98,NA,3.4,13,24.5,0,4.5,4.5,4.5,4.5,0,0,24.5,24.5,"",1,0,0,0,0,0,0 -"Empire of the Air: The Men Who Made Radio",1991,100,NA,8.2,54,4.5,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Empire of the Ants",1977,89,NA,3.1,497,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Empire of the Spiritual Ninja",1987,90,NA,3.8,6,14.5,0,64.5,0,0,0,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Empire of the Sun",1987,154,38000000,7.5,9963,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Emploi du temps, L'",2001,134,NA,7.2,1090,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Employee of the Month",2004,97,NA,5.9,870,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Employee of the Month, The",2002,80,NA,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Employees' Entrance",1933,75,188000,7.2,106,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Emporte-moi",1999,94,NA,6.8,305,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Empreintes",2004,6,NA,7.5,10,0,0,0,14.5,14.5,0,14.5,45.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Empty",2001,23,NA,8.5,13,0,0,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Empty Beach, The",1985,85,NA,4.6,25,4.5,4.5,4.5,14.5,34.5,14.5,0,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Empty Bed, An",1990,60,NA,5.8,8,0,0,14.5,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Empty Building, The",2004,40,170000,9.5,11,0,0,0,0,0,0,0,14.5,4.5,74.5,"",0,0,0,1,0,0,1 -"Empty Holsters",1937,62,NA,5.2,8,0,0,24.5,14.5,34.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Empty Mirror, The",1996,118,NA,4.8,110,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Empty Places",1999,20,NA,5.2,17,4.5,0,4.5,14.5,0,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Empty Saddles",1936,67,NA,8.8,5,0,0,24.5,0,24.5,44.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Emtehan",2002,80,NA,7.4,21,0,0,0,0,0,4.5,44.5,44.5,4.5,0,"",0,0,0,1,0,0,0 -"En attendant la cigogne",1997,16,NA,9.2,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,0,0,1,0,1 -"En avoir (ou pas)",1995,89,NA,6.9,108,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"En brazos de la mujer madura",1997,105,NA,8.2,44,0,0,0,4.5,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"En camas separadas",2003,17,NA,5.9,8,0,0,0,14.5,0,24.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,1 -"En cas de malheur",1958,122,NA,6.6,89,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"En compagnie d'Antonin Artaud",1993,90,NA,6.7,19,0,0,14.5,14.5,0,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"En compagnie de Max Linder",1963,88,NA,7.2,9,0,0,0,0,0,14.5,14.5,44.5,24.5,14.5,"",0,0,1,0,0,0,0 -"En dag til i solen",1998,95,NA,6.5,40,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"En effeuillant la marguerite",1956,98,NA,5.5,56,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"En el espejo del cielo",1998,10,NA,7.4,50,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"En el nombre del hijo",1987,90,NA,3.9,8,24.5,14.5,0,14.5,14.5,0,0,0,0,34.5,"",0,0,0,1,0,0,0 -"En enda natt",1939,90,NA,5.9,35,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"En face",2000,127,NA,4.6,138,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"En garde",2004,94,NA,7.6,20,0,0,0,0,4.5,4.5,34.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"En haut des marches",1983,92,NA,5.9,5,0,0,24.5,0,0,0,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"En jouant 'Dans la compagnie des hommes'",2003,118,NA,6.1,40,14.5,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"En la ciudad",2003,110,NA,6.5,196,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"En la palma de tu mano",1951,90,NA,9.7,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,1,0,0,0 -"En la puta calle!",1997,90,NA,7.6,13,14.5,4.5,4.5,0,14.5,0,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"En la puta vida",2001,103,1500000,6.9,117,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"En las ruinas de Babilonia",1960,120,NA,5,5,0,0,0,44.5,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"En marchant",1969,5,NA,7.8,18,0,0,0,4.5,4.5,0,24.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"En medio de la nada",1994,93,NA,5.4,6,0,14.5,0,14.5,0,34.5,14.5,14.5,0,0,"",1,0,0,1,0,0,0 -"En plein coeur",1998,101,NA,5.8,184,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"En retirada",1984,87,NA,5.7,7,0,0,14.5,14.5,0,24.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"En som Hodder",2003,80,NA,5.3,48,4.5,4.5,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"En territoire indien",2003,97,NA,5.3,23,24.5,4.5,4.5,14.5,24.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"En toute innocence",1988,95,NA,6.2,36,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"En un mundo nuevo",1972,92,NA,7,7,14.5,0,0,24.5,0,0,0,0,0,45.5,"",0,0,1,0,0,0,0 -"En vacances",2000,105,NA,6.7,30,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ena astio koritsi",1970,102,NA,3.8,8,24.5,0,0,34.5,0,24.5,14.5,0,0,0,"",0,0,1,0,0,1,0 -"Ena asylipto koroido",1969,84,NA,6.2,8,0,0,0,14.5,0,0,34.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Ena exypno exypno moutro",1965,84,NA,6.7,7,0,0,0,14.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Ena gelasto apogevma",1979,97,NA,6.9,6,0,0,0,0,0,14.5,14.5,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Ena koritsi gia dio",1963,90,NA,7.5,9,0,0,0,14.5,0,0,44.5,34.5,14.5,0,"",0,0,1,0,0,1,0 -"Ena tank sto krebati mou",1975,97,NA,5.7,11,0,4.5,4.5,0,24.5,24.5,14.5,4.5,0,0,"",0,0,1,1,0,0,0 -"Ena votsalo sti limni",1952,102,NA,8.9,26,0,0,0,0,0,0,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Enamorada",1946,99,NA,8.4,49,0,0,0,0,4.5,4.5,14.5,24.5,4.5,45.5,"",0,0,1,1,0,1,0 -"Enamorado, El",1952,95,NA,7.1,11,0,0,0,4.5,14.5,14.5,14.5,34.5,0,0,"",0,0,1,1,0,0,0 -"Enan no musume",2001,120,NA,7.2,6,0,0,0,0,0,0,64.5,0,34.5,0,"",0,0,0,0,1,0,0 -"Enas Vengos gia oles tis douleies",1970,82,NA,7.8,6,0,0,0,14.5,0,0,14.5,34.5,0,34.5,"",0,0,1,0,0,0,0 -"Enas afragos Onasis",1969,101,NA,5.2,9,0,24.5,0,24.5,24.5,14.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Enas ippotis gia ti Vasoula",1968,94,NA,6.3,17,0,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Enas iros me padoufles",1958,98,NA,6.8,23,0,0,0,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Enas ki enas",2000,96,NA,6.4,60,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Enas laberos ilios",1999,36,NA,6,5,0,24.5,24.5,0,0,0,0,44.5,24.5,0,"",0,0,0,0,0,0,1 -"Enas nomotagis politis",1974,89,NA,7.8,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Enas ntelikanis",1963,100,NA,8.4,5,0,0,0,0,0,24.5,0,0,84.5,0,"",0,0,1,0,0,0,0 -"Enas trelos glentzes",1970,88,NA,6.4,7,0,0,0,0,24.5,0,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Enas trelos, trelos aeropeiratis",1973,102,NA,2.7,12,14.5,14.5,24.5,4.5,4.5,4.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Enas vlakas kai misos",1959,69,NA,7,6,0,0,0,0,0,14.5,34.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Enbamingu",1999,96,NA,6.2,9,0,14.5,0,0,14.5,34.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Encadenada, La",1975,95,NA,5.6,9,0,14.5,14.5,0,14.5,14.5,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Enceinte ou lesbienne?",1996,5,NA,4.4,7,0,14.5,0,0,44.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,1 -"Enchanted",1998,96,NA,6.3,36,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Enchanted April",1935,66,NA,6.1,32,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Enchanted April",1992,95,NA,7.4,1313,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Enchanted Cottage, The",1945,91,NA,7.4,320,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Enchanted Drawing, The",1900,2,NA,6.3,52,4.5,4.5,4.5,0,14.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Enchanted Forest, The",1945,78,NA,7,33,0,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Enchanted Island",1958,93,NA,5,21,0,4.5,14.5,4.5,14.5,24.5,24.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Enchanted Journey, The",1984,90,NA,7,22,0,0,4.5,0,0,14.5,4.5,24.5,4.5,44.5,"",0,1,0,0,0,0,0 -"Enchanted Square, The",1947,10,NA,5.8,7,0,0,14.5,0,0,0,0,24.5,44.5,14.5,"",0,1,0,0,0,0,1 -"Enchantment",1948,100,NA,6.9,90,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Encino Man",1992,88,NA,5,4504,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Encontros Imperfeitos",1993,90,NA,5.3,18,14.5,4.5,0,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Encore",1952,89,NA,7.6,39,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Encore",1996,96,NA,6.8,50,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Encounter at Raven's Gate",1988,94,NA,4.1,62,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Encounter in the Thrid Dimension",1999,40,NA,5.2,100,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Encounter with the Unknown",1973,90,NA,4.8,28,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Encounter, The",1999,12,NA,5,25,0,0,0,4.5,4.5,0,4.5,0,4.5,74.5,"",0,0,0,0,0,0,1 -"End Play",1975,80,NA,4.9,25,4.5,14.5,4.5,14.5,4.5,4.5,14.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"End of August, The",1982,105,NA,3.9,8,0,0,14.5,24.5,0,0,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"End of Days",1999,121,83000000,5.3,18237,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"End of Innocence, The",1990,102,NA,5.8,52,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"End of Suburbia: Oil Depletion and the Collapse of the American Dream, The",2004,78,60000,7.6,42,4.5,0,4.5,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"End of Violence, The",1997,122,5000000,5.4,1575,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"End of the Affair, The",1955,105,NA,7.1,93,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"End of the Affair, The",1999,102,23000000,7,4808,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"End of the Century",2003,110,NA,7.7,240,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"End of the Golden Weather, The",1991,100,NA,4.8,31,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"End of the Harvest",1995,53,NA,2.2,33,34.5,4.5,0,0,0,0,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"End of the Law",2003,88,NA,3.3,22,14.5,4.5,14.5,4.5,0,4.5,4.5,0,4.5,44.5,"R",1,0,0,0,0,0,0 -"End of the Line",1988,103,NA,5.7,123,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"End of the Night",1990,110,NA,6.3,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"End of the River, The",1947,80,NA,6.1,21,0,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"End of the Road",1970,110,NA,5.2,54,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"End of the Trail",1932,61,NA,5.5,12,0,0,4.5,4.5,14.5,4.5,4.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"End of the World",1934,54,NA,3.4,9,24.5,0,0,24.5,14.5,24.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"End of the World",1977,88,NA,3,64,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"End of the World in Four Seasons, The",1995,13,NA,6.8,13,0,0,0,4.5,0,14.5,4.5,45.5,0,14.5,"",0,1,0,0,0,0,1 -"End, The",1953,35,NA,8.5,8,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"End, The",1978,100,NA,6,569,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"End, The",2000,41,NA,8.1,42,0,0,4.5,0,4.5,4.5,14.5,24.5,4.5,44.5,"",1,0,0,0,1,0,1 -"Endangered Species",1982,97,NA,5.8,177,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Endangered Species",2002,94,NA,5.1,44,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Endemoniada, La",1975,90,NA,3.4,26,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Endgame",1999,8,NA,4.4,10,24.5,0,0,14.5,14.5,0,14.5,24.5,0,34.5,"",0,0,1,0,0,0,1 -"Endgame",2001,113,NA,4.9,95,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Endgame - Bronx lotta finale",1983,98,NA,4.7,64,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Endless Love",1981,116,NA,3.7,1156,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Endless Night",1971,95,NA,5.8,153,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Endless Summer 2, The",1994,109,NA,7,435,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Endless Summer, The",1966,95,NA,7.3,580,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Endless Winter",1995,93,NA,5.8,12,4.5,0,4.5,0,0,0,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Endlessly",1993,71,NA,5.8,11,4.5,0,0,0,24.5,14.5,34.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Endstation Freiheit",1980,112,NA,6.9,7,0,0,0,0,14.5,24.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Endstation Tanke",2001,80,NA,5,25,24.5,44.5,14.5,0,4.5,0,4.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Endstation: Paradies",2000,7,NA,8.7,7,0,0,0,0,0,14.5,14.5,0,74.5,0,"",0,1,0,0,0,0,1 -"Endurance",1999,83,NA,5.8,82,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"PG",0,0,0,1,1,0,0 -"Endurance: Shackleton's Legendary Antarctic Expedition, The",2000,90,NA,7.8,472,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Enduring Love",2004,101,NA,6.5,559,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Ene bene",2000,104,NA,7,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Enemies of Laughter",2000,90,NA,5.8,52,4.5,0,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Enemies: A Love Story",1989,119,NA,6.6,462,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Enemy",1996,92,NA,2.7,6,64.5,0,0,0,14.5,0,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Enemy Below, The",1957,98,NA,7.6,1137,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Enemy General, The",1960,74,NA,5.4,8,0,0,0,24.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Enemy Gold",1993,92,NA,2.7,79,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Enemy Mine",1985,108,NA,6.4,4401,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Enemy Territory",1987,89,NA,5.5,66,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Enemy at the Gates",2001,131,70000000,7.3,19169,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",1,0,0,1,0,1,0 -"Enemy of Women",1944,72,NA,4.4,8,24.5,0,14.5,14.5,34.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Enemy of the Law",1945,59,NA,4.1,5,0,0,24.5,24.5,0,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Enemy of the People, An",1978,103,NA,6.3,117,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Enemy of the State",1998,131,90000000,7.1,23263,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,1,0,0,0 -"Enemy, The",2003,34,250000,8.2,147,4.5,0,0,0,0,4.5,14.5,24.5,34.5,14.5,"",0,0,0,0,1,0,1 -"Energy Carol, The",1975,11,NA,6.7,7,0,0,0,14.5,0,0,0,44.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Eneste ene 2, Den",2002,13,NA,6.4,14,24.5,4.5,14.5,0,0,0,0,0,4.5,45.5,"",0,0,1,0,0,1,1 -"Eneste ene, Den",1999,106,NA,6.7,925,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Enfance nue, L'",1968,83,NA,8.2,49,0,0,4.5,0,0,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Enfant au grelot, L'",1998,52,NA,7.8,7,0,0,0,0,0,0,44.5,14.5,24.5,14.5,"",0,1,0,0,0,0,0 -"Enfant d'eau, L'",1995,103,NA,6.8,62,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Enfant de l'hiver, L'",1989,84,NA,6.6,25,0,0,14.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Enfant endormi, L'",2004,95,NA,5.9,8,0,0,0,14.5,14.5,14.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Enfant lion, L'",1993,86,NA,6,44,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Enfant noir, L'",1994,92,NA,6.4,8,0,0,0,0,24.5,24.5,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Enfant sauvage, L'",1970,83,NA,7.4,812,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Enfant secret, L'",1982,92,NA,7.7,9,0,14.5,0,0,14.5,0,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Enfants de l'amour, Les",2002,90,NA,6.3,46,0,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,1,0,0 -"Enfants de salaud",1996,100,NA,6.7,89,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Enfants du marais, Les",1999,115,NA,7.3,648,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Enfants du naufrageur, Les",1992,99,NA,6.8,6,0,0,0,0,0,45.5,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Enfants du paradis, Les",1945,163,NA,8.1,3369,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Enfants du placard, Les",1977,105,NA,5.3,11,4.5,24.5,4.5,4.5,0,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Enfants du refus global, Les",1998,75,NA,4.6,5,0,44.5,0,0,0,0,0,24.5,44.5,0,"",0,0,0,0,0,0,0 -"Enfants du soleil, Les",1995,200,NA,8.9,13,4.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,1,1,0,1,0 -"Enfants terribles, Les",1950,105,NA,7.3,170,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Enfants, Les",1984,94,NA,6.3,16,14.5,14.5,0,0,0,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Enfants, Les",2005,88,NA,6.1,19,0,4.5,0,4.5,4.5,34.5,34.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"Enfer, L'",1994,100,NA,7,573,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Enfin pris?",2002,93,NA,6.5,25,0,4.5,0,4.5,0,4.5,34.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Enforcer from Death Row",1978,84,NA,2.6,17,44.5,4.5,0,14.5,4.5,4.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Enforcer, The",1951,85,NA,7.4,407,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Engel & Joe",2001,93,NA,6.8,139,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Engel auf Erden, Ein",1959,90,NA,6.4,18,0,0,0,0,14.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Engel aus Eisen",1981,105,NA,7.6,9,0,0,0,0,0,0,44.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Engel mit dem Saitenspiel, Der",1944,101,NA,6,10,0,0,0,14.5,14.5,24.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Engel von St. Pauli, Die",1969,97,NA,7.8,6,0,0,0,0,0,14.5,14.5,0,34.5,34.5,"",0,0,0,0,0,0,0 -"Engel, der seine Harfe versetzte, Der",1959,97,NA,5.3,12,0,0,14.5,14.5,0,0,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Engelchen",1996,88,NA,6.6,42,0,0,0,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Engelchen - oder die Jungfrau von Bamberg",1968,90,NA,4.5,15,4.5,4.5,4.5,24.5,0,14.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Engelchen macht weiter - Hoppe, hoppe Reiter",1969,90,NA,5.9,7,0,0,14.5,0,14.5,45.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"England Made Me",1973,100,NA,6.9,27,0,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"England!",2000,97,NA,6.7,106,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"England, My England",1995,153,NA,7.2,56,4.5,4.5,0,0,4.5,4.5,14.5,4.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Englar alheimsins",2000,102,NA,7.2,535,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"English Babu Desi Mem",1996,170,NA,2.5,26,14.5,0,34.5,4.5,4.5,4.5,14.5,4.5,0,14.5,"",0,0,1,1,0,1,0 -"English Patient, The",1996,160,27000000,7.1,25210,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"English Without Tears",1944,89,NA,5,14,0,0,0,24.5,24.5,24.5,14.5,0,4.5,0,"",0,0,1,0,0,1,0 -"English, August",1994,118,NA,6.9,28,0,4.5,4.5,0,0,4.5,14.5,34.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Englishman Who Went Up a Hill But Came Down a Mountain, The",1995,99,NA,6.5,3265,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG",0,0,1,0,0,1,0 -"Enid Is Sleeping",1990,101,NA,5.2,109,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Enigma",1983,101,NA,5.7,172,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Enigma",2001,119,NA,6.7,4291,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Enigma rosso",1978,85,NA,5.7,23,0,4.5,0,4.5,24.5,4.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Enjeru dasuto",1994,117,NA,6.3,190,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Enjo",1958,99,NA,7.5,65,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Enkel resa",1988,93,NA,2.5,29,34.5,4.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ennemi naturel, L'",2004,97,NA,4.9,10,0,0,14.5,24.5,34.5,34.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Ennemi public no 1, L'",1953,85,NA,6,28,0,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ennio Morricone: la musica negli occhi",1990,58,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,1,0,0 -"Ennui, L'",1998,122,NA,6.5,416,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Enoch Arden: Part I",1911,17,NA,6.3,14,4.5,0,4.5,4.5,4.5,34.5,4.5,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Enoch Arden: Part II",1911,17,NA,6.5,13,0,4.5,4.5,0,14.5,14.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Enoken no chakiri kinta 'Zen' - Mamayo sandogasa - Ikiha yoiyoi",1937,76,NA,9.1,5,0,0,24.5,24.5,0,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Enola Gay and the Atomic Bombing of Japan",1995,75,NA,7.5,7,14.5,0,0,0,0,24.5,14.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Enormous Changes at the Last Minute",1983,104,NA,4.8,42,4.5,4.5,4.5,4.5,45.5,4.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Enough",2002,115,38000000,4.9,4339,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Enough Already",1998,95,NA,5.2,26,0,0,0,14.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Enraged New World, An",2002,50,3500,8.9,25,24.5,4.5,0,0,0,4.5,4.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Enrico Caruso: leggenda di una voce",1951,81,NA,4.1,6,0,0,14.5,0,64.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Enrico IV",1984,95,NA,6.2,35,0,0,0,0,24.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Enron: The Smartest Guys in the Room",2005,110,NA,8,198,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Ensayo de un crimen",1955,89,NA,8,331,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Ensei Fufu",1998,153,NA,8,5,0,0,0,24.5,0,0,0,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Ensi tiistaina Brahmsia",1998,15,NA,3.9,7,0,0,14.5,0,14.5,0,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Ensign Pulver",1964,104,NA,5.4,283,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Entangled",1993,98,NA,3.8,93,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ente klingelt um halb acht, Die",1968,88,NA,4.8,25,4.5,0,24.5,4.5,4.5,4.5,34.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Enteng Kabisote: Okay Ka Fairy, the Legend",2004,114,NA,5.4,10,24.5,14.5,14.5,0,24.5,0,0,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Entente cordiale",1939,95,NA,5.9,9,0,0,0,14.5,34.5,24.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Enter Achilles",1996,50,NA,9.3,9,0,0,0,0,0,14.5,0,14.5,0,74.5,"",0,0,0,0,0,0,0 -"Enter Arsene Lupin",1944,72,NA,6.2,8,0,0,0,14.5,14.5,24.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Enter Laughing",1967,112,NA,5.7,81,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Enter Life",1981,8,NA,6.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,1,0,0,0,0,1 -"Enter Madame",1935,83,NA,5.4,11,0,0,4.5,4.5,14.5,24.5,4.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"Enter the Blood Ring",1995,94,NA,1.8,11,14.5,4.5,4.5,0,4.5,4.5,0,4.5,0,34.5,"",1,0,0,0,0,0,0 -"Enter the Devil",1972,75,NA,5.2,5,0,24.5,0,24.5,44.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Enter the Dragon",1973,99,850000,7.4,8078,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Enter the Grill Master",2003,7,NA,5.1,6,0,0,0,0,14.5,14.5,0,0,14.5,45.5,"",0,0,1,0,0,0,1 -"Enter the Ninja",1981,101,NA,4.6,211,4.5,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Enter the Panther",1976,89,NA,4.1,8,45.5,14.5,0,0,24.5,0,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Entering Reality",1999,12,NA,5.6,14,0,0,0,0,14.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Entertainer, The",1960,96,NA,7.3,291,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Entertaining Angels: The Dorothy Day Story",1996,112,NA,5.6,123,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Entertaining Mr. Sloane",1970,94,NA,6.5,74,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Entire History of the Louisiana Purchase, The",1997,50,NA,5.6,8,14.5,0,0,14.5,14.5,14.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Entity, The",1981,115,NA,6,1146,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Entotsu no mieru basho",1953,108,NA,7.5,6,0,0,0,0,0,14.5,34.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Entourloupe, L'",1980,90,NA,4,8,14.5,14.5,14.5,14.5,0,0,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Entr'acte",1924,22,NA,7.6,229,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Entrapment",1999,113,66000000,6.1,18543,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Entre Marx y una mujer desnuda",1995,92,NA,3.2,14,0,14.5,0,4.5,0,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Entre Pancho Villa y una mujer desnuda",1996,87,NA,6,44,0,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Entre abril y julio",2002,92,NA,7,11,0,4.5,0,0,4.5,4.5,44.5,0,4.5,14.5,"",0,0,1,0,0,1,0 -"Entre chiens et loups",2002,110,NA,4.9,64,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Entre ciclones",2003,119,NA,7.7,11,0,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,"",0,0,0,0,0,0,0 -"Entre deux soeurs",1990,24,NA,8.6,9,0,0,0,0,0,14.5,14.5,24.5,14.5,44.5,"",0,1,0,1,1,0,1 -"Entre la mer et l'eau douce",1967,85,NA,5.5,23,4.5,0,0,0,24.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Entre la tarde y la noche",1999,105,NA,5.3,6,0,0,0,0,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Entre las piernas",1999,115,NA,6.7,551,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Entre las redes",1967,93,NA,4.4,6,0,34.5,0,45.5,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Entre onze heures et minuit",1949,92,NA,6.4,15,4.5,0,0,0,14.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Entre rojas",1995,93,NA,6.6,55,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Entre tinieblas",1983,114,NA,6.4,479,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Entre todas las mujeres",1998,90,NA,8.2,6,0,0,0,0,14.5,0,34.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Entreatos",2004,117,NA,9,28,0,0,0,0,4.5,4.5,0,24.5,44.5,24.5,"",0,0,0,0,1,0,0 -"Entrecuisses",1977,90,NA,4.1,5,0,0,24.5,0,64.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Entretanto",1999,25,NA,3.9,10,44.5,0,34.5,14.5,14.5,0,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Entusiasmo, El",1998,105,NA,6.9,60,14.5,4.5,4.5,14.5,4.5,4.5,14.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Envol, L'",2000,90,NA,6.2,24,4.5,0,0,0,14.5,34.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Envoyez les violons",1988,89,NA,6.1,9,14.5,0,0,0,24.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Envy",1930,9,NA,3.7,14,14.5,4.5,24.5,24.5,24.5,14.5,0,0,0,0,"",0,0,1,0,0,0,1 -"Envy",1999,83,NA,6.2,96,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Envy",2004,99,40000000,4.3,3417,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Eo woo-dong",1985,110,NA,5.7,6,34.5,0,0,0,0,34.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Eolguleobtneun minyeo",2004,104,NA,6,40,0,4.5,4.5,0,14.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Eolomea",1972,78,NA,5.9,22,4.5,0,4.5,4.5,14.5,4.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Eommaege aeini saenggyeoteoyo",1995,102,NA,3.6,6,0,0,45.5,14.5,0,34.5,0,0,0,0,"",0,0,0,1,0,1,0 -"Eonios fititis",2001,100,NA,6.4,16,4.5,0,0,0,14.5,34.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Eorin shinbu",2004,115,NA,6.5,178,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Epagelma gynaika",1987,87,NA,6,8,14.5,14.5,0,0,34.5,0,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Epanastatis popolaros",1971,95,NA,5.6,9,0,0,0,0,24.5,24.5,14.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Ephapax",2001,85,NA,7.6,54,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Epic Tale of Kalesius and Clotho: A Meditation on the Impossibility of Romantic Love in a Rapidly Expanding Universe, The",2003,27,6000,9.5,6,0,0,0,0,0,0,0,0,45.5,45.5,"",0,0,1,0,0,0,1 -"Epicenter",2000,99,NA,4,204,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Epidemic",1988,106,NA,5.1,391,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Epiheirisis Apollon",1968,88,NA,6.8,5,0,24.5,0,0,0,24.5,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Epikindini (mia diamartiria), I",1983,91,NA,7.8,11,4.5,0,0,4.5,4.5,4.5,0,0,0,64.5,"",1,0,0,1,0,0,0 -"Epilog",1950,91,NA,9.5,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,0,0,0,0 -"Epiphany: Il inferno",2002,16,10000,8.8,6,0,0,0,0,0,0,0,45.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Episodes in Disbelief",2000,7,NA,7.2,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,1,0,0,0,0,1 -"Epsilon",1997,92,NA,5,95,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Epta hronia gamou",1972,98,NA,5,5,24.5,24.5,0,0,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Equal Impact",1995,105,NA,3.3,18,14.5,14.5,0,0,24.5,4.5,0,0,0,45.5,"",1,0,0,0,0,0,0 -"Equalizer 2000",1986,85,NA,3.9,39,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Equestrian",2003,4,NA,7.8,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,0,0,0,0,1 -"Equestrian Acrobatics",1937,8,NA,6.2,5,0,0,0,0,24.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Equilibrium",2002,107,20000000,7.6,17579,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,0,0,0,0,0 -"Equinox",1970,80,NA,4.3,198,4.5,14.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Equinox",1992,110,NA,5.4,348,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Equinox Knocks",1999,111,NA,4.8,38,14.5,4.5,4.5,14.5,4.5,0,4.5,14.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Equus",1977,137,NA,6.6,708,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Er di",2003,120,NA,6.8,29,0,0,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Er kann's nicht lassen",1962,94,NA,5.5,87,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Er was eens... Luna",2003,10,NA,1.1,10,94.5,14.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,1 -"Era notte a Roma",1960,82,NA,6.7,28,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Era of Vampire, The",2002,90,1000000,4.2,329,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Era outra vez",2000,93,NA,9.5,35,14.5,4.5,0,0,0,0,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Erasable You",1998,85,NA,4.5,29,14.5,0,14.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Eraser",1996,115,100000000,5.8,14641,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Eraserhead",1977,89,10000,7.1,7207,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Erba proibita, L'",2002,95,NA,8.2,5,0,0,0,0,24.5,0,24.5,0,24.5,44.5,"",0,0,0,0,1,0,0 -"Erben, Die",1982,90,NA,5.1,34,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Erbschaft, Die",1936,20,NA,7.9,10,0,0,0,0,0,24.5,14.5,0,24.5,45.5,"",0,0,0,0,0,0,1 -"Erbsen auf halb 6",2004,111,NA,6.8,166,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Ercole al centro della terra",1961,77,NA,5.8,140,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ercole alla conquista di Atlantide",1961,93,NA,3.4,97,24.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ercole contro Molock",1963,75,NA,3.6,28,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Ercole contro i figli del sole",1966,80,NA,2.5,25,24.5,14.5,14.5,4.5,4.5,0,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Ercole contro i tiranni di Babilonia",1964,86,NA,5.2,29,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Ercole e la regina di Lidia",1959,105,NA,4.3,182,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ercole l'invincibile",1963,85,NA,2.3,20,24.5,24.5,14.5,24.5,24.5,0,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Ercole sfida Sansone",1963,86,NA,4.7,42,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Ercole, Sansone, Maciste e Ursus gli invincibili",1964,100,NA,6.3,6,0,0,0,14.5,0,34.5,0,14.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Erection",1971,20,NA,5,6,14.5,0,14.5,14.5,0,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Ergenis, O",1997,120,NA,3.9,20,14.5,0,4.5,0,14.5,14.5,44.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Ergens in Nederland",1940,87,NA,6.8,9,0,0,0,0,0,45.5,14.5,24.5,14.5,0,"",0,0,0,0,0,1,0 -"Erik the Viking",1989,104,NA,5.7,2329,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Erik, il vichingo",1965,95,NA,5.2,7,0,0,14.5,14.5,0,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Erika und Klaus Mann Story, Die",2000,85,NA,6.6,40,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Erika's Hot Summer",1971,65,NA,3.8,5,0,0,24.5,44.5,0,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Erin Brockovich",2000,130,51000000,7.3,24301,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Erinnerungen an die Zukunft",1970,92,NA,5.3,83,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Erkan & Stefan",2000,87,NA,5.7,403,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Erkennen und verfolgen",2003,54,NA,6.8,5,0,24.5,24.5,0,0,0,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Erleuchtung garantiert",2000,109,NA,6.8,308,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Erlking, The",2003,6,NA,8.2,6,0,0,0,0,0,0,0,45.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Ermo",1994,95,NA,7,141,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Ernest",2000,22,NA,7.9,8,0,0,0,0,0,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Ernest",2001,2,NA,3.2,7,24.5,0,0,24.5,0,14.5,14.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Ernest & Bertram",2002,8,NA,7.5,13,0,0,0,4.5,0,0,34.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Ernest Goes to Africa",1997,90,NA,3.3,198,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Ernest Goes to Camp",1987,92,3000000,4.4,1562,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ernest Goes to Jail",1990,81,NA,4.4,1076,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ernest Goes to School",1994,89,NA,3.3,319,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ernest Rides Again",1993,96,7000000,3.6,250,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ernest Saves Christmas",1988,95,6000000,4.6,1125,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ernest Scared Stupid",1991,91,NA,4.3,880,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ernest in the Army",1998,85,NA,3.6,184,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Ernesto",1979,98,NA,6.3,27,4.5,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ernesto Che Guevara, das bolivianische Tagebuch",1994,92,NA,4.7,27,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Ernst & lyset",1996,12,NA,8.3,123,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Ernstfall in Havanna",2002,86,NA,6.5,142,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Erode il grande",1959,93,NA,5.4,7,0,0,14.5,14.5,24.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Eroe borghese, Un",1995,93,NA,7.7,35,4.5,0,0,0,0,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Eroe dei nostri tempi, Un",1955,85,NA,6.5,11,0,0,0,0,4.5,0,44.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Eroe di Babilonia, L'",1963,87,NA,4.3,10,14.5,0,14.5,44.5,14.5,14.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Eroi all'inferno",1973,90,NA,5.2,19,14.5,4.5,24.5,4.5,14.5,0,24.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Eroi, Gli",1973,105,NA,4.5,11,0,0,4.5,44.5,14.5,4.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Eroica",1957,87,NA,7.4,48,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Eroica",1960,90,NA,5.6,7,0,0,0,0,44.5,0,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Eros",2004,104,NA,5.4,139,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Eros, O Deus do Amor",1981,107,NA,6.7,7,0,0,0,14.5,0,14.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Erosu purasu Gyakusatsu",1970,202,NA,9.1,9,0,0,0,0,0,24.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Erotas stous ammolofous",1958,83,NA,5.2,5,0,24.5,0,24.5,0,44.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Erotic Adventures of Aladdin X, The",1995,84,NA,5,15,0,0,24.5,0,0,14.5,14.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Erotic Adventures of Candy, The",1978,80,NA,4.5,22,14.5,0,0,4.5,24.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Erotic Adventures of Pinocchio, The",1971,79,NA,2.8,28,24.5,0,0,4.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Erotic Adventures of Zorro, The",1972,102,75000,4.2,32,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Erotic Ghost",2000,72,NA,1.9,37,44.5,14.5,4.5,4.5,4.5,0,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Erotic Images",1983,93,NA,1.8,9,24.5,24.5,0,14.5,0,0,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Erotic Inferno",1975,91,NA,1.5,6,14.5,0,0,14.5,14.5,14.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Erotic Survivor",2001,97,NA,2.2,51,34.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Erotic Tales - Porn.com",2002,28,NA,1.4,19,34.5,14.5,14.5,14.5,0,4.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,1 -"Erotic Vampire in Paris, An",2002,79,NA,3.4,33,44.5,4.5,4.5,4.5,14.5,14.5,0,0,4.5,4.5,"",0,0,0,0,0,1,0 -"Erotic Visions",1995,92,NA,6.5,18,0,0,14.5,0,0,14.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Erotica",1961,68,4000,1.6,18,44.5,14.5,14.5,0,4.5,0,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Erotiki ekstassi",1980,90,NA,4.8,14,14.5,24.5,4.5,4.5,4.5,4.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Erotiki symfonia",1972,109,NA,4.1,9,24.5,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Erotikkuna kankei",1992,95,NA,5.4,10,0,0,14.5,14.5,34.5,14.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Erotikon",1920,106,NA,6.7,31,4.5,0,0,0,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Erotikon",1929,85,NA,7.2,26,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Erotique",1994,84,NA,4.3,133,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Erotische Geschichte, Eine",2002,28,NA,7,6,0,0,0,14.5,14.5,0,34.5,0,14.5,14.5,"",0,0,1,0,0,0,1 -"Erotissimo",1968,100,NA,4.9,18,0,0,0,14.5,24.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Err On the Side of Caution",1997,94,500000,6,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Errance",2003,95,NA,3.7,33,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Errand Boy, The",1961,92,NA,5.8,203,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Erreur de jeunesse",1989,90,NA,7.1,13,0,14.5,0,0,0,0,34.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Erreur sur la personne",1995,95,NA,4.5,31,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Erreway: 4 caminos",2004,102,NA,3.4,31,34.5,4.5,4.5,4.5,0,4.5,4.5,0,0,34.5,"",0,0,1,1,0,1,0 -"Error in Judgment",1998,90,NA,4.8,62,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Erskineville Kings",1999,90,NA,6,109,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Erst die Arbeit und dann?",1984,43,NA,7.3,75,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Erste Ehe",2002,92,NA,5.2,13,0,4.5,0,4.5,4.5,0,4.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Erste Nacht, Die",2003,5,NA,5.2,6,14.5,0,0,0,0,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Erste Semester, Das",1997,90,NA,3.6,69,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Erste Zug, Der",1999,20,NA,4,13,0,24.5,4.5,4.5,0,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Ertefae Past",2002,115,NA,6.8,62,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Eruption",1977,82,NA,6.7,21,4.5,0,0,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Eruption of Mount St. Helens!, The",1980,25,NA,6.4,39,0,4.5,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Ervinka",1967,95,NA,7,20,0,0,0,0,0,14.5,14.5,24.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Erzi",1996,95,NA,6.3,10,0,0,0,0,24.5,0,34.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Es",1966,86,NA,6.1,9,0,0,0,14.5,24.5,0,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Es geschah am 20. Juli",1955,75,NA,7.1,29,0,0,0,0,4.5,24.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Es geschah am hellichten Tag",1958,100,NA,7.8,581,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Es herrscht Ruhe im Land",1976,103,NA,6.6,7,0,0,14.5,0,14.5,14.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Es ist nicht leicht ein Gott zu sein",1990,119,NA,7.2,108,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Es peligroso casarse a los 60",1981,98,NA,3.5,19,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Es war eine rauschende Ballnacht",1939,89,NA,5.4,13,0,0,0,14.5,4.5,24.5,0,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Esa ja Vesa - auringonlaskun ratsastajat",1994,88,NA,5.1,132,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Esa maldita costilla",1999,93,NA,3.8,45,34.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Esa pareja feliz",1953,83,NA,7.1,39,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Escalation",1968,89,NA,4.1,9,44.5,0,0,14.5,0,0,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Escalier C",1985,102,NA,6.4,58,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Escalier de service",1954,94,NA,6,8,0,0,0,14.5,14.5,34.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Escalier, L'",2003,22,NA,6.2,9,0,0,0,0,0,24.5,24.5,24.5,0,34.5,"",0,0,0,1,0,0,1 -"Escanaba in da Moonlight",2001,91,1000000,5.5,373,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"PG-13",0,0,1,0,0,0,0 -"Escapade",1955,87,NA,8.6,13,0,0,0,0,0,0,24.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Escapade in Japan",1957,93,NA,5.7,73,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Escape",1940,98,NA,6.8,103,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Escape",1948,78,NA,7.8,10,0,0,14.5,0,0,14.5,14.5,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Escape",1990,88,NA,4.5,17,14.5,14.5,4.5,14.5,4.5,0,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Escape Artist, The",1982,96,NA,5.8,91,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Escape Back to the Movies",2000,1,NA,3.9,5,24.5,0,24.5,0,0,0,0,0,44.5,24.5,"",0,0,1,0,0,0,1 -"Escape From Hellhole",1983,100,NA,4.3,9,14.5,14.5,0,24.5,0,14.5,24.5,0,14.5,14.5,"",1,0,0,0,0,0,0 -"Escape From Safehaven",1989,87,NA,4.6,20,14.5,0,0,4.5,14.5,0,0,4.5,0,74.5,"",0,0,0,0,0,0,0 -"Escape From Wildcat Canyon",1998,96,NA,4.9,63,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Escape Me Never",1947,104,NA,5.1,64,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Escape Velocity",1998,100,NA,3.7,90,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Escape from Alcatraz",1979,112,NA,7.3,6131,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Escape from Angola",1976,95,NA,3.1,5,0,0,44.5,64.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Escape from Chernobourg",1999,75,2000,3.7,18,24.5,0,0,0,4.5,4.5,4.5,4.5,14.5,44.5,"",1,0,1,0,0,0,0 -"Escape from Crime",1942,51,NA,5.3,30,0,4.5,0,24.5,34.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Escape from Cuba",2003,97,NA,5.7,19,14.5,14.5,4.5,0,14.5,0,14.5,4.5,4.5,34.5,"PG-13",1,0,0,1,0,0,0 -"Escape from East Berlin",1962,89,NA,6.2,66,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Escape from Fort Bravo",1954,99,NA,6.4,223,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Escape from L.A.",1996,101,50000000,4.8,7955,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Escape from New York",1981,99,6000000,6.8,9924,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Escape from Taliban",2003,166,NA,4.9,19,24.5,0,14.5,0,0,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Escape from Tatooine",2004,5,NA,5.1,5,0,0,0,24.5,44.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Escape from Zahrain",1962,93,NA,5,63,4.5,4.5,0,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Escape from the Planet of the Apes",1971,98,2500000,5.8,2951,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Escape in the Desert",1945,79,NA,5.9,22,0,0,0,14.5,14.5,24.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Escape in the Fog",1945,65,NA,6.3,17,0,0,4.5,14.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Escape to Athena",1979,120,NA,5.2,429,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Escape to Burma",1955,87,NA,5,46,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Escape to Nowhere",1961,40,NA,8.2,44,4.5,0,0,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,0,0,0,1 -"Escape to Paradise",1939,60,NA,4.5,5,0,44.5,0,24.5,24.5,0,0,0,0,24.5,"",0,0,1,0,0,1,0 -"Escape to Paradise",2001,90,NA,6.3,30,0,4.5,14.5,4.5,14.5,14.5,34.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Escape to Witch Mountain",1975,97,NA,6,1043,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Escape to the Sun",1972,118,NA,5.7,8,0,14.5,0,14.5,14.5,24.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Escapement",1958,76,NA,4.5,26,0,4.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Escaping Otis",2002,84,NA,7.2,6,0,0,14.5,0,14.5,0,14.5,0,34.5,14.5,"",0,0,1,0,0,0,0 -"Escapist, The",2001,88,NA,5.9,186,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Escapulario, El",1966,85,NA,4.2,14,14.5,0,0,0,0,0,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Escargots, Les",1965,10,NA,6.5,28,4.5,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Escarnio",2004,25,NA,3,32,14.5,4.5,0,0,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Escarpins sauvages, Les",1994,13,NA,8,6,0,0,14.5,0,0,0,14.5,0,34.5,34.5,"",0,1,0,0,0,0,1 -"Escondida, La",1956,100,NA,6.6,14,14.5,0,4.5,0,24.5,14.5,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Escopeta nacional, La",1978,95,NA,7.3,134,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Escort West",1958,75,NA,4.2,32,14.5,4.5,0,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Escorte, L'",1996,92,NA,4.9,36,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Escrito en el agua",1998,85,NA,6.3,13,0,4.5,0,0,24.5,24.5,34.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Escrito en el cuerpo de la noche",2002,128,NA,6.4,19,4.5,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Escuela de rateros",1958,95,NA,7.3,25,0,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Escuela de vagabundos",1955,99,NA,9.1,50,4.5,0,0,0,4.5,0,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Esecutori, Gli",1976,92,NA,4,59,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Esercito di cinque uomini, Un",1969,105,NA,5.5,112,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Eshelonite",1986,118,NA,8.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Eskadron gusar letuchikh",1980,164,NA,7.1,6,0,0,0,14.5,14.5,0,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Eskapo: The Serge Osmena-Geny Lopez Story",1995,117,NA,6.6,12,4.5,0,0,0,0,4.5,24.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Eskimo",1933,117,950000,7,30,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Eskimo Limon",1978,95,NA,5.3,182,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Eskimo Nell",1975,85,NA,4.7,19,4.5,24.5,0,14.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Eskiya",1996,121,NA,8.1,839,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Esmeralda",1905,10,NA,4.9,11,14.5,0,0,4.5,4.5,0,4.5,0,4.5,44.5,"",0,0,0,1,0,0,1 -"Esmeraldero",2002,117,NA,3.1,10,24.5,0,24.5,0,14.5,14.5,14.5,0,0,34.5,"R",0,0,0,1,1,0,0 -"Eso utan",2002,4,NA,6,6,0,0,14.5,0,34.5,34.5,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Espalda de Dios, La",2001,136,NA,6.6,13,4.5,0,4.5,0,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Espalda del mundo, La",2000,89,NA,8,45,0,0,0,0,4.5,4.5,14.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Espanto surge de la tumba, El",1973,88,NA,4.1,120,4.5,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Espectador que o Cinema Esqueceu, O",1991,20,NA,6.4,19,0,0,0,0,4.5,34.5,45.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Espejismo",1972,82,NA,8.7,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Espejo de la bruja, El",1962,90,NA,6.4,12,0,0,0,0,4.5,14.5,4.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Espelho de Carne",1984,102,NA,5.9,15,4.5,4.5,24.5,4.5,4.5,0,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Espera, La",2002,72,100000,8.8,15,4.5,0,0,0,0,4.5,14.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Esperando la carroza",1985,87,NA,8.9,247,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Espinazo del diablo, El",2001,108,4500000,7.4,3474,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Espionage Agent",1939,83,NA,5.8,29,0,4.5,0,4.5,24.5,34.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Espions, Les",1957,125,NA,6.8,65,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Espiritismo",1962,85,NA,4.5,13,4.5,14.5,0,24.5,24.5,0,24.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Espoir, L'",1945,76,NA,7.1,28,0,0,0,4.5,14.5,24.5,4.5,14.5,14.5,24.5,"",0,0,0,1,1,0,0 -"Esposados",1996,24,NA,8.2,53,4.5,0,4.5,0,0,4.5,24.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Esquece Tudo O Que Te Disse",2002,108,NA,7.1,51,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Esquilache",1989,100,NA,5.2,17,14.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Esquive, L'",2003,117,NA,7,261,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Essai d'ouverture",1988,15,NA,6.5,7,24.5,0,0,0,0,24.5,14.5,24.5,0,0,"",0,0,1,0,1,0,1 -"Essen, schlafen, keine Frauen",2002,77,NA,7.7,12,0,0,0,0,4.5,24.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Essence of Echoes",2002,90,NA,1.9,23,34.5,34.5,14.5,0,4.5,0,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Essene",1972,86,NA,6,8,0,0,0,0,0,64.5,24.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Essex Boys",2000,102,NA,5.4,410,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Est - Ouest",1999,121,NA,7.2,1266,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Est-ce bien raisonnable?",1981,109,NA,4.1,14,4.5,4.5,14.5,4.5,24.5,34.5,0,0,4.5,0,"",1,0,1,0,0,1,0 -"Esta noche, no",2002,89,NA,5.5,11,4.5,4.5,24.5,4.5,0,4.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Estambul 65",1965,117,NA,5.3,25,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Estamira",2004,121,NA,8.6,18,4.5,0,0,0,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Estancia, La",2004,80,NA,8.9,10,0,0,0,0,0,0,14.5,34.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Estanquera de Vallecas, La",1987,106,NA,5.7,40,0,4.5,0,0,14.5,34.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Estas ruinas que ves",1979,107,NA,5.6,8,0,14.5,0,0,14.5,24.5,0,45.5,0,0,"",0,0,1,1,0,0,0 -"Estate di Bobby Charlton, L'",1995,100,NA,5.1,7,14.5,0,14.5,0,0,0,44.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Estate di Davide, L'",1998,100,NA,6.2,19,4.5,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Estate romana",2000,90,NA,4.5,18,14.5,0,4.5,24.5,24.5,0,4.5,14.5,14.5,0,"",0,0,1,1,0,0,0 -"Estate violenta",1959,100,NA,7.4,34,0,0,0,0,0,4.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Esther Kahn",2000,163,NA,6.2,229,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Esther Waters",1948,108,NA,5.5,25,0,0,4.5,14.5,24.5,24.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Esther and the King",1960,109,NA,4.3,58,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Estigma",1982,86,NA,1.3,6,34.5,0,0,14.5,0,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Estorvo",2000,96,NA,6.2,47,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Estoy en crisis",1982,90,NA,2.1,12,14.5,24.5,0,0,4.5,0,4.5,34.5,4.5,0,"",0,0,1,0,0,0,0 -"Estoy hecho un chaval",1977,90,NA,3.3,32,24.5,14.5,14.5,4.5,14.5,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Estranha Hospedaria dos Prazeres, A",1976,81,NA,7.3,6,14.5,0,0,0,0,0,34.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Estranho Encontro",1958,90,NA,6.9,6,0,0,0,14.5,0,14.5,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Estrategia del caracol, La",1993,116,NA,6.9,208,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Estrecho Adventure",1996,6,NA,6.8,7,0,0,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Estrela Nua, A",1984,90,NA,6.7,11,4.5,0,0,14.5,0,14.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Estrela Sobe, A",1974,105,NA,7.9,8,0,0,0,0,0,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Estrella del sur",2002,97,NA,4.7,6,34.5,0,0,0,0,34.5,34.5,0,0,0,"",1,0,0,1,0,0,0 -"Estupro",1979,100,NA,8.2,11,14.5,0,0,0,4.5,0,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Esupai",1974,87,NA,5.7,10,0,0,0,24.5,14.5,24.5,24.5,0,34.5,0,"",0,0,0,0,0,0,0 -"Et Cetera",1966,8,NA,6.3,40,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Et la tendresse?... Bordel!",1979,105,NA,5.6,47,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Et mourir de plaisir",1960,74,NA,5.7,83,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Etat",2000,17,NA,9.1,7,0,0,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,1,0,0,1 -"Eteraz",2000,100,NA,6.5,20,4.5,14.5,0,0,24.5,14.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Eternal",2004,107,NA,4.6,100,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Eternal Embrace",2000,47,96000,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,0,0,1,0 -"Eternal Jew, The",1933,63,NA,2.2,18,34.5,4.5,0,0,0,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Eternal Sea, The",1955,103,NA,7.2,19,0,0,0,4.5,14.5,4.5,14.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Eternal Sunshine of the Spotless Mind",2004,108,20000000,8.6,46240,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,1,1,0,1,0 -"Eternally Yours",1939,95,NA,5.9,77,0,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Eternamente Pagu",1987,100,NA,7.5,21,4.5,0,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Eternidade",1995,90,NA,6.1,8,45.5,0,0,0,14.5,0,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Eternity",1989,110,NA,3.4,46,44.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Eternity",1994,56,NA,8.2,8,0,14.5,14.5,14.5,14.5,0,0,0,0,45.5,"",0,0,0,0,1,0,0 -"Ethan Frome",1993,99,NA,6.1,455,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ethan Mao",2004,87,NA,6,21,4.5,0,4.5,0,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ethel's Sofa",2000,7,NA,7,11,0,0,0,0,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Ethelontis ston erota",1971,93,NA,4.7,5,0,24.5,0,24.5,64.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Ethnic Notions",1986,57,NA,7.5,25,0,0,0,0,4.5,4.5,4.5,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Etiquette Man, The",2000,22,NA,7.1,10,0,0,0,0,24.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Etrusco uccide ancora, L'",1972,99,NA,5.2,43,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Etsuraku",1965,90,NA,6,7,0,0,0,0,24.5,24.5,0,0,44.5,0,"",0,0,0,1,0,0,0 -"Etter Rubicon",1987,93,NA,6.4,67,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Ettore lo fusto",1975,91,NA,4.9,5,44.5,0,0,0,24.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Etz Hadomim Tafus",1994,102,NA,8,72,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Eu",1987,123,NA,6.9,25,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Eu Sei Que Vou Te Amar",1986,110,NA,7.4,63,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Eu Te Amo",1981,110,NA,7.1,113,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Eu Tu Eles",2000,104,NA,7,535,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Eugenia Grandet",1947,100,NA,8.4,7,0,0,0,0,0,0,14.5,44.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Eugenie",1970,92,NA,5.6,127,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Eukaliptus",2002,72,NA,7.6,5,0,24.5,0,0,0,24.5,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Eulogy",2004,91,10000000,6.5,773,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Eunhaengnamoo chimdae",1996,88,NA,5.6,110,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,4.5,"",1,0,0,0,0,1,0 -"Eunmaneun oji anhneunda",1991,123,NA,6.9,7,0,0,0,0,0,45.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Eureka",1984,130,NA,5.4,326,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Eureka",2000,217,NA,7.6,558,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Eureka Stockade",1949,103,NA,6,16,0,0,0,14.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"EuroTrip",2004,90,25000000,6.1,8390,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Europa",1991,112,NA,7.4,2694,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Europa '51",1952,113,NA,7.4,143,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Europa Europa",1990,107,NA,7.7,2018,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Europe & Italy",1999,6,NA,6.6,34,4.5,0,0,0,14.5,14.5,14.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Europe 99euro-films2",2003,96,NA,5.3,13,4.5,0,0,4.5,14.5,4.5,4.5,0,0,45.5,"",0,0,0,1,0,1,0 -"Europe in the Raw",1963,72,NA,1,11,84.5,4.5,0,0,0,0,0,4.5,0,0,"",0,0,0,0,1,0,0 -"European Rest Cure",1904,17,NA,5.2,10,14.5,0,14.5,14.5,34.5,14.5,14.5,24.5,0,0,"",0,0,1,0,0,0,1 -"European Vacation",1985,95,NA,5.3,6215,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Europeans, The",1979,90,NA,5.7,122,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Eva",1935,90,NA,4.5,5,0,0,0,24.5,0,0,84.5,0,0,0,"",0,0,0,0,0,0,0 -"Eva",1948,98,NA,5.6,24,14.5,0,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Eva",1962,107,NA,6.8,111,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Eva Meets Felix",1999,16,NA,7.5,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Eva nera",1976,83,NA,4.2,46,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Eva, la Venere selvaggia",1968,92,NA,2.9,45,44.5,14.5,4.5,4.5,14.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Evakko",1956,100,NA,7.7,6,0,0,0,0,14.5,0,14.5,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Evangeliemandens liv",1915,60,NA,6.1,5,0,0,24.5,44.5,0,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Evangeline",1929,87,NA,8,28,0,0,0,4.5,0,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Evangelio de las Maravillas, El",1998,115,NA,6.5,88,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Evase - Storie di sesso e di violenze, Le",1978,91,NA,5.1,22,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Evasive Action",1998,91,NA,4.3,59,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Evdokia",1971,97,NA,7,45,4.5,0,4.5,0,0,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Evdomos ilios tu erota, O",2002,124,NA,5.6,19,4.5,0,4.5,14.5,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Eve",2002,76,NA,5.1,39,14.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Eve Knew Her Apples",1945,64,NA,5.7,8,0,0,0,14.5,14.5,45.5,0,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Eve and the Handyman",1961,65,NA,2.6,47,24.5,14.5,4.5,14.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Eve of Destruction",1991,99,NA,4.5,376,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Eve of St. Mark, The",1944,96,NA,7,20,0,0,0,0,14.5,4.5,45.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Eve's Bayou",1997,109,5000000,7.2,2302,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Evel Knievel",1971,88,NA,4.7,136,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Evelyn",2002,94,10000000,7.1,1163,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Evelyn Prentice",1934,79,NA,6.4,72,0,4.5,4.5,4.5,14.5,4.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Evelyn: The Cutest Evil Dead Girl",2002,8,NA,7.4,81,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Even Cowgirls Get the Blues",1993,99,8000000,4,1609,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Even as I.O.U",1942,15,NA,7.7,30,4.5,4.5,0,0,4.5,0,34.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"EvenHand",2002,92,500000,7.3,169,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Evenfall",2005,30,NA,8.4,7,0,0,0,0,0,0,24.5,24.5,14.5,24.5,"",1,0,0,0,0,0,1 -"Evening Star, The",1996,129,NA,5.5,996,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Evening of Edgar Allan Poe, An",1972,53,NA,7.7,67,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Evensong",1934,87,NA,4.5,22,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Event Horizon",1997,96,70000000,5.7,15510,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Event, The",2003,110,NA,6,276,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Events Leading Up to My Death, The",1991,89,NA,5.2,33,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Eventual Wife",2000,16,NA,5.8,19,0,14.5,4.5,4.5,4.5,14.5,24.5,14.5,0,24.5,"",0,0,1,0,0,0,1 -"Eventyrrejsen",1960,109,NA,3.2,10,14.5,14.5,45.5,14.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Ever After",1998,121,26000000,7,10250,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG",0,0,1,1,0,1,0 -"Ever Since Eve",1937,80,NA,7.2,42,0,0,0,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Ever Since the World Ended",2001,78,NA,7,12,14.5,0,0,0,0,0,34.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Ever in My Heart",1933,68,243000,5.7,35,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Everest",1998,44,NA,7.3,863,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Evergon",2002,32,20000,7.1,22,4.5,0,0,0,4.5,14.5,34.5,24.5,14.5,0,"",0,0,1,1,0,1,1 -"Evergreen",1934,90,NA,6.4,64,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Evergreen",2004,86,NA,5.1,99,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Everlasting Piece, An",2000,103,14000000,6.1,475,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Everlasting Secret Family, The",1988,94,NA,5.2,55,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Eversmile, New Jersey",1989,91,NA,5,125,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Every Afternoon",1972,85,NA,4.5,16,0,14.5,24.5,14.5,14.5,24.5,0,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Every Breath",1993,84,NA,3.3,61,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Every Child",1979,6,NA,6.7,46,4.5,4.5,4.5,0,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Every Day Except Christmas",1957,37,NA,5.2,13,0,0,0,34.5,0,4.5,4.5,24.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Every Day's a Holiday",1937,80,NA,6.4,27,0,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Every Day's a Holiday",1965,94,NA,4,16,4.5,0,0,24.5,4.5,14.5,0,0,4.5,44.5,"",0,0,1,0,0,0,0 -"Every Dog Has Its Day",1997,93,NA,5.5,9,0,14.5,0,14.5,24.5,0,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Every Dog's Guide to Complete Home Safety",1986,10,NA,7.4,14,0,0,0,0,0,24.5,4.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Every Dog's Guide to the Playground",1991,11,NA,6.8,8,0,0,0,0,14.5,0,34.5,45.5,0,0,"",0,1,1,0,0,0,1 -"Every Girl Should Be Married",1948,85,NA,5.7,268,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Every Girl Should Have One",1978,90,NA,2.5,6,45.5,0,14.5,14.5,14.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Every Girl's Dream",1966,9,NA,5.3,14,4.5,0,0,24.5,24.5,24.5,4.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Every Home Should Have One",1970,94,NA,4.3,62,14.5,0,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Every Little Crook and Nanny",1972,92,NA,4.8,27,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Every Little Girl's Dream",2002,16,27000,7.3,7,0,0,14.5,0,0,14.5,0,14.5,0,45.5,"",0,0,1,1,0,0,1 -"Every Night at Eight",1935,80,NA,6.8,13,0,0,0,0,14.5,4.5,14.5,34.5,0,24.5,"",0,0,1,0,0,1,0 -"Every Sunday",1936,11,NA,6.8,87,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Every Time We Say Goodbye",1986,98,NA,5.6,343,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Every Which Way But Loose",1978,110,NA,5.5,2472,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Every Woman Has a Fantasy",1984,90,NA,5.2,14,4.5,4.5,0,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Everybody Just Stay Calm",1994,60,NA,5.8,11,0,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,1,0,0 -"Everybody Loves Sunshine",1999,97,NA,4.6,171,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Everybody Rides the Carousel",1975,72,NA,6.3,8,0,0,0,0,14.5,14.5,14.5,0,14.5,45.5,"",0,1,0,0,0,0,0 -"Everybody Says I'm Fine!",2001,103,NA,4.5,59,14.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Everybody Sing",1938,91,NA,6.1,69,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Everybody Wins",1990,97,NA,4.7,220,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Everybody's All-American",1988,127,NA,6.2,722,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Everybody's Hobby",1939,54,NA,6.5,8,14.5,0,14.5,14.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Everybody's Pregnant",1997,7,NA,3.6,14,24.5,0,24.5,0,14.5,0,24.5,14.5,0,4.5,"",0,1,0,0,0,0,1 -"Everyday People",2004,91,NA,6.9,237,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Everyday Something",2001,14,NA,6,15,0,0,0,0,4.5,45.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Everynight... Everynight",1994,92,NA,6.8,10,0,0,0,0,0,14.5,14.5,45.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Everyone Says I Love You",1996,101,20000000,6.9,7314,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Everyone's Child",1996,90,NA,8.7,6,0,0,0,0,0,14.5,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Everything But the Truth",1956,83,NA,5.7,16,0,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Everything Goes",2004,18,NA,7.2,136,4.5,0,0,0,4.5,0,4.5,4.5,14.5,74.5,"",0,0,0,1,0,0,1 -"Everything Happens at Night",1939,77,NA,5.9,21,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Everything I Have Is Yours",1952,92,NA,4.9,17,0,4.5,0,14.5,34.5,14.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Everything Is Everything",2003,87,10000,8.3,15,14.5,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Everything Is Thunder",1936,76,NA,4.9,8,0,0,24.5,0,24.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Everything Moves Alone",2001,100,NA,6.5,22,4.5,0,4.5,4.5,4.5,0,4.5,4.5,4.5,45.5,"",0,0,1,1,0,0,0 -"Everything Put Together",2000,87,500000,7.1,151,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Everything Relative",1996,110,NA,5.1,60,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Everything You Always Wanted to Know About Sex * But Were Afraid to Ask",1972,87,2000000,6.7,4671,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Everything for a Reason",2000,89,NA,7.2,35,4.5,0,0,4.5,14.5,0,0,4.5,14.5,45.5,"",0,0,1,0,0,1,0 -"Everything in This Country Must",2004,20,250000,7.1,7,0,14.5,0,0,0,0,24.5,0,14.5,44.5,"",0,0,0,1,0,0,1 -"Everything's Ducky",1961,80,NA,6,17,14.5,4.5,4.5,0,14.5,24.5,4.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Everything's Gone Green",2005,19,30000,9,11,0,0,0,0,0,4.5,0,14.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Everything's Jake",2000,92,900000,6.7,12,34.5,0,0,0,14.5,0,4.5,14.5,0,24.5,"",0,0,1,1,0,0,0 -"Everything's Rosie",1931,67,NA,6.4,18,0,0,0,4.5,24.5,34.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Everything's for You",1989,58,NA,6.7,6,0,0,34.5,0,0,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Evicted",2000,99,NA,2.7,18,24.5,24.5,4.5,4.5,14.5,14.5,0,0,4.5,14.5,"R",0,0,1,0,0,0,0 -"Evictors, The",1979,92,NA,4.2,62,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Evidence",1995,8,NA,7.6,23,0,0,0,4.5,4.5,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Evidence of the Film",1913,15,NA,5.8,6,0,0,0,0,14.5,14.5,64.5,0,0,0,"",0,0,0,0,0,0,1 -"Evidencia invisible",2003,102,NA,9.2,9,0,0,0,14.5,0,0,0,0,14.5,74.5,"",0,0,0,1,0,0,0 -"Evil Alien Conquerors",2002,89,500000,3.8,111,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Evil Altar",1989,90,NA,2.2,31,24.5,24.5,4.5,4.5,4.5,4.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Evil Below, The",1989,92,NA,3.9,8,34.5,0,14.5,14.5,0,24.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Evil Brain from Outer Space, The",1964,78,NA,3.7,15,24.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Evil Cameraman, The",1990,12,NA,4.8,33,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Evil Come Evil Go",1972,66,NA,4.6,18,0,0,14.5,14.5,14.5,24.5,4.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Evil Cult",2003,90,15000,6.7,17,4.5,4.5,0,4.5,4.5,0,14.5,4.5,4.5,44.5,"",1,0,1,0,0,0,0 -"Evil Dead II",1987,85,3500000,7.6,15743,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Evil Dead, The",1981,86,350000,7.4,14407,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"NC-17",0,0,0,0,0,0,0 -"Evil Demon Golfball from Hell!!!",1996,8,NA,8.1,7,0,0,0,0,0,24.5,0,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Evil Ed",1997,93,NA,4.5,506,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Evil Eyes",2004,90,NA,3.9,19,14.5,24.5,0,14.5,0,0,14.5,4.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Evil Hill",1999,12,NA,6.5,81,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Evil Judgement",1984,90,NA,2.7,5,24.5,0,24.5,24.5,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Evil Laugh",1988,87,NA,4.4,48,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Evil Night",2002,19,NA,1.9,11,44.5,4.5,14.5,0,0,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Evil Obsession",1995,95,NA,4.1,31,14.5,4.5,4.5,4.5,4.5,14.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Evil Resident",2002,10,NA,5.3,7,44.5,0,0,14.5,0,0,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Evil Spawn",1987,70,NA,3,39,24.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Evil Spirits",1990,95,NA,3.8,16,0,14.5,34.5,4.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Evil Surprise, The",1994,16,NA,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,1 -"Evil That Men Do, The",1984,90,NA,4.8,371,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Evil Toons",1992,90,NA,3.4,236,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,1,1,0,0,0,0 -"Evil Town",1987,82,NA,2,13,34.5,14.5,14.5,14.5,4.5,0,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Evil Town, An",1995,20,NA,8.4,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Evil Under the Sun",1982,117,NA,6.6,1079,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Evil in the Deep",1976,96,NA,2.7,23,34.5,14.5,4.5,14.5,0,4.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Evil of Frankenstein, The",1964,84,NA,5.1,195,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Evil, The",1978,89,NA,4.9,130,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Evilio",1992,10,NA,4.7,25,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Evilio vuelve (El purificador)",1994,12,NA,5.9,21,14.5,4.5,0,0,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Evils of the Night",1985,84,NA,2,31,24.5,34.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Evilspeak",1981,100,NA,3.9,196,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Evita",1996,134,55000000,6.2,8371,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Evita, una tumba sin paz",1997,60,NA,7.4,7,14.5,0,0,0,0,0,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Evolution",1971,11,NA,6.9,22,0,4.5,4.5,14.5,4.5,4.5,4.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Evolution",2001,101,80000000,5.8,14232,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Evolution of Snuff, The",1978,79,NA,5.6,13,14.5,0,0,0,4.5,24.5,24.5,14.5,0,14.5,"",0,0,0,1,1,0,0 -"Evolver",1995,84,NA,4.8,198,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Evolver: Making of Youthanasia",1994,60,NA,9.2,10,0,0,0,0,14.5,0,14.5,0,0,84.5,"",0,0,0,0,0,0,0 -"Evridiki B.A. 2037",1976,100,NA,6.1,19,14.5,14.5,0,0,0,4.5,0,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Ewa chce spac",1958,95,NA,7.7,27,4.5,0,0,0,4.5,0,4.5,44.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ewangelia wedlug Harry'ego",1993,88,NA,3.3,20,24.5,0,0,14.5,24.5,0,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Ewige Jude, Der",1940,62,NA,3.8,232,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Ewige Traum, Der",1934,80,NA,4.8,13,0,0,0,14.5,34.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ewige Zweifel, Der",1918,41,NA,6.3,8,0,0,0,24.5,24.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Ewiger Walzer",1954,97,NA,5.4,8,0,24.5,14.5,0,0,24.5,24.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Ex, The",1997,87,NA,5.4,417,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ex-Child",1994,5,NA,7.2,6,0,0,0,0,0,34.5,45.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Ex-Lady",1933,67,93000,6.4,136,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Ex-Mrs. Bradford, The",1936,82,NA,6.9,160,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Ex-communion",1978,15,NA,7.9,6,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Ex-femme de ma vie, L'",2004,95,NA,5,36,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Ex-voto",2000,29,NA,8.5,6,0,0,0,0,0,0,14.5,45.5,34.5,0,"",0,0,0,0,0,0,1 -"Examen",2001,15,NA,9.4,7,0,0,0,0,0,0,0,24.5,0,74.5,"",0,0,0,0,0,0,1 -"Examen de minuit, L'",1998,100,NA,6.4,23,0,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Excalibur",1981,119,NA,7.4,11867,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Excalibur Kid, The",1999,88,NA,2.3,32,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,0,14.5,"PG",0,0,0,0,0,0,0 -"Exceed",2001,9,NA,7.4,10,34.5,0,0,0,14.5,0,14.5,0,14.5,44.5,"",0,0,1,0,0,0,1 -"Excellent Cadavers",1999,106,NA,6.2,210,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Exception to the Rule",1997,98,NA,4.8,88,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Excess Baggage",1997,101,NA,4.8,2881,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Excessive Force",1993,90,13000000,4.2,214,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Excessive Force II: Force on Force",1995,88,NA,4.3,81,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Excited",1970,53,NA,1.7,20,45.5,14.5,0,0,14.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Exciting Life of a Tree",1999,6,NA,6,27,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Exclusive",1937,85,NA,6,8,0,0,0,0,0,45.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Excursion",2003,3,NA,5.5,11,0,0,0,14.5,0,4.5,4.5,14.5,34.5,4.5,"",0,0,0,0,0,0,1 -"Excuse My Dust",1951,82,NA,6.1,45,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Execution of Czolgosz, with Panorama of Auburn Prison",1901,4,NA,4.9,21,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,1 -"Execution of Mary Stuart, The",1895,1,NA,5.7,33,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Execution of Wanda Jean, The",2002,88,NA,7.3,45,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Executioner, Part II, The",1984,85,NA,2.8,16,34.5,14.5,14.5,0,14.5,4.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Executioner, The",1970,107,NA,5.5,46,4.5,14.5,4.5,4.5,24.5,14.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Executioner, The",1978,84,NA,7.2,24,0,4.5,0,0,4.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Executive Action",1973,91,NA,6,233,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Executive Decision",1996,134,55000000,6.3,7653,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Executive Suite",1954,104,NA,7.1,412,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Executive Target",1997,92,NA,4.6,262,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Exercice of Steel",1998,4,NA,5.2,6,0,0,14.5,0,34.5,0,0,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Exercise in Discipline - Peel, An",1982,9,NA,6.9,52,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Exhibition",1975,110,NA,3.7,7,14.5,0,44.5,14.5,0,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Exhuming Tyler",1999,22,NA,5.3,14,0,0,4.5,4.5,24.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Exil Shanghai",1997,275,NA,4.3,13,14.5,0,0,4.5,0,0,24.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Exile",1994,95,NA,5.5,21,4.5,4.5,0,14.5,14.5,24.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Exile in Sarajevo",1997,90,NA,3.6,13,14.5,0,0,0,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Exile, The",1947,95,NA,6.7,43,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Exiled",1999,88,NA,8,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Exiled in America",1990,87,NA,4.5,12,34.5,0,4.5,0,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Exiles, The",1961,72,NA,6.4,12,0,0,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Exils",2004,104,NA,7.1,182,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Exist",2004,80,NA,6.1,25,14.5,4.5,0,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Existo",1999,94,NA,5.9,71,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Exit",1970,97,NA,3.3,20,45.5,4.5,4.5,4.5,14.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Exit",1989,20,NA,4.2,8,14.5,0,0,0,0,24.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Exit",1996,90,NA,3.4,47,14.5,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,14.5,"R",1,0,0,0,0,0,0 -"Exit",2000,107,NA,5.1,77,14.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Exit 8A",2004,22,NA,7.7,6,0,0,0,14.5,0,34.5,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Exit Wounds",2001,101,33000000,5.3,5370,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Exit in Red",1996,97,NA,3,127,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Exit the Dragon, Enter the Tiger",1976,84,NA,4.6,26,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Exit to Eden",1994,113,NA,3.9,1826,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Exit... nur keine Panik",1980,105,NA,4.8,12,0,0,14.5,4.5,0,4.5,0,4.5,0,45.5,"",1,0,0,0,0,0,0 -"Exo oi kleftes",1961,87,NA,6.3,5,0,0,0,24.5,0,24.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Exodos kindynou",1980,128,NA,7,6,14.5,0,0,0,0,34.5,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Exodus",1960,208,4000000,6.8,1161,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Exorcism",2003,98,NA,5,42,34.5,4.5,0,0,0,4.5,0,4.5,44.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Exorcismo",1975,90,NA,3,18,34.5,0,24.5,14.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Exorcismo Negro, O",1974,100,NA,7.1,17,14.5,0,0,4.5,14.5,0,14.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Exorcist II: The Heretic",1977,118,14000000,3.5,3009,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Exorcist III, The",1990,105,NA,5.5,2577,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Exorcist, The",1973,132,1000000,7.9,34162,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Exorcist: The Beginning",2004,114,30000000,5,4130,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Exotic Dreams of Casanova, The",1971,78,NA,1,6,45.5,0,0,0,14.5,0,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Exotic French Fantasies",1974,76,NA,6.4,5,0,0,0,0,24.5,0,0,0,24.5,64.5,"",0,0,0,0,0,0,0 -"Exotic House of Wax, The",1996,85,NA,2.9,72,24.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Exotic Time Machine, The",1997,78,NA,3.4,26,14.5,4.5,14.5,0,4.5,14.5,24.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Exotica",1994,103,NA,7.2,4494,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Expect No Mercy",1995,91,NA,3.2,78,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Expect a Miracle",2001,94,NA,3.7,5,24.5,0,44.5,0,0,24.5,0,24.5,0,0,"",0,0,1,0,0,1,0 -"Expecting",2002,91,NA,4.8,48,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Expendables, The",1988,89,NA,4.3,16,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Expensive Husbands",1937,62,NA,6.3,8,0,0,0,24.5,24.5,34.5,0,14.5,0,0,"",0,0,1,0,0,1,0 -"Expensive Tastes",1978,76,NA,5.9,12,14.5,0,0,0,0,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Experience",1968,29,NA,6.5,21,0,0,0,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Experience Box, The",2001,99,NA,6,8,0,0,0,14.5,14.5,0,14.5,0,24.5,34.5,"",0,0,1,1,0,0,0 -"Experiencia prematrimonial",1972,91,NA,4.3,11,4.5,4.5,14.5,0,64.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Experiment Alcatraz",1950,57,NA,5.6,17,0,0,0,14.5,24.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Experiment Perilous",1944,91,NA,6.2,118,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Experiment in Terror",1962,123,NA,7.2,368,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Experiment, Das",1998,9,NA,9.1,61,4.5,0,4.5,4.5,4.5,0,4.5,14.5,34.5,34.5,"",0,1,0,0,0,0,1 -"Experiment, Das",2001,119,NA,7.8,6601,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Expert, The",1932,68,NA,4,5,24.5,0,24.5,0,24.5,24.5,0,24.5,0,0,"",0,0,1,1,0,0,0 -"Expert, The",1995,92,NA,4,114,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Experte, Der",1988,93,NA,4.8,45,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Expertos en Pinchazos",1979,90,NA,4.2,16,4.5,14.5,0,4.5,4.5,4.5,34.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Experts, The",1989,94,NA,4.1,497,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Expiration",2003,102,50000,6.6,206,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Expired",2000,11,NA,6.4,11,0,0,0,0,4.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Explodiert",1998,15,NA,7.5,10,14.5,0,0,0,14.5,0,0,44.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Exploding Oedipus",2001,75,NA,3.9,9,14.5,0,34.5,24.5,24.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Exploits d'un jeune Don Juan, Les",1987,95,NA,5.2,29,0,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Explorers",1985,109,NA,6,1830,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Explosion",1969,98,500000,4.9,5,0,0,44.5,0,44.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Explosion of a Motor Car",1900,1,NA,7.2,40,0,4.5,0,0,14.5,14.5,34.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Explosive Generation, The",1961,89,NA,5.8,50,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Explozia",1973,112,NA,4.4,17,14.5,0,14.5,0,4.5,4.5,4.5,14.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Exponerad",1971,90,NA,4.5,10,14.5,14.5,0,24.5,14.5,0,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Expose Me, Lovely",1976,90,NA,4.3,25,24.5,4.5,0,4.5,14.5,24.5,0,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Exposed",1983,95,NA,4.4,170,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Expreso nocturno",2003,8,NA,7.3,6,0,0,0,0,14.5,0,45.5,0,14.5,14.5,"",0,0,1,0,0,0,1 -"Express: Aisle to Glory",1998,12,NA,7.7,38,0,4.5,0,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,1,0,0,0,1 -"Expresso Bongo",1960,111,NA,6.1,42,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Exquisite Corpse",2004,60,3500,8.9,16,0,0,0,0,0,0,24.5,4.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Exquisite Corpses",1989,95,NA,4.7,6,34.5,0,0,14.5,0,14.5,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Exquisite Tenderness",1995,99,NA,4.1,147,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Extase",1932,95,NA,7.1,25,0,4.5,0,0,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Extase",1933,87,NA,6.6,157,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Extension du domaine de la lutte",1999,120,NA,6.7,163,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Extensionista, El",1991,90,NA,5.6,13,4.5,14.5,4.5,0,4.5,34.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Exterminator 2",1984,89,NA,2.9,204,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Exterminator, The",1980,104,NA,4.6,457,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Extermineitors III: La gran pelea final",1991,85,NA,3.3,19,34.5,14.5,0,14.5,0,14.5,4.5,0,4.5,24.5,"",1,0,1,0,0,0,0 -"Extermineitors IV: Como hermanos gemelos",1992,90,NA,3.3,27,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Extermineitors, Los",1989,90,NA,3.7,43,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",1,0,1,0,0,0,0 -"Extinct Pink",1969,6,NA,4.6,78,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Extn. 21",2003,9,NA,6.3,11,4.5,0,0,0,0,4.5,45.5,14.5,0,4.5,"",0,1,0,0,0,0,1 -"Extra Girl, The",1923,68,NA,6.3,29,0,4.5,0,4.5,14.5,14.5,44.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Extra Turn, The",1903,1,NA,4.5,8,0,0,0,64.5,0,24.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Extra, El",1962,110,NA,6.7,25,0,0,4.5,0,14.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Extra, The",2005,96,NA,3.3,42,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Extramarital",1999,90,NA,4.6,107,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Extramuros",1985,118,NA,8.4,40,4.5,0,0,0,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Extraordinaire destin de Madame Brouette, L'",2002,104,NA,6.2,32,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Extraordinary Cab Accident, An",1903,1,NA,6.6,28,4.5,0,4.5,0,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Extraordinary Seaman, The",1969,80,NA,3.4,52,24.5,14.5,4.5,14.5,4.5,14.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Extraordinary Visitor",1998,87,NA,6.8,35,0,4.5,4.5,0,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Extras",1998,110,NA,4.9,15,0,4.5,4.5,24.5,14.5,14.5,24.5,14.5,0,4.5,"",1,0,1,0,0,0,0 -"Extraterrestre, L'",2000,93,NA,4.2,97,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Extraterrestres, Los",1983,90,NA,4,13,14.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Extreme Close-Up",1973,80,NA,3.9,40,24.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Extreme Days",2001,93,NA,4.8,342,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"PG",1,0,1,1,0,0,0 -"Extreme Force",2001,90,NA,4.6,22,24.5,0,4.5,4.5,14.5,14.5,0,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Extreme Justice",1993,96,NA,4.7,205,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Extreme Measures",1996,118,38000000,5.9,3417,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Extreme Ops",2002,94,40000000,4,1337,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Extreme Prejudice",1987,104,NA,5.9,682,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Extremism Breaks My Balls",2000,6,NA,5,12,4.5,0,14.5,0,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Extremities",1986,89,NA,5.9,402,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Exypnakias, O",1966,98,NA,7.9,6,0,0,14.5,0,0,34.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Eye Myth Educational",1972,2,NA,8.4,5,0,0,0,24.5,0,0,24.5,0,44.5,24.5,"",0,0,0,0,0,0,1 -"Eye for an Eye",1996,101,20000000,5.6,1843,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Eye for an Eye, An",1966,106,NA,5.2,21,0,0,4.5,4.5,14.5,34.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Eye for an Eye, An",1981,97,NA,4.9,303,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Eye of God",1997,84,NA,7.5,437,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Eye of the Beholder",1999,109,15000000,4.5,5549,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Eye of the Cat",1969,102,NA,5.6,85,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Eye of the Devil",1967,96,NA,5.2,191,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Eye of the Eagle",1986,84,NA,4,18,14.5,4.5,24.5,14.5,14.5,0,14.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Eye of the Eagle 2: Inside the Enemy",1989,78,NA,3.7,22,4.5,14.5,14.5,24.5,4.5,4.5,0,4.5,4.5,14.5,"",1,0,0,0,0,1,0 -"Eye of the Needle",1981,112,NA,7,1339,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Eye of the Storm",1991,98,NA,4.3,115,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Eye of the Storm",1992,67,NA,2.9,6,14.5,0,0,14.5,0,0,34.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Eye of the Stranger",1993,96,NA,2.7,16,64.5,14.5,0,0,0,0,4.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Eye of the Tiger",1986,92,NA,3.8,109,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Eye of the Wolf",1995,95,NA,4.2,28,4.5,4.5,4.5,4.5,24.5,4.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Eyeball Eddie",2000,29,NA,5.3,68,14.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Eyes",1971,35,NA,4.6,5,24.5,0,0,44.5,0,24.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Eyes Have It, The",1931,10,NA,5,25,0,4.5,14.5,4.5,34.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Eyes Have It, The",1945,7,NA,6.8,27,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Eyes Wide Shut",1999,159,65000000,7,37868,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Eyes in the Night",1942,80,NA,7,92,0,0,0,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Eyes of Fire",1983,82,NA,5.1,111,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Eyes of Laura Mars",1978,104,7000000,5.8,1174,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Eyes of Tammy Faye, The",2000,79,NA,7.4,424,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,0,1,0,0 -"Eyes of Texas",1948,70,NA,6.2,15,4.5,0,0,0,24.5,34.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Eyes of Youth",1919,78,NA,8.6,9,0,0,0,0,0,14.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Eyes of a Stranger",1981,84,NA,3.9,136,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Eyes of an Angel",1991,91,NA,4.6,150,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Eyes of the Beholder",1992,89,NA,3.2,59,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Eyes of the Navy",1940,20,NA,5.3,15,4.5,4.5,4.5,0,24.5,24.5,4.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"Eyes of the Underworld",1943,61,NA,7,5,0,0,0,0,24.5,0,64.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Eyes to Heaven",2000,88,NA,4.6,11,4.5,0,4.5,4.5,0,4.5,0,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Eyewitness",1956,82,NA,6,13,0,0,0,4.5,4.5,44.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Eyewitness",1970,92,NA,6.1,86,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Eyewitness",1981,103,NA,6,682,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Eyewitness to Murder",1991,105,NA,4,16,14.5,14.5,14.5,14.5,14.5,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ezek a fiatalok",1967,75,NA,8.5,6,0,0,0,0,0,34.5,0,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Ezrah Amerikai",1992,100,NA,6.8,13,4.5,0,0,4.5,0,14.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"F",1980,80,NA,6.9,27,0,4.5,4.5,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"F*Stop",2005,9,NA,9.1,10,0,0,0,0,0,14.5,14.5,14.5,0,74.5,"",0,0,0,0,0,0,1 -"F-Stops",2001,103,NA,7.4,9,14.5,0,0,14.5,0,14.5,0,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"F-Zone, The",1996,68,NA,8.6,9,0,0,0,0,0,14.5,0,34.5,14.5,44.5,"",0,0,0,0,0,0,0 -"F-Zone, The",1999,101,NA,7,7,24.5,0,0,0,14.5,0,24.5,0,0,24.5,"PG-13",0,0,0,1,0,0,0 -"F. est un salaud",1998,91,NA,6.4,86,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"F.E.N.",1979,114,NA,4,9,0,14.5,0,14.5,24.5,14.5,14.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"F.I.S.T.",1978,145,11000000,5.7,781,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"F.J. Holden, The",1977,101,NA,4.7,34,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"F.P.1",1933,74,NA,7.1,20,4.5,0,0,0,34.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"F.P.1 antwortet nicht",1932,114,NA,7.7,31,4.5,0,4.5,0,0,4.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"F.T.A.",1972,94,NA,3.6,22,34.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,24.5,"",0,0,1,0,1,0,0 -"F.T.W.",1994,100,NA,4,159,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"F/X",1986,109,NA,6.5,3946,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"F/X2",1991,108,NA,5.3,1514,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"FAQ: Frequently Asked Questions",2004,82,NA,4,8,0,0,0,14.5,0,0,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"FBI Girl",1951,74,NA,6.2,11,0,0,0,0,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"FBI Story, The",1959,149,NA,6.2,469,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"FBI: Frikis buscan incordiar",2004,85,NA,2.2,41,45.5,4.5,4.5,14.5,4.5,4.5,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"FHAR",1971,26,NA,9,7,0,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,1 -"FIX: The Story of an Addicted City",2002,92,NA,8.1,31,0,0,0,0,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"FM",1978,104,NA,5.6,169,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fa qian han",1977,92,NA,3.5,15,24.5,14.5,4.5,0,4.5,0,24.5,0,0,34.5,"",1,0,1,0,0,0,0 -"Fa yeung nin wa",2000,94,NA,8,7380,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"PG",0,0,0,1,0,1,0 -"Fabian",1980,110,NA,4.6,15,0,0,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fabiola",1949,96,NA,7,25,0,0,0,4.5,24.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fabrik der Offiziere",1960,91,NA,7,6,0,0,0,0,0,34.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Fabryka",1971,17,NA,6.2,19,4.5,0,0,0,14.5,34.5,4.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Fabuleuse aventure de Marco Polo, La",1965,112,NA,4.7,39,0,4.5,14.5,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Fabuleuses aventures du legendaire Baron de Munchausen, Les",1979,78,NA,5.5,6,0,0,0,14.5,14.5,0,0,34.5,0,34.5,"",0,1,1,0,0,0,0 -"Fabuleux voyage de l'ange, Le",1991,102,NA,6.4,5,0,24.5,0,0,24.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Fabuloso Fittipaldi, O",1973,99,NA,6.1,10,14.5,0,0,14.5,24.5,0,34.5,24.5,0,14.5,"",0,0,0,0,1,0,0 -"Fabulous Baker Boys, The",1989,110,NA,6.6,4419,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Fabulous Bastard from Chicago, The",1969,95,NA,1.9,5,24.5,0,24.5,24.5,0,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Fabulous Dorseys, The",1947,88,NA,5.1,83,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Fabulous Texan, The",1947,60,NA,7,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Faca de Dois Gumes",1989,75,NA,7.5,21,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Facade",2000,93,6000000,4.8,93,24.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Faccia a faccia",1967,100,NA,7.7,90,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Faccia di Picasso",2000,95,NA,4.6,40,24.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Faccia di spia",1975,105,NA,5.3,12,4.5,0,4.5,4.5,24.5,0,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Facciamo fiesta",1997,96,NA,1.9,13,24.5,14.5,14.5,0,4.5,4.5,0,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Face",2002,89,NA,6.3,42,4.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Face",2004,92,NA,5.4,75,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Face Behind the Mask, The",1941,69,NA,6.8,64,0,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Face at the Window, The",1910,17,NA,4.4,5,24.5,0,0,0,24.5,0,0,0,44.5,24.5,"",0,0,0,1,0,0,1 -"Face at the Window, The",1939,65,NA,6.1,24,4.5,0,4.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Face in the Crowd, A",1957,125,NA,8,1286,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Face in the Fog, A",1936,66,NA,6,7,0,0,0,14.5,14.5,24.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Face in the Rain",1963,81,NA,4.5,5,0,0,44.5,0,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Face of Eve, The",1968,97,NA,4.4,18,0,24.5,24.5,24.5,14.5,0,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Face of Fire",1959,79,NA,6.4,42,0,0,4.5,4.5,14.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Face of Fu Manchu, The",1965,89,NA,5.9,172,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Face of Marble, The",1946,72,NA,3.7,48,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Face of War, A",1968,72,NA,8.1,12,0,0,0,0,0,0,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Face of a Fugitive",1959,81,NA,5.7,36,0,0,0,4.5,34.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Face of the Screaming Werewolf",1964,60,NA,2.2,16,24.5,14.5,24.5,4.5,0,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Face of the Serpent, The",2003,100,NA,5.1,24,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,0,14.5,"R",1,0,0,0,0,0,0 -"Face on the Bar Room Floor, The",1914,14,NA,5.5,33,0,14.5,0,24.5,24.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Face on the Bar-Room Floor, The",1923,60,NA,1,7,100,0,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Face the Music",1993,93,NA,4.9,44,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Face to Face",1952,89,NA,5.1,8,0,0,0,34.5,34.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Face to Face",2003,92,8000,6,9,24.5,0,0,0,14.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Face-Off",1971,112,NA,5.2,77,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Face/Off",1997,133,80000000,7.1,37506,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Faceless",1988,90,NA,5.8,119,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Faces",1968,130,275000,7.4,770,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Faces of Death",1978,85,NA,3.4,645,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Faces of Death 2",1981,85,NA,2.6,268,44.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Faces of Death 3",1985,91,NA,2.2,189,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Faces of Death 4",1990,90,NA,2.3,175,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Faces of Death 5",1995,90,NA,2,91,45.5,4.5,4.5,4.5,14.5,0,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Faces of Death 6",1996,70,NA,1.5,93,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,1,0,0 -"Faces of Death: Fact or Fiction?",1999,54,NA,2.3,68,45.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Faces of Gore",1999,89,NA,4.3,40,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Faces of Gore 2",2000,90,NA,2.7,17,64.5,4.5,4.5,4.5,14.5,0,0,0,0,4.5,"",0,0,0,0,1,0,0 -"Faces of Gore 3",2000,90,NA,3.6,5,44.5,0,44.5,0,0,0,0,0,0,24.5,"",0,0,0,0,1,0,0 -"Facing Your Danger",1946,10,NA,5.9,12,0,0,0,4.5,4.5,44.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Facing the Enemy",2001,98,NA,5,67,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Facing the Music",2001,89,NA,8.3,47,0,0,0,0,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Factor Pilgrim, El",2000,87,NA,6.6,50,4.5,4.5,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Factotum",2005,94,1000000,6.8,60,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Facts Are Safety",2001,6,NA,5,7,0,14.5,0,0,24.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Facts of Life, The",1960,103,NA,6.3,84,4.5,0,0,4.5,4.5,24.5,24.5,14.5,0,14.5,"",0,0,1,1,0,1,0 -"Faculty, The",1998,104,15000000,6.1,13143,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Fadarines, Oi",1979,115,NA,5.2,10,14.5,14.5,0,14.5,0,0,24.5,0,14.5,44.5,"",0,0,1,0,0,0,0 -"Fade",2000,22,NA,5.7,26,14.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Fade to Black",1980,102,NA,5.1,358,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fade to Black",2004,109,NA,4.5,110,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"R",0,0,0,0,1,0,0 -"Fado Lusitano",1994,6,NA,6.1,10,14.5,0,0,0,24.5,14.5,14.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Fado majeur et mineur",1995,110,NA,9.3,6,14.5,0,0,0,0,0,34.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Faeries",1999,75,NA,5,73,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Faflatas, O",1972,89,NA,7,8,0,0,0,0,0,14.5,64.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Fag Hag",1998,73,NA,2.7,34,24.5,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Faggots Are for Burning",1996,10,NA,8.3,11,14.5,0,0,0,0,0,0,0,4.5,74.5,"",0,0,0,1,0,0,1 -"Fagin's Freshman",1939,8,NA,4.8,6,0,0,34.5,0,14.5,14.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Fah",1998,118,NA,5.1,18,34.5,0,0,14.5,4.5,0,4.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Fah talai jone",2000,101,NA,7.1,471,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Fahrenheit 451",1966,108,NA,7.1,4094,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fahrenheit 9/11",2004,122,6000000,7.9,34666,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"R",0,0,0,0,1,0,0 -"Fahrerflucht",2003,12,NA,6.2,12,14.5,0,0,0,4.5,34.5,0,14.5,0,24.5,"",0,0,0,0,0,1,1 -"Faibles femmes",1959,100,NA,7.4,84,4.5,0,4.5,0,4.5,14.5,45.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fail-Safe",1964,112,NA,7.8,3170,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Failan",2001,115,NA,7.9,506,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Failure at Fifty, A",1940,10,NA,5.7,5,0,0,0,0,44.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Failures, The",2003,95,NA,6,13,4.5,0,4.5,0,14.5,24.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Fair Game",1986,90,NA,5,45,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Fair Game",1995,91,50000000,3.9,2579,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,1,1,0,0,0 -"Fair Haired Hare, The",1951,7,NA,7.5,35,0,0,4.5,0,4.5,4.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Fair Play",2002,15,NA,7.6,9,14.5,14.5,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Fair Wind to Java",1953,92,1250000,5.8,47,4.5,4.5,0,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Fair and Worm-er",1946,7,NA,7.1,16,0,0,0,0,4.5,4.5,64.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Fairies",2003,20,NA,8,19,14.5,4.5,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Fairuz, we hielden zoveel van mekaar",2003,80,NA,6.6,5,0,0,0,0,0,24.5,24.5,44.5,0,24.5,"",0,0,0,0,1,0,0 -"Fairy Faith, The",2000,75,NA,6.6,25,0,0,0,4.5,14.5,14.5,14.5,0,24.5,24.5,"",0,0,0,0,1,0,0 -"Fairy Tale",1998,30,NA,6.5,23,4.5,0,0,0,0,24.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Fairy Tales",1979,82,NA,4.7,89,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fairy Tales: Next Gen",2004,15,NA,2.2,5,84.5,0,0,0,0,0,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Fairy Who Didn't Want to Be a Fairy, The",1992,16,NA,8.8,6,0,0,0,0,0,0,0,14.5,84.5,0,"",0,0,1,0,0,0,1 -"FairyTale: A True Story",1997,99,NA,6.5,920,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Fais-moi des vacances",2002,86,NA,5.5,26,4.5,0,0,14.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fait Accompli",1998,94,NA,4,109,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fait d'hiver",1999,105,NA,5.8,23,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Fait d'hiver",2001,6,80000,7.4,164,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,1,1,0,0,1 -"Faites sauter la banque!",1963,88,NA,6.6,103,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Faith",1990,101,NA,1.8,12,34.5,34.5,4.5,0,0,0,14.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Faithful",1910,17,NA,6.1,9,14.5,0,0,0,34.5,14.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,1 -"Faithful",1996,91,13000000,5.6,414,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Faithful in My Fashion",1946,81,NA,4.6,18,14.5,0,0,24.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,1,0,0,1,0 -"Faithless",1932,77,203420,6.6,40,0,0,4.5,4.5,14.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Faits divers",1983,108,NA,5,68,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Fake",2000,60,NA,6.9,39,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,1,1,1,0,0,0 -"Fake",2003,109,NA,7.4,16,0,0,0,0,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Fake Clouds",2003,8,NA,6.3,7,0,0,24.5,0,24.5,14.5,0,0,24.5,0,"",0,0,0,0,0,0,1 -"Fake ID",2003,86,100000,3.6,41,4.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fake, The",1953,80,NA,5.4,10,0,0,14.5,14.5,24.5,44.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Fake-Out",1982,96,NA,4.6,29,4.5,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Fakers",2004,85,1800000,5.6,58,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Fakin' Da Funk",1997,89,NA,5.2,111,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Fala Tu",2003,74,NA,6.9,8,0,0,0,14.5,0,14.5,34.5,24.5,0,14.5,"",0,0,0,0,1,0,0 -"Falaise, La",1998,17,NA,6.3,7,0,0,14.5,0,0,24.5,14.5,0,24.5,14.5,"",0,0,0,0,0,0,1 -"Falakros mathitis, O",1979,90,NA,7.3,6,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Falbalas",1945,95,NA,7,29,0,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Falcon Down",2000,93,NA,4.4,112,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Falcon Out West, The",1944,64,NA,6.3,35,0,0,4.5,14.5,14.5,24.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Falcon Strikes Back, The",1943,63,NA,6.5,40,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Falcon Takes Over, The",1942,65,NA,6.2,78,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Falcon and the Co-eds, The",1943,67,NA,5.9,41,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Falcon and the Snowman, The",1985,131,NA,6.6,1912,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Falcon in Danger, The",1943,69,NA,6,24,0,0,0,4.5,24.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Falcon in Hollywood, The",1944,66,NA,5.9,54,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Falcon in Mexico, The",1944,70,NA,6.4,43,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Falcon in San Francisco, The",1945,66,NA,6.3,34,4.5,0,0,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Falcon's Adventure, The",1946,61,NA,6.1,34,0,0,0,4.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Falcon's Alibi, The",1946,61,NA,6,38,0,0,4.5,14.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Falcon's Brother, The",1942,63,NA,6.5,55,4.5,0,4.5,4.5,24.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Falecida, A",1965,90,NA,7.9,16,0,0,0,0,0,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Falkehjerte",1999,80,NA,4.8,29,0,4.5,14.5,14.5,0,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Falkenau, the Impossible",1988,52,NA,8.2,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Falkland Man, The",2001,77,NA,5.2,15,14.5,4.5,4.5,0,4.5,24.5,4.5,0,14.5,24.5,"",1,0,0,0,0,0,0 -"Fall",1997,93,1000000,5.1,495,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Fall",2000,97,2000000,1.5,249,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Fall Gleiwitz, Der",1961,70,NA,8.7,13,0,0,0,0,0,4.5,4.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Fall Guy",1947,64,NA,7.1,7,0,0,0,0,14.5,44.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Fall Out-Fall in",1943,7,NA,7.5,47,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Fall Time",1995,103,NA,5,330,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Fall X701, Der",1966,80,NA,4.5,36,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Fall of the Roman Empire, The",1964,184,19000000,6.4,996,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fall, The",1998,94,NA,5.2,78,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Fallait pas!...",1996,95,NA,5,88,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fallen",1998,123,NA,6.7,9367,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Fallen Angel",1945,98,NA,7.1,142,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Fallen Angel",1997,99,NA,3.9,26,4.5,14.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Fallen Angel: Gram Parsons",2004,90,NA,7.4,17,0,0,0,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Fallen Angels",1996,57,NA,7.8,10,0,0,0,14.5,0,24.5,14.5,24.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Fallen Angels",2002,97,NA,4.8,29,14.5,14.5,4.5,4.5,24.5,14.5,4.5,0,4.5,4.5,"R",0,0,0,0,0,0,0 -"Fallen Arches",1998,100,NA,2.8,17,14.5,4.5,14.5,0,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Fallen Idol, The",1948,95,NA,8,322,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Fallen Sparrow, The",1943,94,NA,6.9,100,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Falling Angels",2003,104,NA,6.4,170,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Falling Down",1993,113,NA,7.3,14536,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Falling Grace",2004,15,NA,8.8,10,0,0,0,0,0,14.5,14.5,14.5,34.5,44.5,"",0,0,0,0,0,0,1 -"Falling Hare",1943,8,NA,7.3,81,0,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Falling Leaves",1912,12,NA,6.4,10,0,0,14.5,0,0,34.5,64.5,0,0,0,"",0,0,0,1,0,0,1 -"Falling Like This",2000,94,NA,3,269,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Falling Over Backwards",1990,100,NA,4.7,13,0,0,4.5,24.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Falling Rocks",2000,93,NA,6.2,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Falling Sky",1998,95,NA,5.3,109,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Falling Through",2000,92,NA,4.8,70,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Falling Words",1997,19,8000,9.2,13,0,0,0,0,0,0,4.5,24.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Falling for You",1933,88,NA,5,8,0,0,14.5,14.5,24.5,34.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Falling from Grace",1992,100,NA,5.3,147,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Falling in Love",1984,106,NA,5.9,1392,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Falling in Love Again",1980,103,NA,4.8,94,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fallo!",2003,90,NA,4.3,62,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Fallout",1995,87,NA,5.4,28,14.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fallout",1998,90,NA,3.2,113,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Fallout",2003,15,NA,8.8,9,14.5,0,0,0,14.5,0,0,24.5,34.5,24.5,"",0,0,0,1,0,0,1 -"Falls, The",1980,185,NA,7.7,181,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Falls, The",1991,89,NA,6.6,25,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Falls, The",2003,85,75000,5.7,29,14.5,4.5,4.5,0,0,14.5,4.5,14.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Falo Crest",1987,80,NA,5.6,5,24.5,0,0,0,0,24.5,64.5,0,0,0,"",0,0,1,0,0,0,0 -"Falsche Adam, Der",1955,80,NA,7.6,7,0,14.5,0,0,0,0,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Falsche Bewegung",1975,103,NA,7,162,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Falsche Gewicht, Das",1971,140,NA,6.7,21,0,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"False Alarms",1936,18,NA,7,82,0,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"False Colors",1943,65,NA,6.3,24,4.5,4.5,0,0,14.5,24.5,4.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"False Face",1977,95,NA,4.7,28,4.5,4.5,0,4.5,24.5,24.5,0,0,4.5,34.5,"",0,0,0,1,0,0,0 -"False Faces, The",1919,70,NA,6.6,5,24.5,0,0,0,0,44.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"False Hare",1964,6,NA,5.9,26,4.5,0,4.5,14.5,14.5,14.5,34.5,4.5,0,0,"",0,1,1,0,0,0,1 -"False Identity",1990,93,NA,5.1,30,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"False Madonna, The",1931,70,NA,6.6,6,0,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"False Paradise",1948,59,NA,7.1,18,0,0,4.5,0,0,14.5,24.5,14.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Falsehood",2001,34,NA,8.6,28,0,0,0,0,0,4.5,0,4.5,45.5,44.5,"",0,0,0,1,0,0,1 -"Falsk som vatten",1985,102,NA,6.2,97,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fame",1980,134,NA,6.3,2662,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fame Chimica",2003,97,NA,6.8,43,0,0,0,4.5,4.5,14.5,45.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Fame Is the Spur",1946,116,NA,6,25,4.5,0,4.5,0,4.5,24.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Fame Whore",1997,73,NA,5.7,22,24.5,0,4.5,4.5,0,0,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Famiglia Buonanotte, La",1989,92,NA,5.4,12,0,4.5,4.5,0,14.5,14.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Famiglia Passaguai, La",1951,75,NA,6.9,6,0,0,0,0,0,34.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Famiglia, La",1987,120,NA,7.5,268,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Familia",1996,102,NA,7.3,238,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Familia de tantas, Una",1949,130,NA,9.7,23,0,0,0,0,0,0,4.5,4.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Familia rodante",2004,103,NA,7,61,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Familia, bien, gracias, La",1979,104,NA,4.6,12,0,0,24.5,24.5,24.5,4.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Familiari delle vittime non saranno avvertiti, I",1972,93,NA,3.9,17,4.5,4.5,24.5,24.5,24.5,4.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Familie",2001,91,NA,7.8,185,4.5,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Familien Gregersen",2004,240,NA,5.1,46,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Familjehemligheter",2001,101,NA,6.6,152,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Familles je vous hais",1997,78,NA,4.9,5,0,0,0,24.5,24.5,0,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Family Affair, A",1937,69,190000,6.7,57,0,0,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Family Affair, A",2001,107,NA,5.2,59,14.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Family Attraction",1998,17,NA,5.7,16,0,0,4.5,0,4.5,14.5,34.5,0,4.5,34.5,"",0,0,0,0,0,0,1 -"Family Business",1989,110,NA,5.4,2256,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Family Fundamentals",2002,75,NA,6.9,35,0,4.5,4.5,0,4.5,24.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Family Honeymoon",1949,90,NA,6.2,32,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Family Jewels, The",1965,99,NA,5.7,251,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Family Life",1924,20,NA,5.9,8,0,0,0,14.5,0,45.5,24.5,0,14.5,0,"",0,0,1,0,0,0,1 -"Family Man, The",2000,125,60000000,6.5,11220,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Family Name",1997,89,NA,3.5,15,14.5,0,0,4.5,14.5,0,0,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Family Plan",1998,102,NA,4.6,142,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Family Plot",1976,121,3000000,6.6,2212,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Family Portrait",1950,25,NA,5.5,6,0,14.5,14.5,0,34.5,0,14.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Family Portrait",2004,28,NA,9.7,7,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,0,0,1,0,1 -"Family Remains",1993,35,NA,7.2,6,0,0,0,0,14.5,14.5,0,64.5,0,0,"",0,0,0,0,0,0,1 -"Family Reunion",1988,97,NA,5.5,9,14.5,0,0,14.5,14.5,24.5,14.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Family Reunion",1989,84,NA,7.2,7,0,0,0,0,24.5,24.5,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Family Secret, The",1951,85,NA,6.6,6,0,0,0,0,0,34.5,34.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Family That Dwelt Apart, The",1974,8,NA,7.9,22,0,0,0,0,14.5,4.5,4.5,14.5,34.5,14.5,"",0,1,1,0,0,0,1 -"Family Thing, A",1996,109,NA,6.9,800,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Family Tree",1999,86,NA,5.6,56,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Family Viewing",1987,86,NA,7.1,285,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Family Way, The",1966,115,NA,7.4,187,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Family, The",1974,103,NA,5,6,14.5,0,0,0,34.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Famous",2000,90,NA,6.1,252,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Famous Boners",1942,10,NA,6.1,5,0,0,0,0,44.5,0,64.5,0,0,0,"",0,0,0,0,1,0,1 -"Famous Ferguson Case, The",1932,74,NA,6.4,5,0,0,0,0,44.5,44.5,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Famous Fred",1996,30,NA,6.8,12,0,0,4.5,4.5,4.5,0,24.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Famous Movie Dogs",1940,10,NA,6.2,9,0,0,0,14.5,0,34.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,1 -"Fan chan",2003,110,NA,6.9,71,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Fan yi cho",2000,111,NA,5.9,77,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Fan, Der",1982,88,NA,5.5,46,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fan, The",1949,89,NA,5.6,59,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Fan, The",1981,95,NA,5.1,307,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fan, The",1996,114,55000000,5.4,6920,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Fanalysis",2002,26,NA,7.7,91,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,1,0,1 -"Fanatic",1965,97,NA,5.8,138,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fancy Answers",1941,10,NA,6.5,6,0,0,0,0,0,34.5,64.5,0,0,0,"",0,0,0,0,0,0,1 -"Fancy Dancing",2002,91,NA,5.5,26,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fancy Pants",1950,92,NA,6.5,207,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fandango",1985,91,NA,6.2,1737,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Fandango",2000,94,NA,5.5,69,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fando y Lis",1967,93,100000,6.6,218,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fandom",2004,96,5000,9.2,12,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,0,1,1,0,0 -"Faneflukt",1975,97,NA,5.2,12,0,0,4.5,14.5,14.5,34.5,14.5,0,0,4.5,"",0,0,0,1,0,1,0 -"Fanella Me To 9, I",1988,121,NA,7.2,25,4.5,0,0,4.5,0,4.5,44.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fanfan",1993,89,NA,6.3,476,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Fanfan la Tulipe",1952,95,NA,7.6,248,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Fanfan la tulipe",2003,97,NA,5.5,537,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fanfare",1958,93,NA,7.4,111,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Fanfaren der Liebe",1951,91,NA,7.1,7,14.5,0,0,0,0,24.5,14.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Fang lang",1997,118,NA,3.4,15,14.5,4.5,0,14.5,4.5,14.5,4.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Fang shiyu",1973,90,NA,4.2,33,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Fangs",2001,94,NA,3,170,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Fanny",1932,140,NA,8.3,206,4.5,4.5,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Fanny",1961,134,NA,7,212,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Fanny Hill",1964,104,NA,2.9,34,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fanny Hill",1968,91,NA,4.6,18,4.5,14.5,4.5,14.5,24.5,0,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Fanny Hill",1983,80,NA,4.9,128,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Fanny Hill",1995,86,NA,2.3,20,24.5,24.5,14.5,0,4.5,14.5,0,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fanny Pelopaja",1984,100,NA,5.7,27,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fanny and Elvis",1999,111,NA,5.8,144,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fanny by Gaslight",1944,102,NA,5.7,44,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fanny och Alexander",1982,312,NA,8.2,4359,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Fans and Freaks: The Culture of Comics and Conventions",2002,80,NA,7.9,11,0,0,0,0,4.5,14.5,0,4.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Fansom the Lizard",2000,9,NA,5.8,20,0,0,0,14.5,14.5,14.5,24.5,0,14.5,24.5,"",0,1,0,0,0,0,1 -"Fant",1937,95,NA,6.1,29,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Fantasia",1940,80,2280000,7.8,14925,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Fantasia Al Noseh Romanti",1978,90,NA,7.5,8,0,0,0,0,0,0,14.5,24.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Fantasia Legacy: The Concert Feature, The",2000,50,NA,7.3,20,0,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Fantasia chez les ploucs",1971,100,NA,4.3,24,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fantasia/2000",1999,75,80000000,7.4,5353,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Fantasist, The",1986,98,NA,5.1,44,0,4.5,14.5,4.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Fantasm",1976,90,NA,4.4,24,0,24.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Fantasm Comes Again",1977,94,NA,3.4,13,4.5,34.5,14.5,0,14.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Fantasma d'amore",1981,99,NA,6.9,48,0,0,4.5,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Fantasma de la casa roja, El",1956,91,NA,4.9,16,0,14.5,4.5,0,14.5,34.5,0,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fantasma de la opereta, El",1960,90,NA,6,8,0,0,0,0,34.5,0,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Fantasma del convento, El",1934,85,NA,7.1,11,0,0,0,0,0,4.5,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Fantasma dell'opera, Il",1998,106,10000000,3.8,910,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Fantasma di Sodoma, Il",1988,84,NA,4.2,74,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fantasma, O",2000,90,NA,5.7,341,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fantasmagorie",1908,2,NA,5.9,17,4.5,14.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Fantasmas burlones, Los",1965,85,NA,9.2,5,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,0,1,0,0,0,0 -"Fantasmi a Roma",1961,100,NA,6.2,36,4.5,0,4.5,4.5,0,4.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Fantastic Animation Festival",1977,80,NA,7.2,13,0,4.5,4.5,0,0,0,14.5,44.5,14.5,4.5,"",0,1,0,0,0,0,0 -"Fantastic Voyage",1966,100,NA,6.7,2098,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Fantastica",1980,110,NA,5.6,17,14.5,0,4.5,14.5,14.5,14.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Fantastici tre supermen, I",1967,94,NA,7.9,11,0,0,0,4.5,0,4.5,34.5,0,4.5,34.5,"",1,0,0,0,0,0,0 -"Fantasticks, The",2000,86,NA,5.8,420,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"PG",0,0,0,0,0,0,0 -"Fantastische Nacht, Das",2003,19,NA,5.6,5,0,0,0,44.5,0,44.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Fantasy Film Worlds of George Pal, The",1985,93,NA,7.2,35,0,0,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Fantom kiler",1998,90,NA,4.6,47,34.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fantom kiler 2",1999,82,NA,4.2,15,34.5,0,4.5,14.5,14.5,14.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Fantozzi",1975,100,NA,8.1,369,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Fantozzi 2000 - la clonazione",1999,100,NA,3.8,35,14.5,14.5,24.5,24.5,4.5,0,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fantozzi alla riscossa",1990,105,NA,5.2,54,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fantozzi subisce ancora",1983,85,NA,6,86,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fantozzi va in pensione",1988,102,NA,5.7,76,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fany",1995,99,NA,7.4,43,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Far Country, The",1954,97,NA,7.2,531,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Far East",1982,102,NA,5.5,28,4.5,0,4.5,14.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Far From Bismarck",1999,80,NA,6.6,11,14.5,0,0,4.5,4.5,4.5,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Far From China",2001,110,NA,8.9,7,0,0,0,0,0,0,24.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Far From Home: The Adventures of Yellow Dog",1995,81,NA,5.8,306,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Far From Poland",1984,106,NA,6.1,7,14.5,0,0,14.5,0,0,45.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Far Frontier, The",1948,67,NA,5.6,10,0,0,0,14.5,24.5,44.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Far Harbor",1996,99,NA,5,95,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Far Horizons, The",1955,108,NA,6,107,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Far North",1988,90,NA,4.2,134,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Far Off Place, A",1993,108,NA,6.4,684,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Far Out Man",1990,81,NA,3.5,166,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Far Shore, The",1976,105,NA,5,6,0,0,0,34.5,34.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Far West",1973,90,NA,3.6,12,4.5,4.5,4.5,0,34.5,0,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Far West",2003,17,NA,4.9,52,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Far and Away",1992,140,30000000,6.2,8556,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Far betaler",1946,82,NA,7.3,8,0,0,0,0,0,14.5,14.5,45.5,0,24.5,"",0,0,0,0,0,0,0 -"Far from Heaven",2002,107,13500000,7.7,9167,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Far from Home",1989,86,NA,5.5,234,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Far from India",2003,101,10000,6.1,13,14.5,0,4.5,0,14.5,0,34.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Far from the Madding Crowd",1967,168,NA,7.2,587,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Far laver sovsen",1967,109,NA,4.4,13,4.5,4.5,0,14.5,34.5,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Far skal giftes",1941,92,NA,6.4,5,0,0,0,0,44.5,0,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Far til fire",1953,97,NA,5.9,41,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Far til fire i byen",1956,95,NA,5.8,43,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Far til fire i sneen",1954,98,NA,5.8,28,4.5,0,4.5,14.5,24.5,24.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Far til fire med fuld musik",1961,95,NA,5.1,25,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Far til fire og onkel Sofus",1957,89,NA,5.4,24,0,4.5,4.5,14.5,34.5,4.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Far til fire og ulveungerne",1958,93,NA,5.4,18,0,0,14.5,24.5,24.5,24.5,0,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Far, El",1998,85,NA,5.6,9,0,0,24.5,0,24.5,24.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Fara",1999,89,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Faraon",1966,118,NA,7,124,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Faraonul",2004,82,NA,6.1,7,0,14.5,0,14.5,24.5,0,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Fararishtay kifti rost",2002,90,NA,6.4,89,4.5,4.5,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Faraw!",1997,90,NA,7.2,5,0,0,24.5,0,0,0,24.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Farba",1998,77,NA,6.6,11,0,0,0,4.5,4.5,44.5,4.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Farceur, Le",1960,88,NA,6.1,14,0,4.5,0,0,24.5,24.5,4.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Fare to Remember, A",1998,100,NA,5.5,43,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Farendj",1990,90,NA,6.7,6,0,14.5,14.5,0,14.5,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Farewell to Arms, A",1932,79,NA,6.5,473,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Farewell to Arms, A",1957,152,4353000,5.6,260,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Farewell to Harry",2002,103,NA,6.9,21,4.5,0,0,0,4.5,0,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Farewell to the King",1989,115,NA,5.6,403,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Farewell, My Love",2001,90,NA,4.7,51,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Farewell, My Lovely",1975,97,NA,6.9,668,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Farfallon",1974,100,NA,7.7,10,0,0,0,0,0,14.5,24.5,34.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Fargo",1952,69,NA,6.5,74,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Fargo",1996,98,7000000,8.2,65597,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Fargo Kid, The",1940,63,NA,5.6,15,0,4.5,0,0,14.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Farinelli",1994,111,NA,6.7,1176,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Farlig farvann",1995,85,NA,6.2,70,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Farlig frihet",1954,86,NA,5.7,8,0,0,0,0,45.5,0,45.5,0,0,0,"",0,0,0,1,0,0,0 -"Farlig leg",1990,90,NA,5.4,5,0,0,0,44.5,0,24.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Farlig ungdom",1953,108,NA,5,7,0,0,0,44.5,14.5,0,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Farligt venskab",1995,88,NA,5.9,72,4.5,4.5,0,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Farm Family: In Search of Gay Life in Rural America",2004,73,NA,7.7,9,0,0,0,0,0,0,14.5,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Farm Foolery",1949,8,NA,6.4,5,0,24.5,0,0,0,44.5,0,24.5,24.5,0,"",0,1,0,0,0,0,1 -"Farm Frolics",1941,7,NA,6.4,15,4.5,0,0,4.5,14.5,24.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Farm Sluts",2003,17,NA,8.5,44,0,0,0,0,4.5,4.5,14.5,24.5,34.5,24.5,"",0,0,1,0,0,0,1 -"Farm of Tomorrow",1954,6,NA,6.8,28,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Farm: Angola, USA, The",1998,88,NA,7.7,147,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Farmer & Chase",1997,97,NA,4.8,40,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Farmer Takes a Wife, The",1935,91,NA,5.8,21,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,0,4.5,"",0,0,1,0,0,1,0 -"Farmer Takes a Wife, The",1953,81,NA,4.6,20,4.5,4.5,4.5,24.5,34.5,4.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Farmer's Daughter, The",1940,60,NA,7.3,13,0,0,0,0,4.5,14.5,24.5,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Farmer's Daughter, The",1947,97,NA,7.4,342,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Farmer's Wife, The",1928,129,NA,6.6,167,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Farmer's Wife, The",1998,390,NA,8.5,52,0,4.5,0,0,4.5,0,4.5,4.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Farmer, The",1977,97,NA,4.7,31,4.5,4.5,0,4.5,4.5,4.5,0,4.5,14.5,45.5,"",1,0,0,0,0,0,0 -"Farmhouse, The",1998,101,NA,5.5,28,14.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Farmingville",2004,79,NA,6.9,47,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Farmyard Symphony",1938,8,NA,6.8,42,4.5,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Faro, El",1998,109,NA,7.8,162,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Farrebique ou les quatre saison",1946,90,NA,6.6,18,14.5,4.5,0,0,0,14.5,0,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Farsantes, Los",1963,82,NA,6.2,6,0,0,0,0,34.5,0,14.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Farz",1967,170,NA,5.8,5,24.5,0,0,24.5,0,0,44.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Fascinating Nature",1996,90,NA,9.2,21,0,0,0,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Fascination",1980,79,NA,5.9,12,0,0,0,4.5,4.5,24.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Fascination",2004,95,5000000,3.3,124,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,1,0 -"Fascist of X-Mart, The",2003,9,1000,5.1,22,24.5,4.5,4.5,4.5,0,4.5,4.5,0,4.5,44.5,"",0,0,1,0,0,0,1 -"Fashion Model",1945,61,NA,4.4,5,24.5,0,0,44.5,44.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Fashionably L.A.",1999,95,NA,5.9,47,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fashions of 1934",1934,78,NA,6.8,162,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Fassbinder in Hollywood",2002,57,NA,7.4,18,0,14.5,0,14.5,0,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Fast",1995,100,NA,5.4,23,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Fast Break",1979,107,NA,5.1,152,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fast Buck Duck",1963,6,NA,6.3,21,0,0,0,4.5,4.5,24.5,24.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Fast Bullets",1936,58,NA,4.8,9,0,0,24.5,0,34.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Fast Cars, Fast Women",1981,90,NA,6.4,5,0,0,0,0,44.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Fast Charlie... the Moonbeam Rider",1979,98,NA,4.9,33,4.5,4.5,0,14.5,34.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Fast Company",1938,75,NA,6.7,27,0,0,0,4.5,0,24.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Fast Company",1953,67,NA,5.4,18,0,0,14.5,14.5,34.5,24.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Fast Company",1979,91,NA,4.7,141,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fast Film",2003,14,NA,8.1,98,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Fast Food",1989,92,NA,3.7,104,14.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fast Food Fast Women",2000,95,NA,6.4,801,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Fast Food High",2003,92,4500000,5.4,23,14.5,0,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Fast Forward",1985,110,NA,4.4,105,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fast Forward",2004,5,NA,6,7,0,14.5,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Fast Getaway",1991,86,NA,4.3,246,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Fast Getaway II",1994,87,NA,3.9,137,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fast Gun",1987,82,NA,3.5,8,14.5,0,14.5,45.5,14.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Fast Horses",1998,97,NA,8,9,14.5,0,0,0,0,0,14.5,14.5,44.5,24.5,"",0,0,1,1,0,0,0 -"Fast Lady, The",1962,95,NA,5.6,77,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fast Lane to Malibu",2000,94,NA,3,58,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fast Life",1932,82,NA,5.1,6,0,0,0,14.5,14.5,45.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Fast Money",1995,93,NA,5.5,306,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Fast Sofa",2001,109,NA,4,182,14.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Fast Spin Fling",2000,5,NA,5.1,6,0,0,0,0,64.5,0,0,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Fast Talking",1984,95,NA,5.1,17,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fast Times at Hero High",2003,5,NA,6.1,32,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,0,44.5,"",0,0,1,0,0,0,1 -"Fast Times at Ridgemont High",1982,90,4500000,7.1,10361,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Fast Trip, Long Drop",1994,54,NA,7.2,6,0,0,0,0,34.5,0,0,34.5,34.5,0,"",0,0,0,0,1,0,0 -"Fast Workers",1933,66,NA,5.6,29,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fast and Furious",1939,73,NA,6.2,32,0,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"Fast and Furry-ous",1949,7,NA,7.8,112,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Fast and Loose",1930,70,NA,6.4,11,0,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Fast and Loose",1939,80,NA,5.9,35,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Fast and Loose",1953,75,NA,5,18,0,4.5,4.5,0,64.5,14.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Fast and the Furious, The",1954,73,66000,4.6,73,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fast and the Furious, The",2001,106,38000000,5.7,21428,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Fast perfekte Hochzeit, Eine",1999,95,NA,6.3,24,0,0,4.5,14.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Fast perfekte Scheidung, Eine",1997,100,NA,3.5,25,14.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fast perfekter Seitensprung, Ein",1996,105,NA,6.2,29,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Fast, Cheap & Out of Control",1997,80,NA,7.3,988,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,0,1,0,0 -"Faster",2003,103,NA,6.4,93,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"PG-13",0,0,0,0,1,0,0 -"Faster, Pussycat! Kill! Kill!",1965,83,45000,6.5,1242,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,1,1,0,0,0 -"Fastest Guitar Alive, The",1967,87,NA,4.6,44,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Fastest Gun Alive, The",1956,89,NA,6.7,248,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Fastest with the Mostest",1960,7,NA,6.4,31,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Fastnachtsbeichte, Die",1960,97,NA,7.8,11,0,0,4.5,0,4.5,14.5,0,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Fasulye",2000,105,NA,7.5,115,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Fasuna to Chibusa",2001,60,NA,4.9,5,0,0,0,44.5,44.5,0,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Faszination Natur - Seven Seasons",2004,86,NA,6.6,7,0,14.5,0,0,0,44.5,0,14.5,24.5,0,"",0,0,0,0,1,0,0 -"Fat Albert",2004,93,NA,4.2,1062,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"Fat Black Pussycat, The",1963,94,NA,3.9,20,14.5,14.5,0,24.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Fat Chance",2001,10,NA,7,5,0,0,0,0,0,0,84.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Fat City",1972,100,NA,7.4,544,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fat Man and Little Boy",1989,127,NA,6.3,1219,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fat Man, The",1951,77,NA,6.3,30,0,0,0,14.5,14.5,34.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fat Spy, The",1966,75,NA,3.2,34,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Fata Morgana",1965,84,NA,6.3,11,4.5,0,0,4.5,0,34.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Fata Morgana",1971,78,NA,7.9,121,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Fatal Affair",1998,94,NA,4.9,82,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Fatal Attraction",1987,123,14000000,6.7,8541,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fatal Beauty",1987,104,NA,4.4,528,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Fatal Bond",1992,89,NA,3.8,35,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fatal Choice",1995,95,NA,4.1,11,24.5,14.5,0,4.5,24.5,14.5,0,0,0,0,"",1,0,0,1,0,0,0 -"Fatal Conflict",2000,92,NA,2.3,47,24.5,24.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"R",1,0,0,1,0,0,0 -"Fatal Footsteps",1926,25,NA,7.6,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,1 -"Fatal Frames",1996,125,NA,4.1,64,34.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fatal Games",1984,81,NA,5.1,38,24.5,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fatal Glass of Beer, The",1933,18,NA,7.6,269,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Fatal Hour, The",1940,68,NA,4.7,71,4.5,4.5,4.5,24.5,24.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Fatal Instinct",1991,95,NA,3.9,93,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fatal Instinct",1993,91,NA,5.2,1320,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fatal Mallet, The",1914,18,NA,5.7,26,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Fatal Passion",1994,90,NA,4.1,9,14.5,24.5,0,34.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Fatal Past",1993,70,NA,3.3,18,24.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Fatal Pursuit",1998,103,NA,2.2,39,44.5,14.5,24.5,0,4.5,4.5,4.5,0,0,14.5,"R",0,0,0,1,0,0,0 -"Fatal Reaction: Singapore",1997,90,NA,2.6,5,0,24.5,0,0,24.5,0,0,44.5,24.5,0,"",0,0,0,0,1,0,0 -"Fatal Sky",1990,92,NA,5.6,20,0,4.5,14.5,4.5,34.5,14.5,14.5,4.5,4.5,0,"",1,0,0,0,0,0,0 -"Fate",1990,114,NA,5.9,6,34.5,0,14.5,0,0,14.5,0,0,0,34.5,"",0,0,1,0,0,1,0 -"Fate Foretold, A",2000,21,NA,7.6,11,0,0,0,0,14.5,0,4.5,14.5,44.5,4.5,"",0,0,0,0,0,0,1 -"Fate Is the Hunter",1964,106,NA,7,241,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fate Totally Worse Than Death, A",2000,84,NA,3.9,42,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Fate come noi",2001,92,NA,6.8,16,4.5,4.5,4.5,0,0,4.5,14.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Fate ignoranti, Le",2001,109,NA,7.4,1216,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Fate un bel sorriso",2000,93,NA,3.9,6,14.5,0,14.5,0,0,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Fate, Le",1966,114,NA,5.2,20,0,0,14.5,0,24.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Father Brown",1954,91,NA,7.2,113,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Father Christmas",1991,25,NA,5.9,46,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Father Dear Father",1972,99,NA,4,29,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Father Gets in the Game",1908,10,NA,4.4,5,24.5,0,0,0,44.5,0,44.5,0,0,0,"",0,0,1,0,0,0,1 -"Father Goose",1964,118,NA,7.1,1575,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Father Guido Sarducci Goes to College",1985,59,NA,6.3,17,4.5,0,14.5,0,0,14.5,14.5,0,14.5,44.5,"",0,0,1,0,0,0,0 -"Father Hood",1993,95,NA,3.8,463,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Father Is a Bachelor",1950,83,NA,6.1,16,0,0,0,4.5,14.5,24.5,14.5,34.5,4.5,0,"",0,0,1,0,0,0,0 -"Father Is a Prince",1940,57,NA,6.5,24,0,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,0,"",0,0,1,1,0,0,0 -"Father Makes Good",1950,61,NA,2.5,6,34.5,14.5,0,0,0,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Father Noah's Ark",1933,8,NA,6.8,52,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Father Roy: Inside the School of Assassins",1997,56,NA,3,12,24.5,0,0,0,14.5,0,14.5,0,14.5,24.5,"",0,0,0,0,1,0,0 -"Father Takes a Wife",1941,79,NA,5.9,38,0,0,4.5,14.5,24.5,14.5,4.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Father Was a Fullback",1949,84,NA,6,59,4.5,4.5,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Father Xmas",2001,20,NA,8.4,10,14.5,0,0,0,0,0,0,14.5,45.5,34.5,"",0,0,1,1,0,0,1 -"Father and Daughter",2000,8,NA,7.9,234,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,1,0,1,0,0,1 -"Father of the Bride",1950,92,NA,7.3,1515,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Father of the Bride",1991,105,NA,6.4,8636,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Father of the Bride Part II",1995,106,30000000,5.6,4089,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Father's Day Off",1953,7,NA,7,39,0,4.5,4.5,4.5,4.5,14.5,34.5,4.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Father's Lion",1952,6,NA,6.7,46,4.5,0,4.5,4.5,0,14.5,44.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Father's Little Dividend",1951,82,NA,6.6,460,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Father's Week-end",1953,7,NA,6.9,34,4.5,0,4.5,0,4.5,14.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Fatherland",1986,111,NA,5.7,41,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Fathers & Sons",1992,109,NA,4.8,113,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fathers Are People",1951,7,NA,6.6,35,4.5,0,4.5,4.5,0,24.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Fathers' Day",1997,98,85000000,4.7,2714,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Fathom",1967,99,NA,5.4,215,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fatiche di Ercole, Le",1958,107,NA,5,217,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fatimas tredje hemlighet",1999,15,NA,3.1,8,14.5,14.5,34.5,14.5,0,14.5,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Fatma",2002,124,NA,7.1,18,4.5,0,4.5,4.5,4.5,24.5,34.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Fatso",1980,93,NA,5.4,302,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Fatti di gente per bene",1974,115,NA,7.2,19,0,0,0,4.5,14.5,24.5,24.5,0,34.5,4.5,"",0,0,0,1,0,0,0 -"Fatto di sangue fra due uomini per causa di una vedova - si sospettano moventi politici",1978,115,NA,5.3,47,4.5,4.5,0,0,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fatty Drives the Bus",1999,82,NA,5.6,38,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Fatty Finn",1980,91,NA,6.3,47,4.5,4.5,4.5,4.5,0,14.5,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Fatty and Mabel Adrift",1916,34,NA,7.1,38,14.5,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Fatty's Magic Pants",1914,12,NA,5.6,16,4.5,0,0,4.5,4.5,64.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Fatty's Tintype Tangle",1915,20,NA,6.6,21,0,0,4.5,0,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Fauno, Il",1917,60,NA,7,5,0,0,0,0,0,24.5,0,84.5,0,0,"",0,0,0,0,0,0,0 -"Faussaires, Les",1994,90,NA,4.3,18,14.5,4.5,4.5,14.5,14.5,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Fausse suivante, La",2000,96,NA,6.2,50,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Faust",1926,116,NA,8.4,731,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Faust",1960,128,NA,6.2,100,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Faust",1994,97,NA,7.3,411,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,1,0,0,0,0,0 -"Faust: Love of the Damned",2001,101,6000000,4.1,628,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Faustina",1957,101,NA,3.5,5,24.5,0,0,24.5,44.5,0,0,0,0,24.5,"",0,0,1,1,0,0,0 -"Fausto",1993,89,NA,5.7,84,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fausto 5.0",2001,94,NA,6.4,281,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Faustrecht der Freiheit",1975,123,NA,7.8,346,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Faustyna",1995,73,NA,5.5,13,4.5,0,4.5,0,0,14.5,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Faut-il aimer Mathilde?",1993,94,NA,7.6,8,0,14.5,0,0,0,14.5,64.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Fautes d'orthographe, Les",2004,90,NA,6.4,39,0,0,4.5,4.5,14.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fauves, Les",1984,90,NA,3.2,13,14.5,4.5,0,45.5,4.5,0,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Faux contact",2000,13,NA,6.4,16,0,0,0,0,14.5,4.5,0,24.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Faux fuyants",1983,100,NA,8,5,24.5,0,0,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Faux magistrat, Le",1914,70,NA,8,30,0,0,0,0,0,4.5,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Favor, El",2004,90,NA,5.5,27,4.5,14.5,4.5,0,0,14.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Favor, The",2001,5,NA,5.9,8,0,0,0,0,14.5,24.5,0,14.5,0,45.5,"",0,0,1,0,0,0,1 -"Favoris de la lune, Les",1984,101,NA,6.6,89,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Favorita, La",1952,78,NA,5.8,7,0,0,0,0,44.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Favorite Son",1997,95,NA,5,45,34.5,0,0,4.5,0,0,0,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Favorite, The",1989,104,NA,3.4,39,4.5,24.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Favour, the Watch and the Very Big Fish, The",1991,89,NA,5.6,294,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Fay Lung kwo gong",1978,100,NA,6.4,70,4.5,4.5,4.5,0,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Fazil",1928,88,NA,6,15,0,0,0,14.5,4.5,24.5,34.5,24.5,4.5,0,"",0,0,0,1,0,1,0 -"Fazilet",1989,87,NA,9.2,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,0,0,1,0,0,0 -"Fe, esperanza y caridad",1974,113,NA,7.5,11,0,0,0,4.5,0,4.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fear",1946,68,NA,6.2,30,14.5,0,14.5,4.5,14.5,24.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Fear",1988,96,NA,4.4,40,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Fear",1996,97,NA,5.6,4687,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Fear & Favor in the Newsroom",1996,57,NA,8.7,16,0,0,0,0,0,0,4.5,4.5,14.5,74.5,"",0,0,0,0,1,0,0 -"Fear Chamber, The",1968,88,NA,3.2,35,24.5,14.5,4.5,14.5,4.5,0,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Fear City",1984,95,NA,4.6,271,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fear Is the Key",1972,99,NA,5.8,178,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Fear Less",2003,5,NA,6.1,10,0,0,0,14.5,44.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Fear No Evil",1981,99,840000,3.9,127,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fear Strikes Out",1957,100,NA,7,269,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fear X",2003,91,6600000,5.9,742,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Fear and Desire",1953,68,20000,6.3,225,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Fear and Loathing in Las Vegas",1998,118,18500000,7.2,21484,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Fear in the Night",1947,72,NA,6.9,85,0,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Fear in the Night",1972,94,NA,4.9,58,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fear of Flying",2000,96,NA,4.6,612,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Fear of a Black Hat",1994,88,NA,6.7,1031,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Fear of the Dark",2001,150,30000,5.5,10,14.5,0,0,14.5,14.5,24.5,0,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Fear of the Dark",2002,86,NA,5.5,355,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Fear, Anxiety & Depression",1989,85,NA,5.5,78,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fear, The",1995,88,NA,2.9,198,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fear: Resurrection, The",1999,97,NA,2.8,165,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"FearDotCom",2002,101,42000000,3.2,5126,34.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Fearless",1993,122,NA,7.1,4352,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fearless Fagan",1952,79,NA,5.2,24,4.5,4.5,4.5,14.5,24.5,24.5,0,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Fearless Frank",1967,83,NA,3.2,34,34.5,14.5,4.5,0,4.5,4.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fearless Tiger",1994,88,NA,2.9,39,45.5,4.5,4.5,14.5,4.5,4.5,0,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Fearless Vampire Killers, The",1967,108,2000000,7,3452,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Fearless: The Hunterwali Story",1993,62,NA,6.1,5,0,0,0,0,0,24.5,0,0,44.5,44.5,"",0,0,0,0,0,0,0 -"Fearmakers, The",1958,85,NA,5.3,47,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Feast",1992,87,NA,3.4,22,24.5,14.5,4.5,4.5,4.5,0,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Feast at Midnight, A",1994,105,NA,6.5,130,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"PG",0,0,1,1,0,0,0 -"Feast of Death",2001,90,NA,6.4,14,0,0,0,0,0,24.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Feast of Friends",1970,50,NA,6.2,5,0,0,24.5,44.5,0,0,0,0,0,44.5,"",0,0,0,0,1,0,0 -"Feast of July",1995,116,NA,6.2,161,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Feather Bluster",1958,6,NA,5.8,20,0,4.5,0,14.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Feather Dusted",1955,6,NA,6.7,22,0,0,0,14.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Feather Finger",1966,6,NA,5.8,8,0,0,14.5,0,14.5,24.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Feather in His Hare, A",1948,7,NA,6.5,33,4.5,0,0,4.5,14.5,14.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Feathered Serpent, The",1948,68,NA,6.1,71,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Feathers",1987,60,NA,6,9,14.5,0,0,0,14.5,24.5,44.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Febbre da cavallo",1976,100,NA,7.2,174,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Febbre da cavallo - La mandrakata",2002,104,NA,5.5,37,14.5,4.5,4.5,4.5,14.5,34.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Febbre, La",2005,108,NA,6.9,48,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fede tider",1996,55,NA,6.4,57,0,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Federal Agents vs. Underworld, Inc.",1949,167,NA,6.1,10,0,0,14.5,0,24.5,34.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Federal Hill",1994,97,80000,6.1,139,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Federal Operator 99",1945,169,NA,8,14,0,0,0,0,0,4.5,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Federale, Il",1961,100,NA,7.5,30,0,0,0,0,4.5,14.5,4.5,44.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Federico Fellini - un autoritratto ritrovato",2000,55,NA,7.8,18,24.5,0,0,0,0,14.5,0,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Fedora",1978,114,6727000,6.2,271,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Feds",1988,90,NA,4.7,674,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Feed",1992,76,NA,6.5,61,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Feed 'em and Weep",1938,10,NA,7.3,16,0,0,0,0,0,4.5,34.5,34.5,14.5,0,"",0,0,1,0,0,0,1 -"Feed the Kitty",1952,7,NA,8.5,185,0,0,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Feedback",2002,88,NA,5.5,87,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Feeders",1996,68,NA,1.7,148,74.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Feedin' the Kiddie",1957,7,NA,5.2,5,0,24.5,0,0,0,24.5,24.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Feel My Pulse",1928,86,NA,6.6,20,0,4.5,0,0,4.5,14.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Feel Neil",2003,80,NA,7,9,0,0,0,0,0,0,24.5,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Feeling Called Glory, A",1999,29,NA,6.9,8,14.5,0,0,0,0,14.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Feeling Minnesota",1996,99,NA,5.2,2602,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Feelings",1977,93,NA,7.3,5,0,0,0,0,24.5,0,0,44.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Feelings of Mountains and Waters",1988,19,NA,8.7,10,0,0,0,0,0,0,0,34.5,44.5,34.5,"",0,1,0,0,0,0,1 -"Feest",1963,28,NA,2.2,21,14.5,4.5,4.5,4.5,4.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,1 -"Feestje",2004,95,NA,4.4,111,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Feet First",1930,93,647000,7,78,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Feet of Song",1988,6,NA,7.7,8,0,0,0,0,14.5,14.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Fei Tien",1996,126,NA,3.9,13,14.5,4.5,0,45.5,14.5,0,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Fei hu xiong xin",1994,103,NA,5.2,46,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Fei lung maang jeung",1988,102,NA,7.2,635,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Fei yat boon oi ching siu suet",1997,93,NA,4.7,22,14.5,0,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fei ying",2004,99,15000000,5.5,128,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Fei ying gai wak",1990,80,NA,6.9,1840,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Feiertag",2002,82,NA,6.8,5,0,0,0,0,24.5,0,64.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Feixia Ahda",1994,120,NA,5,14,0,0,4.5,4.5,0,0,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Feldmann saken",1987,87,NA,6.4,10,14.5,0,0,24.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Feldmarescialla, La",1967,100,NA,3.3,13,4.5,14.5,24.5,4.5,4.5,4.5,0,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Felices pascuas",1954,83,NA,4.4,6,0,14.5,14.5,34.5,14.5,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Felicia's Journey",1999,116,NA,7,2519,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Felicidades",2000,100,NA,7.2,126,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Felicity",1979,90,NA,4,45,14.5,0,4.5,4.5,24.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Felidae",1994,82,NA,6.5,163,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Feline Follies",1919,6,NA,7,19,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Feline Frame-up",1954,7,NA,7.8,32,0,0,0,0,0,4.5,24.5,44.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Felix",1982,92,NA,6.7,19,0,0,0,14.5,0,14.5,34.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Felix",1988,82,NA,3.6,9,0,0,34.5,14.5,14.5,0,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Felix",1996,87,NA,4.9,8,34.5,0,14.5,0,14.5,0,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Felix - Ein Hase auf Weltreise",2005,84,NA,5.9,7,14.5,14.5,14.5,0,0,0,14.5,14.5,0,24.5,"",0,1,0,0,0,0,0 -"Felix the Cat: The Movie",1991,82,NA,6.4,53,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Feliz Ano Velho",1987,111,NA,8,40,4.5,0,4.5,0,4.5,14.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Feliz navidad, Una",2001,15,NA,7,8,14.5,0,0,14.5,0,0,45.5,14.5,14.5,0,"",0,0,1,1,0,0,1 -"Fella with the Fiddle, The",1937,7,NA,6.8,10,0,0,0,0,14.5,24.5,45.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Fellini: Je suis un grand menteur",2002,105,NA,6.7,97,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Fellow Americans",1942,11,NA,4.7,8,0,14.5,24.5,0,24.5,0,14.5,0,14.5,14.5,"",0,0,0,0,1,0,1 -"Felony",1996,93,NA,3.6,72,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Felsen, Der",2002,122,NA,6.8,124,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fem mand og Rosa",1964,99,NA,6.2,16,4.5,4.5,0,0,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Female",1933,58,286000,6.5,115,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Female Animal, The",1958,84,NA,4.7,28,4.5,4.5,14.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Female Bunch, The",1969,86,NA,2.8,38,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Female Jungle",1954,73,NA,4.9,45,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Female Misbehavior",1992,80,NA,7.1,12,0,0,0,0,0,14.5,34.5,4.5,34.5,4.5,"",0,0,0,0,1,0,0 -"Female Perversions",1996,119,NA,5.6,510,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Female Trouble",1974,97,25000,7.1,868,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"NC-17",0,0,1,0,0,0,0 -"Female of the Species, The",1912,17,NA,6.9,28,4.5,4.5,4.5,0,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Female on the Beach",1955,97,NA,5.6,137,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Females Is Fickle",1940,6,NA,6.5,6,0,0,14.5,0,0,14.5,0,0,34.5,34.5,"",0,1,1,0,0,0,1 -"Femalien",1996,89,NA,4.8,208,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Femalien II",1998,92,NA,3.6,107,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Femina ridens",1969,108,NA,6.4,45,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Feminine Touch, The",1941,97,NA,6.6,79,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Feminine Touch, The",1994,94,NA,4.6,45,14.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Femme",1996,4,NA,4.9,13,0,4.5,14.5,0,4.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Femme Fatale",1991,94,NA,4.3,145,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Femme Fatale",2002,114,35000000,6.4,6083,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Femme aux bottes rouges, La",1974,92,NA,6,48,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Femme de Gilles, La",2004,103,NA,6.2,51,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Femme de Jean, La",1974,105,NA,6.6,11,0,0,0,14.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Femme de Rose Hill, La",1989,95,NA,6.7,18,0,0,0,4.5,0,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Femme de chambre du Titanic, La",1997,88,NA,6.8,397,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Femme de l'aviateur, La",1981,104,NA,7.6,224,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Femme de ma vie, La",1986,102,NA,6.7,29,0,0,4.5,4.5,24.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Femme de mon pote, La",1983,99,NA,6,138,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Femme du Gange, La",1974,100,NA,6.2,8,14.5,0,0,0,0,0,14.5,0,64.5,14.5,"",0,0,0,0,0,0,0 -"Femme du boulanger, La",1938,133,NA,8.3,202,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Femme du cosmonaute, La",1998,99,NA,5.6,56,4.5,4.5,4.5,14.5,14.5,14.5,34.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Femme en bleu, La",1973,95,NA,5.5,33,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Femme enfant, La",1980,100,NA,6.3,9,0,0,14.5,0,0,14.5,34.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Femme et le pantin, La",1959,101,NA,5.8,18,0,0,0,14.5,4.5,24.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Femme flic, La",1980,103,NA,6.3,31,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Femme papillon, La",2003,10,NA,5.8,8,0,0,0,14.5,14.5,64.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Femme publique, La",1984,113,NA,5.4,92,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Femme qui boit, La",2001,91,NA,6.6,68,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Femme qui pleure, La",1979,90,NA,6.4,7,0,0,0,14.5,0,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Femme-Objet, La",1980,80,NA,7.7,7,0,0,0,0,14.5,0,24.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Femmes",1983,86,NA,5.1,14,24.5,24.5,0,4.5,14.5,24.5,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Femmes de Paris",1953,85,NA,6,6,0,0,14.5,0,0,34.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Femmes de Sade",1976,80,NA,5.5,23,0,0,4.5,0,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Femmes femmes",1974,115,NA,5.7,10,14.5,14.5,0,0,0,14.5,44.5,14.5,0,24.5,"",0,0,1,1,0,0,0 -"Femmes s'en balancent, Les",1953,109,NA,6.1,19,0,0,0,14.5,0,14.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Femmes, Les",1969,86,NA,5.8,41,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Femmes... ou les enfants d'abord..., Les",2002,123,NA,6.7,108,4.5,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Femmina",1998,93,NA,3.6,6,14.5,14.5,0,0,0,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Femmine in fuga",1985,90,NA,4,41,4.5,14.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Femmine infernali",1980,88,NA,4.1,63,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Femmine insaziabili",1969,99,NA,5.2,9,14.5,0,14.5,0,34.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Fen nu qing nian",1973,100,NA,6.5,17,0,0,0,4.5,0,14.5,14.5,24.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Fence, The",1994,91,NA,4.1,74,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Feng kuang de dai jia",1988,100,NA,8.1,7,0,0,0,0,0,0,14.5,74.5,0,14.5,"",0,0,0,1,0,0,0 -"Feng yue",1996,127,NA,6.8,506,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Feng yue qi tan",1972,95,NA,7.9,15,0,0,0,4.5,14.5,0,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Feng yun xiong ba tian xia",1998,85,10000000,6.3,922,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Fengkuang yingyu",1999,90,NA,6.1,22,4.5,0,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Fengkuei-lai-te jen",1983,101,NA,8,64,4.5,0,0,0,0,4.5,24.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Feniks, De",1999,12,NA,5.4,25,0,0,0,14.5,0,24.5,34.5,24.5,0,0,"",0,0,1,1,0,1,1 -"Fenomenal e il tesoro di Tutankamen",1968,95,NA,5.8,6,34.5,0,0,0,0,0,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Fenster mit Aussicht",2001,9,NA,5.4,5,0,0,0,24.5,24.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Fenstersturz, Der",2001,15,NA,6,24,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Feras, As",1995,94,NA,8.4,10,24.5,0,0,0,0,0,0,64.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ferdinand the Bull",1938,8,NA,7.6,119,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Ferdinando I. re di Napoli",1959,105,NA,6.3,6,0,0,0,14.5,14.5,14.5,45.5,0,0,0,"",0,0,1,0,0,0,0 -"Ferdinando e Carolina",1999,102,NA,5.5,21,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Ferdydurke",1991,90,NA,6,40,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Ferestadeh",1983,103,NA,8.3,15,0,0,0,0,4.5,0,4.5,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Ferie d'agosto",1996,110,NA,6.5,100,4.5,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ferien auf Immenhof",1957,87,NA,4.5,43,4.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ferienfieber",2004,85,NA,6.5,16,4.5,4.5,14.5,0,14.5,14.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Ferkel",1998,4,NA,6.4,22,0,0,0,0,14.5,34.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"Ferment",1999,4,NA,7.3,5,0,0,0,0,0,0,84.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Fermo con le mani!",1937,73,NA,7.2,7,0,0,0,0,24.5,44.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Fermo posta Tinto Brass",1995,90,NA,4.6,102,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"FernGully: The Last Rainforest",1992,76,NA,5.6,1983,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Fernando ha vuelto",1998,31,NA,8.5,14,24.5,0,0,0,0,0,24.5,14.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Ferocious Female Freedom Fighters",1982,90,NA,4.9,45,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Feroz",1984,115,NA,2.6,8,14.5,14.5,14.5,0,0,14.5,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Ferret Called Mickey, A",2003,12,NA,5.8,11,14.5,0,4.5,0,34.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Ferris Bueller's Day Off",1986,102,NA,7.7,32130,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ferroviere, Il",1956,105,NA,7.8,54,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ferry Cross the Mersey",1965,88,NA,8.3,19,0,0,0,0,14.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Ferry Tales",2003,40,NA,8.1,22,0,0,0,0,14.5,4.5,4.5,34.5,24.5,4.5,"",0,0,0,0,1,0,1 -"Ferry to Hong Kong",1959,112,NA,5.3,58,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Fest des Huhnes, Das",1992,55,NA,7.8,15,4.5,0,0,0,4.5,0,0,14.5,44.5,24.5,"",0,0,1,0,1,0,0 -"Festa",1989,82,NA,6.9,18,4.5,0,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Festa de Margarette, A",2003,80,NA,5.8,24,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Festa di laurea",1985,94,NA,7.1,28,0,0,0,0,14.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Festen",1998,105,1300000,8.2,11983,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Festin de la mante, Le",2003,96,NA,5.9,14,4.5,4.5,0,4.5,4.5,24.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Festival",1967,95,NA,7,21,0,4.5,0,0,0,4.5,14.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Festival",2001,95,NA,4.2,348,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Festival Express",2003,90,NA,7.3,305,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"R",0,0,0,0,1,0,0 -"Festival in Cannes",2001,100,NA,6.4,207,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Festival of Claymation",1987,53,NA,7.5,10,0,0,0,0,14.5,24.5,0,24.5,24.5,34.5,"",0,1,0,0,0,0,0 -"Fetch",1998,7,NA,7.1,21,0,0,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Fetentoni, I",1999,99,NA,5,8,14.5,0,14.5,0,64.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Fetishes",1996,84,NA,5.8,79,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fette Welt",1998,89,NA,5.8,35,14.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Fetten Jahre sind vorbei, Die",2004,127,NA,7.9,1238,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,1,0 -"Feu Mathias Pascal",1926,170,NA,6.6,16,0,4.5,0,0,0,14.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Feu follet, Le",1963,108,NA,7.5,247,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Feu sous la peau, Le",1985,87,NA,3.2,6,14.5,14.5,0,14.5,34.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Feud There Was, A",1938,8,NA,7.7,9,0,0,0,0,14.5,14.5,14.5,14.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Feud with a Dude",1968,6,NA,6.2,8,0,0,14.5,14.5,0,14.5,24.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Feud, The",1989,97,NA,5.4,44,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Feudin' Fools",1952,63,NA,7.2,28,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Feudin', Fussin' and A-Fightin'",1948,78,NA,2.5,22,24.5,4.5,4.5,0,0,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Feuer und Schwert - Die Legende von Tristan und Isolde",1982,84,NA,7.5,13,0,0,0,4.5,0,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Feuer, Eis & Dosenbier",2002,83,NA,3.3,219,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Feuer, Eis & Dynamit",1990,106,NA,3,171,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Feuerreiter",1998,130,NA,6.7,23,4.5,14.5,0,4.5,4.5,14.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Feuerrote Baronesse, Die",1959,99,NA,6,6,0,0,0,0,14.5,64.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Feuerwerk",1954,97,NA,5.8,13,0,0,4.5,4.5,0,24.5,24.5,34.5,4.5,0,"",0,0,1,0,0,1,0 -"Feuerzangenbowle, Die",1944,97,NA,7.6,930,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Feuerzeug, Das",1958,83,NA,6.8,16,0,4.5,0,0,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Feux rouges",2004,105,NA,7,371,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fever",1999,95,6000000,5.7,248,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Fever Heat",1968,109,NA,5.5,7,0,0,0,0,44.5,14.5,0,0,14.5,24.5,"",1,0,0,1,0,0,0 -"Fever Pitch",1985,96,NA,3.3,49,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fever Pitch",1997,102,NA,6.7,1697,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Fever Pitch",2001,27,25000,5.8,40,45.5,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,"",0,0,1,0,1,0,1 -"Fever Pitch",2005,98,39690000,6.6,1712,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Fever in the Blood, A",2002,12,NA,7.6,14,0,0,0,0,0,14.5,14.5,4.5,0,64.5,"",1,0,1,0,0,0,1 -"Fever, The",2004,83,NA,7.2,16,34.5,0,0,0,4.5,0,4.5,0,4.5,44.5,"",0,0,0,1,0,0,0 -"Few Doctors, The",1997,34,NA,1.9,12,14.5,0,4.5,0,0,4.5,14.5,4.5,0,44.5,"",0,0,0,0,0,0,1 -"Few Good Men, A",1992,138,33000000,7.5,25237,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Few Moments with Eddie Cantor, A",1924,7,NA,9.1,16,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Few of Us",1996,105,NA,7.2,59,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Fi baitina rajul",1961,159,NA,5,8,0,0,0,14.5,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Fiaca, La",1969,95,NA,7.6,27,4.5,0,0,4.5,0,14.5,14.5,24.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Fiaker Nr. 13",1926,95,NA,6.5,5,0,0,0,0,84.5,0,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Fica Comigo",1998,90,NA,5.8,9,14.5,0,0,24.5,14.5,24.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Fichissimi, I",1981,90,NA,6.5,35,4.5,0,4.5,4.5,4.5,4.5,44.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Fickende Fische",2002,104,NA,7.3,228,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fiction Makers, The",1968,105,NA,5.9,74,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fida",2004,180,NA,5.7,46,4.5,4.5,0,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Fidanzati, I",1963,84,NA,8.2,111,0,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fiddle-de-dee",1947,3,NA,7.8,21,4.5,0,0,4.5,0,0,4.5,24.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Fiddler on the Roof",1971,181,9000000,7.6,5893,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fiddlers Three",1944,65,NA,6.7,6,0,0,0,0,14.5,45.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Fiddlers Three",1948,17,NA,7.3,42,0,0,4.5,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Fidel",1999,12,NA,6.5,22,0,0,0,4.5,0,4.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Fidel",2001,91,NA,7.7,85,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Fiebre",1970,90,NA,5.1,14,4.5,0,14.5,0,4.5,14.5,0,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Fiebre amarilla",1983,90,NA,4.7,6,45.5,0,0,0,0,0,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Fiebre del loco, La",2001,94,NA,6.4,83,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Field",2001,10,NA,6.3,9,0,0,0,24.5,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Field Mouse, The",1941,9,NA,4,5,24.5,0,0,24.5,0,0,24.5,0,0,44.5,"",0,1,0,0,0,0,1 -"Field and Scream",1955,7,NA,6.5,17,0,0,0,4.5,0,44.5,14.5,4.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Field of Dreams",1989,107,NA,7.7,21270,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Field of Fire",1991,96,NA,5,19,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Field of Honor",1986,95,NA,5.6,39,14.5,4.5,14.5,0,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Field of Honor, A",1973,15,1400,7.7,32,4.5,4.5,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",1,0,1,0,0,0,1 -"Field, The",1990,107,NA,6.6,588,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fields of Mudan",2004,23,NA,8,11,4.5,0,4.5,0,0,0,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,1 -"Fiend",1980,90,NA,3.2,28,34.5,14.5,14.5,4.5,4.5,14.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Fiend Who Walked the West, The",1958,101,NA,5,32,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Fiend Without a Face",1958,74,NA,5.8,303,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fiend of Dope Island",1961,76,NA,3.6,11,4.5,24.5,0,4.5,0,14.5,0,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Fiend, The",1971,87,NA,4.5,22,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Fiendish Plot of Dr. Fu Manchu, The",1980,101,NA,4.1,374,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fierce Creatures",1997,93,NA,6.1,5216,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fierecilla domada, La",1956,80,NA,4.7,6,14.5,0,0,0,14.5,34.5,0,34.5,0,0,"",0,0,1,0,0,0,0 -"Fierecillos indomables, Los",1982,85,NA,2.7,6,14.5,34.5,0,0,14.5,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Fierecillos se divierten, Los",1983,90,NA,3.5,10,14.5,14.5,14.5,0,0,14.5,44.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Fierrot le pou",1990,8,NA,4.1,49,34.5,4.5,0,4.5,14.5,14.5,14.5,24.5,0,4.5,"",0,0,1,0,0,0,1 -"Fiesta",1941,45,NA,4.5,10,24.5,0,14.5,34.5,14.5,24.5,14.5,0,0,0,"",0,0,1,0,0,1,0 -"Fiesta",1947,104,NA,5.3,49,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fiesta",1995,112,NA,7.2,80,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Fiesta Fiasco",1967,6,NA,6.3,20,0,0,14.5,14.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Fiesta de Santa Barbara, La",1935,19,NA,6.1,45,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Fiesta de todos, La",1979,110,NA,1.5,15,64.5,0,0,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,1,0,1,0,0 -"Fiesta, La",2003,103,NA,4.7,76,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fietsen naar de maan",1963,97,NA,7.2,5,0,0,0,0,24.5,24.5,24.5,0,44.5,0,"",0,0,1,0,0,0,0 -"Fifa e arena",1948,80,NA,7.9,26,0,0,0,0,4.5,14.5,14.5,14.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Fifi Blows Her Top",1958,17,NA,5.8,42,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Fifi Martingale",2001,127,NA,4.2,12,14.5,14.5,4.5,24.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Fifteen Minute Hamlet, The",1995,22,NA,8.5,73,4.5,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,1 -"Fifteen Minute Show, The",2003,87,3500,8.9,7,0,0,0,0,0,0,14.5,14.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Fifteen Minutes",2000,18,NA,5.5,13,14.5,0,0,0,4.5,24.5,4.5,0,4.5,34.5,"",0,0,0,0,0,0,1 -"Fifth Element, The",1997,126,90000000,7.1,55398,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Fifth Floor, The",1978,90,NA,3.9,50,4.5,4.5,24.5,24.5,4.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Fifth Musketeer, The",1979,104,NA,4.9,124,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fifth Province, The",1997,89,NA,2.1,17,14.5,14.5,0,0,4.5,14.5,0,14.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Fifth Season, The",1997,80,NA,7.8,39,0,0,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Fifth Ward",1998,110,NA,3.6,17,14.5,4.5,0,0,0,4.5,14.5,0,0,45.5,"R",0,0,0,0,0,0,0 -"Fifth-Column Mouse, The",1943,7,NA,6.1,19,4.5,0,0,0,34.5,4.5,24.5,24.5,4.5,0,"",0,1,1,0,0,0,1 -"Fifty Million Frenchmen",1931,65,NA,6,18,4.5,14.5,14.5,14.5,4.5,14.5,34.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Fifty Percent Grey",2001,3,NA,7.3,160,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Fifty Years of Bugs Bunny in 3 1/2 Minutes",1989,4,NA,7.6,6,0,0,0,0,0,14.5,14.5,45.5,0,14.5,"",0,0,0,0,0,0,1 -"Fifty/Fifty",1992,101,NA,4.5,74,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Figaro and Cleo",1943,7,NA,6,19,0,0,14.5,4.5,24.5,14.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Figaro and Frankie",1947,7,NA,6.4,14,0,4.5,4.5,0,14.5,14.5,24.5,4.5,0,24.5,"",0,1,1,0,0,0,1 -"Fight Club",1999,139,63000000,8.5,112092,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,0,1,0,0,0 -"Fight for Your Lady",1937,67,NA,5.4,18,0,0,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Fight for Your Life",1977,82,NA,6.4,95,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Fight for the Sky, The",1945,20,NA,3,7,14.5,14.5,24.5,14.5,0,14.5,0,0,0,14.5,"",0,0,0,0,1,0,1 -"Fight, The",2004,90,NA,7.9,39,0,0,0,4.5,4.5,0,24.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Fighter",2000,91,NA,7.6,53,0,0,0,0,4.5,4.5,34.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Fighter Attack",1953,80,NA,6.2,18,0,0,0,14.5,24.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Fighter Pilot: Operation Red Flag",2004,40,NA,7.4,16,4.5,4.5,0,0,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Fighter Squad",1961,8,NA,6.7,28,14.5,0,4.5,4.5,4.5,0,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Fighter Squadron",1948,96,NA,5.9,91,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Fighter, The",1952,78,NA,5.9,15,0,0,14.5,4.5,14.5,14.5,44.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Fightin Pals",1940,7,NA,5.9,7,0,0,14.5,0,14.5,14.5,14.5,0,14.5,24.5,"",0,1,1,0,0,0,1 -"Fightin' Fools",1941,9,23627,5.2,7,14.5,0,0,0,45.5,14.5,0,0,14.5,0,"",0,0,1,0,0,0,1 -"Fighting 69th, The",1940,90,NA,6.4,206,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fighting Back",1948,61,NA,5.1,7,0,0,0,14.5,24.5,24.5,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Fighting Black Kings",1976,90,NA,3.7,7,14.5,0,14.5,14.5,0,14.5,0,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Fighting Caravans",1931,81,NA,5.9,52,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fighting Champ, The",1932,59,NA,5.2,10,0,24.5,14.5,14.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Fighting Chance, The",1955,48,NA,6.2,7,0,0,0,14.5,0,24.5,44.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Fighting Coast Guard",1951,86,532111,6.6,15,0,0,0,14.5,0,24.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Fighting Devil Dogs, The",1938,204,NA,7.1,12,0,0,0,0,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Fighting Eddie",2000,25,NA,3.7,20,0,0,24.5,0,0,4.5,14.5,0,4.5,64.5,"",0,0,0,0,0,0,1 -"Fighting Father Dunne",1948,93,NA,7,35,0,0,4.5,0,14.5,14.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Fighting Fish",2004,90,NA,3.7,82,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,1,0 -"Fighting Fools",1949,69,NA,6.4,26,0,0,0,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Fighting Frontiersman, The",1946,61,NA,5.6,7,0,14.5,0,0,14.5,45.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Fighting Gringo, The",1939,59,NA,5.1,12,0,0,0,24.5,24.5,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Fighting Irish",2003,104,NA,1.5,14,64.5,0,0,0,0,0,4.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Fighting Kentuckian, The",1949,100,NA,5.9,344,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Fighting Lady, The",1944,61,NA,7.1,21,0,0,0,4.5,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Fighting Lawman, The",1953,71,NA,5.4,9,0,0,14.5,24.5,0,44.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Fighting Mad",1976,88,600000,5.5,60,4.5,0,4.5,14.5,24.5,44.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Fighting Man of the Plains",1949,94,NA,6.5,27,0,4.5,0,0,4.5,34.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fighting Marines, The",1935,216,NA,7.2,10,0,0,0,0,14.5,34.5,14.5,44.5,14.5,0,"",1,0,0,0,0,0,0 -"Fighting O'Flynn, The",1949,94,NA,6,31,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Fighting Prince of Donegal, The",1966,110,NA,5.9,45,4.5,0,4.5,0,24.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fighting Ranger, The",1934,60,NA,4.7,6,0,0,14.5,14.5,34.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Fighting Seabees, The",1944,100,NA,6.1,417,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Fighting Stock",1935,69,NA,4.4,8,14.5,14.5,0,0,45.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Fighting Temptations, The",2003,123,NA,5.2,1013,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Fighting Tools",1943,3,NA,8.6,7,0,0,0,0,0,14.5,0,24.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Fighting Trouble",1956,61,NA,5.7,9,14.5,14.5,0,0,24.5,14.5,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Fighting Vigilantes, The",1947,61,NA,5.6,7,0,0,24.5,14.5,24.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Fighting with Kit Carson",1933,250,NA,5.3,6,0,14.5,0,0,0,34.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Figli di Annibale",1998,90,NA,6.5,50,4.5,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Figli... so' pezzi 'e core, I",1982,94,NA,4,11,64.5,14.5,0,0,0,0,0,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Figli/Hijos",2001,92,NA,8.2,71,0,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Figlia di Frankenstein, La",1971,94,NA,4.4,140,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Figlio del capitano Blood, Il",1962,88,NA,4.9,16,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,0,24.5,"",1,0,0,0,0,0,0 -"Figlio del corsaro rosso, Il",1959,80,NA,4.2,14,0,4.5,4.5,24.5,14.5,14.5,0,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Figlio di Bakunin, Il",1997,89,NA,3.9,12,24.5,0,0,0,0,4.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Figlio di Cleopatra, Il",1964,103,NA,4.4,11,4.5,0,4.5,14.5,24.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Figlio di Spartacus, Il",1963,92,NA,4.8,29,4.5,0,14.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Figlio mio infinitamente caro",1987,113,NA,5.8,7,14.5,0,0,14.5,24.5,0,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Figure de proue, La",1948,90,NA,6.5,28,0,0,0,0,0,4.5,34.5,64.5,0,0,"",0,0,0,1,0,0,0 -"Figures in a Landscape",1970,110,NA,6,69,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Filantropica",2002,113,NA,8.5,690,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"File of the Golden Goose, The",1969,105,NA,5.1,35,4.5,0,14.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"File on Thelma Jordon, The",1950,100,NA,7,104,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Filet Meow",1966,6,NA,5,12,4.5,14.5,4.5,0,4.5,24.5,4.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Filha, A",2003,90,NA,6.9,26,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Filigrana",1949,105,NA,5.1,5,0,0,44.5,0,24.5,0,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Filipinas",2003,100,NA,6.9,15,24.5,0,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fille aux yeux d'or, La",1961,90,NA,6.7,12,4.5,4.5,24.5,0,0,0,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Fille de 15 ans, La",1989,86,NA,6.2,25,0,0,4.5,4.5,14.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Fille de Dracula, La",1972,87,NA,5.4,31,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,1,0 -"Fille de Keltoum, La",2001,106,NA,6.3,19,0,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fille de d'Artagnan, La",1994,136,NA,6.3,686,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fille de l'air, La",1992,103,NA,6.2,42,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fille du diable, La",1946,105,NA,7.4,7,0,0,0,0,0,24.5,14.5,0,44.5,14.5,"",0,0,0,1,0,0,0 -"Fille du puisatier, La",1940,142,NA,6.6,48,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Fille prodigue, La",1981,95,NA,6.3,6,0,0,14.5,0,14.5,0,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Fille seule, La",1995,96,NA,7.3,319,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fille sur le pont, La",1999,90,NA,7.4,2283,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,1,0 -"Filles de la concierge, Les",1934,80,NA,6.2,9,0,0,0,0,24.5,24.5,45.5,0,0,0,"",0,0,0,0,0,1,0 -"Filles de madame Claude, Les",1980,79,NA,3.1,6,14.5,14.5,34.5,0,14.5,0,0,0,14.5,0,"",0,0,0,0,0,1,0 -"Filles ne savent pas nager, Les",2000,102,NA,6.3,151,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Filles perdues, cheveux gras",2002,100,NA,5.5,143,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Filles uniques",2003,85,NA,6.4,104,4.5,4.5,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fillmore",1972,105,NA,7.1,22,0,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Film",1965,20,NA,7.7,107,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Film 1",1999,101,NA,6.6,142,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Film About a Woman Who...",1974,90,NA,6.3,9,0,0,14.5,0,14.5,14.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Film Antics",1954,9,NA,5.8,5,0,0,24.5,0,0,24.5,24.5,0,0,44.5,"",0,0,1,0,0,0,1 -"Film Club",2000,5,NA,7.4,88,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Film Fan, The",1939,7,NA,6.2,14,0,0,0,0,24.5,4.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Film Geek",2005,78,10000,9.3,7,0,0,0,0,0,0,14.5,0,24.5,45.5,"",0,0,1,0,0,0,0 -"Film House Fever",1986,58,NA,4.6,8,24.5,0,0,0,0,34.5,24.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Film Johnnie, A",1914,15,NA,5.9,74,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Film Parade, The",1933,25,NA,5,5,0,24.5,0,24.5,24.5,0,0,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Film Portrait",1972,81,NA,6.9,7,0,0,0,14.5,0,44.5,14.5,0,24.5,0,"",0,0,0,0,1,0,0 -"Film School Confidential",2002,82,75000,6.4,17,0,0,4.5,0,4.5,14.5,44.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Film That Was Lost, The",1942,10,NA,7.9,15,0,0,0,0,0,14.5,14.5,24.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Film as a Subversive Art: Amos Vogel and Cinema 16",2003,56,NA,7.3,14,0,0,0,0,4.5,24.5,24.5,34.5,4.5,0,"",0,0,0,0,1,0,0 -"Film d'amore e d'anarchia, ovvero 'stamattina alle 10 in via dei Fiori nella nota casa di tolleranza...'",1973,120,NA,7.3,184,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Film ist.",1998,62,NA,5.2,8,0,0,24.5,14.5,0,24.5,14.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Film ist. 7-12",2002,90,NA,8.8,7,0,0,0,0,0,0,14.5,24.5,44.5,14.5,"",0,0,0,0,1,0,0 -"Film ohne Titel",1948,99,NA,8.2,38,0,0,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Film(dzama)",2001,23,NA,7.4,20,34.5,0,0,0,0,4.5,4.5,4.5,0,45.5,"",0,0,0,1,0,0,1 -"Film(knout)",2000,10,NA,7.1,7,14.5,0,0,0,0,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,1 -"Film(lode)",2000,13,NA,7,7,14.5,0,0,0,0,0,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Filme de Amor",2003,116,NA,7.6,36,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Filmic Achievement",2005,80,NA,9.6,10,0,0,0,0,0,0,0,14.5,24.5,74.5,"",0,0,1,0,0,0,0 -"Filming 'Othello'",1978,84,NA,6.3,31,0,4.5,0,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Filmmaker",1968,64,NA,4.2,46,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Filmmaking On the Riviera",1964,10,NA,5.1,8,14.5,0,0,0,45.5,14.5,0,0,0,24.5,"",0,0,0,0,1,0,1 -"Filmpje!",1995,90,NA,5,324,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Films That Suck",1999,83,NA,3.6,18,14.5,4.5,14.5,4.5,0,0,4.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Films of the Brothers Quay, The",1987,78,NA,8.6,124,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,0,0,1,0,0 -"Filmstudie",1926,7,NA,8.1,12,0,0,0,14.5,14.5,0,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Filos mou o Lefterakis, O",1963,90,NA,7.8,31,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Fils de Gascogne, Le",1995,106,NA,7,38,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Fils de Marie, Les",2002,100,NA,6.4,13,0,0,0,4.5,4.5,14.5,34.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Fils du requin, Le",1993,90,NA,6.8,95,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fils du vent, Les",2004,90,NA,3.4,90,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Fils, Le",1973,100,NA,5.8,15,4.5,0,4.5,0,24.5,24.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Fils, Le",2002,103,NA,7.1,819,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Filth and the Fury, The",2000,108,NA,7.4,1172,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Filthy",2003,33,NA,2.8,36,24.5,14.5,14.5,4.5,0,4.5,0,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Filthy Rich, The",1980,80,NA,5.3,18,0,0,14.5,24.5,0,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Filumena Marturano",1951,98,NA,8.5,7,0,0,0,0,14.5,0,0,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Fim de Festa",1978,102,NA,9.2,5,0,0,0,24.5,24.5,0,0,0,0,64.5,"",0,0,0,1,0,0,0 -"Fim do Mundo, O",1992,64,NA,8,9,14.5,0,0,0,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fimpen",1974,89,NA,5.5,61,4.5,4.5,0,14.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Fin de fiesta",1960,104,NA,5.7,15,14.5,0,0,0,0,4.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Fin du jour, La",1939,108,NA,8.4,44,0,0,0,0,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Fin du monde, La",1931,105,NA,5.4,11,0,4.5,4.5,0,4.5,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Fin n' Catty",1943,7,NA,6.8,20,0,0,0,0,4.5,24.5,44.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Final",2001,111,80000,5.2,330,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Final Alliance, The",1990,90,NA,3.2,24,34.5,24.5,0,4.5,4.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Final Analysis",1992,124,NA,5.5,2290,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Final Approach",1991,100,NA,4.5,175,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Final Assignment",1980,98,NA,4.7,30,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Final Chapter: Walking Tall",1977,112,NA,4.3,118,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Final Comedown, The",1972,83,NA,5.5,28,0,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Final Conflict, The",1981,108,NA,5.1,1790,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Final Countdown, The",1980,103,NA,6.6,2572,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Final Curtain",1957,20,NA,2.1,19,44.5,14.5,4.5,4.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Final Curtain, The",2002,84,NA,5.4,86,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Final Cut",1980,81,NA,4.1,18,4.5,4.5,14.5,14.5,4.5,0,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Final Cut",1998,93,NA,5.9,389,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Final Cut, The",2004,105,NA,6.2,1840,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Final Cut: The Making and Unmaking of 'Heaven's Gate'",2004,78,NA,5.2,27,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Final Destination",2000,98,23000000,6.6,16504,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Final Destination 2",2003,90,26000000,6.3,8481,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Final Destination Unknown",1987,27,NA,5.9,25,24.5,0,0,0,4.5,0,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Final Edition",1932,66,NA,5.5,8,0,0,0,14.5,14.5,24.5,45.5,0,0,0,"",0,0,0,1,0,0,0 -"Final Embrace",1992,83,NA,3.2,24,4.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Final Equinox",1995,90,NA,4.4,13,14.5,4.5,4.5,24.5,24.5,14.5,4.5,0,0,0,"",1,0,0,0,0,0,0 -"Final Exam",1981,89,NA,3.2,121,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Final Fantasy: The Spirits Within",2001,106,137000000,6.5,16451,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,1,0,0,0,0,0 -"Final Goal, The",1995,85,NA,3.9,26,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Final Impact",1992,99,NA,3.9,55,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Final Judgement",1992,90,NA,4.2,30,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Final Justice",1984,92,NA,1.7,369,64.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Final Mission",1984,101,NA,4.2,27,24.5,14.5,4.5,4.5,4.5,14.5,24.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Final Payback",1999,102,NA,4,47,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Final Programme, The",1973,89,NA,4.9,111,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Final Rinse",1999,92,NA,3.1,19,14.5,14.5,24.5,0,0,4.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Final Sacrifice, The",1990,78,NA,1.4,596,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Final Sale",2004,14,20000,6.7,17,14.5,4.5,0,0,14.5,4.5,0,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Final Score",1986,88,NA,3.9,6,14.5,14.5,0,34.5,0,14.5,0,14.5,0,0,"",1,0,0,0,0,0,0 -"Final Solution",2001,110,1500000,7,32,0,4.5,0,0,4.5,4.5,34.5,14.5,14.5,24.5,"R",1,0,0,1,0,0,0 -"Final Solution",2003,218,NA,9.1,23,0,0,4.5,4.5,0,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Final Taboo, The",1988,77,NA,4.3,8,24.5,14.5,0,0,24.5,14.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Final Terror, The",1983,82,NA,3.4,141,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Final Test, The",1953,90,NA,6.3,19,0,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Final Vendetta",1996,95,NA,4.7,85,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Final Voyage",1999,93,NA,3.1,204,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"FinalCut.com",2001,84,NA,5.2,22,24.5,4.5,0,14.5,4.5,4.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Find the Blackmailer",1943,56,NA,7.3,22,0,0,4.5,4.5,4.5,24.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Find the Lady",1956,56,NA,5.2,11,0,0,0,0,45.5,24.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Find the Lady",1976,94,NA,3.9,45,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Finder's Fee",2001,100,NA,5.9,330,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Finders Keepers",1951,74,NA,6.5,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Finders Keepers",1966,94,NA,4.4,23,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Finders Keepers",1984,96,NA,5.1,123,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Finders Keepers, Lovers Weepers!",1968,71,82000,4,69,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Finding Christa",1991,55,NA,5.9,7,14.5,0,0,0,14.5,24.5,14.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Finding Forrester",2000,136,43000000,7.3,13439,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Finding Graceland",1998,106,10000000,6.6,504,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Finding His Voice",1929,11,NA,6.2,8,0,0,0,0,14.5,34.5,14.5,24.5,14.5,0,"",0,1,0,0,1,0,1 -"Finding Home",2003,124,NA,5.3,26,34.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Finding Interest",1994,92,NA,5,31,4.5,4.5,4.5,4.5,24.5,0,4.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Finding Kate",2004,12,NA,4.1,7,0,0,45.5,24.5,0,0,0,0,14.5,0,"",0,0,0,1,0,0,1 -"Finding Kelly",2000,88,NA,4.3,61,34.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Finding Nemo",2003,100,94000000,8.3,41846,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,1,1,0,0,0 -"Finding Neo",2004,12,8500,6.8,10,34.5,0,0,0,14.5,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Finding Neverland",2004,106,NA,8.1,17715,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"PG",0,0,0,1,0,0,0 -"Finding North",1998,95,NA,6.4,112,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Fine Feathered Friend",1942,8,NA,7.7,29,0,0,0,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Fine Line Between Cute and Creepy, The",2002,14,NA,7.4,66,4.5,0,0,4.5,0,0,4.5,4.5,44.5,44.5,"",0,0,1,0,0,0,1 -"Fine Madness, A",1966,104,NA,5.9,211,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Fine Mess, A",1986,90,NA,3.6,324,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fine and Dandy",2003,6,1000,7.2,6,14.5,14.5,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Fine del mondo nel nostro solito letto in una notte piena di pioggia, La",1978,104,NA,4.5,36,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fine dell'innocenza, La",1976,86,NA,4,9,0,24.5,14.5,0,14.5,24.5,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Fine mrtve djevojke",2002,77,NA,7.2,153,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fine.",2002,21,NA,5.4,10,0,0,0,14.5,34.5,14.5,0,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Finest Hour, The",1991,105,NA,4.6,122,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Finest Hours, The",1964,116,NA,4.9,10,0,14.5,14.5,0,0,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Finestra di fronte, La",2003,106,NA,7.6,1225,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Finger Man",1955,82,NA,6.3,19,0,0,4.5,14.5,4.5,34.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Finger Points, The",1931,85,NA,6.1,44,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fingered",1986,25,NA,5.5,97,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Fingerprints Don't Lie",1951,57,NA,2.3,9,45.5,24.5,0,0,0,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Fingers",1978,90,NA,6.7,231,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fingers at the Window",1942,80,NA,6,66,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Finian's Rainbow",1968,141,3500000,5.9,521,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Finis Hominis",1971,79,NA,6.5,15,0,0,0,0,14.5,14.5,44.5,4.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Finis terrae",1929,80,NA,8.2,6,0,0,0,0,0,0,34.5,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Finished",1997,75,NA,5.4,16,14.5,0,0,4.5,14.5,4.5,4.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Finishing School",1934,73,NA,6.1,33,0,0,0,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Finishing Touch, The",1928,19,NA,7.6,67,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Finishing Touch, The",1992,81,NA,4.6,26,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Finisterre",2003,57,NA,8.4,8,0,0,0,0,0,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Finisterre, donde termina el mundo",1998,94,NA,7,44,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Finnegan's Wake",1966,92,NA,7.2,10,0,0,0,0,0,14.5,24.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Finnlandia",2001,118,NA,7.5,12,4.5,0,0,0,0,4.5,14.5,45.5,4.5,0,"",0,0,0,1,0,0,0 -"Fintar o Destino",1998,77,850000,6.2,16,0,0,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Finye",1982,100,NA,7.2,13,0,0,4.5,0,24.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Finzan",1989,107,NA,6.6,9,0,0,0,0,14.5,44.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Fio do Horizonte, O",1993,91,NA,4.9,22,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Fiocco nero per Deborah, Un",1974,110,NA,5,6,0,0,0,14.5,14.5,34.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Fiona",1998,85,NA,6.3,118,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fiore dai petali d'acciaio, Il",1973,90,NA,3.1,6,0,34.5,14.5,0,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Fiore delle mille e una notte, Il",1974,131,NA,6.7,585,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Fiorile",1993,118,NA,7,260,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fire",1996,104,NA,7.1,747,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fire Birds",1990,85,NA,4.2,1098,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Fire Brigade, The",1926,90,249556,7.8,5,0,0,0,0,24.5,0,0,44.5,44.5,0,"",0,0,0,1,0,0,0 -"Fire Cheese",1941,7,NA,4.8,8,0,0,0,14.5,45.5,24.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Fire Chief",1940,8,NA,7.4,38,0,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Fire Dancer",2002,79,1000000,8.2,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Fire Down Below",1957,116,NA,5.9,146,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fire Down Below",1997,105,NA,4.3,2258,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Fire Fighters, The",1930,7,NA,7,41,0,0,0,4.5,4.5,14.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Fire Has Been Arranged, A",1935,70,NA,5.3,6,0,0,0,14.5,14.5,14.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Fire In the Night",1986,89,NA,4.3,5,0,0,44.5,0,0,24.5,0,44.5,0,0,"",1,0,0,0,0,0,0 -"Fire Island Pines on $0 a Day",2003,10,NA,7.2,5,0,0,0,24.5,0,0,24.5,44.5,24.5,0,"",0,0,1,0,0,0,1 -"Fire Maidens From Outer Space",1956,80,NA,2.3,268,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fire Over Afghanistan",2003,92,155000,4.5,67,24.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Fire Over England",1937,92,NA,6.5,157,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fire Raisers, The",1934,77,NA,4.1,9,0,0,14.5,24.5,34.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Fire Sale",1977,88,NA,4,100,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Fire and Ice",1983,81,NA,6.2,450,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Fire and Ice",1986,83,NA,3.3,84,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Fire in the Sky",1993,109,NA,6,1639,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fire with Fire",1986,103,NA,5.7,267,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Fire!",1901,5,NA,6.4,39,4.5,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Fireback",1978,90,NA,4.6,16,14.5,4.5,4.5,0,4.5,0,14.5,4.5,0,45.5,"",1,0,0,0,0,0,0 -"Fireball 500",1966,92,NA,4.8,47,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Fireball Jungle",1969,94,NA,4.2,7,24.5,14.5,0,0,0,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Fireball, The",1950,84,NA,6,42,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fireballs",1987,82,NA,3.4,12,45.5,4.5,4.5,4.5,0,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Firebird 2015 A.D.",1981,97,NA,4.8,29,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Firebird, The",1934,74,NA,5.5,22,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Firechasers, The",1971,101,NA,5.6,14,4.5,0,0,24.5,14.5,14.5,4.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Firecracker",1981,77,NA,5.7,26,4.5,4.5,4.5,4.5,14.5,0,14.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Firecracker",1997,20,NA,8.2,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Firecreek",1968,104,NA,6.5,310,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Firefly Man, The",2003,11,NA,8.6,14,4.5,0,0,4.5,4.5,0,4.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Firefly, The",1937,131,NA,6.4,56,0,0,4.5,4.5,14.5,14.5,4.5,24.5,24.5,14.5,"",0,0,0,0,0,1,0 -"Firefox",1982,136,21000000,5.5,3401,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Firehead",1991,80,NA,3.4,33,34.5,14.5,4.5,14.5,4.5,4.5,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Firehouse",1987,91,NA,2.8,66,44.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Firelight",1964,140,NA,7.5,46,14.5,0,0,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Firelight",1997,103,NA,6.9,705,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,1,0 -"Fireman Save My Child",1954,79,NA,5.4,12,0,0,4.5,4.5,0,14.5,4.5,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Fireman, Save My Child",1932,66,NA,6.2,29,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fireman, The",1916,32,NA,6.5,194,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Firepower",1979,104,NA,4.6,96,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Firepower",1993,95,NA,4.5,57,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Firepussy",2003,20,NA,5.4,5,24.5,24.5,0,24.5,0,0,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Fires Were Started",1943,80,NA,7.3,33,0,4.5,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,1,0,0 -"Fires Within",1991,86,NA,5.1,157,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fires of Kuwait",1992,36,NA,7.7,76,0,0,0,4.5,4.5,14.5,4.5,44.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Firestarter",1984,101,15000000,5.6,2839,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Firestorm",1984,100,NA,5.4,17,4.5,0,0,14.5,24.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Firestorm",1995,90,NA,3.2,50,14.5,24.5,4.5,14.5,0,14.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Firestorm",1998,89,19000000,4.4,987,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Firetrap",2001,97,NA,5.1,183,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Firewalker",1986,104,NA,3.9,583,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Fireworks",1947,20,NA,6.6,137,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Firm, The",1993,154,42000000,6.6,14708,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Firmafesten",1972,97,NA,4.4,17,14.5,4.5,4.5,14.5,24.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Firmaskovturen",1978,79,NA,5.6,16,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Firmling, Der",1934,23,NA,8.3,13,0,0,0,0,0,0,14.5,24.5,14.5,44.5,"",0,0,1,0,0,0,1 -"First $20 Million Is Always the Hardest, The",2002,105,NA,5.2,563,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"First 9 1/2 Weeks, The",1998,100,NA,3.5,130,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"First Aiders",1944,7,NA,6.7,14,0,0,0,0,14.5,24.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"First Auto, The",1927,77,NA,6.3,37,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"First Bad Man, The",1955,6,NA,7.1,43,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"First Blood",1982,97,14000000,6.8,11956,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"First Comes Courage",1943,88,NA,5.8,7,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"First Contact",1983,58,NA,6.7,36,0,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"First Date",1989,91,NA,3.7,8,14.5,0,24.5,24.5,24.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"First Daughter",1997,30,NA,5.5,9,0,14.5,0,24.5,0,14.5,0,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"First Deadly Sin, The",1980,112,NA,5.8,306,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"First Emperor of China, The",1989,42,NA,5.7,20,14.5,0,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"First Family",1980,97,NA,3.9,160,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"First Great Train Robbery, The",1979,110,6000000,6.9,1758,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,1,1,0,0,0 -"First Hundred Years, The",1938,73,NA,6.4,12,0,0,4.5,0,4.5,44.5,24.5,4.5,4.5,0,"",0,0,1,1,0,0,0 -"First Kid",1996,101,NA,4.9,1043,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"First Kiss",2002,2,NA,8.6,8,0,0,0,0,0,0,24.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"First Knight",1995,134,75000000,5.6,8708,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"First Lady",1937,83,NA,6.5,35,0,0,4.5,0,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"First Legion, The",1951,86,NA,7.5,18,0,4.5,0,0,0,24.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"First Love",1939,84,NA,6.4,67,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"First Love",1977,92,NA,5.1,112,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"First Love, Last Rites",1997,94,300000,5,147,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"First Man Into Space",1959,77,NA,4.1,88,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"First Men in the Moon",1964,103,NA,6.3,455,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"First Monday in October",1981,98,NA,6,306,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"First Motion Picture Unit, The",1943,21,NA,3,21,24.5,14.5,4.5,4.5,24.5,14.5,0,4.5,0,4.5,"",0,0,0,0,1,0,1 -"First Nudie Musical, The",1976,97,NA,4.5,152,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"First Op",1999,25,NA,5.4,19,24.5,4.5,0,0,0,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,1 -"First Person",2003,95,NA,7.4,8,14.5,14.5,0,0,0,0,14.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"First Power, The",1990,98,10000000,4.8,513,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"First Round-Up, The",1934,11,NA,7.2,24,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"First Seven Years, The",1930,20,NA,8.1,20,4.5,0,0,0,0,4.5,24.5,34.5,24.5,24.5,"",0,0,1,0,0,0,1 -"First Snow of Winter, The",1998,28,NA,8.4,13,0,0,0,0,0,0,4.5,24.5,4.5,64.5,"",0,1,0,0,0,0,1 -"First Strike",1985,92,NA,3.3,14,24.5,0,14.5,14.5,14.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"First Texan, The",1956,82,NA,5.8,36,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"First Time at Cherry High",1984,82,NA,8.2,5,0,0,24.5,0,0,24.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"First Time, The",1969,90,NA,5.4,48,14.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"First Traveling Saleslady, The",1956,92,NA,5.2,67,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"First Turn-On!!, The",1983,87,NA,3.5,86,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"First Vampire: Don't Fall for the Devil's Illusions, The",2004,24,NA,8.6,10,14.5,0,0,0,0,14.5,0,0,14.5,74.5,"",0,0,0,0,0,0,1 -"First Vision, The",1976,15,NA,7.1,21,4.5,0,0,0,4.5,0,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,1 -"First Wives Club, The",1996,103,26000000,5.6,6434,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"First Yank Into Tokyo",1945,82,NA,5.5,53,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"First a Girl",1935,93,NA,5.8,33,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"First of May, The",1999,111,2500000,7.1,88,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"First of the Few, The",1942,90,NA,6.8,97,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"First to Fight",1967,92,NA,5.3,35,0,0,4.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"First to Go, The",1997,90,NA,5.4,119,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Firstborn",1984,103,NA,5.7,303,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fischerin vom Bodensee, Die",1956,87,NA,5.8,16,0,4.5,4.5,4.5,14.5,0,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Fischio al naso, Il",1967,108,NA,4.9,7,14.5,0,14.5,0,0,14.5,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Fish 073",1999,7,NA,5.4,12,0,0,0,4.5,14.5,4.5,14.5,0,4.5,44.5,"",0,0,0,0,0,0,1 -"Fish Burglars",2004,25,15000,8.2,5,0,0,24.5,0,0,0,0,0,44.5,44.5,"",0,0,1,0,0,0,1 -"Fish Called Wanda, A",1988,108,7500000,7.7,25035,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Fish Don't Blink",2002,100,NA,2.7,22,4.5,14.5,0,4.5,4.5,0,4.5,4.5,4.5,45.5,"R",0,0,0,0,0,0,0 -"Fish Fry",1943,7,NA,7,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Fish Hawk",1979,94,NA,5.6,22,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Fish Heads",1982,5,NA,7.4,61,4.5,0,4.5,0,4.5,14.5,14.5,14.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Fish Out of Water",1999,95,NA,4.1,27,14.5,14.5,4.5,14.5,14.5,14.5,4.5,0,4.5,14.5,"PG",1,0,1,0,0,0,0 -"Fish That Saved Pittsburgh, The",1979,102,NA,4.1,232,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fish Without a Bicycle",2003,97,NA,4.5,39,24.5,4.5,0,4.5,4.5,4.5,0,14.5,4.5,34.5,"R",0,0,1,1,0,1,0 -"Fish and Slips",1962,6,NA,6.3,21,0,0,0,4.5,24.5,0,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Fish in a Barrel",2001,85,200000,5.5,59,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Fish in the Bathtub, A",1999,96,NA,5.7,68,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Fishbelly White",1998,22,NA,6.8,29,4.5,0,0,0,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Fisher King, The",1991,137,24000000,7.4,11952,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Fishes of Horror, The",1999,27,NA,3.3,15,4.5,4.5,14.5,14.5,0,0,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Fishin' Around",1931,7,NA,5.1,16,0,4.5,14.5,4.5,24.5,24.5,14.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Fishing Feats",1951,9,NA,5.2,5,0,0,0,44.5,24.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"Fishing Trip, The",1998,84,NA,6.2,23,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Fishing for Love",2001,7,NA,10,5,0,0,0,0,0,0,0,0,0,100,"",0,0,1,0,0,0,1 -"Fishing for Trauster",2004,24,20000,8.2,8,14.5,0,0,0,14.5,0,0,0,0,74.5,"",0,0,1,0,0,0,1 -"Fishing with Gandhi",1998,69,NA,5.3,58,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Fishmonger, The",2002,5,NA,5.9,14,0,0,0,24.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Fishy",2003,10,NA,7.7,14,4.5,4.5,0,0,4.5,4.5,0,24.5,24.5,24.5,"",0,0,0,1,0,1,1 -"Fishy Tales",1937,11,NA,7,22,0,0,4.5,4.5,0,4.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Fisimatenten",2000,97,NA,5.2,15,4.5,4.5,14.5,14.5,0,4.5,4.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fist Fighter",1989,97,NA,4.8,52,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,0,24.5,"",1,0,0,1,0,0,0 -"Fist Power",2002,5,NA,8,6,0,0,0,0,14.5,34.5,0,34.5,14.5,0,"",0,0,0,0,1,0,1 -"Fist of Fear, Touch of Death",1980,90,NA,2.1,190,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Fist of Glory",1990,93,NA,4.3,10,24.5,14.5,24.5,14.5,24.5,0,0,24.5,0,0,"",1,0,0,1,0,0,0 -"Fistful of Fingers",1994,78,NA,6.5,16,0,0,0,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Fistful of Flies",1996,84,NA,6.6,92,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fists of Bruce Lee",1978,92,NA,2.7,23,14.5,24.5,34.5,4.5,14.5,4.5,0,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Fists of Iron",1995,94,NA,3.7,34,24.5,4.5,24.5,24.5,4.5,4.5,0,0,0,4.5,"R",1,0,0,0,0,0,0 -"Fit to Be Tied",1931,10,NA,6.1,14,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Fit to Be Tied",1952,7,NA,6.1,35,4.5,0,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Fits & Starts",2002,10,NA,8.5,41,0,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Fittest, The",2003,88,NA,8,8,14.5,0,0,0,0,0,14.5,14.5,34.5,24.5,"",0,0,1,0,0,0,0 -"FitzPatrick Traveltalks No. T-322: Exotic Mexico",1942,9,NA,4.5,5,0,0,44.5,0,44.5,0,0,0,0,24.5,"",0,0,0,0,1,0,1 -"FitzPatrick Traveltalks: Glimpses of Western Germany",1954,9,NA,2.4,6,34.5,14.5,0,0,14.5,0,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"FitzPatrick Traveltalks: In the Valley of the Rhine",1953,9,NA,8.4,8,0,0,0,0,14.5,14.5,24.5,14.5,0,34.5,"",0,0,0,0,1,0,1 -"Fitzcarraldo",1982,158,NA,7.7,2202,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Fitzwilly",1967,102,NA,5.9,123,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Fiume del grande caimano, Il",1979,90,NA,2.5,70,24.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fiume di dollari, Un",1966,89,NA,4.5,26,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Five",1951,93,NA,6.7,80,0,0,0,4.5,4.5,14.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Five Aces",1999,95,NA,4.4,172,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Five Bloody Graves",1970,88,NA,1.9,31,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Five Came Back",1939,75,NA,7.1,143,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Five Children and It",2004,89,NA,5.5,160,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Five Cities of June, The",1963,26,NA,5.8,7,0,0,0,0,44.5,0,14.5,14.5,0,24.5,"",0,0,0,0,1,0,1 -"Five Corners",1987,90,NA,6.3,743,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Five Days One Summer",1982,96,NA,5.8,215,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Five Days from Home",1979,108,NA,5.6,36,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Five Dedicated to Ozu",2003,75,NA,6.1,27,14.5,0,4.5,0,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Five Deep Breaths",2003,21,NA,2.7,5,44.5,24.5,0,0,24.5,0,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Five Dollar Fine",1997,5,NA,5.9,10,14.5,0,0,24.5,34.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"Five Easy Pieces",1970,96,NA,7.4,3894,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Five Feet High and Rising",2000,29,NA,6.3,100,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Five Finger Exercise",1962,109,NA,5.8,16,0,0,4.5,4.5,14.5,4.5,44.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Five Gates to Hell",1959,98,NA,5.7,27,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Five Golden Dragons",1967,70,NA,5.1,15,0,4.5,4.5,24.5,14.5,4.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Five Golden Hours",1961,90,NA,5.1,10,0,0,0,14.5,44.5,14.5,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Five Graves to Cairo",1943,96,855000,7.6,379,4.5,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Five Guns West",1955,74,60000,3.1,63,14.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Five Heartbeats, The",1991,116,NA,6.3,368,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Five Lines",2001,110,NA,7.1,9,0,14.5,0,0,0,14.5,24.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Five Locust Sisters, The",1928,5,NA,2.9,5,24.5,0,24.5,0,64.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Five Loose Women",1974,70,NA,2.8,27,24.5,4.5,0,4.5,4.5,14.5,4.5,0,4.5,34.5,"",1,0,0,1,0,0,0 -"Five Miles High",2004,5,NA,8.8,6,0,0,0,0,14.5,0,0,0,34.5,45.5,"",0,0,1,0,0,0,1 -"Five Minutes From the Station",1930,14,NA,6.9,16,0,0,0,14.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Five Minutes to Love",1963,85,NA,5.3,11,4.5,4.5,14.5,0,14.5,24.5,4.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Five Pennies, The",1959,112,NA,6.9,306,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Five Seconds to Spare",1999,99,NA,5.8,27,24.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Five Senses, The",1999,106,NA,6.9,1201,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Five Star Final",1931,89,NA,7.3,163,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Five Star Stories",1989,65,NA,6.3,19,0,0,4.5,4.5,0,4.5,24.5,24.5,4.5,34.5,"",1,1,0,0,0,1,0 -"Five Weeks in a Balloon",1962,101,NA,5.3,137,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Five Wives, Three Secretaries and Me",1998,82,NA,5.5,26,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,1,0,1,0,0 -"Five Years",2002,89,NA,7.6,16,0,14.5,0,0,0,14.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Five and Ten",1931,88,NA,7,30,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Five on the Black Hand Side",1973,96,NA,5.5,40,4.5,0,0,4.5,14.5,14.5,4.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Five the Hard Way",1969,82,NA,1.4,285,64.5,14.5,4.5,4.5,4.5,4.5,0,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Fiver Thing, The",2000,7,NA,5.5,9,14.5,24.5,0,0,0,24.5,44.5,0,0,0,"",0,0,1,0,0,0,1 -"Fix, The",1984,95,NA,3.5,5,0,24.5,24.5,0,0,24.5,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Fixed Bayonets!",1951,92,NA,7.4,91,0,4.5,4.5,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fixer Dugan",1939,68,NA,5.2,15,0,0,4.5,4.5,44.5,24.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Fixer Uppers, The",1935,30,NA,7.2,114,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Fixer, The",1968,132,NA,6.6,212,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fixing Frank",2002,103,NA,7.4,12,4.5,0,0,4.5,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fiza",2000,167,1000000,7.1,132,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Fjorton suger",2004,83,NA,5.4,83,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Flag",1987,101,NA,6.3,11,14.5,0,0,0,4.5,4.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Flag Wars",2003,86,NA,8.2,20,0,4.5,0,4.5,4.5,14.5,34.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Flag of Mercy",1942,10,NA,7,5,0,0,0,0,0,44.5,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Flag: A Story Inspired by the Tradition of Betsy Ross, The",1927,20,NA,5.4,37,0,4.5,0,4.5,34.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Flaggermusvinger",1992,80,NA,4,11,24.5,0,0,4.5,0,0,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flagpole Jitters",1956,16,NA,5.5,28,14.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Flamberede hjerter",1986,114,NA,6.2,41,4.5,4.5,4.5,0,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Flambierte Frau, Die",1983,104,NA,6.1,108,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flame",1996,88,NA,6.2,27,0,0,0,4.5,14.5,4.5,44.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Flame Barrier, The",1958,70,100000,4.4,20,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Flame Song, The",1934,22,NA,3.4,6,34.5,0,0,34.5,34.5,0,0,0,0,0,"",0,0,0,0,0,1,1 -"Flame Within, The",1935,72,NA,3.8,15,0,24.5,4.5,24.5,14.5,4.5,4.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Flame and the Arrow, The",1950,88,NA,6.9,363,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Flame and the Flesh, The",1954,104,NA,5.9,14,0,0,0,0,14.5,24.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Flame in the Streets",1961,93,NA,5.9,16,0,0,4.5,4.5,14.5,34.5,4.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Flame of Araby",1951,77,NA,4.5,38,4.5,14.5,4.5,14.5,34.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Flame of Barbary Coast",1945,91,600000,5.5,141,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Flame of Calcutta",1953,70,NA,4.6,6,14.5,0,0,0,45.5,0,14.5,0,0,14.5,"",1,0,0,0,0,1,0 -"Flame of New Orleans, The",1941,79,NA,6.7,93,4.5,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Flame of the Islands",1956,90,NA,5.3,8,0,0,24.5,0,14.5,34.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Flame, The",1947,97,NA,5.3,7,0,0,0,44.5,14.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Flamenco (de Carlos Saura)",1995,100,NA,7.2,148,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Flamenco at 5:15",1983,29,NA,7.5,17,0,0,0,0,4.5,24.5,4.5,4.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Flames of Passion",1989,18,NA,3.2,17,14.5,4.5,4.5,0,4.5,34.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,1,1 -"Flaming Bullets",1945,59,NA,6,11,0,4.5,4.5,0,44.5,14.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Flaming Creatures",1963,45,NA,5.3,70,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Flaming Ears",1992,84,NA,5.8,9,0,0,0,14.5,34.5,14.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Flaming Feather",1952,77,NA,5.7,40,0,0,4.5,14.5,34.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Flaming Star",1960,92,NA,6.2,388,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Flamingo",2003,28,NA,6.6,9,0,0,0,14.5,24.5,14.5,44.5,0,0,14.5,"",0,0,1,1,0,0,1 -"Flamingo Kid, The",1984,100,NA,6.1,1039,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Flamingo Road",1949,94,NA,7,240,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Flamman",1956,78,NA,4.8,6,0,0,34.5,0,45.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Flamme, La",2000,3,NA,6.5,25,0,4.5,0,0,14.5,14.5,24.5,44.5,0,0,"",0,0,0,0,0,1,1 -"Flammen im Paradies",1997,105,NA,5.7,22,14.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flammend' Herz",2004,90,NA,7.5,6,14.5,0,0,0,0,0,0,45.5,0,34.5,"",0,0,0,0,1,0,0 -"Flammende Herzen",1978,95,NA,7.2,8,0,0,0,0,0,24.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Flanagan",1975,110,NA,5,14,4.5,0,4.5,0,24.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Flanagan Boy, The",1953,81,NA,5.4,7,24.5,0,0,14.5,14.5,44.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Flanell No. 5",1998,58,NA,8.8,5,0,0,0,0,0,0,0,24.5,84.5,0,"",0,0,0,0,0,0,0 -"Flap",1970,106,NA,5.1,48,4.5,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Flaqueza del bolchevique, La",2003,95,NA,6.8,151,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Flareup",1969,100,NA,4.7,34,4.5,0,14.5,24.5,14.5,24.5,14.5,4.5,0,0,"PG-13",0,0,0,0,0,0,0 -"Flash",1980,85,NA,5.2,5,0,0,24.5,0,0,64.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Flash",1986,90,NA,5.8,11,24.5,4.5,4.5,0,0,4.5,0,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Flash Gordon",1980,111,35000000,5.7,5626,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Flash Gordon Conquers the Universe",1940,195,NA,6.4,192,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Flash and the Firecat",1976,84,NA,3,16,14.5,24.5,34.5,4.5,14.5,0,0,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Flash of Green, A",1984,131,NA,6.3,42,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Flash of Light, A",1910,17,NA,4.5,5,24.5,0,0,0,24.5,0,44.5,0,24.5,0,"",0,0,0,0,0,1,1 -"Flash of a Dream",2001,60,NA,6.8,13,0,0,0,14.5,4.5,4.5,14.5,0,34.5,14.5,"",0,0,0,0,1,0,0 -"Flashback",1990,108,NA,5.7,968,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Flashdance",1983,95,NA,5.5,4568,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Flashfire",1993,88,NA,3.9,82,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Flashpoint",1984,94,NA,6.1,238,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Flat 'n' Fluffy",2001,7,NA,5.9,8,0,0,0,14.5,14.5,14.5,24.5,0,14.5,24.5,"",0,1,1,0,0,0,1 -"Flat Foot Stooges",1938,16,NA,7.2,49,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Flat Is Beautiful",1998,50,NA,5.5,19,24.5,0,0,0,14.5,14.5,0,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Flat Out",1998,96,NA,2.1,9,24.5,14.5,14.5,0,0,0,0,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Flat Top",1952,83,NA,6.1,37,0,4.5,0,14.5,14.5,24.5,24.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Flat, De",1994,105,NA,5.1,103,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Flatlife",2004,10,NA,7.8,64,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Flatliners",1990,110,NA,6.3,9830,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Flats, The",2002,102,500000,7.2,19,4.5,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Flatworld",1997,30,NA,7.3,90,4.5,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Flautista nos Portais do Amanhecer, O",1999,108,NA,5.6,10,0,0,14.5,0,0,34.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Flavia",1986,95,NA,1.9,8,34.5,24.5,24.5,14.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Flavia, la monaca musulmana",1974,101,NA,5.3,74,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Flavors",2003,118,NA,6,51,14.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Flawless",1999,112,27000000,6.1,3287,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Flaxy Martin",1949,86,NA,6.5,29,0,0,4.5,0,24.5,24.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Flea Circus, The",1954,7,NA,7.2,34,0,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Flea in Her Ear, A",1968,94,NA,5.6,25,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fled",1996,105,NA,5,1943,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,1,0,0,1,0 -"Fledermaus, Die",1946,100,NA,6.7,20,0,0,4.5,14.5,0,14.5,14.5,24.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Fledermaus, Die",1962,107,NA,3.8,14,4.5,14.5,0,14.5,14.5,4.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Fleet's In, The",1942,93,NA,6.9,51,0,0,0,4.5,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Fleets of Stren'th",1942,6,NA,6.8,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Flemish Farm, The",1943,82,NA,5.4,15,0,0,0,4.5,34.5,44.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Flemming og Kvik",1960,93,NA,6.5,11,0,0,4.5,0,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Flesh",1932,96,NA,5.5,61,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flesh",1968,105,4000,5.7,287,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Flesh & Blood",1950,102,NA,6.1,8,0,0,0,14.5,14.5,0,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Flesh & Blood",1985,117,6500000,6.3,2047,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Flesh & Laces",1983,95,NA,5.3,5,0,0,44.5,0,0,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Flesh Eaters, The",1964,87,NA,5.1,70,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Flesh Eating Mothers",1989,89,NA,3,100,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Flesh Feast",1970,68,NA,1.9,60,45.5,14.5,4.5,4.5,4.5,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Flesh Gordon",1974,90,NA,4.5,889,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Flesh Gordon Meets the Cosmic Cheerleaders",1989,98,NA,3.4,214,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Flesh Merchant, The",1956,90,NA,5.3,9,0,0,0,24.5,34.5,0,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Flesh Suitcase",1995,90,1000000,5.2,28,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Flesh and Blood Show, The",1972,93,NA,4.7,22,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Flesh and Bone",1993,116,NA,6.3,1175,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Flesh and Fantasy",1943,94,NA,7,95,0,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flesh and Fury",1952,83,NA,6.5,29,4.5,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Flesh and Lace",1964,73,NA,6.8,7,0,0,14.5,14.5,0,44.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Flesh and the Devil",1926,113,373000,7.5,232,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Flesh and the Fiends, The",1959,91,NA,7.1,145,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Flesh and the Spur",1957,78,NA,5.7,10,14.5,0,0,44.5,0,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Flesh for Frankenstein",1973,95,NA,5.1,678,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Flesh for the Beast",2003,85,NA,3.8,136,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Fleshburn",1984,90,NA,4.1,21,24.5,4.5,0,24.5,34.5,4.5,4.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Flesheater",1988,88,60000,4.5,109,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fleshpot on 42nd Street",1973,80,NA,7.3,12,4.5,0,0,0,4.5,14.5,24.5,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Fleshtone",1994,91,NA,4.1,47,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Fletch",1985,94,NA,6.6,7562,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fletch Lives",1989,95,NA,5.4,2670,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fleur bleue",1971,81,NA,6.1,12,4.5,0,0,0,14.5,4.5,24.5,14.5,0,24.5,"",0,0,0,1,0,1,0 -"Fleur d'oseille",1968,90,NA,5.7,9,0,0,0,0,14.5,34.5,0,14.5,44.5,0,"",0,0,1,0,0,0,0 -"Fleur du mal, La",2003,101,NA,6.5,501,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Fleurs de Maria Papadopylou, Les",1995,8,NA,1,12,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Fleurs de sang",2002,100,NA,5.2,10,0,14.5,14.5,0,14.5,24.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Fleurs du miel, Les",1976,96,NA,4,6,0,34.5,0,0,0,0,0,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Fleurs magiques, Les",1995,21,NA,5.9,8,0,0,0,0,24.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Fleurs sauvages, Les",1982,152,NA,7.1,7,0,0,0,0,14.5,0,45.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Flex",2000,17,NA,8.7,34,0,0,4.5,0,4.5,4.5,0,24.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Flic Story",1975,107,NA,6.7,154,4.5,4.5,4.5,4.5,4.5,4.5,45.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Flic ou voyou",1979,105,NA,6.1,206,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Flicka",2002,11,NA,7,13,0,0,0,0,0,4.5,74.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Flicka och hyacinter",1950,89,NA,7.6,80,0,0,0,0,4.5,4.5,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Flicker Memories",1941,8,NA,5.7,19,0,0,4.5,14.5,14.5,24.5,14.5,0,4.5,24.5,"",0,0,1,0,0,0,1 -"Flicker, The",1965,30,NA,5.6,21,14.5,14.5,4.5,4.5,0,0,0,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Flickorna",1968,100,NA,6,20,0,0,4.5,14.5,24.5,14.5,24.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Flicks",1987,79,NA,3.4,14,4.5,14.5,24.5,14.5,4.5,14.5,4.5,0,0,14.5,"",0,1,1,0,0,0,0 -"Flics de choc",1983,92,NA,4.1,13,14.5,24.5,0,34.5,24.5,0,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Fliegende Klassenzimmer, Das",1954,92,NA,7,39,4.5,4.5,0,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Fliegende Klassenzimmer, Das",1973,88,NA,5.3,79,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fliegende Klassenzimmer, Das",2003,110,NA,6,177,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Flies Ain't Human",1941,6,NA,5.4,7,0,0,14.5,0,24.5,14.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Flight",1929,110,NA,6,23,0,0,0,4.5,24.5,24.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Flight Angels",1940,74,NA,7,22,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Flight Command",1940,116,NA,5.9,67,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flight From Glory",1937,67,NA,6.2,19,0,14.5,0,4.5,14.5,24.5,34.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Flight Lieutenant",1942,80,NA,5.5,12,0,0,0,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Flight Nurse",1954,90,NA,6,15,4.5,4.5,4.5,0,24.5,0,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Flight That Disappeared, The",1961,71,NA,3.8,24,4.5,24.5,4.5,34.5,14.5,4.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Flight for Freedom",1943,102,NA,5.4,29,0,0,0,4.5,24.5,24.5,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Flight from Ashiya",1964,100,NA,4.9,61,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Flight from Destiny",1941,75,NA,6,12,0,0,0,0,34.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Flight of Dragons, The",1982,96,NA,7.6,580,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,0,1,0,0,0 -"Flight of Fancy",2000,96,NA,5.2,45,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Flight of the Dove, The",1994,87,NA,4.3,95,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Flight of the Doves",1971,105,NA,6.5,51,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Flight of the Gossamer Condor, The",1978,27,NA,8.7,6,0,0,0,0,14.5,0,14.5,14.5,34.5,14.5,"",0,0,0,0,1,0,1 -"Flight of the Ibis",1996,94,NA,7.2,8,14.5,0,0,14.5,0,0,0,24.5,34.5,14.5,"",1,0,0,0,0,0,0 -"Flight of the Intruder",1991,115,NA,5.2,1004,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Flight of the Lost Balloon",1962,91,NA,5,13,0,0,0,14.5,34.5,14.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Flight of the Navigator",1986,90,NA,6.4,3089,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Flight of the Phoenix",2004,113,45000000,6,2732,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Flight of the Phoenix, The",1965,142,NA,7.6,2545,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Flight to Fury",1964,80,NA,3.3,27,14.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Flight to Hong Kong",1956,88,NA,5.7,18,0,0,4.5,24.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Flight to Mars",1951,72,NA,4.7,79,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flight to Nowhere",1946,79,NA,4.3,9,0,0,34.5,44.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Flight to Tangier",1953,90,NA,5.1,43,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Flim-Flam Man, The",1967,104,NA,6.6,458,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Flinch",1994,88,NA,4.2,110,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fling in the Ring",1955,16,NA,6.1,29,14.5,14.5,14.5,4.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Flintstones in Viva Rock Vegas, The",2000,90,58000000,3.7,1712,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Flintstones, The",1994,91,45000000,4.5,8704,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Flip",2004,15,8000,9.1,10,0,0,0,0,0,0,0,34.5,34.5,44.5,"",0,0,0,0,0,0,1 -"Flip Side, The",2001,80,NA,8.8,24,34.5,0,0,0,0,0,14.5,0,0,45.5,"",0,0,1,1,0,0,0 -"Flip a Coin",2004,95,NA,7.7,7,14.5,0,0,0,0,0,14.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Flipper",1963,87,NA,5.7,150,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flipper",1996,95,NA,5,883,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Flipper's New Adventure",1964,94,NA,5.7,46,4.5,0,0,4.5,34.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flipping",1997,98,NA,4.5,54,14.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Flirt",1993,23,NA,6.3,130,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Flirtation Walk",1934,97,NA,6,49,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Flirting",1991,110,NA,7.2,1437,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Flirting Widow, The",1930,72,NA,5.5,29,4.5,14.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Flirting with Disaster",1996,92,7000000,7,3986,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Flirting with Myself",2001,26,NA,4.7,7,44.5,14.5,0,0,0,0,0,0,24.5,14.5,"",0,0,1,0,0,0,1 -"Flirty Birdy",1945,7,NA,6.4,27,4.5,0,0,14.5,4.5,14.5,34.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Floating",1999,90,NA,6.2,143,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Floating Away",1998,105,NA,6,92,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Floating Life",1996,95,NA,6.5,130,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Floch",1972,90,NA,6.4,10,0,0,0,0,14.5,14.5,0,24.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Flock, The",2001,14,NA,6.9,73,44.5,4.5,0,4.5,4.5,0,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Flodder",1986,111,NA,6.3,893,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Flodder 2",1992,114,NA,4.5,556,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Flodder 3",1995,122,NA,4.5,420,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Flood Tide",1958,82,NA,5.7,20,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Floodhouse",2003,50,NA,6,10,0,0,0,14.5,14.5,14.5,34.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Flooding",2000,86,NA,2.4,25,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Floods of Fear",1959,84,NA,5.8,21,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Floor Flusher",1954,6,NA,3.9,9,0,14.5,14.5,24.5,24.5,24.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Floortje",2002,7,NA,8,6,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Floorwalker, The",1916,29,NA,7.1,194,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Flop",1990,98,NA,5.8,9,0,0,14.5,0,24.5,34.5,0,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Flop Goes the Weasel",1943,7,NA,6.7,12,0,0,0,0,4.5,14.5,45.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Flor Contemplacion Story, The",1995,120,NA,6.5,24,4.5,0,4.5,4.5,0,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Flor de mayo",1959,114,NA,7.4,15,0,0,0,4.5,4.5,4.5,44.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Flor de mi secreto, La",1995,103,NA,7.1,1163,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Flor silvestre",1943,94,NA,6.7,16,0,0,4.5,0,4.5,14.5,14.5,0,34.5,24.5,"",0,0,0,1,0,1,0 -"Flora",1995,25,NA,6.9,6,0,0,0,14.5,14.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Floradas na Serra",1954,100,NA,7.3,13,0,0,0,0,0,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Florenc 13:30",1957,86,NA,4.1,9,24.5,0,14.5,0,0,44.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Florence est folle",1944,101,NA,8.2,44,0,0,0,0,0,4.5,24.5,14.5,45.5,0,"",0,0,0,0,0,0,0 -"Florentine Dagger, The",1935,70,NA,6.6,13,0,0,0,4.5,4.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Florentiner Hut, Der",1939,91,NA,7.8,21,4.5,0,0,0,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Flores amarillas en la ventana",1996,95,NA,6.6,6,0,0,0,0,0,45.5,0,34.5,0,14.5,"",0,0,0,1,0,1,0 -"Flores de otro mundo",1999,108,NA,7.3,177,4.5,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Flores del vicio, Las",1979,90,NA,5.4,14,14.5,14.5,0,24.5,14.5,4.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Florian",1940,91,NA,5.2,17,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Florida Enchantment, A",1914,63,NA,6.4,35,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Florido pensil, El",2002,80,NA,5.1,27,14.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,4.5,0,"",0,0,1,1,0,0,0 -"Flossie",1974,88,NA,4.2,21,4.5,14.5,0,4.5,14.5,4.5,4.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Flossin",2001,81,86000,7.9,7,14.5,0,0,0,0,14.5,0,0,24.5,44.5,"PG-13",0,0,0,0,0,0,0 -"Flotte Biester auf der Schulbank",1983,79,NA,2,10,24.5,24.5,24.5,44.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Floundering",1994,96,NA,5.3,425,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Flow",1996,80,NA,6.4,7,14.5,0,0,0,24.5,0,0,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Flower & Garnet",2002,103,NA,7.2,198,14.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Flower Drum Song",1961,133,NA,6.7,385,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Flower Thief, The",1960,70,NA,4.6,13,0,14.5,0,14.5,0,14.5,4.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Flowergirl",1999,19,NA,6.6,14,4.5,4.5,0,0,0,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Flowers",2004,72,NA,7.9,9,14.5,14.5,0,0,0,0,0,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Flowers & Freckle Cream",2000,20,NA,6.9,18,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Flowers and Trees",1932,8,NA,8.2,92,0,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Flowers for Madame",1935,7,NA,6.3,10,0,0,0,0,74.5,14.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Flowers in the Attic",1987,93,NA,4.9,998,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flowing Gold",1940,81,NA,6.7,58,0,0,4.5,0,14.5,14.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Flubber",1997,90,NA,4.6,5102,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Fluch der gelben Schlange, Der",1963,98,NA,3,14,0,44.5,4.5,24.5,4.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Fluch der schwarzen Schwestern, Der",1973,115,NA,5,28,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fluch des schwarzen Rubin, Der",1965,94,NA,3.5,9,0,14.5,24.5,24.5,14.5,24.5,0,0,14.5,0,"",1,0,0,0,0,0,0 -"Fluch, Der",1988,92,NA,7.1,28,0,0,4.5,0,0,0,24.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Flucht",1996,14,NA,4.3,7,0,0,0,14.5,14.5,0,14.5,14.5,0,44.5,"",0,0,0,0,0,0,1 -"Fluffy",1965,92,NA,5.4,50,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fluffy Cumsalot, Porn Star",2003,57,NA,2.1,18,34.5,4.5,4.5,4.5,4.5,0,4.5,0,0,34.5,"",0,0,0,0,1,0,0 -"Flug des Albatros, Der",1995,93,NA,3.2,7,14.5,0,14.5,0,14.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Fluke",1995,96,NA,6,709,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Flush",1977,90,NA,1.7,8,24.5,34.5,24.5,0,0,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Fluttering Hearts",1927,23,NA,6.8,23,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Flux",1996,14,NA,6.9,5,0,0,0,0,24.5,0,44.5,0,24.5,24.5,"",0,0,0,1,0,0,1 -"Flux",2002,7,NA,7.5,16,0,0,4.5,14.5,14.5,0,4.5,4.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Fluxes",1968,24,NA,5.7,5,0,0,0,0,24.5,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Fly",1970,25,NA,6,16,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Fly Away Baby",1937,60,NA,5.8,39,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Fly Away Home",1996,110,NA,6.9,3027,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Fly Away Peter",1948,60,NA,5.6,13,0,0,4.5,14.5,24.5,24.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Fly Fly",2001,3,NA,6.1,8,0,0,0,34.5,0,14.5,0,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Fly II, The",1989,105,NA,4.3,2599,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fly Me",1973,72,NA,3.8,7,0,14.5,44.5,0,14.5,14.5,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Fly Who Loved Me, The",2004,3,NA,7.3,10,0,0,24.5,0,0,0,0,24.5,0,64.5,"",0,1,0,0,0,0,1 -"Fly by Night",1993,93,NA,3.4,51,24.5,14.5,0,14.5,4.5,4.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Fly in the Pink, A",1971,6,NA,4.9,8,0,0,0,24.5,24.5,45.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Fly mej en greve",1959,87,NA,5,6,0,14.5,0,14.5,0,45.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Fly's Last Flight, The",1949,7,NA,7.7,7,0,0,0,14.5,0,0,45.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Fly, The",1958,94,500000,6.8,2052,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fly, The",1986,92,15000000,7,9914,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fly-By-Night",1942,74,NA,5.8,10,14.5,0,0,0,24.5,14.5,14.5,24.5,34.5,0,"",0,0,0,1,0,0,0 -"Flyerman",2003,96,NA,7.8,8,0,0,14.5,0,14.5,0,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Flyers",1983,35,NA,7.2,5,0,0,0,0,24.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Flyfishing",2002,82,NA,6.4,92,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Flyg-Bom",1952,98,NA,3.9,18,0,14.5,24.5,14.5,24.5,4.5,4.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Flying Blind",1941,69,NA,6.1,7,0,14.5,0,14.5,24.5,24.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Flying Cat, The",1952,7,NA,6.6,36,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Flying Changes",1999,75,NA,3.6,18,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Flying Circus",1968,6,NA,3.7,9,0,14.5,34.5,0,14.5,24.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Flying Deuces, The",1939,69,NA,6.8,516,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Flying Devils",1933,62,NA,5.6,10,0,0,14.5,14.5,34.5,14.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Flying Disc Man from Mars",1950,167,NA,4.9,20,4.5,0,24.5,14.5,14.5,4.5,24.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Flying Down to Rio",1933,89,462000,6.8,386,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Flying Dutchman, The",2001,89,2000000,3.6,59,34.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Flying Elephants",1928,17,NA,6.1,46,4.5,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Flying Fleet, The",1929,87,NA,6.9,43,0,0,4.5,4.5,14.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Flying Fortress",1942,68,NA,5.4,22,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Flying Gauchito, The",1945,8,NA,6.4,16,4.5,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Flying High",1931,80,NA,5.3,24,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Flying Irishman, The",1939,71,NA,4.1,20,14.5,14.5,4.5,14.5,14.5,24.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Flying Jalopy, The",1943,7,NA,7.2,16,0,0,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Flying Leathernecks",1951,102,NA,6.1,492,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Flying Missile, The",1950,91,NA,6.5,11,0,0,0,0,14.5,14.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Flying Mouse, The",1934,9,NA,6.5,84,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Flying Nansen",1999,11,NA,6.5,8,0,0,0,0,14.5,14.5,0,14.5,0,64.5,"",0,1,0,0,0,0,1 -"Flying Over Mother",1996,9,NA,6.2,21,4.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Flying Padre",1951,9,NA,5.8,233,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Flying Saucer Daffy",1958,17,NA,5.5,37,14.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Flying Saucer Rock'n'Roll",1997,12,NA,4.8,21,0,0,4.5,0,0,4.5,0,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Flying Saucer, The",1950,69,NA,5.2,39,14.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Flying Serpent, The",1946,59,NA,5.3,28,0,0,4.5,24.5,24.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Flying Sorceress, The",1956,7,NA,6.2,24,4.5,0,4.5,4.5,0,24.5,44.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Flying Squirrel, The",1954,7,NA,6.6,32,0,0,4.5,0,4.5,4.5,44.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Flying Tigers",1942,102,NA,6.5,449,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Flying Virus",2001,95,NA,3.5,179,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Flying Wild",1941,64,NA,6.1,53,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Flypaper",1997,108,NA,4.8,210,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Flyvende farmor",2001,82,NA,4.5,57,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Fo Zhang luo han quan",1980,86,NA,5.9,60,4.5,0,4.5,0,4.5,14.5,14.5,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Focus",1996,73,NA,6.7,57,0,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Focus",2004,14,NA,9.6,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,0,0,0,1 -"Focus Group",2004,29,8000,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Foes",1977,115,NA,5.7,10,24.5,14.5,0,14.5,14.5,14.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Foet",2001,18,NA,9.4,7,0,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Fog Island",1945,72,NA,4.7,46,0,0,14.5,14.5,24.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fog Over Frisco",1934,68,NA,6.7,147,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Fog of War: Eleven Lessons from the Life of Robert S. McNamara, The",2003,107,NA,8.4,3416,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,0,0,1,0,0 -"Fog, The",1923,70,NA,8,15,4.5,4.5,0,0,0,4.5,24.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Fog, The",1980,89,1000000,6.5,4618,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fogbound",2002,97,NA,5.2,52,4.5,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Foghorn Leghorn, The",1948,6,NA,7.5,91,0,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Foire aux sexes, La",1973,76,NA,6.1,9,0,0,14.5,0,24.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Folie des grandeurs, La",1971,108,NA,7.1,459,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Folie douce, La",1994,90,NA,6.6,10,14.5,0,0,14.5,14.5,0,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Folie du Docteur Tube, La",1915,6,NA,5.6,20,0,4.5,0,4.5,24.5,24.5,24.5,0,4.5,14.5,"",0,0,0,0,0,0,1 -"Folies bourgeoises",1976,107,NA,4.4,38,14.5,4.5,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Folkefiende, En",2005,90,NA,4.8,22,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Folks!",1992,107,NA,4.2,467,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Folle d'elle",1998,95,NA,4,90,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Folle embellie",2004,110,NA,5.8,9,0,24.5,14.5,0,14.5,24.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Follow Me Home",1996,100,220000,7.6,52,4.5,0,0,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Follow Me Outside",2000,94,1000000,4.6,12,0,4.5,14.5,4.5,0,4.5,0,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Follow Me Quietly",1949,60,NA,6.6,115,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Follow Me!",1972,95,NA,5.8,78,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Follow Me, Boys!",1966,131,NA,6.5,345,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Follow That Camel",1967,95,NA,5.6,189,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Follow That Dream",1962,109,NA,5.4,276,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Follow Thru",1930,92,NA,6.5,20,0,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Follow Your Heart",1998,115,NA,5.8,29,14.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Follow a Star",1959,102,NA,4.3,40,4.5,4.5,4.5,14.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Follow the Boys",1944,122,NA,6.6,35,0,0,0,4.5,14.5,24.5,44.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Follow the Boys",1963,95,NA,4.8,48,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Follow the Fleet",1936,110,747000,7.4,371,0,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Follow the Leader",1944,65,NA,6.8,49,0,0,0,4.5,0,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Follow the Sun",1951,93,NA,6,61,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Followers",2000,87,NA,8.2,24,4.5,0,4.5,0,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Following",1998,69,6000,7.6,3197,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Following Paula",2000,41,NA,1.3,14,14.5,0,0,0,0,0,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Folly to Be Wise",1953,91,NA,7.7,28,4.5,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Folterkammer des Dr. Fu Man Chu, Die",1969,92,NA,2.3,279,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fome de Amor",1968,73,NA,5.5,10,24.5,0,0,14.5,0,24.5,14.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Fomlesen i kattepine",1999,83,2400000,4.6,18,24.5,14.5,4.5,14.5,24.5,14.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Fonazei o kleftis",1965,82,NA,7.8,22,0,0,0,0,0,4.5,14.5,44.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Fond Kiss..., Ae",2004,104,NA,7.3,740,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Fond de l'air est rouge, Le",1977,180,NA,7.8,59,0,0,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Fondo del mar, El",2003,92,NA,6.9,106,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Foney Fables",1942,8,NA,6.2,22,0,0,0,0,34.5,14.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Fong Sai-Yuk",1993,100,NA,7,1337,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",1,0,1,0,0,0,0 -"Fong Shi Yu II: Wan fu mo di",1993,95,NA,6.8,691,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Fontamara",1977,139,NA,7.8,8,0,0,0,0,0,0,34.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fontan",1988,100,NA,7.3,35,0,0,0,4.5,4.5,0,24.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Fontanero, su mujer, y otras cosas de meter..., El",1981,86,NA,4.7,6,34.5,14.5,0,14.5,0,0,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Foo gwai lit che",1986,98,NA,6.7,108,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Foo-Foo Dust",2003,39,NA,8.1,15,4.5,0,0,0,0,0,4.5,45.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Food for Feudin'",1950,7,NA,5.1,16,0,4.5,14.5,0,24.5,0,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Food for Thought",1999,11,NA,6.1,10,0,0,0,14.5,14.5,34.5,0,44.5,14.5,0,"",0,0,1,0,0,0,1 -"Food of Love",1997,108,NA,2.9,19,44.5,4.5,0,0,14.5,14.5,24.5,0,0,4.5,"",0,0,1,0,0,1,0 -"Food of Love",2002,112,NA,6.4,262,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Food of the Gods II",1989,91,3500000,1.9,173,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Food of the Gods, The",1976,88,NA,3.4,344,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fool Coverage",1952,7,NA,6.9,29,0,0,0,0,14.5,14.5,34.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Fool Killer, The",1965,99,NA,5.3,36,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fool There Was, A",1915,67,NA,5.8,81,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fool for Love",1985,106,NA,5.2,311,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fool's Gold",1947,63,NA,7.4,8,0,0,0,0,14.5,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Fool, The",1990,140,NA,6.7,22,4.5,0,4.5,0,4.5,0,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Foolin' Around",1980,111,NA,5.2,107,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Foolish",1999,97,NA,3,133,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Foolish Wives",1922,384,1100000,7.6,191,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Foolproof",2003,94,NA,6.6,845,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Fools",1970,93,NA,3.9,21,4.5,4.5,4.5,4.5,14.5,14.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Fools",1997,90,NA,4.7,13,14.5,0,0,0,0,0,14.5,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Fools Rush In",1997,109,NA,5.8,5225,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Fools for Scandal",1938,80,1300000,5.6,44,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Fools of Fate",1909,11,NA,5.4,9,14.5,0,0,14.5,24.5,24.5,14.5,24.5,0,0,"",0,0,0,1,0,0,1 -"Fools of Fortune",1990,104,NA,5.2,50,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fools' Parade",1971,98,NA,6.1,121,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Foot Shooting Party, The",1994,27,NA,3.4,35,24.5,0,4.5,0,4.5,0,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Football",2001,8,NA,4.6,29,4.5,0,4.5,24.5,4.5,24.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,1 -"Football Factory, The",2004,91,NA,6.5,1164,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Football Now and Then",1953,7,NA,7.7,9,0,0,0,0,0,24.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Football Toucher Downer, The",1937,6,NA,7.2,10,0,0,14.5,0,0,14.5,44.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Footfalls",2000,27,NA,4.7,11,14.5,4.5,0,4.5,14.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Footlight Fever",1941,69,NA,6.1,7,0,0,0,0,14.5,24.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Footlight Frenzy",1984,110,NA,8.6,8,0,0,0,0,0,14.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Footlight Glamour",1943,72,NA,5.7,21,4.5,0,0,4.5,34.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Footlight Parade",1933,104,703000,7.6,385,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Footlight Serenade",1942,80,NA,6.4,30,0,0,0,0,14.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Footloose",1984,107,NA,5.9,5914,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Footloose Heiress, The",1937,59,NA,6.2,5,0,0,24.5,0,0,24.5,64.5,0,0,0,"",0,0,1,0,0,1,0 -"Footrot Flats: The Dog's Tale",1987,71,NA,6.7,114,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Footstep Man, The",1992,89,NA,4.9,7,0,0,14.5,14.5,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Footsteps",1974,33,NA,8.3,6,14.5,0,0,14.5,0,0,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Footsteps in the Dark",1941,96,NA,6.8,79,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Footsteps in the Fog",1955,90,NA,6.3,91,0,4.5,0,4.5,14.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Footsteps in the Night",1957,62,NA,5.1,9,0,14.5,44.5,0,0,24.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"For All Mankind",1989,80,NA,8,249,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"For Always",2004,76,NA,8.1,18,14.5,4.5,0,0,4.5,0,0,14.5,0,64.5,"",0,0,0,1,0,0,0 -"For Angela",1994,25,NA,8,5,0,0,0,0,0,24.5,24.5,44.5,0,24.5,"",0,0,0,0,0,0,1 -"For Auld Lang Syne",1938,7,NA,7.9,22,4.5,0,0,0,4.5,4.5,64.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"For Better or Worse",1996,105,NA,5.1,153,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,1,0,0,0 -"For Better or Worser",1935,7,NA,5.1,21,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"For Better, for Worse",1954,92,NA,7.1,14,14.5,0,0,0,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,1,0 -"For Caroline",2002,18,60000,6.7,19,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"For Crimin' Out Loud",1956,16,NA,7.1,27,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"For Ever Mozart",1996,84,NA,5.7,108,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"For Freedom",1940,87,NA,4.6,9,0,34.5,14.5,14.5,34.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"For God and Country",1943,43,NA,1.5,15,45.5,14.5,4.5,0,0,0,4.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"For Good",2003,96,NA,8.2,9,0,0,14.5,0,0,0,24.5,0,34.5,34.5,"",0,0,0,1,0,0,0 -"For Heaven's Sake",1926,58,NA,7.9,117,4.5,0,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,0,0,1,0 -"For Heaven's Sake",1950,92,NA,5.7,38,0,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"For Hire",1997,96,NA,4.8,94,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"For Keeps?",1988,90,NA,4.8,598,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"For Life or Death",1996,94,NA,3.8,5,44.5,24.5,0,0,24.5,0,0,0,0,24.5,"",1,0,0,0,0,0,0 -"For Love Alone",1986,102,NA,5.2,31,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,1,0 -"For Love and Money",1967,75,NA,1.8,13,64.5,14.5,0,0,0,4.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"For Love of Ivy",1968,101,NA,5.4,87,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"For Love of the Game",1999,137,50000000,6.1,5782,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"For Love or Money",1963,108,NA,5.6,59,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"For Love or Money",1969,80,NA,1.5,10,64.5,24.5,0,0,0,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"For Love or Money",1993,96,NA,5.8,1662,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"For Marilyn",1992,11,NA,7.2,35,4.5,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"For Me and My Gal",1942,104,802000,6.9,326,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"For Men Only",1952,93,NA,7.8,5,0,0,0,0,0,0,64.5,0,44.5,0,"",0,0,0,1,0,0,0 -"For My Baby",1997,102,NA,3.3,18,24.5,24.5,4.5,4.5,14.5,14.5,0,4.5,0,4.5,"",0,0,0,1,0,0,0 -"For Our Man",2003,25,NA,8.9,8,14.5,0,0,0,0,14.5,0,0,34.5,34.5,"",0,0,1,1,0,0,1 -"For Pete's Sake",1968,90,NA,5.4,12,0,0,4.5,0,24.5,14.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"For Pete's Sake",1974,90,NA,5.8,327,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"For Queen and Country",1988,105,NA,6.4,195,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"For Richer or Poorer",1997,115,NA,5.3,1710,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"For Scent-imental Reasons",1949,7,NA,7.1,114,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,1,1 -"For Singles Only",1968,91,NA,1.1,6,34.5,0,0,0,34.5,0,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"For Those About to Rock: Monsters in Moscow",1992,84,NA,8.9,16,0,0,0,0,4.5,0,0,0,24.5,64.5,"",0,0,0,0,1,0,0 -"For Those Who Think Young",1964,96,NA,5.8,42,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"For Which He Stands",1996,88,NA,4.8,53,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"For Which It Stands",2003,8,NA,9,13,0,0,0,0,0,0,4.5,24.5,34.5,34.5,"",0,0,0,1,0,0,1 -"For Whom the Bell Tolls",1943,168,3000000,7.2,1010,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"For Whom the Bulls Toil",1953,6,NA,7,48,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"For Your Convenience",1939,9,NA,5,8,0,0,14.5,24.5,34.5,24.5,0,0,0,0,"",0,0,0,0,0,0,1 -"For Your Eyes Only",1981,127,28000000,6.7,8061,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"For a Few Lousy Dollars",1996,88,NA,5.1,59,24.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,1,1,0,0,0 -"For da Love of Money",2002,97,NA,2.9,60,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"For dagene er onde",1991,74,NA,4.5,7,0,0,0,45.5,44.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"For harde livet",1989,101,NA,5.7,10,0,0,14.5,24.5,34.5,0,24.5,24.5,0,0,"",0,0,0,0,1,0,0 -"For the Birds",2000,3,NA,8,2310,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,1,1,0,0,0,1 -"For the Boys",1991,138,NA,5.8,987,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"For the Cause",2000,91,NA,2.8,183,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"For the Common Defense!",1942,22,NA,5.4,14,0,0,0,14.5,24.5,45.5,0,0,0,4.5,"",0,0,0,1,0,0,1 -"For the Defense",1930,65,NA,7,9,0,0,0,0,0,14.5,44.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"For the First Time",1959,92,NA,6.1,50,4.5,0,0,4.5,14.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"For the Love of Ada",1972,88,NA,5.3,9,0,0,0,24.5,24.5,14.5,34.5,14.5,0,0,"",0,0,1,0,0,1,0 -"For the Love of Benji",1977,85,NA,5.4,148,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"For the Love of Mary",1948,90,NA,6.5,24,4.5,0,0,4.5,14.5,4.5,4.5,24.5,4.5,34.5,"",0,0,1,0,0,1,0 -"For the Love of May",2000,17,NA,5.4,6,0,0,0,0,34.5,0,0,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"For the Love of Mike",1960,87,NA,5,5,0,0,0,0,44.5,0,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"For the Moment",1993,120,NA,6.4,247,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,1,0 -"For the Term of His Natural Life",1927,101,NA,6.3,9,0,0,14.5,14.5,14.5,24.5,0,14.5,34.5,0,"",0,0,0,0,0,1,0 -"Forastero, El",2002,100,NA,4.5,7,0,0,24.5,0,14.5,14.5,14.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Forbidden",1932,83,NA,6,48,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Forbidden",1953,85,NA,5.7,25,0,4.5,4.5,0,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Forbidden",2002,84,NA,4.1,99,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Forbidden Cargo",1954,85,NA,5.2,19,0,14.5,0,14.5,14.5,44.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Forbidden City, The",1918,62,NA,8.1,6,0,0,0,0,14.5,0,0,0,64.5,14.5,"",0,0,0,1,0,1,0 -"Forbidden City, U.S.A.",1989,56,NA,5,5,0,0,0,24.5,0,24.5,0,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Forbidden Dance, The",1990,97,NA,2.6,215,34.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Forbidden Fruit",2000,30,NA,8.6,5,0,0,0,0,0,24.5,0,64.5,24.5,0,"",0,0,0,0,1,0,1 -"Forbidden Games",1995,89,NA,4.6,69,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Forbidden Island",1959,66,NA,3.7,5,0,0,24.5,44.5,0,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Forbidden Love: The Unashamed Stories of Lesbian Lives",1992,85,NA,6.5,72,4.5,4.5,0,0,4.5,14.5,14.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Forbidden Marriages in the Holy Land",1995,66,NA,3,6,45.5,14.5,14.5,0,0,0,0,0,0,14.5,"",0,0,0,0,1,0,0 -"Forbidden Passage",1941,21,NA,5.6,10,0,0,0,14.5,14.5,64.5,14.5,0,14.5,0,"",0,0,0,1,0,0,1 -"Forbidden Planet",1956,98,1900000,7.7,6736,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Forbidden Quest",1993,70,NA,5.6,37,14.5,0,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Forbidden Sins",1998,95,NA,4.2,119,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Forbidden Sun",1989,85,NA,3.2,21,14.5,14.5,14.5,4.5,14.5,0,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Forbidden Trail",1932,68,NA,3.7,8,0,14.5,14.5,14.5,24.5,0,0,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Forbidden Trails",1941,54,NA,5.8,8,0,0,14.5,0,14.5,34.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Forbidden Warrior",2004,91,NA,4.6,59,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,34.5,"",1,0,0,0,0,0,0 -"Forbidden World",1982,77,NA,4.4,110,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Forbidden Zone",1980,74,NA,6.8,690,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Forbidden, The",1978,36,NA,4.2,72,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Forbrydelsens element",1984,104,NA,6.2,1189,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Forbrydelser",2004,101,NA,7.1,183,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Forbryder, En",1941,83,NA,7,5,0,0,0,24.5,44.5,0,0,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Force 10 from Navarone",1978,118,NA,5.9,2275,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Force Beyond, The",1978,85,NA,5.9,9,0,14.5,14.5,0,0,24.5,34.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Force More Powerful, A",1999,110,NA,6.4,8,0,0,14.5,0,0,14.5,0,0,34.5,34.5,"",0,0,0,0,0,0,0 -"Force majeure",1989,86,NA,6.6,97,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Force of Arms",1951,99,NA,6.1,54,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Force of Evil",1948,78,NA,7.5,571,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Force of One, A",1979,90,NA,4.5,253,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Force of Water, The",1998,1,NA,8,5,0,0,0,0,0,0,0,100,0,0,"",0,1,0,0,0,0,1 -"Force on Thunder Mountain, The",1977,93,NA,1.9,12,64.5,14.5,0,4.5,0,0,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Force, The",1994,94,NA,3.9,62,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Force: Five",1981,96,NA,4.4,53,4.5,14.5,14.5,4.5,24.5,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Forced Entry",1972,83,NA,5.7,26,14.5,4.5,0,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Forced Entry",1975,88,NA,4.9,33,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Forced March",1989,104,2700000,4,16,14.5,0,4.5,14.5,14.5,4.5,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Forced Vengeance",1982,90,NA,4.6,192,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Forced to Kill",1993,93,NA,4,29,14.5,4.5,24.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Forces of Nature",1999,105,NA,5.3,7285,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Ford Transit",2002,81,NA,7.8,38,14.5,0,0,0,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Fore Play",1975,75,NA,4.6,6,0,0,14.5,0,0,14.5,0,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Foreign Affair, A",1948,116,1500000,7.5,491,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Foreign Affair, A",2003,94,NA,6.3,234,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Foreign Affaires",1935,71,NA,5.4,11,0,0,0,0,74.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Foreign Body",1986,111,NA,5.2,81,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Foreign Correspondent",1940,115,NA,7.7,1975,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Foreign Correspondents",1999,102,500000,7.6,117,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"PG-13",0,0,0,1,0,1,0 -"Foreign Field, A",1993,95,NA,8.1,106,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,45.5,"",0,0,1,1,0,0,0 -"Foreign Ghosts",1998,133,NA,4.4,5,24.5,44.5,0,0,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Foreign Intrigue",1956,100,NA,5.6,89,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Foreign Moon",1995,90,NA,6,31,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Foreign Nights",1989,90,NA,5.1,11,0,0,4.5,4.5,34.5,4.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Foreign Student",1994,90,NA,5.6,74,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Foreigner, The",1978,77,NA,4.4,14,4.5,0,24.5,0,4.5,0,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Foreigner, The",2003,96,20000000,3.1,904,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Foreigners out! Schlingensiefs Container",2002,90,NA,8.9,21,0,0,0,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Foreman Went to France, The",1942,87,NA,6.9,65,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Forest Commandos, The",1945,19,NA,6.5,11,0,0,0,0,4.5,45.5,14.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Forest Rangers, The",1942,87,NA,7.4,50,0,4.5,0,0,4.5,14.5,34.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Forest Warrior",1996,93,NA,3.7,162,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Forest of Bliss",1986,90,NA,5.3,13,4.5,0,0,4.5,0,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Forever",1992,93,NA,5.2,20,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Forever Amber",1947,138,6000000,6.5,149,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Forever Evil",1987,107,NA,3.2,44,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Forever Fabulous",2000,105,NA,4,14,14.5,4.5,14.5,0,14.5,4.5,4.5,4.5,0,24.5,"",0,0,1,1,0,0,0 -"Forever Female",1953,93,NA,6.5,52,0,4.5,0,0,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Forever Fever",1998,95,NA,6.6,244,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Forever Lulu",2000,99,20000000,5.5,257,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Forever Midnight",1999,105,NA,4.2,22,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Forever Mine",1999,113,NA,5.1,484,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Forever My Love",1962,147,NA,6,20,0,4.5,0,0,24.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Forever Young",1983,84,NA,4.9,12,0,4.5,0,14.5,14.5,34.5,0,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Forever Young",1992,102,NA,6,6453,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Forever and Always",1978,18,NA,6.2,10,0,0,0,24.5,0,0,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Forever and a Day",1943,104,NA,7.7,106,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Forever, Darling",1956,96,NA,5.8,118,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Forever, Lulu",1987,85,NA,3.8,67,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Forget Me Not",1936,73,NA,4.2,13,4.5,0,14.5,0,4.5,4.5,24.5,24.5,0,14.5,"",0,0,0,1,0,1,0 -"Forget Paris",1995,101,NA,6.2,2874,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Forgive Me Father",2001,138,NA,3.9,35,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Forgiveness",2004,112,NA,6.8,94,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Forgotten Babies",1933,20,NA,8.7,20,0,0,0,14.5,0,24.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Forgotten Faces, The",1961,17,NA,7,12,0,0,0,0,4.5,14.5,24.5,44.5,0,4.5,"",0,0,0,0,0,0,1 -"Forgotten Heroes",1990,105,NA,4.7,10,34.5,0,0,0,24.5,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Forgotten Heroes",2004,13,NA,8.6,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,0,0,0,0,1 -"Forgotten One, The",1990,100,NA,6.1,60,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Forgotten Silver",1995,53,NA,7.5,1302,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Forgotten Toys, The",1995,25,NA,8,18,0,0,0,0,14.5,0,4.5,24.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Forgotten Village, The",1941,67,NA,5.5,6,0,0,0,0,45.5,14.5,14.5,14.5,0,0,"",0,0,0,1,1,0,0 -"Forgotten Warrior",1986,84,NA,2.3,7,44.5,14.5,14.5,14.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Forgotten, The",1973,92,NA,4.2,284,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Forgotten, The",2004,94,42000000,5.8,8234,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Forma de bailar, Una",1997,70,NA,5.4,16,14.5,0,0,0,0,34.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Formel Eins Film, Der",1985,97,NA,4.4,25,14.5,14.5,4.5,14.5,14.5,14.5,4.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Former Child Star",1997,81,NA,2.7,11,14.5,4.5,0,0,0,14.5,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Formula 1 - Nell'Inferno del Grand Prix",1970,91,NA,6.1,7,0,14.5,0,0,14.5,14.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Formula, The",1980,117,NA,5.4,299,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Formulas for Seduction: The Cinema of Atom Egoyan",1999,52,NA,8.4,16,14.5,0,0,0,0,0,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Formynderne",1978,103,NA,4.1,7,44.5,0,0,24.5,14.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Forrest Gump",1994,142,55000000,8.2,89722,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"PG-13",0,0,1,1,0,0,0 -"Forsaken",1994,12,NA,3.8,8,0,24.5,0,14.5,34.5,0,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Forsaken, The",2001,90,5000000,5.1,1928,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Forsaking All Others",1934,83,NA,5.9,123,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Fort Algiers",1953,78,NA,5.5,14,0,0,4.5,14.5,24.5,24.5,14.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Fort Apache",1948,125,2500000,7.6,1865,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Fort Apache the Bronx",1981,125,NA,6.3,950,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Fort Bowie",1958,80,NA,5.2,11,0,4.5,4.5,14.5,24.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Fort Defiance",1951,82,NA,5.5,26,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Fort Dobbs",1958,93,NA,6.2,39,0,4.5,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fort Massacre",1958,80,NA,6.1,52,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fort Osage",1952,72,NA,5.2,8,14.5,0,14.5,14.5,14.5,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Fort Saganne",1984,175,NA,6.3,141,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Fort Ti",1953,73,NA,4.6,42,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fort Utah",1967,84,NA,4.8,16,24.5,0,0,14.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Fort Vengeance",1953,75,NA,5.2,10,0,0,0,24.5,14.5,44.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Fort Worth",1951,80,NA,5.5,27,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fort Yuma",1955,78,NA,5.7,7,0,0,14.5,0,14.5,44.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Forteresse suspendue, La",2001,95,NA,5.3,57,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fortini/Cani",1976,83,NA,4.6,11,14.5,0,0,0,0,4.5,4.5,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Fortress",1993,95,12000000,5.3,2577,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Fortress 2",1999,92,11000000,4.2,1027,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Fortress of Amerikkka",1989,100,NA,2.6,26,14.5,14.5,14.5,4.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fortuna",2000,85,NA,5.8,17,0,0,0,4.5,14.5,24.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Fortuna di essere donna, La",1956,100,NA,5.2,15,0,0,4.5,14.5,4.5,24.5,24.5,24.5,0,4.5,"",0,0,1,1,0,0,0 -"Fortunat",1960,121,NA,6.6,28,0,0,0,0,14.5,14.5,24.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Fortune Cookie",1999,106,NA,5.5,27,4.5,4.5,0,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Fortune Cookie, The",1966,125,3705000,7.4,1504,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Fortune Is a Woman",1957,95,NA,6.6,10,0,14.5,0,14.5,0,24.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Fortune and Men's Eyes",1971,102,NA,5.8,93,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fortune, The",1975,88,NA,5.5,297,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fortunes of Captain Blood",1950,91,NA,6.1,9,0,14.5,0,14.5,0,64.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Fortunes of War",1993,107,NA,5.2,48,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Forty Acre Feud",1965,85,NA,7.4,5,24.5,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Forty Boys and a Song",1941,10,NA,6.6,9,0,0,0,0,24.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Forty Deuce",1982,89,NA,4.8,40,4.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Forty Guns",1957,79,NA,6.9,202,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Forty Naughty Girls",1937,63,NA,6,28,0,0,0,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Forty Pink Winks",1975,7,NA,4.7,5,0,0,0,24.5,64.5,24.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Forty Shades of Blue",2005,108,1500000,4.2,57,4.5,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Forty Thieves",1944,60,NA,6.5,18,4.5,0,0,0,24.5,0,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Forty-Niners, The",1954,71,NA,6.3,8,0,0,0,0,14.5,34.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Forty-five Minutes from Hollywood",1926,14,NA,4.8,25,4.5,0,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Forward March Hare",1953,7,NA,7.3,47,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Forward Pass, The",1929,78,NA,3.4,10,34.5,24.5,0,0,14.5,34.5,0,0,0,14.5,"",0,0,0,1,0,1,0 -"Forza del passato, La",2002,98,NA,5.9,34,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fos pou svini, To",2000,95,NA,7.2,9,0,0,0,14.5,0,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Foto di Gioia, Le",1987,94,NA,4.6,95,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Foto proibite di una signora per bene, Le",1970,93,NA,6.5,33,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fotoamator",1998,52,NA,5.1,18,4.5,0,0,14.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Fotograf",2001,66,NA,5.4,8,14.5,14.5,0,14.5,14.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Fotografando Patrizia",1985,89,NA,5.4,11,4.5,0,4.5,4.5,14.5,0,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Fotos",1996,93,NA,4.3,50,24.5,4.5,4.5,4.5,4.5,0,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Fotostar",2002,16,NA,7.4,5,0,0,0,0,0,0,44.5,64.5,0,0,"",0,0,1,0,0,1,1 -"Fou du labo IV, Le",1967,90,NA,4.3,22,14.5,4.5,4.5,14.5,4.5,24.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Foul Hunting",1947,6,NA,6.4,35,4.5,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Foul Play",1978,116,NA,6.6,2280,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fountain, The",1934,83,NA,5.6,13,0,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Fountain, The",2001,15,NA,8.3,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Fountainhead, The",1949,114,NA,6.9,1121,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Four American Composers",1983,220,NA,8.5,16,0,0,4.5,0,14.5,0,4.5,4.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Four Boys and a Gun",1957,74,NA,5.9,12,0,0,14.5,0,14.5,4.5,24.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Four Corners",1997,80,NA,6.1,11,14.5,0,0,0,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Four Daughters",1938,90,NA,7.3,191,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Four Days",1999,92,NA,5.1,92,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Four Days in November",1964,122,NA,8.3,37,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Four Dead Batteries",2004,96,77000,8.7,19,4.5,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Four Deuces, The",1976,87,NA,5,34,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Four Dimensions of Greta",1972,85,NA,3.6,24,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Four Dogs Playing Poker",2000,97,NA,5.7,496,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Four Faces West",1948,89,NA,6.4,61,0,0,0,4.5,14.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Four Feathers, The",1939,130,NA,7.8,734,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Four Feathers, The",2002,125,80000000,6.2,4400,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Four Friends",1981,114,NA,6.4,341,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Four Frightened People",1934,78,NA,6.3,19,4.5,4.5,0,4.5,14.5,14.5,34.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Four Girls in Town",1957,85,NA,4.8,16,0,0,0,14.5,14.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Four Girls in White",1939,73,NA,5.1,12,4.5,4.5,14.5,4.5,24.5,4.5,4.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Four Guns to the Border",1954,83,NA,5.4,15,4.5,0,0,4.5,24.5,44.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Four Horsemen of the Apocalypse",1962,153,NA,6.3,248,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Four Horsemen of the Apocalypse, The",1921,150,800000,7.6,163,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Four Hours to Kill!",1935,70,NA,5.2,13,0,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Four Jacks",2000,92,NA,4.5,52,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Four Jacks and a Jill",1942,68,NA,5.3,20,0,4.5,14.5,24.5,4.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Four Jills in a Jeep",1944,89,NA,6.3,50,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Four Just Men, The",1939,85,NA,5,15,0,0,0,4.5,24.5,34.5,24.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Four Men and a Coffin",1996,97,NA,5.3,7,14.5,0,0,0,44.5,24.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Four Men and a Prayer",1938,85,NA,6.3,60,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Four Mothers",1941,86,NA,6.1,24,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Four Musicians of Bremen, The",1922,7,NA,4.8,9,0,0,0,24.5,34.5,24.5,14.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Four Musketeers, The",1974,108,NA,7,1564,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,1,0 -"Four Parts",1934,19,NA,8.9,7,0,0,0,0,0,0,14.5,44.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Four Poster, The",1952,103,NA,6,38,0,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Four Rode Out",1971,99,NA,4.7,14,0,14.5,4.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Four Rooms",1995,98,4000000,6,10675,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Four Seasons, The",1981,107,NA,6.5,635,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Four Sided Triangle",1953,81,NA,5,52,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Four Skulls of Jonathan Drake, The",1960,70,NA,5.9,64,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Four Sons",1928,100,NA,5.5,50,14.5,4.5,4.5,4.5,24.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Four Sons",1940,89,NA,5.5,11,0,0,4.5,4.5,14.5,14.5,4.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Four Stars",1967,1100,NA,3,12,24.5,0,4.5,0,0,0,4.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Four Weddings and a Funeral",1994,117,6000000,7.2,17820,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"Four Wives",1939,99,NA,5.9,59,0,4.5,4.5,14.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Four in the Morning",1965,94,NA,5.1,17,0,0,0,14.5,0,4.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Four's a Crowd",1938,92,NA,6.1,84,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,"",0,0,1,0,0,1,0 -"Four-Eyed Monsters",2005,85,NA,6.9,18,0,0,0,0,4.5,14.5,4.5,14.5,4.5,45.5,"",0,0,1,1,0,1,0 -"Four.50",2003,6,5000,4.7,6,0,0,34.5,0,0,14.5,0,45.5,0,0,"",1,0,0,0,0,0,1 -"Fourbi",1996,114,NA,6.1,51,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fourteen",2002,18,NA,6.6,10,14.5,0,0,0,0,0,34.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Fourteen Hours",1951,92,NA,7.4,119,0,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fourth Angel, The",2001,95,NA,5.4,597,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Fourth Dimension, The",1988,27,NA,6,13,0,4.5,0,0,4.5,24.5,4.5,24.5,0,34.5,"",0,1,0,0,0,0,1 -"Fourth Protocol, The",1987,119,NA,6.2,1434,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fourth War, The",1990,91,NA,5.2,228,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fourth Wish, The",1976,107,NA,6.6,15,0,0,0,0,4.5,34.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fourth World War, The",2003,78,NA,7.8,14,0,0,4.5,4.5,0,0,24.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Fous de Bassan, Les",1987,105,NA,5.3,17,0,4.5,0,14.5,14.5,14.5,24.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Fous du stade, Les",1972,80,NA,5.1,64,4.5,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Foutaises",1989,8,NA,7.9,173,4.5,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Fovou tous Ellines...",2000,90,NA,5.4,125,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Fowl Play",1937,7,NA,6.4,5,0,0,0,0,0,44.5,0,24.5,0,44.5,"",0,1,1,0,0,0,1 -"Fowl Weather",1953,7,NA,6.8,30,0,0,0,4.5,14.5,4.5,45.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Fox Hunt",1996,95,NA,6.1,98,0,0,4.5,4.5,4.5,0,4.5,4.5,4.5,84.5,"",1,0,1,0,0,0,0 -"Fox Hunt, The",1938,8,NA,7,33,0,0,0,4.5,4.5,14.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Fox Pop",1942,8,NA,7.1,28,0,0,14.5,0,4.5,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Fox Trot Finesse",1915,16,NA,7,19,0,0,4.5,4.5,4.5,14.5,44.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Fox and the Grapes, The",1941,8,NA,8.5,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Fox and the Hound, The",1981,83,NA,6.7,2709,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,1,0,0,0 -"Fox in a Fix, A",1951,7,NA,6.5,15,0,0,0,4.5,4.5,34.5,34.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Fox, The",1967,110,NA,6.4,167,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fox-Terror",1957,7,NA,6.6,22,0,0,0,4.5,14.5,4.5,34.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Foxes",1980,106,NA,5.8,476,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Foxes of Harrow, The",1947,117,NA,6.6,31,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Foxfire",1955,87,NA,5.6,54,0,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Foxfire",1996,102,NA,5.6,1558,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Foxhole in Cairo",1961,80,NA,4.9,24,4.5,0,0,24.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Foxtrap",1986,88,NA,3.5,23,14.5,24.5,4.5,14.5,14.5,4.5,0,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Foxtrot",1976,91,NA,5.1,28,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Foxtrot",1982,79,NA,5.1,6,14.5,0,0,0,0,14.5,0,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Foxy Brown",1974,87,NA,6.1,763,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Foxy Duckling, The",1947,7,NA,6.9,12,0,0,0,4.5,0,24.5,24.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Foxy Grandpa and Polly in a Little Hilarity",1902,1,NA,4.6,12,0,0,14.5,4.5,44.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Foxy Lady, Wild Cherry",2000,21,NA,7.9,14,0,0,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,1 -"Foxy by Proxy",1952,7,NA,7.1,33,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Fracchia contro Dracula",1985,88,NA,5.5,64,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fracchia la belva umana",1981,99,NA,6.2,107,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Fracture",2004,107,NA,6.7,26,0,0,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fracture du myocarde, La",1990,105,NA,7,103,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fractured Fairy Tales: The Phox, the Box & the Lox",1999,6,NA,6.8,21,0,0,0,4.5,0,14.5,14.5,4.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Fractured Leghorn, A",1950,7,NA,7.4,32,0,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Fragile",1998,8,NA,6.2,19,4.5,0,0,4.5,24.5,14.5,24.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Fragment of Fear",1970,94,NA,5.3,31,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fragmentos da vida",1929,40,NA,8.1,5,0,0,0,0,0,0,24.5,64.5,24.5,0,"",0,0,0,1,0,0,1 -"Fraidy Cat",1942,7,NA,6.5,32,0,0,4.5,4.5,4.5,14.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Fraile, El",1990,106,NA,4.7,12,44.5,0,0,0,4.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Frailty",2001,100,11000000,7.4,10551,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Frame Up",1991,90,NA,5.1,11,0,4.5,4.5,14.5,14.5,4.5,14.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Frame of Mind",2003,20,30000,7,6,14.5,0,0,14.5,0,0,14.5,0,0,45.5,"",0,0,0,0,0,0,1 -"Frame-Up II: The Cover-Up",1996,92,NA,4.6,11,4.5,0,14.5,24.5,24.5,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Framed",1930,65,NA,5.7,12,0,0,4.5,4.5,34.5,4.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Framed",1947,82,NA,6.8,25,0,0,0,4.5,14.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Framed",1975,106,NA,5.4,47,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Framed Cat, The",1950,7,NA,6.3,21,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Frames from the Edge",1989,95,NA,6.6,16,14.5,0,0,4.5,14.5,14.5,0,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Frameup",1993,91,NA,7.8,27,0,4.5,4.5,0,0,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Fran",1985,98,NA,5.5,12,4.5,0,0,4.5,14.5,34.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Franc, Le",1994,44,NA,5.5,38,4.5,0,4.5,14.5,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Franc-tireur, Le",1972,72,NA,5.5,7,0,0,0,0,44.5,0,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"France Boutique",2003,95,NA,5.1,92,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"France Five",2000,30,NA,8,8,0,14.5,0,0,0,0,0,64.5,14.5,14.5,"",1,0,1,0,0,0,1 -"Frances",1982,140,NA,7.2,1094,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Frances Carroll & 'The Coquettes'",1940,10,NA,7.8,6,0,0,0,0,14.5,0,14.5,0,45.5,14.5,"",0,0,0,0,0,0,1 -"Francesco",1989,133,NA,4.9,163,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Francesco d'Assisi",1966,134,NA,7.6,7,0,0,0,0,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Francesco, giullare di Dio",1950,83,NA,7.9,104,4.5,0,0,4.5,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Franchesca Page",1997,94,NA,3.8,22,4.5,4.5,4.5,0,24.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Franchise Affair, The",1950,95,NA,6,12,0,14.5,0,4.5,24.5,4.5,34.5,0,0,4.5,"",0,0,0,1,0,1,0 -"Francine St. Claire's Mail",2002,24,10000,6,5,0,0,0,0,0,44.5,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Francis",1950,91,150000,6.2,167,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Francis Covers the Big Town",1953,86,NA,6,38,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Francis Goes to West Point",1952,81,NA,5.9,75,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Francis Goes to the Races",1951,88,NA,6.1,63,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Francis Joins the WACS",1954,95,NA,5.7,65,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Francis in the Haunted House",1956,80,NA,5.2,41,4.5,4.5,4.5,4.5,34.5,4.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Francis in the Navy",1955,80,NA,5.4,112,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Francis of Assisi",1961,101,NA,6.2,58,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Francisca",1981,166,NA,6.3,36,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Francisca",2002,88,NA,7.9,50,14.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Franck Spadone",2000,85,NA,5,19,4.5,14.5,14.5,4.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Franco Bagongo",2002,85,NA,8.1,9,14.5,0,0,0,0,0,14.5,24.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Franco e Ciccio sul sentiero di guerra",1969,95,NA,2.7,5,24.5,44.5,0,0,0,0,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Franco e Ciccio... ladro e guardia",1969,91,NA,5.8,8,0,14.5,0,14.5,0,24.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Franco: ese hombre",1964,103,NA,1.8,18,45.5,0,14.5,0,4.5,0,0,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Frank Duck Brings 'em Back Alive",1946,8,NA,8.5,11,0,0,0,0,0,14.5,0,34.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Frank Film",1973,9,NA,7.8,52,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Frank Finds Out",1998,83,NA,8,8,24.5,0,14.5,0,0,0,0,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Frank Lloyd Wright",1998,146,NA,7.7,97,4.5,4.5,0,0,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Frank Truth, The",2001,85,NA,7.6,27,24.5,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Frank Zappa: Phase II - The Big Note",2002,90,NA,7.7,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,0,0,0,0,0 -"Frank and I",1984,83,NA,4.9,31,4.5,0,4.5,14.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Frank and Jesse",1994,105,NA,5.6,241,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frank and Ollie",1995,90,NA,7.8,50,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"PG",0,0,0,0,1,0,0 -"Frank en Eva",1973,105,NA,5.4,17,0,0,14.5,14.5,14.5,44.5,0,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Frank the Wrabbit",1998,9,NA,6.6,9,0,0,0,0,14.5,24.5,24.5,14.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Frank's Book",2001,18,NA,5.6,52,4.5,0,4.5,0,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Frank's Cock",1994,8,NA,8.3,20,14.5,0,0,0,0,14.5,14.5,14.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Frankenfish",2004,84,3000000,4.6,309,14.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Frankenhooker",1990,85,2500000,5,520,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Frankenstein",1910,16,NA,5.8,70,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Frankenstein",1931,71,291000,7.9,6045,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Frankenstein",1994,123,45000000,6,6941,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Frankenstein & the Werewolf Reborn!",2000,92,NA,5,26,34.5,4.5,14.5,4.5,4.5,0,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Frankenstein - 1970",1958,83,110000,3.9,84,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frankenstein 80",1972,85,NA,3.1,13,4.5,24.5,34.5,14.5,4.5,4.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Frankenstein 90",1984,100,NA,4.4,34,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Frankenstein Created Woman",1967,92,NA,5.8,271,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Frankenstein General Hospital",1988,90,NA,3.3,28,14.5,24.5,14.5,14.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Frankenstein Island",1981,97,NA,1.6,113,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Frankenstein Meets the Spacemonster",1965,79,60000,2.5,72,34.5,24.5,14.5,4.5,0,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Frankenstein Meets the Wolf Man",1943,74,NA,6.4,550,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frankenstein Must Be Destroyed",1969,101,NA,6.3,307,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Frankenstein Punk",1986,12,NA,8.3,6,0,0,0,0,0,0,14.5,34.5,0,45.5,"",0,1,0,0,0,0,1 -"Frankenstein Unbound",1990,82,NA,4.9,608,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Frankenstein and Me",1996,91,NA,4.9,83,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,34.5,"PG",0,0,0,0,0,0,0 -"Frankenstein and the Monster from Hell",1974,93,NA,5.6,215,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Frankenstein's Daughter",1958,85,60000,3.8,102,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Frankenstein: A Cinematic Scrapbook",1991,60,NA,1.8,6,34.5,0,0,0,0,34.5,14.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Frankenthumb",2002,32,NA,6.5,124,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Frankenweenie",1984,29,NA,7.2,1244,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Frankie Starlight",1995,100,NA,6.6,323,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Frankie and Johnny",1966,87,4500000,4.9,212,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Frankie and Johnny",1991,118,NA,6.4,3946,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Frankie and Johnny Are Married",2004,95,NA,6,46,4.5,0,0,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"R",0,0,1,0,0,0,0 -"Frankly Caroline",2000,8,NA,7.3,9,0,0,0,0,24.5,44.5,0,34.5,0,0,"",0,1,0,0,0,0,1 -"Frankreich, wir kommen",1999,80,NA,6.9,18,0,0,0,0,14.5,0,34.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Franky Goes to Hollywood",1999,12,NA,4.1,81,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Frantic",1988,120,NA,6.6,7040,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frantz Fanon: Black Skin, White Mask",1996,70,NA,4.7,19,0,4.5,4.5,0,14.5,34.5,14.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Franz",1971,91,NA,6.1,12,0,0,0,4.5,4.5,4.5,14.5,44.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Franz Kafka's It's a Wonderful Life",1993,23,NA,7.7,175,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Franzmann",1979,47,NA,1.2,24,74.5,4.5,0,4.5,4.5,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Frasier, the Sensuous Lion",1973,97,NA,3.9,5,24.5,0,0,24.5,24.5,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Frat House",1979,73,NA,1.8,5,44.5,0,0,24.5,0,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Frat House",1998,60,NA,7.4,40,4.5,0,0,4.5,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Fratelli e sorelle",1991,92,NA,4.7,19,14.5,4.5,0,0,14.5,24.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Fratello dello spazio",1988,90,NA,1.1,8,64.5,14.5,14.5,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Fratello sole, sorella luna",1972,121,3000000,6.4,513,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Fraternity Demon",1992,86,NA,2.9,20,24.5,14.5,14.5,34.5,0,0,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Fraternity Row",1977,100,NA,6.1,68,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fraternity Vacation",1985,84,NA,4.2,325,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Frati rossi, I",1988,90,NA,5.3,18,4.5,14.5,24.5,4.5,14.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Fratii Jderi",1973,105,NA,9.2,16,24.5,0,0,0,0,0,24.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Frau Holle",1961,73,NA,6.4,7,14.5,0,14.5,0,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Frau Holle",1963,59,NA,5.4,8,0,0,0,14.5,0,14.5,24.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Frau Rettich, die Czerni und ich",1998,95,NA,6.5,83,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Frau Wirtin hat auch eine Nichte",1969,98,NA,3.4,14,24.5,0,34.5,0,0,14.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Frau Wirtin hat auch einen Grafen",1968,90,NA,3.5,22,14.5,14.5,14.5,14.5,14.5,0,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Frau Wirtin treibt es jetzt noch toller",1970,84,NA,3.3,10,34.5,0,24.5,14.5,14.5,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Frau am dunklen Fenster, Die",1960,97,NA,8.2,8,0,0,0,0,0,0,34.5,14.5,45.5,0,"",0,0,0,0,0,0,0 -"Frau die an Dr. Fabian zweifelte, Die",2002,89,NA,5.1,87,24.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Frau im Mond",1929,95,NA,7,131,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Frau namens Harry, Eine",1990,90,NA,1.9,44,45.5,14.5,14.5,4.5,4.5,4.5,0,0,4.5,4.5,"",0,0,1,0,0,1,0 -"Frau2 sucht HappyEnd",2001,96,NA,6.4,92,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Frauds",1993,90,NA,5.5,182,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Frauds and Frenzies",1918,21,NA,5.3,7,0,0,0,24.5,24.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Frauen im Liebeslager",1977,69,NA,5.4,27,0,4.5,24.5,0,14.5,34.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Frauen sind was Wunderbares",1994,87,NA,4.7,39,14.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Frauenhaus, Das",1977,75,NA,5.8,33,4.5,4.5,0,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frauenschicksale",1952,102,NA,7.8,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Fray Don Juan",1970,87,NA,8.2,5,0,0,0,0,24.5,0,0,44.5,0,44.5,"",0,0,1,0,0,0,0 -"Fray Escoba",1961,101,NA,1.3,6,14.5,14.5,0,0,0,0,0,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Frazetta: Painting with Fire",2003,93,NA,7.7,21,0,4.5,0,0,0,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Freak Orlando",1981,126,NA,9.1,12,0,0,14.5,4.5,0,0,14.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Freak Out",2004,92,NA,6.8,45,4.5,4.5,0,0,4.5,4.5,4.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Freak Talks About Sex",1999,90,NA,5.6,249,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Freak Weather",1998,87,NA,5.6,22,4.5,4.5,0,4.5,14.5,4.5,4.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Freak, The",2002,6,NA,7.1,35,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Freaked",1993,86,11000000,5.4,920,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Freaks",1932,64,310607,7.7,4134,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Freaks Uncensored!",1999,100,NA,9.8,12,24.5,0,0,0,0,0,0,4.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Freakstars 3000",2004,75,NA,7.4,21,0,0,0,4.5,0,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Freaky Friday",1976,95,NA,6.1,1424,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Freaky Friday",2003,97,26000000,6.9,8052,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Freccia azzurra, La",1996,93,NA,6.7,40,14.5,0,4.5,0,4.5,24.5,14.5,24.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Freccia d'oro, La",1962,91,NA,4.5,18,0,14.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Freckles",1960,85,NA,4.3,6,0,0,34.5,0,14.5,14.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Fred: The Movie",2000,90,NA,3.9,8,34.5,0,14.5,14.5,0,14.5,14.5,0,0,14.5,"",0,0,0,1,1,0,0 -"Freddie Rich and His Orchestra",1938,11,NA,7.2,14,0,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Freddie as F.R.O.7",1992,91,NA,3.5,47,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Freddy Got Fingered",2001,87,15000000,3.5,9115,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Freddy VS Ghostbusters",2004,34,NA,6.5,85,4.5,0,4.5,4.5,0,4.5,4.5,4.5,4.5,64.5,"",0,0,1,0,0,0,1 -"Freddy Vs. Jason",2003,97,25000000,6.1,11109,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Freddy the Freshman",1932,7,NA,4.8,20,14.5,14.5,14.5,14.5,44.5,4.5,4.5,0,14.5,0,"",0,1,1,0,0,0,1 -"Freddy unter fremden Sternen",1959,97,NA,4,9,0,14.5,14.5,0,45.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Freddy's Dead: The Final Nightmare",1991,93,5000000,4.3,3618,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Fredrikssons fabrikk - The movie",1994,84,NA,4.3,75,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Free",2001,96,NA,5.8,18,4.5,4.5,14.5,4.5,0,4.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Free Country the Movie",1996,74,NA,1.1,10,94.5,14.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Free Eats",1932,20,NA,7,30,0,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Free Enterprise",1998,116,NA,6.5,1119,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"R",0,0,1,0,0,1,0 -"Free Fall",1964,10,NA,7.7,7,14.5,0,0,0,14.5,0,44.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Free Fall",1999,92,NA,4.7,123,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Free Frenchman, The",1989,60,NA,9.2,6,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,0,0,0,0,0 -"Free Money",1998,91,30000000,4.7,619,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Free Radicals",1958,5,NA,8.1,18,0,0,0,0,4.5,14.5,14.5,24.5,4.5,44.5,"",0,1,0,0,0,0,1 -"Free Ride",1986,92,NA,4.3,21,34.5,14.5,4.5,14.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Free Ride, A",1915,10,NA,4.9,13,14.5,0,4.5,4.5,34.5,4.5,4.5,4.5,14.5,0,"",0,0,0,0,0,0,1 -"Free Soul, A",1931,91,NA,6.3,181,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Free Tibet",1998,90,NA,4.2,37,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Free Willy",1993,112,NA,5.2,3799,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Free Willy 2: The Adventure Home",1995,95,NA,4.3,1544,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Free Willy 3: The Rescue",1997,86,NA,4,641,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Free and Easy",1930,92,NA,5.4,94,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Free and Easy",1941,56,NA,5.9,20,0,0,4.5,24.5,24.5,24.5,4.5,0,24.5,4.5,"",0,0,1,0,0,1,0 -"Free for All",1949,83,NA,6.4,5,0,0,0,0,0,44.5,44.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Free to Love",1925,60,NA,7.5,7,0,0,0,0,14.5,14.5,0,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Free, White and 21",1963,104,40000,1.9,13,44.5,14.5,4.5,0,14.5,0,0,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Freebie and the Bean",1974,113,NA,5.8,318,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Freedom",1982,102,NA,5.8,13,0,0,0,4.5,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Freedom Comes High",1943,16,NA,6,7,14.5,0,0,14.5,14.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Freedom Downtime",2001,121,25000,8,236,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Freedom Radio",1941,95,NA,5.7,26,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Freedom Strike",1998,93,NA,3.3,106,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Freefall",1994,96,NA,4.6,149,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Freejack",1992,110,NA,4.9,2928,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Freelance",1971,81,NA,4.5,9,0,14.5,0,0,24.5,14.5,34.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Freeman",2004,15,NA,8.4,7,14.5,0,0,0,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,1 -"Freeriders",1998,86,NA,6.3,14,0,0,0,4.5,0,24.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Freestyle",1996,12,NA,7.2,5,0,0,0,0,0,0,84.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Freestyle: The Art of Rhyme",2000,60,NA,8.2,33,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Freeware",2000,7,NA,5,12,0,4.5,0,4.5,0,34.5,4.5,0,0,44.5,"",1,1,0,0,0,0,1 -"Freeway",1988,91,NA,4.6,66,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Freeway",1996,102,3000000,6.5,4961,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Freeway II: Confessions of a Trickbaby",1999,90,2000000,4.6,666,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Freewayphobia #1",1965,16,NA,7.9,27,0,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Freeze Frame",2004,99,2000000,5.8,189,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Freeze Me",2000,101,NA,6.2,319,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Frei parken",1998,7,2000,5.8,7,0,0,14.5,0,14.5,44.5,0,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Freighters of Destiny",1931,57,39000,5.9,16,0,0,0,4.5,44.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Freiheit",1966,3,NA,5.3,42,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Freispiel",1995,94,NA,7.1,115,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Fremde Freundin",2000,83,NA,6.5,8,0,0,0,0,24.5,24.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Fremde, Die",2000,102,NA,6.3,13,0,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Fremder Freund",2003,105,NA,6.7,60,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fremragende timer",2003,17,NA,6.1,22,0,4.5,0,14.5,0,24.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"French Blue",1974,90,NA,6.2,10,24.5,0,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"French Cancan",1955,93,NA,7.2,278,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"French Connection II",1975,119,NA,6.5,1971,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"French Connection, The",1971,104,1800000,7.8,11783,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"French Doors, The",2002,13,NA,6.5,32,4.5,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"French Dressing",1964,86,NA,6.3,25,0,0,0,4.5,4.5,14.5,14.5,14.5,0,45.5,"",0,0,1,1,0,0,0 -"French Exit",1995,92,NA,4.6,50,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"R",0,0,1,0,0,1,0 -"French Kiss",1995,111,NA,6.2,7653,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"French Lieutenant's Woman, The",1981,127,NA,6.8,1787,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"French Line, The",1954,102,NA,5,63,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"French Lovers",1985,8,NA,5.8,8,0,0,0,34.5,0,34.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"French Mistress, A",1960,94,NA,6,10,14.5,0,0,0,0,44.5,24.5,0,0,34.5,"",0,0,1,0,0,0,0 -"French Postcards",1979,95,NA,5.5,154,24.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"French Quarter",1977,95,NA,4.2,17,0,14.5,24.5,24.5,14.5,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"French Quarter Undercover",1985,84,2500000,4,5,24.5,0,44.5,24.5,0,0,0,0,0,24.5,"",1,0,0,0,0,0,0 -"French Rarebit",1951,7,NA,6.9,59,0,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"French Without Tears",1940,67,NA,7.9,7,0,0,0,14.5,0,0,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Frenchie",1950,81,NA,5.4,14,0,0,0,14.5,14.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Frenchman's Creek",1944,110,NA,6.2,90,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Frenchman's Farm",1987,86,NA,5.3,28,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Frenesia dell'estate",1963,100,NA,7.5,6,0,0,0,0,14.5,14.5,0,34.5,34.5,0,"",0,0,1,0,0,0,0 -"Frenzy",1972,116,3500000,7.3,3698,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Frequency",2000,118,31000000,7.4,15317,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Fresa y chocolate",1994,108,NA,7.3,1022,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Fresh",1994,114,NA,7.4,2057,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Fresh Air",1999,92,NA,5.2,32,14.5,4.5,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fresh Airedale",1945,7,NA,6.6,17,4.5,0,0,4.5,4.5,24.5,14.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Fresh Cut Grass",2004,101,NA,5.1,18,0,0,4.5,4.5,4.5,14.5,0,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Fresh Fish",1939,7,NA,6.8,23,0,0,0,0,14.5,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Fresh Hare",1942,7,NA,7.2,75,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Fresh Horses",1988,105,NA,4.6,359,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Fresh Kill",1994,80,NA,3,23,14.5,4.5,14.5,4.5,0,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Freshman, The",1925,76,NA,8,321,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Freshman, The",1990,102,NA,6.5,3783,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Freshmen",1999,121,NA,6.8,8,0,14.5,0,0,0,14.5,14.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Freud",1962,139,4000000,6.4,195,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Freud and Darwin Sitting in a Tree",2000,27,17000,8.3,15,14.5,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,1,0,0,0,1 -"Freudlose Gasse, Die",1925,109,NA,7.1,141,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Freudy Cat",1964,6,NA,5.9,19,4.5,0,14.5,14.5,14.5,24.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Freunde",2000,100,NA,6.1,64,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Freunde",2001,21,NA,7,25,0,0,4.5,0,14.5,0,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Freunde meiner Frau, Die",1949,85,NA,8.9,6,0,0,0,0,0,0,0,14.5,64.5,14.5,"",0,0,1,0,0,0,0 -"Fric-Frac",1939,105,NA,7.2,40,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Frida",2002,123,12000000,7.5,8614,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Frida Kahlo",1971,13,NA,6,5,0,0,0,24.5,0,44.5,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Frida Kahlo: A Ribbon Around a Bomb",1992,60,NA,8,9,0,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Frida, naturaleza viva",1986,108,NA,6.8,87,4.5,4.5,0,0,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Friday",1995,91,3500000,6.7,7020,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Friday",2000,19,NA,7.3,28,4.5,0,0,0,0,14.5,24.5,34.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Friday After Next",2002,85,20000000,4.9,1659,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Friday Foster",1975,90,NA,5.5,144,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Friday Night Date, A",2000,96,NA,2.3,283,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Friday Night In",2003,20,NA,7,5,0,24.5,0,0,24.5,0,44.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Friday Night Lights",2004,117,30000000,7,4290,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Friday the 13th",1953,7,NA,6.6,5,24.5,0,0,0,24.5,0,24.5,0,0,44.5,"",0,1,0,0,0,0,1 -"Friday the 13th",1980,95,700000,5.8,7475,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Friday the 13th Part 2",1981,87,1000000,4.9,3794,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Friday the 13th Part 3: 3D",1982,91,4000000,4.3,3239,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Friday the 13th Part VI: Jason Lives",1986,87,NA,4.7,2902,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Friday the 13th Part VII: The New Blood",1988,90,3500000,4.1,2625,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Friday the 13th Part VIII: Jason Takes Manhattan",1989,100,5000000,3.6,3248,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Friday the 13th: A New Beginning",1985,92,NA,3.5,2984,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Friday the 13th: The Final Chapter",1984,90,1800000,4.6,2975,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Friday the Thirteenth",1933,89,NA,6.1,36,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,14.5,0,"",0,0,1,1,0,0,0 -"Fridolf sticker opp!",1958,88,NA,4.6,13,0,4.5,34.5,0,14.5,24.5,0,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Fried Green Tomatoes",1991,130,NA,7.4,10777,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Frieda",1947,98,NA,7.3,16,0,4.5,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Friedemann Bach",1941,102,NA,3.4,11,24.5,0,0,0,4.5,0,0,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Friedrich Schiller - Der Triumph eines Genies",1940,102,NA,7.2,12,4.5,0,0,4.5,0,4.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Friend of Dorothy, A",1994,33,NA,7,99,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,1,0,0,1 -"Friend of the Family",1995,103,NA,4.8,170,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Friend of the Family II",1996,83,NA,4.3,54,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Friend or Phony",1952,7,NA,4.4,5,0,0,0,44.5,0,24.5,0,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Friendland",2003,12,NA,6.8,8,24.5,0,0,0,0,14.5,0,24.5,0,34.5,"",0,0,1,0,0,0,1 -"Friendly Enemies",1942,95,NA,5.4,8,14.5,0,0,14.5,24.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Friendly Persuasion",1956,137,3000000,7.5,1020,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Friendly Persuasion: Iranian Cinema After the 1979 Revolution",2000,113,NA,8,15,14.5,0,0,0,0,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Friends",1912,17,NA,5,13,0,0,4.5,34.5,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,1,1 -"Friends",1988,87,NA,4.6,16,4.5,14.5,4.5,0,24.5,4.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Friends",1993,105,NA,4.5,43,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Friends & Lovers",1999,103,NA,3.9,397,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Friends Forever",2002,80,NA,6.5,26,0,0,0,0,14.5,14.5,14.5,4.5,14.5,34.5,"",0,0,1,0,1,0,0 -"Friends Like These",2005,5,0,9,8,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Friends and Enemies",1992,103,NA,6.5,11,0,4.5,0,0,24.5,14.5,24.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Friends and Family",2001,87,NA,7,371,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Friends and Lovers",1931,68,NA,5.1,42,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Friends in High Places",2001,83,NA,6.9,19,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Friends of Eddie Coyle, The",1973,102,NA,6.8,336,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Friends of Mr. Sweeney",1934,68,NA,4.9,24,4.5,4.5,4.5,4.5,24.5,4.5,24.5,14.5,0,0,"",0,0,1,1,0,0,0 -"Friends, Lovers, & Lunatics",1989,93,NA,2.9,28,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Friendship's Death",1987,78,NA,7.5,20,0,0,0,0,0,14.5,14.5,34.5,34.5,4.5,"",0,0,0,0,0,0,0 -"Fright",1956,68,NA,4,6,14.5,0,0,45.5,14.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Fright",1971,87,NA,5,81,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fright Night",1947,18,NA,7.2,71,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Fright Night",1985,106,9000000,6.5,3601,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fright Night Part II",1989,108,NA,5,922,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fright Show",1985,58,NA,6.4,8,14.5,0,0,24.5,14.5,0,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Fright to the Finish",1954,6,NA,5.5,25,4.5,0,0,4.5,14.5,34.5,24.5,0,0,4.5,"",0,1,1,0,0,0,1 -"Frightened City, The",1961,97,NA,6.5,57,4.5,0,0,0,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Frightened Man, The",1952,69,NA,6,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Frightening, The",2002,85,NA,3.4,112,24.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Frightmare",1974,88,NA,5.4,117,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Frightmare",1982,95,NA,2.9,68,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frigid Hare",1949,7,NA,7,89,0,4.5,4.5,4.5,4.5,4.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Frigjorte, De",1993,97,NA,7,86,4.5,0,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Frigo, Le",2001,1,NA,7,7,0,14.5,0,14.5,0,0,14.5,45.5,0,0,"",0,1,0,0,0,0,1 -"Frihed, lighed og Louise",1944,94,NA,6.2,6,0,14.5,0,14.5,14.5,0,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Fringe Dwellers, The",1986,98,NA,6.2,86,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Frisco Jenny",1932,71,286000,6.6,36,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Frisco Kid",1935,80,NA,5.9,42,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frisco Kid, The",1979,122,NA,6,1364,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Frisk",1995,88,NA,6.2,163,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Frisky Summer 2",1996,90,NA,8.3,31,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Frisky Summer 3",1998,82,NA,9,12,0,0,0,0,0,0,4.5,14.5,34.5,44.5,"",0,0,0,0,0,0,0 -"Frisson des vampires, Le",1970,90,NA,5.5,124,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fritz Lang Interviewed by William Friedkin",1974,140,NA,7.4,12,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Fritz the Cat",1972,80,1000000,5.8,1109,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,1,1,1,0,0,0 -"Frk. Vildkat",1942,98,NA,5.8,8,0,0,0,14.5,14.5,14.5,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Frodo Is Great... Who Is That?!!",2004,60,NA,9.4,7,0,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Frog Crossing",1996,12,NA,2.8,19,14.5,4.5,4.5,0,4.5,0,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Frog Dreaming",1986,93,NA,5.8,169,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Frog Prince, The",1988,86,NA,6,65,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Frog, the Dog, and the Devil, The",1986,8,NA,8.9,6,0,0,0,0,14.5,0,0,34.5,0,45.5,"",0,1,0,0,0,0,1 -"Frog-g-g!",2004,80,NA,4,42,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"FrogZ",2001,90,NA,4.8,11,4.5,4.5,0,14.5,0,0,0,0,4.5,45.5,"",0,0,0,0,0,0,0 -"Frogmen Operation Stormbringer",2002,90,NA,3.1,60,24.5,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Frogmen, The",1951,96,NA,6.8,91,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Frogs",1972,91,NA,4,720,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Frogs for Snakes",1998,108,NA,3.8,121,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Frogs!",1991,116,NA,4.4,13,0,0,14.5,34.5,44.5,0,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Frogtown II",1993,90,NA,2.5,43,34.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Frolicking Fish",1930,6,NA,5.6,5,0,0,24.5,0,0,24.5,24.5,0,24.5,24.5,"",0,1,1,0,0,0,1 -"From A to Z-Z-Z-Z",1953,7,NA,7.8,42,0,4.5,4.5,0,0,4.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"From Beyond",1986,85,4500000,6,887,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"From Beyond the Grave",1973,97,NA,6,163,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"From Darkness",2002,9,NA,6.5,6,0,0,0,0,34.5,0,0,14.5,45.5,0,"",0,1,0,0,0,0,1 -"From Dusk Till Dawn",1996,108,20000000,6.8,28473,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,1,0,0,0,0 -"From Hand to Mouse",1944,7,NA,6.5,8,0,0,0,14.5,14.5,14.5,34.5,24.5,0,0,"",0,1,1,0,0,0,1 -"From Hand to Mouth",1919,24,NA,7.1,36,0,0,4.5,0,0,24.5,24.5,24.5,4.5,14.5,"",1,0,1,0,0,0,1 -"From Hare to Eternity",1996,7,NA,6.4,23,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"From Hare to Heir",1960,7,NA,7.1,40,0,0,0,0,4.5,24.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"From Hell",2001,122,35000000,6.8,17292,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"From Hell It Came",1957,73,NA,3.4,126,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"From Hell to Heaven",1933,67,NA,6.5,6,0,0,14.5,0,0,0,34.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"From Hell to Hell",2000,90,NA,6.4,18,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"From Hell to Texas",1958,100,NA,6.5,60,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"From Here to Eternity",1953,118,1650000,7.9,5995,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,1,0 -"From Hollywood to Deadwood",1989,102,NA,4.4,17,24.5,0,4.5,14.5,4.5,14.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"From Hollywood to Hanoi",1993,78,NA,6.6,9,14.5,14.5,0,0,0,24.5,0,34.5,0,24.5,"",0,0,0,0,1,0,0 -"From Justin to Kelly",2003,90,12000000,1.7,6517,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"From Mao to Mozart: Isaac Stern in China",1980,84,NA,7.3,69,0,4.5,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"From Morning On I Waited Yesterday",1998,13,NA,6.9,6,0,0,0,14.5,14.5,0,34.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"From Noon Till Three",1976,99,NA,6.2,228,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"From Nurse to Worse",1940,17,NA,8.1,48,0,0,0,0,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"From Rome to Rollerball: The Full Circle",1975,8,NA,6.5,10,0,0,0,0,44.5,34.5,24.5,0,0,14.5,"",0,0,0,0,0,0,1 -"From Russia to Hollywood: The 100-Year Odyssey of Chekhov and Shdanoff",1999,100,NA,6.1,11,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"From Russia with Love",1963,115,2000000,7.3,10291,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"From Sam",2004,1,NA,9.4,14,4.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,1,0,0,1 -"From Soup to Nuts",1928,18,NA,7.4,70,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"From Swastika to Jim Crow",2000,60,NA,7.9,14,0,0,0,0,14.5,0,24.5,0,4.5,45.5,"",0,0,0,0,1,0,0 -"From This Day Forward",1946,96,NA,6.5,43,0,4.5,0,4.5,14.5,14.5,34.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"From Time to Time",1992,18,NA,6.4,48,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"From a Far Country",1981,140,NA,6.6,38,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"From the 104th Floor",2003,3,NA,7,8,0,0,0,0,0,0,64.5,0,14.5,24.5,"",0,1,0,0,0,0,1 -"From the Big Bang to Tuesday Morning",2000,6,NA,6.3,18,0,0,4.5,0,14.5,0,24.5,34.5,4.5,14.5,"",0,1,0,0,0,0,1 -"From the Drain",1967,14,0,5.1,28,14.5,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"From the Earth to the Moon",1958,101,NA,5.4,164,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"From the Four Corners",1941,15,NA,7.1,17,0,0,0,0,0,14.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,1 -"From the Hip",1987,95,NA,5.7,439,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"From the Journals of Jean Seberg",1995,100,NA,7.1,60,4.5,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"From the Manger to the Cross",1912,71,NA,6.2,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"From the Mixed-Up Files of Mrs. Basil E. Frankweiler",1973,105,NA,5.7,83,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"From the Terrace",1960,149,NA,6,322,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Front Page Story",1954,99,NA,6.1,10,0,0,0,0,14.5,34.5,45.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Front Page Woman",1935,82,NA,6.7,164,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Front Page, The",1931,101,NA,7.1,253,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Front Page, The",1974,105,4000000,7,1296,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Front Room",1996,2,NA,2.7,14,64.5,4.5,0,4.5,4.5,4.5,0,4.5,0,0,"",0,0,0,0,0,0,1 -"Front, The",1976,95,NA,7.3,1306,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Frontera",1978,95,NA,6.2,5,0,24.5,0,0,24.5,24.5,24.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Frontera Sur",1993,90,NA,7,7,0,0,0,0,0,14.5,45.5,24.5,0,0,"",1,0,0,0,0,0,0 -"Frontera Sur",1998,95,NA,7.2,33,4.5,0,4.5,4.5,4.5,4.5,34.5,44.5,4.5,0,"",0,0,0,1,0,0,0 -"Frontera, La",1991,120,NA,7,96,4.5,0,4.5,0,4.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Fronterz",2004,95,NA,9.1,13,0,0,0,0,0,4.5,0,24.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Frontier Days",1945,17,NA,4.9,8,14.5,0,14.5,24.5,34.5,14.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Frontier Flirtation; or, How the Tenderfoot Won Out, A",1903,1,NA,4.7,13,0,0,34.5,0,4.5,34.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"Frontier Fugitives",1945,57,NA,5.8,5,24.5,0,0,0,44.5,0,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Frontier Gal",1945,92,NA,4.1,21,4.5,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Frontier Marshal",1939,71,NA,6.7,26,0,4.5,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frontier Outlaws",1944,58,NA,4.2,8,0,0,34.5,24.5,24.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Frontier Rangers",1959,83,NA,5,9,14.5,0,14.5,24.5,14.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Frontier Scout",1938,61,NA,5.9,6,0,0,0,34.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Frontier Uprising",1961,68,NA,4.5,5,0,0,0,44.5,44.5,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Frontiersmen, The",1938,74,NA,6.8,23,0,0,0,0,14.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Frontline, The",1993,70,NA,6,10,14.5,0,0,14.5,0,24.5,0,14.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Frosch mit der Maske, Der",1959,89,NA,6.4,92,0,0,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frosh: Nine Months in a Freshman Dorm",1994,98,NA,2.6,7,14.5,0,0,24.5,0,0,14.5,0,0,44.5,"",0,0,0,0,1,0,0 -"Frosset hjerte",1999,80,NA,6,18,0,0,4.5,14.5,0,0,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Frost",1997,270,NA,3.4,18,14.5,4.5,0,4.5,0,4.5,4.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Frost: Portrait of a Vampire",2001,92,NA,2.5,118,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Frostbite",2005,83,2400000,2.8,201,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Frou-Frou",1955,112,NA,5.4,10,0,0,0,24.5,34.5,34.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Frozen",2004,90,NA,6.6,20,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Frozen Assets",1992,98,NA,3.2,143,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Frozen Dead, The",1966,95,NA,4.2,67,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Frozen Ghost, The",1945,61,NA,4.9,37,4.5,0,14.5,4.5,34.5,24.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Frozen Limits, The",1939,84,NA,4.6,8,0,0,0,34.5,0,14.5,14.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Frozen North, The",1922,15,NA,6.7,134,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Frozen Scream",1975,85,NA,3.4,22,24.5,14.5,24.5,14.5,4.5,4.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Frozen with Fear",2000,96,NA,4.3,58,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fruit Machine, The",1988,103,NA,6.6,111,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fruitcake",2003,20,NA,8.7,6,0,0,0,0,0,34.5,0,0,0,64.5,"",0,0,1,0,0,0,1 -"Fruits de la passion, Les",1981,83,NA,5.9,74,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Frullo del passero, Il",1988,95,NA,4.5,12,4.5,0,4.5,0,34.5,4.5,14.5,14.5,4.5,0,"",0,0,0,0,0,1,0 -"Frunk",2003,30,NA,7.1,12,0,0,0,0,4.5,44.5,0,34.5,14.5,0,"",0,0,0,1,0,0,1 -"Frusna leoparden, Den",1986,97,NA,4,19,24.5,14.5,0,0,0,14.5,4.5,0,4.5,44.5,"",0,0,0,1,0,0,0 -"Frusta e il corpo, La",1963,87,66500,6.7,213,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ftina tsigara",2000,85,NA,6.4,40,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Fu gui bing tuan",1989,89,NA,5.4,15,0,4.5,0,0,34.5,34.5,24.5,0,0,4.5,"",1,0,1,0,0,0,0 -"Fu qin ba ba",2001,90,NA,6.4,7,0,0,0,0,0,14.5,44.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Fu rong zhen",1984,164,NA,7.6,64,0,0,0,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Fubar",2002,76,NA,7.1,617,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Fuchs von Paris, Der",1957,98,NA,7.6,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Fuck Hamlet",1996,83,NA,6.2,16,45.5,0,4.5,0,0,14.5,0,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Fuck It",2000,5,NA,3.9,13,44.5,4.5,0,0,0,0,0,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Fuck Norge",2004,82,NA,3.7,56,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Fuck You, Fuck You Very Much",1998,51,NA,6.8,16,34.5,0,0,0,0,0,4.5,4.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Fuck Your Dreams, This Is Heaven",1986,37,NA,5.6,7,14.5,24.5,0,0,0,0,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Fuck: The Movie",2003,6,NA,7.9,27,24.5,0,0,0,0,0,0,4.5,4.5,74.5,"",0,0,1,0,0,0,1 -"Fuckland",2000,84,NA,5,127,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fudgie & Jane",2003,26,NA,7.9,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,1,0,0,0,1 -"Fuego",1964,99,NA,5.5,27,4.5,0,0,14.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fuego",1969,81,NA,6.1,35,4.5,0,4.5,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fuel",2002,4,NA,5.5,8,0,0,14.5,0,24.5,24.5,24.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Fuel",2003,17,NA,4,13,14.5,0,0,0,0,0,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Fuelin' Around",1949,16,NA,8.5,32,0,0,0,0,0,4.5,4.5,24.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Fueling the Fire",2002,22,NA,7.7,17,0,4.5,0,0,4.5,0,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Fuente amarilla, La",1999,93,NA,6.3,76,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Fuera del cuerpo",2004,104,NA,6.8,27,4.5,0,0,4.5,4.5,24.5,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Fuete",1986,100,NA,7.7,5,0,0,0,24.5,0,24.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Fuga dal Bronx",1983,85,NA,3,173,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Fuga dall'archipelago maledetto",1982,96,NA,5.4,21,0,0,14.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Fuga de Segovia, La",1981,110,NA,6.7,23,4.5,4.5,0,0,4.5,0,34.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Fuga de cerebros",1998,95,NA,7.3,40,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fuga di mezzanotte",1995,90,NA,3.9,6,0,0,14.5,14.5,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Fuga, La",2001,117,NA,6.8,135,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fuggiasco, Il",2003,97,NA,6.8,28,4.5,0,0,0,14.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fughe da fermo",2001,92,NA,5,8,0,0,34.5,0,24.5,14.5,0,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Fugitifs, Les",1986,95,NA,6.8,414,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Fugitivas",2000,98,NA,7,63,4.5,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fugitive From Justice, A",1940,53,NA,4.9,27,0,0,4.5,34.5,24.5,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Fugitive Kind, The",1959,119,NA,6.7,339,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fugitive Love",1991,15,NA,7.2,12,4.5,0,4.5,0,0,0,4.5,24.5,45.5,0,"",0,0,1,1,0,0,1 -"Fugitive Lovers",1934,82,NA,6.7,24,0,0,0,0,14.5,24.5,34.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Fugitive in the Sky",1936,58,NA,6.2,22,0,0,0,24.5,0,34.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Fugitive, The",1910,17,NA,4.5,19,4.5,14.5,14.5,4.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,1 -"Fugitive, The",1947,104,NA,6.6,264,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Fugitive, The",1993,130,44000000,7.7,48292,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Fugitives for a Night",1938,63,NA,6,10,0,0,24.5,0,24.5,44.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Fugue",1998,7,NA,8.3,9,0,0,0,0,0,0,24.5,34.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Fugueuses",1995,95,NA,7,14,0,0,0,0,14.5,24.5,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fuji",1974,8,NA,6.4,5,0,0,0,0,0,84.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Fujiwara Yoshie no furusato",1930,86,NA,5.2,12,4.5,0,0,14.5,4.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Fuk sing go jiu",1985,96,NA,6.1,344,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Fukai kawa",1995,130,NA,7.5,12,4.5,0,0,0,0,14.5,34.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Fukkatsu no hi",1980,108,16000000,5.7,140,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fuks",1999,86,NA,5.1,69,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Fukssvansen",2001,90,NA,6.1,208,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fukuro",2003,119,NA,6.5,6,0,0,0,0,0,34.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Fukuro no shiro",1999,138,NA,5.7,71,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fulaninha",1986,90,NA,6.1,9,0,0,0,24.5,24.5,0,24.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Fulfilled",1999,16,NA,4.7,17,0,4.5,14.5,14.5,14.5,24.5,0,24.5,4.5,0,"",0,0,0,0,0,0,1 -"Fulfillment",1974,70,NA,6.5,10,0,0,0,0,0,24.5,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Full",2001,16,NA,8,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,1 -"Full Blast",1997,91,NA,5.9,19,14.5,4.5,0,4.5,14.5,14.5,14.5,0,0,34.5,"",1,0,0,0,0,0,0 -"Full Blast",1999,95,NA,5.4,64,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Full Circle",1977,98,NA,5.8,117,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Full Clip",2004,95,500000,4.1,72,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Full Confession",1939,73,NA,5.6,20,0,0,0,14.5,24.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Full Fathom Five",1990,82,NA,2.6,36,44.5,14.5,4.5,4.5,0,4.5,0,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Full Feedback",1998,19,NA,7.4,14,0,14.5,0,4.5,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Full Frontal",2001,90,NA,7.8,10,24.5,0,0,14.5,0,0,0,34.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Full Frontal",2002,101,2000000,5,3056,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Full Impact",1997,72,NA,2,35,64.5,4.5,4.5,14.5,0,4.5,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Full Metal Jacket",1987,116,30000000,8.2,47757,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Full Monty, The",1997,91,3500000,7.2,22115,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Full Moon High",1981,93,NA,4.8,119,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Full Moon in Blue Water",1988,95,NA,5.1,183,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Full Tilt Boogie",1997,97,NA,5.8,577,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,1,0,0 -"Full Treatment, The",1961,93,NA,5,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Full of Life",1957,91,NA,6.1,54,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Fuller Brush Girl, The",1950,85,NA,6.5,71,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fuller Brush Man, The",1948,93,NA,6.7,87,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Fumata blanca",2002,113,NA,5,14,0,4.5,0,4.5,34.5,24.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Fun",1994,105,NA,7.3,433,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Fun Bar Karaoke",1997,103,NA,6.7,44,24.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Fun Down There",1988,89,NA,5.5,33,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Fun and Fancy Free",1947,73,NA,6.8,337,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Fun in Acapulco",1963,97,NA,5.1,347,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Fun in a Bakery Shop",1902,1,NA,5.3,39,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,0,"",0,0,1,0,0,0,1 -"Fun with Dick and Jane",1977,95,3000000,6.2,512,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fune wo oritara kanojo no shima",2003,112,NA,8,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Funeral Home",1980,93,NA,4.2,47,4.5,14.5,4.5,14.5,14.5,14.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Funeral de los dedos, El",2000,7,NA,9.2,12,4.5,0,0,0,0,0,0,0,4.5,84.5,"",0,0,0,1,0,0,1 -"Funeral for Mr. Smithee, A",2002,3,NA,7.8,8,0,0,0,0,14.5,14.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Funeral in Berlin",1966,102,NA,6.5,500,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Funeral, The",1996,99,NA,6.1,1586,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Funes, un gran amor",1993,110,NA,3.8,17,14.5,14.5,4.5,4.5,0,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fung gip",1979,85,NA,8,12,4.5,0,0,0,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Funhouse, The",1981,90,NA,5.2,719,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Funkytown",1998,82,NA,8.2,5,0,0,0,0,24.5,0,24.5,0,24.5,44.5,"",0,0,0,0,1,0,0 -"Funland",1988,98,NA,3.4,51,14.5,24.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Funniest Man in the World, The",1967,95,NA,6.9,10,0,0,0,0,24.5,0,14.5,44.5,14.5,24.5,"",0,0,1,0,1,0,0 -"Funny",1989,81,NA,6.1,8,14.5,0,14.5,14.5,0,0,14.5,14.5,0,34.5,"",0,0,1,0,1,0,0 -"Funny About Love",1990,101,NA,4.4,238,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Funny Bones",1995,128,NA,6.7,1171,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Funny Car Summer",1974,88,NA,4.7,15,14.5,14.5,4.5,0,4.5,0,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Funny Face",1957,103,3000000,7.1,1673,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Funny Farm",1988,101,NA,5.4,2942,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Funny Farm, The",1983,94,NA,4.4,21,14.5,4.5,4.5,14.5,14.5,4.5,0,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Funny Games",1997,108,NA,7.2,2827,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Funny Girl",1968,155,14100000,7,1782,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Funny Ha Ha",2003,85,NA,6.2,95,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Funny Lady",1975,136,NA,5.7,541,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Funny Little Bunnies",1934,7,NA,6.9,51,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Funny Man",1994,90,NA,3.9,125,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Funny Money",1982,97,NA,5.3,10,14.5,0,0,0,14.5,44.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Funny People II",1983,89,NA,3.9,27,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Funny Thing Happened on the Way to the Forum, A",1966,99,NA,6.8,1620,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Funny Things Happen Down Under",1965,61,NA,7.4,21,4.5,0,0,4.5,4.5,0,0,14.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Funnyman",1967,102,NA,5.8,6,0,0,14.5,14.5,0,0,14.5,34.5,0,14.5,"",0,0,1,1,0,0,0 -"Fuochi d'artificio",1997,100,NA,5,163,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Fuoco (la favilla - la vampa - la cenere), Il",1916,45,NA,8.4,9,0,0,0,0,0,0,24.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Fuon",2004,106,NA,5.5,6,0,0,14.5,0,45.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Fuori dal mondo",1999,100,NA,7.5,279,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Fuori uno sotto un altro arriva il passatore",1973,93,NA,4.7,5,0,0,24.5,24.5,0,0,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Furchtlosen Vier, Die",1997,89,NA,3.4,29,14.5,4.5,14.5,0,4.5,14.5,0,14.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Furet, Le",2003,88,NA,4.7,30,4.5,14.5,14.5,14.5,24.5,14.5,24.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Fureur",2003,107,NA,5.3,62,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Furia",1999,90,NA,5.2,50,14.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Furia del Hombre Lobo, La",1972,90,NA,2.5,45,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Furia di Ercole, La",1962,97,NA,3.4,10,0,14.5,24.5,34.5,0,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Furia, La",1997,105,NA,4.3,30,14.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Furies, The",1950,109,NA,7.3,103,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Furin kazan",1969,165,NA,6.7,35,4.5,0,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",1,0,0,1,0,0,0 -"Further Adventures of Tennessee Buck, The",1988,90,NA,3.8,134,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Further Adventures of the Wilderness Family, The",1978,105,NA,5.6,65,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Further Gesture, A",1997,96,NA,4.8,128,14.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Further Perils of Laurel and Hardy, The",1968,99,NA,7.4,15,0,0,0,0,4.5,14.5,24.5,34.5,0,24.5,"",0,0,1,0,1,0,0 -"Further Prophecies of Nostradamus",1942,11,NA,5.8,8,24.5,0,0,0,24.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Further Up the Creek",1958,91,NA,6,9,0,0,0,24.5,0,14.5,45.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Furtivos",1975,99,NA,7.9,69,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Furto del tesoro, Il",2000,180,NA,4,6,0,0,0,34.5,0,0,0,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Fury",1936,90,NA,7.6,1110,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Fury at Furnace Creek",1948,88,NA,6.1,20,0,0,0,14.5,14.5,14.5,44.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Fury at Gunsight Pass",1956,68,NA,6.1,20,0,0,0,0,24.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Fury at Showdown",1957,75,NA,6.8,5,0,0,0,0,64.5,0,0,0,44.5,0,"",0,0,0,0,0,0,0 -"Fury in the Pacific",1945,20,NA,7.3,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,1,0,1 -"Fury in the Shaolin Temple",1979,83,NA,6.1,14,14.5,0,0,0,0,44.5,24.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Fury of the Congo",1951,69,NA,6.4,19,4.5,0,4.5,0,4.5,4.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Fury of the Dragon",1976,89,NA,5.9,56,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Fury, The",1978,118,5500000,6,1524,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Fuses",1967,22,NA,7.5,20,4.5,0,0,0,0,14.5,14.5,44.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Fusiladitos, Los",2004,57,NA,8.6,45,4.5,0,0,0,0,0,4.5,4.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Futari",1991,120,NA,7.6,15,4.5,4.5,0,0,0,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Futei no kisetsu",2000,88,NA,6,23,0,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Futsu saizu no kaijin",1986,18,NA,5.1,9,14.5,0,0,0,24.5,24.5,0,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Futter",1996,5,NA,8.3,14,0,0,0,14.5,0,0,4.5,0,44.5,34.5,"",0,1,0,0,0,0,1 -"Futtock's End",1970,49,NA,4.4,15,4.5,0,0,4.5,0,14.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Future Fear",1997,77,NA,2.3,58,45.5,4.5,4.5,14.5,4.5,4.5,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Future Hunters",1986,96,NA,3.1,40,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Future Is Now, The",1955,15,NA,5.4,7,0,0,0,14.5,14.5,45.5,0,0,0,14.5,"",0,0,0,0,1,0,1 -"Future Kick",1991,76,NA,2.6,53,34.5,24.5,4.5,14.5,4.5,4.5,0,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Future Lasts a Long Time, The",1996,14,NA,5.4,23,4.5,0,0,4.5,0,14.5,0,4.5,0,64.5,"",0,0,0,0,0,0,1 -"Future Murder",2000,92,NA,6.4,51,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",1,0,0,1,0,0,0 -"Future Tense",1983,31,NA,5.6,8,34.5,0,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Future War",1997,90,NA,1.6,1622,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Future of Food, The",2004,88,750000,9.4,13,0,0,0,0,4.5,0,0,34.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Future-Kill",1985,89,NA,2.9,79,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Futureworld",1976,104,NA,5.7,756,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Futz!",1969,92,NA,2.8,15,44.5,4.5,4.5,0,24.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Fuyajo",1998,122,NA,7.3,109,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Fuzis, Os",1964,80,NA,8.2,55,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Fuzz",1972,92,NA,5.3,189,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Fuzzy Logic",1998,18,NA,6.4,11,0,24.5,0,0,0,0,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Fuzzy Pink Nightgown, The",1957,87,NA,5.5,31,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Fuzzy Settles Down",1944,60,NA,5.5,6,0,0,0,14.5,34.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Fylakes anilikon",1982,100,NA,5.7,23,14.5,0,4.5,0,0,4.5,14.5,4.5,0,45.5,"",1,0,0,1,0,0,0 -"Fylakes anilikon 2: Ekdikisi sti via",1984,78,NA,8.1,9,14.5,0,14.5,0,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,0 -"Fyra kvinnor",2001,94,NA,5.6,25,14.5,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Fyra nyanser av brunt",2004,192,NA,7.6,567,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Fyre",1978,87,NA,3.6,21,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"G",1983,109,NA,5.2,147,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"G",2002,96,NA,7.9,15,4.5,0,4.5,4.5,0,4.5,4.5,24.5,0,44.5,"R",0,0,0,1,0,1,0 -"G'ole!",1982,101,NA,6,21,0,0,0,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"G-Men Never Forget",1948,167,NA,7,15,0,4.5,4.5,0,14.5,24.5,44.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"G-Men from Hell",2000,98,NA,4.7,93,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG-13",1,0,1,0,0,0,0 -"G-Sale",2003,87,NA,5.6,34,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,1,0,0,0,0 -"G-men vs. the Black Dragon",1943,243,NA,5.6,18,0,0,4.5,0,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"G.A.D.A.R.",2003,9,NA,7,5,24.5,0,0,0,0,0,64.5,24.5,0,0,"",0,0,1,0,0,0,1 -"G.I. Blues",1960,104,NA,5.4,426,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG",0,0,1,0,0,1,0 -"G.I. Dood It",1955,17,NA,6.3,5,0,0,0,0,0,84.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"G.I. Executioner",1975,86,NA,1.1,18,45.5,0,4.5,0,4.5,14.5,0,0,4.5,24.5,"",1,0,0,0,0,0,0 -"G.I. Honeymoon",1945,70,NA,6,5,0,0,0,24.5,24.5,0,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"G.I. Jane",1951,62,NA,3.7,15,14.5,4.5,14.5,4.5,0,0,4.5,0,4.5,44.5,"",0,0,0,0,0,0,0 -"G.I. Jane",1997,124,50000000,5.5,9116,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"G.I. Pink",1968,6,NA,6.1,9,0,0,0,0,24.5,34.5,24.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"G.I. Wanna Home",1946,15,NA,7.1,42,0,0,0,4.5,4.5,24.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"G.O.D.",2001,91,NA,4.2,38,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"G.O.R.A.",2004,127,5000000,7.2,1561,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"G.P.U.",1942,99,NA,8.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",1,0,0,0,0,0,0 -"G:MT Greenwich Mean Time",1999,117,NA,6.2,162,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"GTO",1999,108,NA,6,94,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"GUF Ha-Neschamot - Die Halle der Seelen",2003,37,NA,7.4,12,0,0,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Ga li la jiao",1990,101,NA,6.5,77,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",1,0,1,0,0,1,0 -"Gaatjes",2002,19,NA,8.5,6,0,0,0,0,14.5,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Gaav",1969,100,NA,7.6,55,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Gaayam",1993,140,NA,7.1,10,0,0,0,0,0,0,14.5,34.5,14.5,45.5,"",1,0,0,1,0,0,0 -"Gabbeh",1996,73,NA,7.3,432,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gabbia, La",1986,101,NA,5.8,26,4.5,4.5,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gabbianella e il gatto, La",1998,75,6000000,6.8,134,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Gabby Goes Fishing",1941,7,NA,5.5,8,0,0,0,14.5,24.5,34.5,14.5,0,14.5,0,"",0,1,1,0,0,0,1 -"Gable and Lombard",1976,131,NA,4.4,109,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Gabriel",1999,11,NA,5.7,22,4.5,4.5,0,24.5,4.5,4.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"Gabriel & Me",2001,87,NA,5,37,14.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gabriel Orozco",2002,80,NA,4,14,24.5,4.5,4.5,4.5,0,0,24.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Gabriel Over the White House",1933,102,NA,6.4,145,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gabriela",1983,99,NA,6.2,182,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Gabriela",2001,93,NA,7.4,861,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"R",0,0,0,0,0,1,0 -"Gabriella",1972,82,NA,3.6,6,14.5,0,34.5,14.5,0,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Gabriella",2002,5,NA,8.7,13,4.5,0,14.5,0,4.5,4.5,4.5,0,24.5,34.5,"",0,0,1,0,0,0,1 -"Gabrielle",1954,90,NA,5.7,9,0,0,0,0,14.5,24.5,0,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gabrielle",2001,15,NA,6.1,8,0,0,0,14.5,0,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Gabriels ord",2002,35,NA,7.8,12,4.5,0,14.5,0,0,0,0,4.5,4.5,45.5,"",1,0,0,0,0,1,1 -"Gabroi tis Eftihias",1962,76,NA,7.7,13,0,0,0,0,4.5,0,24.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Gabros apo to Londino",1967,85,NA,7,13,0,0,0,4.5,14.5,4.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gaby",1956,96,NA,6,73,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gaby: A True Story",1987,110,NA,7.4,161,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Gacaca, Living Together Again in Rwanda?",2002,55,NA,7.1,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Gack Gack",2002,7,NA,5.6,6,14.5,0,0,0,34.5,34.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Gacy",2003,88,NA,4.8,409,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gadael Lenin",1993,90,NA,4.5,28,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Gadajace glowy",1980,16,NA,7,35,4.5,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Gadar: Ek Prem Katha",2001,170,NA,6.7,130,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Gaden",2003,18,NA,2.8,6,64.5,0,14.5,0,0,0,0,0,0,14.5,"",0,0,0,1,0,0,1 -"Gadjo dilo",1997,102,NA,7,881,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Gaea Girls",2000,104,NA,6.6,42,0,4.5,0,4.5,0,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Gaebyeok",1991,146,NA,8,6,0,0,0,0,0,0,45.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gafe, El",1959,85,NA,5,6,0,0,34.5,0,34.5,0,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Gagamboy",2004,100,NA,4.9,21,4.5,4.5,4.5,0,4.5,14.5,4.5,24.5,0,14.5,"",1,0,1,0,0,0,0 -"Gagarin",1995,3,NA,7.5,42,0,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Gagman",1989,127,NA,7.5,18,0,0,0,0,0,14.5,24.5,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Gagnant, Le",1979,90,NA,3.1,5,24.5,44.5,0,44.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Gai savoir, Le",1969,95,NA,5.7,40,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Gai shi ji hua",1984,87,NA,6.1,7,14.5,14.5,0,0,0,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Gai tung aap gong",1988,95,NA,7.4,70,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Gaia Symphony II",1999,130,NA,5,10,0,0,0,0,100,0,0,0,0,0,"",0,0,0,0,1,0,0 -"Gaichu",2001,92,NA,6.8,72,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Gaijin, Os Caminhos da Liberdade",1980,112,NA,5.8,17,4.5,0,0,0,4.5,14.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Gaily, Gaily",1969,107,8000000,5.1,47,4.5,4.5,0,14.5,34.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gaja Gamini",2000,122,NA,6.3,31,14.5,4.5,0,4.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Gakko",1993,128,NA,7.6,17,0,4.5,0,0,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gakko II",1996,122,NA,7.4,19,14.5,4.5,0,0,0,0,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Gakko III",1998,133,NA,6.5,8,24.5,0,0,0,0,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Gakusei romance: Wakaki hi",1929,60,NA,7.1,21,0,0,0,14.5,4.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Gal Who Took the West, The",1949,84,NA,6.7,7,14.5,0,0,0,14.5,14.5,14.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Gal Young 'Un",1979,105,94000,5.7,36,4.5,4.5,4.5,4.5,0,14.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Gala",2003,105,NA,6.4,9,0,0,0,14.5,0,34.5,24.5,24.5,0,14.5,"",0,0,0,0,1,0,0 -"Gala Dali",2001,6,NA,4.5,11,4.5,0,14.5,0,34.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Gala Day at Disneyland",1960,27,NA,9,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Galactic Gigolo",1988,80,NA,3.2,60,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Galapagos: The Enchanted Voyage",1999,40,NA,7.1,81,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Galaxies Are Colliding",1992,93,NA,4,61,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Galaxina",1980,95,NA,3,312,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Galaxis",1995,91,NA,3,150,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Galaxy Express 999",1996,126,NA,8,42,4.5,0,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Galaxy Far, Far Away, A",2001,62,NA,4.8,32,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,1,0,0 -"Galaxy Quest",1999,102,45000000,7.2,22341,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,0,0,0,0 -"Galaxy of Terror",1981,81,NA,4,324,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Galaxy of the Dinosaurs",1992,65,1250,1.4,17,44.5,14.5,0,0,0,0,0,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Galets, Les",2002,11,NA,6.3,6,0,0,0,0,0,84.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Galette du roi, La",1986,90,NA,4.9,12,0,4.5,0,24.5,24.5,14.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Galettes de Pont-Aven, Les",1975,105,NA,6.4,54,4.5,0,14.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Galgameth",1996,110,NA,6.4,31,14.5,0,0,0,4.5,14.5,24.5,14.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Galia",1966,105,NA,6.2,12,0,0,0,0,4.5,14.5,44.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Galileo",1969,105,NA,5.8,24,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Galileo",1975,145,NA,6.1,50,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Galimatias, czyli kogel-mogel II",1989,93,NA,6.7,13,0,0,0,4.5,4.5,4.5,34.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Galindez File, The",2003,125,NA,5.4,59,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gall Force: Eternal Story",1986,196,NA,6.1,43,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",1,1,0,0,0,0,0 -"Gallagher's Travels",1987,94,NA,6.6,7,0,0,0,14.5,0,44.5,24.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Gallant Bess",1947,100,NA,6.3,39,0,4.5,4.5,4.5,0,14.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Gallant Blade, The",1948,81,NA,6.1,8,0,0,0,14.5,34.5,14.5,24.5,14.5,0,0,"",1,0,0,1,0,0,0 -"Gallant Hours, The",1960,115,NA,6.8,159,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gallant Journey",1946,85,NA,6.1,23,0,0,0,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Gallant Lady",1933,84,NA,7.2,13,0,0,0,0,14.5,0,14.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Gallant Legion, The",1948,88,NA,6.9,10,0,0,0,0,24.5,24.5,14.5,44.5,14.5,0,"",0,0,0,0,0,0,0 -"Gallant Sons",1940,76,NA,5.9,38,0,0,0,4.5,24.5,34.5,0,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Gallavants",1984,100,5000000,8.1,9,0,0,0,0,0,34.5,0,24.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Gallego",1988,116,NA,7.3,8,0,0,0,0,0,0,24.5,45.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gallipoli",1981,110,NA,7.6,6278,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gallito Ciego",2001,89,NA,4.4,14,4.5,14.5,0,4.5,24.5,0,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Gallivant",1997,100,NA,5.3,16,14.5,0,0,0,14.5,4.5,34.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Gallo cedrone",1998,93,NA,5.5,94,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gallo de oro, El",1964,105,NA,9.3,21,0,0,0,4.5,0,0,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Gallopin' Gals",1940,7,NA,5.1,18,0,4.5,4.5,0,45.5,24.5,0,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Gallopin' Gaucho, The",1928,6,4249,6.2,45,4.5,0,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Galloping Ghost, The",1931,226,NA,7.5,8,0,0,0,0,0,14.5,24.5,45.5,14.5,0,"",0,0,0,0,0,0,0 -"Galloping Major, The",1951,80,NA,6.6,9,0,0,0,14.5,0,14.5,34.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Gam gai",2002,106,NA,7.5,158,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Gam ye sing gwong chaan laan",1988,94,NA,3,11,34.5,4.5,0,0,4.5,4.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Gam yin ji",1988,93,NA,6.5,10,0,14.5,0,14.5,0,24.5,44.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Gamal Hame'ofef, Ha-",1994,93,NA,5.6,16,0,0,24.5,4.5,0,4.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gaman",1978,119,NA,8.2,6,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gamberge, La",1962,90,NA,4.3,5,0,0,24.5,0,24.5,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Gambit",1966,109,NA,7,373,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gambler Wore a Gun, The",1961,64,NA,6.3,11,0,0,14.5,4.5,4.5,14.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Gambler from Natchez, The",1954,88,NA,6.7,14,0,0,0,0,4.5,45.5,0,34.5,0,0,"",0,0,0,0,0,0,0 -"Gambler, The",1974,111,NA,6.6,340,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Gambler, The",1997,97,NA,6.4,99,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Gamblers, The",1970,93,NA,6,7,0,14.5,0,14.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Gambling House",1951,80,NA,5.9,22,4.5,4.5,0,4.5,4.5,34.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Gambling Lady",1934,66,NA,6.3,57,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gambling On the High Seas",1940,54,NA,6.5,15,0,0,0,14.5,24.5,14.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Gambling Ship",1933,72,NA,3.8,14,14.5,0,4.5,14.5,14.5,14.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Gambling, Gods and LSD",2002,180,NA,6.1,97,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Game Day",1999,106,NA,4.7,83,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Game Over: Kasparov and the Machine",2003,90,NA,6.7,95,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"PG",0,0,0,0,1,0,0 -"Game for Vultures, A",1979,113,NA,4.1,40,14.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Game of Death",1978,35,NA,5.3,1416,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Game of Their Lives, The",2002,80,NA,7.5,42,0,0,0,0,0,4.5,14.5,34.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Game of Their Lives, The",2005,101,20000000,6.4,125,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,4.5,45.5,"PG",0,0,0,1,0,0,0 -"Game with No Rules, A",1994,17,NA,7.2,23,4.5,0,0,0,0,4.5,14.5,4.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Game, The",1988,88,NA,3.9,15,24.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Game, The",1997,128,50000000,7.6,28099,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Gamekeeper, The",1980,84,NA,6.4,16,4.5,0,4.5,0,14.5,14.5,0,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Gamer",2001,92,NA,3.8,64,24.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Gamera 2: Region shurai",1996,99,NA,7.5,188,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Gamera 3: Iris kakusei",1999,108,NA,7.3,214,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Gamera tai Daimaju Jaiga",1970,83,NA,4.5,61,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gamera tai daiakuju Giron",1969,80,NA,3.5,199,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gamers, The",2003,15,9000,7.1,13,0,0,0,4.5,0,4.5,34.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Games",1967,100,NA,6.8,121,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Games People Play",2004,97,NA,4.9,128,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Games That Lovers Play",1970,91,NA,5.3,15,4.5,4.5,14.5,4.5,14.5,24.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Games of Desire",1990,80,NA,3.5,18,14.5,14.5,0,4.5,24.5,0,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Games, The",1970,100,NA,5.5,60,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Gameui beobjig",1994,110,NA,4.5,8,34.5,0,0,24.5,0,0,34.5,0,0,0,"",1,0,0,0,0,0,0 -"Gamitan",2002,115,NA,5.7,12,0,0,24.5,4.5,14.5,4.5,34.5,4.5,0,0,"",1,0,0,1,0,1,0 -"Gamle guld, Det",1951,99,NA,5.3,15,0,4.5,4.5,4.5,4.5,34.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Gamlet",1964,140,NA,8.3,184,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Gamma People, The",1956,76,NA,4.2,28,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Gammera the Invincible",1966,86,NA,3.8,10,0,0,14.5,34.5,34.5,0,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Gammick, La",1975,86,NA,6.6,13,14.5,0,0,0,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gamos ala ellinika",1964,90,NA,8,17,0,0,0,0,0,14.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Gan",1953,104,NA,7.4,20,0,0,0,0,14.5,14.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,1,0 -"Gan",2003,90,NA,8.1,53,4.5,0,4.5,0,4.5,4.5,14.5,4.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Gan no tera",1962,98,NA,7,7,0,0,14.5,0,0,14.5,44.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Gan, Ha-",1977,90,NA,6,14,0,0,4.5,24.5,0,24.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Ganashatru",1989,99,NA,6.3,34,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ganbatte ikimasshoi",1998,120,NA,7.9,75,0,4.5,0,0,0,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Gancheob Li Cheol-jin",1999,105,NA,6.6,34,0,0,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Gandahar",1988,83,NA,6.4,209,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Gander at Mother Goose, A",1940,6,NA,7,9,0,0,0,0,14.5,14.5,24.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Gandhi",1982,188,22000000,8,15879,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Gang Bangs",1985,90,NA,8,13,0,0,0,4.5,0,0,4.5,34.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Gang Buster, The",1931,65,NA,6.4,5,0,0,0,24.5,44.5,0,24.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Gang Busters",1942,251,NA,7.3,13,0,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Gang Busters",1954,74,NA,4.8,13,14.5,4.5,4.5,14.5,14.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Gang Leader",1991,155,NA,8.3,9,0,14.5,0,0,0,0,14.5,14.5,24.5,44.5,"",1,0,0,0,0,0,0 -"Gang Tapes",2001,91,NA,5.7,194,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Gang That Couldn't Shoot Straight, The",1971,96,NA,4.8,204,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Gang War",1940,63,NA,4.2,13,0,24.5,4.5,14.5,24.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Gang War",1958,75,NA,5.8,45,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gang Wars",1976,82,NA,3.9,6,0,0,34.5,14.5,14.5,14.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Gang Warz",2004,97,NA,6,19,34.5,0,4.5,14.5,0,0,0,4.5,4.5,44.5,"",1,0,0,1,0,0,0 -"Gang des otages, Le",1973,90,NA,5.6,5,0,24.5,0,0,0,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Gang in Blue",1996,97,NA,5.3,151,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Gang of Roses",2003,94,NA,2.6,87,44.5,14.5,4.5,14.5,0,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Gang's All Here, The",1941,61,NA,6,8,0,0,0,14.5,0,24.5,14.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Gang's All Here, The",1943,103,NA,7.3,145,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Gang, Le",1977,105,NA,5.6,109,4.5,4.5,4.5,4.5,4.5,14.5,45.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ganga Bruta",1933,76,NA,7.6,21,0,4.5,0,0,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ganga Zumba",1963,100,NA,6.6,8,14.5,0,0,14.5,14.5,0,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gangaajal",2003,150,NA,7.1,39,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gangland",1998,97,NA,5.2,15,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Gangland",2000,82,NA,2.8,121,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Gangpae sueob",1996,108,NA,4.4,9,24.5,0,0,24.5,24.5,14.5,14.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Gangs of Chicago",1940,66,NA,3.2,6,34.5,14.5,0,0,14.5,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Gangs of New York",2002,166,97000000,7.3,34808,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Gangs of New York, The",1938,67,NA,6.1,9,0,14.5,0,0,0,0,24.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Gangstaz n Cash",1996,27,NA,6.1,8,24.5,0,0,0,14.5,0,14.5,34.5,0,14.5,"",1,0,0,0,0,0,1 -"Gangster",2002,90,NA,7.7,43,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gangster '70",1968,110,NA,5.6,6,0,0,0,14.5,0,14.5,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Gangster No. 1",2000,103,NA,6.5,1730,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Gangster Story",1960,65,75000,4.5,23,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Gangster Wars",1981,121,NA,5.2,28,4.5,0,4.5,4.5,14.5,24.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gangster's Den, The",1945,55,NA,4.8,12,0,0,0,24.5,34.5,44.5,0,0,0,0,"",1,0,0,1,0,0,0 -"Gangster, The",1947,84,NA,6.5,28,0,4.5,4.5,14.5,0,24.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gangstermeisje, Het",1966,90,NA,6.2,12,4.5,0,4.5,0,14.5,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Gangsters",2002,90,NA,6,127,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Gangsters of the Frontier",1944,56,NA,5.5,5,0,0,24.5,0,0,84.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Gangsters per un massacro",1968,89,NA,4.8,6,0,0,0,14.5,34.5,34.5,0,14.5,0,0,"",1,0,0,0,0,0,0 -"Gangway",1937,90,NA,5.9,15,0,0,4.5,4.5,14.5,0,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gangway for Tomorrow",1943,69,NA,5.2,24,4.5,0,4.5,14.5,4.5,34.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Ganhar a Vida",2001,115,NA,7,24,4.5,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ganheddo",1989,97,NA,4.4,146,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Ganja & Hess",1973,110,NA,5.1,79,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gannat al shayateen",1999,79,NA,5.4,22,0,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Ganovenehre",1966,94,NA,7.4,14,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gans von Sedan, Die",1959,90,NA,5.5,57,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ganz und gar",2003,95,1400000,8.2,114,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Gao yang yi sheng",1992,89,NA,6.1,86,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Gaous, Les",2004,92,NA,4.5,30,24.5,0,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gap-Toothed Women",1987,31,NA,6.3,20,0,0,4.5,0,14.5,4.5,24.5,34.5,24.5,4.5,"",0,0,0,0,1,0,1 -"Garabatos",1964,14,NA,3.7,6,14.5,14.5,14.5,0,34.5,14.5,0,0,0,0,"",0,1,0,0,1,0,1 -"Garaga",1989,100,NA,8.5,8,0,0,14.5,0,24.5,0,34.5,0,14.5,14.5,"",0,1,0,0,0,0,0 -"Garage Days",2002,106,6000000,5.6,597,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Garage Olimpo",1999,98,NA,7.3,411,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Garage Sale",1996,30,NA,6.2,27,4.5,4.5,0,0,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,1,0,0,1,1 -"Garage, The",1919,25,NA,7.4,65,0,0,0,4.5,4.5,14.5,34.5,34.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Garam Hawa",1973,146,NA,7.2,23,0,0,0,0,0,4.5,14.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Garasu no nou",2000,100,NA,6.2,23,4.5,4.5,14.5,0,4.5,4.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Garazh",1979,101,NA,7.8,193,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Garbage Pail Kids Movie, The",1987,100,NA,3,452,34.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Garbo",1992,100,NA,3.8,13,44.5,0,0,4.5,4.5,4.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Garbo Talks",1984,103,NA,6.1,203,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Garce, La",1984,90,NA,6.1,13,0,0,0,0,14.5,44.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Garcea si oltenii",2001,90,NA,4,93,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Garcia",1999,100,NA,4.6,14,14.5,4.5,4.5,14.5,24.5,14.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Garde du corps, Le",1984,85,NA,4.4,25,4.5,0,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Gardemariny III",1992,107,NA,4.4,18,24.5,0,0,14.5,14.5,14.5,4.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Garden Gopher",1950,6,NA,6.9,22,0,0,4.5,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Garden Murder Case, The",1936,61,NA,5.8,9,0,14.5,0,14.5,14.5,14.5,14.5,14.5,34.5,0,"",0,0,0,0,0,0,0 -"Garden Party",1997,85,NA,7,8,0,0,0,0,0,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Garden State",2004,109,2500000,8.1,23814,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,1,1,0,1,0 -"Garden of Allah, The",1936,79,2200000,6.2,139,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Garden of Earthly Delights, The",1981,3,NA,7.4,51,4.5,4.5,4.5,0,0,14.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Garden of Earthly Delights, The",2004,103,NA,7.9,14,0,0,4.5,4.5,0,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Garden of Eden",1955,67,NA,4.6,7,0,14.5,24.5,0,14.5,0,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Garden of Eden, The",1928,78,NA,7.9,46,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Garden of Evil",1954,96,NA,6.4,228,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Garden of Luxor",1972,9,NA,6,19,14.5,4.5,4.5,14.5,0,4.5,34.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Garden of the Dead",1974,59,NA,3.7,60,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Garden of the Moon",1938,94,NA,6.2,33,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Gardener, The",1998,105,NA,2.9,79,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Gardens of Stone",1987,112,NA,6.5,887,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Gardien de la nuit",1986,100,NA,7.8,8,0,14.5,0,0,0,24.5,0,45.5,0,14.5,"",0,0,0,1,0,0,0 -"Gardiens de phare",1929,80,NA,9.8,7,14.5,0,0,0,0,14.5,0,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Garfield",2004,80,50000000,4.8,4775,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,1,1,0,0,0,0 -"Gargantuan",1992,1,NA,6.3,6,14.5,0,14.5,0,14.5,0,0,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Gariba no uchu ryoko",1965,85,NA,7.6,12,14.5,4.5,0,0,0,14.5,0,14.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Garibaldino al convento, Un",1942,83,NA,7.1,8,0,0,0,14.5,0,0,45.5,24.5,14.5,0,"",0,0,1,1,0,0,0 -"Garlic Is As Good As Ten Mothers",1980,51,NA,7.1,30,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Garment Jungle, The",1957,88,NA,6.5,31,0,0,4.5,0,4.5,34.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Garmento",2002,90,NA,5.9,16,14.5,4.5,14.5,4.5,0,0,4.5,4.5,0,44.5,"",0,0,0,1,0,0,0 -"Garota dourada",1984,105,NA,5,7,24.5,0,0,0,14.5,24.5,0,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Garotas do ABC",2003,130,NA,7.8,26,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Garou densetsu",1994,100,NA,6.3,210,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,1,0,0,0,0,0 -"Garpenfargle",2004,4,NA,9,6,0,0,0,0,0,0,14.5,0,45.5,34.5,"",0,0,1,0,0,0,1 -"Garras de Lorelei, Las",1974,80,NA,3.3,40,14.5,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Garriage: A Documentary in 4 Chapters and an Epilogue",2004,14,NA,9.7,6,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,1,0,1,0,1 -"Garrincha, Alegria do Povo",1962,60,NA,5.2,13,4.5,0,0,0,34.5,14.5,4.5,14.5,14.5,0,"",0,0,0,0,1,0,0 -"Garsoniera gia deka",1981,114,NA,6.2,8,0,14.5,0,14.5,0,14.5,0,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Garv: Pride and Honour",2004,162,NA,4.4,25,24.5,0,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Gary Cooper: American Life, American Legend",1991,47,NA,6.8,31,4.5,4.5,0,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Gas",1944,3,NA,7.4,7,0,0,0,0,14.5,0,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Gas",1981,94,NA,2.2,109,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gas Attack",2001,71,NA,4.9,36,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gas House Kids in Hollywood",1947,62,NA,6.4,6,0,0,0,0,45.5,0,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Gas Planet",1992,3,NA,6.1,44,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Gas Pump Girls",1979,86,NA,3.3,45,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gas Station, The",2000,27,NA,7.6,13,0,0,4.5,0,0,14.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,1 -"Gas, Food Lodging",1992,101,NA,6.5,937,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Gas-Oil",1955,92,NA,5.8,28,0,0,4.5,4.5,14.5,24.5,34.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Gas-s-s-s",1971,79,NA,3.4,130,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Gasbags",1941,77,NA,5,7,0,0,0,14.5,14.5,24.5,0,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Gaseum dallin namja",1993,110,NA,4,11,4.5,0,24.5,45.5,0,0,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Gaslight",1940,84,NA,7.4,386,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gaslight",1944,114,NA,7.6,2608,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gaslight Follies",1945,110,NA,6.5,5,24.5,0,0,0,44.5,24.5,24.5,0,0,0,"",0,0,0,0,1,0,0 -"Gasline",2001,16,NA,6.3,22,14.5,0,0,4.5,14.5,14.5,44.5,4.5,0,0,"",0,0,0,1,0,0,1 -"Gasman",1997,15,NA,6.7,65,4.5,4.5,0,0,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Gasmann, Der",1941,85,NA,6.3,11,0,0,0,0,14.5,4.5,34.5,0,24.5,4.5,"",0,0,1,0,0,0,0 -"Gasoline Rainbows",2000,76,NA,8,7,0,0,0,0,0,14.5,24.5,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Gasoloons",1936,16,NA,4.7,6,0,0,14.5,14.5,14.5,34.5,0,14.5,0,0,"",0,0,1,0,0,0,1 -"Gaspard et Robinson",1990,93,NA,7.7,16,0,0,0,0,0,14.5,24.5,14.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Gaspards, Les",1974,90,NA,5.6,50,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gasparone",1937,80,NA,5.6,17,0,4.5,0,14.5,4.5,4.5,44.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gasthaus an der Themse, Das",1962,92,NA,5.7,81,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gaston en Leo in Hong Kong",1988,97,NA,4.7,52,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gaston's War",1997,120,NA,5.9,110,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Gasu ningen dai ichigo",1960,81,NA,5.7,40,4.5,4.5,0,14.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Gate",2000,15,NA,8.1,10,0,0,0,0,0,14.5,14.5,24.5,34.5,34.5,"",0,0,1,0,0,0,1 -"Gate II: Trespassers, The",1992,93,NA,3.5,173,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gate of Heavenly Peace, The",1995,189,NA,7.8,55,0,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Gate to Heaven",2003,90,NA,5.5,28,0,0,24.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Gate, The",1987,85,NA,4.9,1087,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gategutter",1949,77,NA,6.4,32,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gatekeeper, The",2002,103,NA,6.4,84,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Gates of Heaven",1978,85,NA,7.5,546,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Gates to Paradise",1968,89,NA,5.6,15,4.5,14.5,0,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Gateway",1938,75,NA,4.7,7,0,14.5,0,0,14.5,44.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Gathering of Eagles, A",1963,115,NA,5.9,148,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gathering, The",2002,83,18000000,5.8,1033,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gatica, el mono",1993,136,NA,6.6,66,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Gatling Gun, The",1973,93,NA,5.1,37,0,14.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Gator",1976,115,NA,5.4,325,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Gatos",2002,18,NA,7.8,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Gattaca",1997,101,36000000,7.6,26071,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Gatti rossi in un labirinto di vetro",1975,97,NA,4.8,73,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gatto a nove code, Il",1971,115,1000000,6.3,515,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gatto dagli occhi di giada, Il",1977,95,NA,5.6,52,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gatto nel cervello, Un",1990,93,100000,5.6,237,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Gatto nero, Il",1981,92,NA,5.2,187,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gatto nero, Il",1989,89,NA,3.5,51,24.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gatto, Il",1978,109,NA,6.7,24,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Gattopardo, Il",1963,165,NA,7.7,1736,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Gau go neui jai yat jek gwai",2002,96,NA,3.1,14,4.5,14.5,0,4.5,4.5,24.5,4.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Gau lung bing sat",2001,101,NA,6.4,48,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Gau sing biu choi",1998,86,NA,4.4,12,14.5,0,0,4.5,24.5,0,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Gaucho Serenade",1940,66,NA,6.1,17,0,0,14.5,0,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gaucho, Il",1965,110,NA,6.1,30,4.5,0,0,4.5,4.5,34.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gaucho, The",1927,115,NA,7.5,42,0,0,4.5,0,4.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Gaudi Afternoon",2001,93,NA,6.4,423,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Gauguin",1950,11,NA,5.5,8,14.5,0,14.5,0,0,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Gauner und der liebe Gott, Der",1960,95,NA,6.8,20,0,4.5,0,0,14.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gauntlet, The",1977,109,5500000,6,2201,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Gauyat sandiu haplui",1992,92,NA,6.6,170,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gav khuni",2003,96,NA,6.8,24,4.5,4.5,4.5,0,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gavin's Way",2001,89,NA,7.8,13,4.5,0,4.5,0,0,4.5,0,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Gawain and the Green Knight",1973,93,NA,5.5,55,4.5,4.5,24.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gawi",2000,97,NA,5.2,160,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gay",2004,100,NA,2.6,33,45.5,4.5,4.5,0,0,0,0,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Gay Amigo, The",1949,60,NA,7.3,8,0,0,0,14.5,0,14.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Gay Anties, The",1947,7,NA,6.1,11,0,0,0,0,24.5,44.5,24.5,0,0,0,"",0,1,1,0,0,0,1 -"Gay Bride, The",1934,80,NA,6.8,41,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gay Cuba",1996,57,NA,5.9,12,0,0,0,0,14.5,24.5,4.5,4.5,0,44.5,"",0,0,0,0,1,0,0 -"Gay Deceivers, The",1969,97,NA,5.2,66,14.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gay Deception, The",1935,75,NA,5.7,20,0,0,0,4.5,24.5,24.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Gay Desperado, The",1936,86,NA,5.8,36,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Gay Divorcee, The",1934,107,520000,7.6,713,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Gay Falcon, The",1941,67,NA,6.2,60,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gay Parisian, The",1941,20,NA,6.5,13,0,0,0,4.5,14.5,24.5,0,34.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Gay Pioneers",2004,30,NA,7,5,24.5,0,0,0,0,0,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Gay Purr-ee",1962,85,NA,6.2,185,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Gay Ranchero, The",1948,72,NA,5,5,24.5,0,0,0,44.5,0,0,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Gay Shoe Clerk, The",1903,1,NA,6.4,91,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Gay Sisters, The",1942,110,NA,6,70,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gay USA",1978,78,NA,8,5,0,24.5,0,0,0,0,0,24.5,0,64.5,"",0,0,0,0,1,0,0 -"Gay by Dawn",2004,9,8000,9,12,4.5,0,0,0,0,0,0,4.5,4.5,74.5,"",0,0,1,0,0,0,1 -"Gayab",2004,138,NA,6,21,0,14.5,0,4.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gaydar",2002,20,NA,6.6,32,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Gayniggers from Outer Space",1992,26,NA,5.8,947,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,1,0,0,0,1 -"Gayracula",1983,83,NA,1.6,9,24.5,24.5,34.5,0,0,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Gaz Bar Blues",2003,115,NA,7.1,198,0,0,4.5,4.5,4.5,4.5,34.5,34.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Gaza Strip",2002,74,NA,7.1,98,24.5,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Gazebo, The",1959,100,NA,6.9,210,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gazon maudit",1995,104,NA,6.5,1019,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Gazza ladra, La",1964,11,NA,5.9,6,0,14.5,0,14.5,0,45.5,0,0,14.5,0,"",0,1,0,0,0,0,1 -"Gde nakhoditsya Nofelet?",1987,82,NA,5.1,18,0,4.5,14.5,0,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Gdy spadaja anioly",1959,21,NA,7.4,109,4.5,0,0,0,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Gdzie jest general?",1964,92,NA,5.5,12,0,0,4.5,4.5,4.5,24.5,0,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ge ge de qing ren",1992,90,NA,8.3,7,0,0,0,0,14.5,0,45.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"GeGe",2001,90,NA,4.8,34,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gebissen wird nur nachts",1971,102,NA,5,46,4.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Geboren in Absurdistan",1999,111,NA,6.6,67,4.5,4.5,4.5,4.5,14.5,24.5,44.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Gebroken rood",2004,96,NA,6.8,13,0,0,0,0,4.5,4.5,44.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Gebroken spiegels",1984,108,NA,6.5,42,4.5,0,0,0,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Gee Whiz-z-z-z-z-z-z",1956,6,NA,6.8,62,0,4.5,4.5,4.5,4.5,4.5,44.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Geek Maggot Bingo",1983,70,NA,2.6,26,44.5,14.5,0,0,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Geen paniek",1973,85,NA,2.8,9,14.5,0,24.5,0,0,24.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Gefangen",2004,96,NA,3.9,48,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gege",2004,113,NA,7,6,0,0,0,0,14.5,14.5,14.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Gegen die Wand",2004,121,NA,8,2476,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Geh, zieh dein Dirndl aus",1973,85,NA,3.6,17,14.5,4.5,14.5,34.5,14.5,0,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Geheimaktion schwarze Kapelle",1959,105,NA,6,6,0,0,0,0,14.5,84.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Geheimnis der drei Dschunken, Das",1965,90,NA,5.8,11,4.5,0,0,0,24.5,24.5,24.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Geheimnis der gelben Narzissen, Das",1961,94,NA,5.5,35,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Geheimnis der schwarzen Witwe, Das",1963,107,NA,5.9,10,0,0,0,0,14.5,45.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Geheimnis, Das",1995,80,NA,7.6,7,0,0,0,14.5,14.5,0,44.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Geheimnisse einer Seele",1926,97,NA,7.4,25,0,0,4.5,4.5,0,14.5,24.5,24.5,34.5,4.5,"",0,0,0,0,0,0,0 -"Geheimnisse in goldenen Nylons",1967,92,NA,5.5,15,4.5,4.5,4.5,0,24.5,24.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Gei ba ba de xin",1995,104,NA,6.5,870,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,0,0,0,0 -"Gei diy chun fung",1997,58,NA,6.2,8,0,0,0,0,14.5,14.5,24.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Geierwally",1988,105,NA,5.9,51,14.5,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Geierwally, Die",1940,104,NA,5.6,17,4.5,0,14.5,14.5,0,44.5,4.5,4.5,14.5,0,"",0,0,0,1,0,1,0 -"Geierwally, Die",1956,90,NA,4.4,12,0,24.5,0,24.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Geisha",1996,92,NA,4.9,9,14.5,0,14.5,14.5,14.5,14.5,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Geisha Boy, The",1958,98,NA,5.5,220,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gekido no showashi: Okinawa kessen",1971,149,NA,7.1,9,0,0,0,0,14.5,14.5,44.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Gekisatsu! Judo ken",1977,94,NA,5.1,20,4.5,0,14.5,14.5,0,14.5,14.5,0,4.5,34.5,"",1,0,0,1,0,0,0 -"Gekitotsu! Satsujin ken",1974,91,NA,6.7,529,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Gekko no sasayaki",1999,100,NA,7.4,130,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,1,0 -"Gelbe Kirschen",2000,86,NA,6.4,17,0,14.5,0,4.5,0,24.5,44.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Geld oder Leber!",1986,85,NA,2.7,73,24.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Gelegenheitsarbeit einer Sklavin",1973,91,NA,3.3,12,4.5,4.5,4.5,4.5,0,24.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Geliebte Hochstaplerin",1961,88,NA,7.1,7,0,0,0,0,14.5,0,14.5,44.5,24.5,0,"",0,0,1,0,0,0,0 -"Geliebter Alltag",2000,13,NA,7.4,10,0,0,0,0,0,24.5,44.5,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Gem of a Jam, A",1943,17,NA,7.1,52,0,0,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Gembaku no ko",1952,97,NA,7.2,16,0,0,0,4.5,14.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gemide",1999,102,NA,7.9,209,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Gemidos de placer",1983,86,NA,5.5,11,4.5,0,4.5,4.5,4.5,4.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Gemini - The Twin Stars",1988,110,NA,5.8,8,0,0,0,0,24.5,45.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Gemini Affair",1975,92,NA,5.8,11,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gemsar",2002,85,NA,7.3,43,14.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gen 13",1998,87,NA,5.5,79,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,1,0,0,0,0,0 -"Gendai yakuza: hito-kiri yota",1972,95,NA,7.6,88,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Gendarme de St. Tropez, Le",1964,89,NA,6.6,651,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gendarme desconocido, El",1941,108,NA,7.4,15,0,0,0,0,0,4.5,24.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Gendarme en balade, Le",1970,105,NA,5.6,300,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gendarme et les extra-terrestres, Le",1979,96,NA,5.2,416,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gendarme et les gendarmettes, Le",1982,99,NA,5.2,372,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gendarme se marie, Le",1968,92,NA,5.9,336,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gendernauts",1999,87,NA,5.7,23,4.5,4.5,0,4.5,0,14.5,44.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Gene Autry and The Mounties",1951,70,NA,6.2,9,0,0,14.5,0,24.5,14.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Gene Autry, Melody of the West",1994,58,NA,9.8,7,14.5,0,0,24.5,0,0,0,0,0,45.5,"",0,0,0,0,1,0,0 -"Gene Krupa Story, The",1959,101,NA,6.7,79,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"General Chaos: Uncensored Animation",1998,81,NA,6,27,4.5,4.5,4.5,0,14.5,4.5,24.5,4.5,14.5,24.5,"",0,1,0,0,0,0,0 -"General Died at Dawn, The",1936,98,NA,6.6,107,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"General Massacre",1973,90,NA,4.1,5,0,0,24.5,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"General Spanky",1936,71,NA,5.9,43,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"General Sutter",1999,100,NA,4.6,8,24.5,0,14.5,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"General's Daughter, The",1999,116,60000000,6.1,11128,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"General, The",1927,83,NA,8.4,6644,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",1,0,1,0,0,1,0 -"General, The",1994,12,NA,8.8,8,0,0,0,0,0,14.5,14.5,14.5,14.5,45.5,"",0,1,0,0,0,0,1 -"General, The",1998,124,NA,7.1,1598,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Generala, La",1970,100,NA,6.3,16,14.5,4.5,0,0,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Generale dell'armata morte, Il",1983,105,NA,4.1,8,0,24.5,0,0,14.5,14.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Generale della Rovere, Il",1959,129,NA,7.7,165,4.5,0,0,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Generation",1969,109,NA,5.7,20,0,4.5,0,14.5,24.5,4.5,4.5,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Generation Ax",1998,78,NA,4.6,29,34.5,4.5,14.5,4.5,14.5,4.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Generation Gap",2004,1,NA,6.5,17,34.5,0,0,0,0,0,4.5,0,14.5,44.5,"",0,0,1,0,0,0,1 -"Genesis",1978,32,NA,6.1,10,24.5,0,0,0,14.5,14.5,14.5,0,24.5,34.5,"",0,0,0,0,1,0,1 -"Genesis",1986,105,NA,5.3,19,0,0,0,14.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Genesis",2001,80,NA,6,5,24.5,0,0,0,0,24.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Genesis",2004,81,NA,6.6,117,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Genesis Children",1972,85,NA,4.3,69,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Genesis and Catastrophe",2000,8,NA,5.7,39,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Genesis: A Band in Concert",1977,45,NA,7.8,12,0,0,0,0,0,0,14.5,44.5,0,44.5,"",0,0,0,0,1,0,0 -"Genet parle d'Angela Davis",1970,10,NA,9.9,7,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,0,0,0,0,1 -"Genevieve",1953,86,NA,7.5,353,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Genghis Blues",1999,88,NA,7.6,352,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Genghis Khan",1965,124,NA,5.3,231,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Genghis Khan",2004,120,50000000,7.9,15,24.5,4.5,0,0,0,0,0,4.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Gengszterfilm",1999,110,NA,5.4,18,4.5,0,4.5,0,14.5,14.5,14.5,14.5,24.5,4.5,"",1,0,0,1,0,0,0 -"Genie with the Light Pink Fur, The",1966,7,NA,5.9,8,0,0,0,14.5,14.5,45.5,0,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Genio, due compari, un pollo, Un",1975,120,NA,5.7,284,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Genius at Work",1946,61,NA,5.3,10,0,14.5,0,14.5,44.5,34.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Genius of Lenny Breau, The",1999,120,NA,5,10,14.5,0,0,0,34.5,0,0,0,0,64.5,"",0,0,0,0,1,0,0 -"Geniy",1991,162,NA,7.4,52,0,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Gennaioi tis Samothrakis, Oi",2003,85,NA,5.9,22,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Genocide",1981,90,NA,5.6,22,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Genou de Claire, Le",1970,105,NA,7.5,598,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Genre",1996,5,NA,7.9,135,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Genroku chushingura",1941,241,NA,7.5,162,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Gens normaux n'ont rien d'exceptionnel, Les",1993,100,NA,7,82,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Gens qui s'aiment, Les",2000,90,NA,6.6,34,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Gent",1969,15,NA,7.2,41,0,4.5,24.5,4.5,4.5,4.5,4.5,0,4.5,45.5,"",0,0,0,0,1,0,1 -"Gente de la Universal, La",1991,110,NA,5.1,65,4.5,0,4.5,4.5,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Gente del Po",1943,10,NA,8.8,12,0,0,0,0,0,0,0,45.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Gente di Roma",2003,100,NA,4.9,40,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,1,0,1,0,0 -"Gente di rispetto",1975,113,NA,5.3,22,0,0,4.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gente pez",2001,89,NA,4.3,91,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gentle Annie",1944,80,NA,4.9,18,14.5,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Gentle Giant",1967,95,NA,5.7,29,0,4.5,0,14.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gentle Gunman, The",1952,86,NA,6.8,20,0,0,0,0,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gentle Rain, The",1966,110,NA,4.7,19,4.5,4.5,24.5,0,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gentle Savage",1973,85,NA,5.7,12,14.5,0,0,0,24.5,0,0,4.5,4.5,44.5,"",1,0,0,1,0,0,0 -"Gentle Sex, The",1943,92,NA,6.4,28,0,0,0,4.5,24.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Gentle Trap, The",1960,59,NA,3.9,14,14.5,4.5,24.5,14.5,24.5,4.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Gentleman After Dark, A",1942,74,NA,5.8,8,0,0,14.5,0,24.5,0,45.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Gentleman B.",2000,89,NA,4.6,24,24.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gentleman Jim",1942,104,NA,7.6,404,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Gentleman Jo... uccidi",1969,92,NA,6.7,7,0,0,0,0,14.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Gentleman Tramp, The",1975,78,NA,7,30,0,0,0,14.5,0,14.5,4.5,34.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Gentleman Who Fell",1993,5,NA,4.4,8,14.5,0,14.5,14.5,14.5,0,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Gentleman d'Epsom, Le",1962,84,NA,5.5,65,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gentleman de Cocody, Le",1964,84,NA,4.8,10,24.5,0,0,24.5,14.5,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Gentleman of Paris, A",1927,65,NA,8.5,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Gentleman's Agreement",1947,118,2000000,7.4,1173,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Gentleman's Bet",1995,90,NA,5.8,29,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,0,34.5,"R",0,0,0,1,0,0,0 -"Gentleman's Fate",1931,90,NA,6,12,0,0,0,4.5,4.5,45.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Gentleman's Game, A",2001,112,NA,6.4,197,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Gentlemen Are Born",1934,75,NA,4.6,7,0,0,0,24.5,14.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Gentlemen Marry Brunettes",1955,99,NA,5,53,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gentlemen Prefer Blondes",1928,75,352000,7.3,14,4.5,0,0,4.5,0,4.5,14.5,24.5,0,34.5,"",0,0,1,0,0,0,0 -"Gentlemen Prefer Blondes",1953,91,NA,7.2,2451,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Gentlemen of Nerve",1914,16,NA,6.3,24,0,0,4.5,4.5,4.5,34.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Gentlemen with Guns",1946,53,NA,4.7,9,0,14.5,0,24.5,44.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Gentlemen's Agreement",1935,71,NA,6.5,33,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Gently Down the Stream",1981,14,NA,6.2,8,34.5,0,0,0,0,24.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Gents Without Cents",1944,19,NA,7.3,77,0,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Gents in a Jam",1952,16,NA,7.3,56,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Genuine Risk",1990,90,NA,4.9,42,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Geobreeders",1998,90,NA,7.1,22,4.5,0,0,4.5,0,14.5,14.5,34.5,4.5,14.5,"",1,1,0,0,0,0,0 -"Geomi sup",2004,120,NA,6.9,75,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Geonchugmuhan yugmyeongagcheui bimil",1998,108,NA,4.3,11,0,4.5,0,34.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Geordie",1955,93,NA,7.3,137,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"George",1972,86,NA,6.9,17,0,0,4.5,4.5,4.5,14.5,14.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"George B.",1997,98,NA,6.6,50,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"George Dumpson's Place",1965,8,NA,5.1,16,0,0,14.5,14.5,14.5,4.5,24.5,0,4.5,14.5,"",0,0,0,0,1,0,1 -"George Hall and His Orchestra",1936,11,NA,3.8,5,0,24.5,24.5,0,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"George Lucas in Love",1999,8,NA,7.2,1217,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,1 -"George Raft Story, The",1961,106,NA,5.4,27,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"George Stevens: A Filmmaker's Journey",1984,110,NA,7.7,62,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"George Wallace: Settin' the Woods on Fire",2000,167,NA,8.7,14,0,0,0,4.5,0,0,4.5,4.5,44.5,34.5,"",0,0,0,0,1,0,0 -"George Washington",2000,94,NA,7.4,1000,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"George Washington Slept Here",1942,93,NA,7.2,152,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"George White's 1935 Scandals",1935,83,NA,6.4,14,0,0,0,4.5,24.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"George White's Scandals",1934,80,NA,5.7,7,0,0,0,14.5,24.5,0,44.5,0,0,14.5,"",0,0,0,0,0,0,0 -"George White's Scandals",1945,95,NA,4.7,9,0,14.5,0,44.5,0,0,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"George and Mildred",1980,89,NA,4.8,59,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"George and Rosemary",1987,9,NA,7.6,24,0,0,4.5,0,0,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,1,1 -"George and the Dragon",2004,93,32000000,5.5,137,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",1,0,1,0,0,1,0 -"George in Civvy Street",1946,79,NA,4.8,10,24.5,0,0,14.5,14.5,14.5,24.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"George of the Jungle",1997,92,55000000,5.5,6430,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"George's Island",1989,89,NA,5.5,30,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Georges Bataille's Story of the Eye",2004,81,NA,4.5,14,45.5,0,4.5,0,4.5,0,0,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Georgetown Loop (Colorado), The",1903,3,NA,7,26,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Georgia",1988,93,NA,6.6,51,4.5,4.5,4.5,4.5,4.5,24.5,4.5,44.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Georgia",1995,115,NA,6.1,809,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Georgia, Georgia",1972,91,NA,4.6,16,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Georgica",1998,109,NA,8.2,46,0,0,0,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Georgie Girl",2001,69,NA,6.6,7,0,0,0,0,14.5,14.5,14.5,44.5,14.5,0,"",0,0,0,0,1,0,0 -"Georgische Trauben",2000,29,NA,3.6,18,0,14.5,34.5,0,24.5,14.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Georgy Girl",1966,99,400000,7,453,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Geraftaar",1985,167,NA,5.4,18,4.5,0,0,0,24.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Gerald McBoing! Boing! on Planet Moo",1956,7,NA,6.2,35,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Gerald McBoing-Boing",1950,8,NA,7.8,101,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Gerald McBoing-Boing's Symphony",1953,8,NA,7,13,0,0,0,0,14.5,4.5,4.5,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Geri's Game",1997,4,NA,7.5,1257,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Germania anno zero",1948,71,NA,8.1,516,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Germanoi xanarhodai, Oi",1948,90,NA,8.9,36,0,0,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Germgirl",2001,5,NA,5.9,12,0,0,4.5,14.5,0,45.5,0,4.5,0,4.5,"",1,0,1,0,0,0,1 -"Germicide",1976,105,NA,5.5,6,0,14.5,14.5,14.5,14.5,0,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Germinal",1963,110,NA,7.3,17,0,0,14.5,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Germinal",1993,159,NA,7,666,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Gerodokoros, O",1967,88,NA,6.7,7,0,0,0,0,0,24.5,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Geroite na Shipka",1955,137,NA,8.7,9,0,0,0,0,0,0,0,24.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Geronimo",1939,89,NA,4.4,26,4.5,4.5,4.5,14.5,4.5,14.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Geronimo",1962,101,NA,5.7,72,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Geronimo: An American Legend",1993,115,50000000,6.2,1233,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gerorisuto",1990,12,NA,2.3,7,24.5,24.5,24.5,0,0,0,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Gerry",2002,105,3500000,6,1944,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Gertrud",1964,115,NA,7.4,346,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gertrudis Bocanegra",1992,98,NA,6.4,6,14.5,0,0,0,14.5,0,0,64.5,0,0,"",0,0,0,1,0,0,0 -"Gervaise",1956,116,NA,7.4,73,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gesches Gift",1997,95,NA,7.6,5,0,0,0,0,24.5,24.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Geschichte vom Onkel Willy aus Golzow, Die",1996,140,NA,8.8,6,0,0,0,0,14.5,0,0,14.5,0,64.5,"",0,0,0,0,1,0,0 -"Geschichte vom kleinen Muck, Die",1953,100,NA,8,47,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Geschichte vom weinenden Kamel, Die",2003,90,NA,7.4,855,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"PG",0,0,0,1,1,0,0 -"Geschichten aus dem Wienerwald",1961,120,NA,5.6,7,0,0,0,0,24.5,0,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Geschichten aus dem Wienerwald",1979,90,NA,6.7,18,0,0,0,4.5,4.5,0,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Geschichtsunterricht",1973,88,NA,2.7,19,24.5,14.5,0,4.5,0,0,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Geschlecht in Fesseln - Die Sexualnot der Gefangenen",1928,107,NA,7.5,11,4.5,0,0,0,0,24.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Geschriebene Gesicht, Das",1995,89,NA,1.8,9,14.5,14.5,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Geschwister - Kardesler",1997,82,NA,6.3,5,0,0,0,0,0,44.5,24.5,0,44.5,0,"",0,0,0,1,0,0,0 -"Gespenst, Das",1983,88,NA,6.7,21,14.5,4.5,4.5,0,0,14.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Gespenster",2005,85,NA,7.7,23,4.5,4.5,4.5,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Gestehen Sie, Dr. Corda!",1958,98,NA,4.6,5,0,0,24.5,44.5,0,44.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Gestiefelte Kater, Der",1955,67,NA,6.2,8,24.5,0,0,0,24.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,1,0 -"Gesucht: Monika Ertl",1989,89,NA,8.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,0,1,0,0 -"Get Back",1991,89,NA,5.6,75,0,4.5,4.5,4.5,24.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Get Bruce",1999,82,NA,5.5,222,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Get Carter",1971,112,NA,7.4,3184,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Get Carter",2000,104,40000000,4.7,4927,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Get Cracking",1943,96,NA,1.4,5,24.5,0,0,0,0,24.5,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Get Crazy",1983,92,NA,6.1,206,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Get Mean",1976,84,NA,2.1,7,14.5,14.5,14.5,14.5,14.5,0,14.5,0,14.5,0,"",1,0,1,0,0,0,0 -"Get Out and Get Under",1920,28,NA,7,40,4.5,0,4.5,0,4.5,14.5,44.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Get Out of My Room",1985,53,NA,4,174,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Get Outta Here",2001,20,NA,6.1,6,0,0,0,0,0,34.5,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Get Over It",2001,87,10000000,5.7,3561,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Get Ready to Be Boyzvoiced",2000,95,NA,6.9,274,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Get Rich Quick",1951,6,NA,7.3,32,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Get Rich Quick Porky",1937,7,NA,5.8,17,4.5,0,0,14.5,4.5,24.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Get Shorty",1995,105,30250000,7,14825,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Get Up!",2003,112,NA,7.1,30,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",1,0,1,1,0,0,0 -"Get Well Soon",2001,95,NA,5,257,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Get Your Stuff",2000,93,NA,5.1,89,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Get Yourself a College Girl",1964,87,NA,4.5,34,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Get a Job",1985,11,NA,6.5,31,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Get a Job",1998,93,750000,2.3,21,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Get on the Bus",1996,120,2400000,6.6,1142,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Get the Picture",2004,9,NA,5.8,15,0,0,0,0,14.5,14.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Get to Know Your Rabbit",1972,91,NA,5.1,73,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Get-Away, The",1941,89,NA,6.8,35,0,0,0,4.5,4.5,14.5,44.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Getaway, The",1972,122,3352254,7.3,2843,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Getaway, The",1994,116,NA,5.5,3111,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Geteilte Himmel, Der",1964,110,NA,6.4,34,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Geteiltes Leid",2000,12,NA,7.8,32,4.5,0,0,0,4.5,4.5,14.5,14.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Getno",2004,95,NA,3,42,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gettin' Grown",2004,74,NA,8.4,5,0,0,0,0,0,24.5,0,24.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Gettin' Square",2003,100,NA,6.8,301,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Getting Acquainted",1914,16,NA,6.3,35,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Getting Away with Murder",1996,91,NA,3.9,255,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Getting Even with Dad",1994,109,NA,4.2,998,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Getting Gertie's Garter",1945,72,NA,6.6,28,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Getting Hal",2003,85,NA,6,5,44.5,0,0,0,0,0,0,24.5,0,44.5,"",1,0,1,0,0,0,0 -"Getting In",1994,94,NA,4.4,169,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Getting Into Heaven",1970,81,NA,3.5,20,14.5,24.5,14.5,14.5,4.5,0,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Getting It On",1983,96,NA,3,27,14.5,24.5,4.5,14.5,14.5,0,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Getting It Over with",1977,28,NA,7.8,5,0,24.5,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Getting It Right",1989,102,NA,6.5,197,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Getting Lucky",1990,85,NA,4.2,32,14.5,0,14.5,14.5,14.5,0,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Getting Off",1979,80,NA,5.5,6,0,0,0,14.5,34.5,14.5,0,34.5,0,0,"",0,0,0,0,0,0,0 -"Getting Out",2002,22,NA,8.2,6,0,14.5,0,0,0,0,0,14.5,14.5,45.5,"",0,0,1,1,0,1,1 -"Getting Out of Rhode Island",2003,103,NA,8.4,14,0,0,4.5,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Getting Started",1979,12,NA,6.3,51,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Getting Straight",1970,124,NA,6,159,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Getting Together",1976,110,NA,3.6,24,34.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Getting Wasted",1980,98,NA,4.2,19,24.5,14.5,0,4.5,4.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Getting a Ticket",1930,11,NA,6,7,0,0,0,0,45.5,14.5,0,0,14.5,14.5,"",0,0,1,0,0,0,1 -"Getting of Wisdom, The",1978,101,NA,6.5,70,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Getting to Know You",1999,96,NA,7,185,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Gettysburg",1993,259,25000000,7.5,5191,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Geu seome gago shibda",1993,102,NA,6.8,44,4.5,0,0,0,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Geu yeoja, geu namja",1993,109,NA,8,7,24.5,0,0,0,0,14.5,0,44.5,14.5,0,"",0,0,0,0,0,0,0 -"Geuddae geusaramdeul",2005,102,NA,6.8,17,14.5,0,0,4.5,4.5,0,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Geudeulmanui sesang",1996,106,NA,4,5,0,0,0,64.5,0,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Geuhurodo olaetdongan",1989,112,NA,7.6,6,0,0,0,0,0,14.5,14.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Geung si sin sang",1985,96,NA,7.6,396,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"PG-13",1,0,1,0,0,0,0 -"Gezeichneten, Die",1922,105,NA,7.4,9,0,0,14.5,0,0,34.5,34.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Gezin van Paemel, Het",1986,90,NA,6.9,64,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ggamdong",1988,118,NA,1.8,5,84.5,24.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Ggeol Deok-swi",1989,94,NA,1.8,5,84.5,24.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Ggobangdongne saramdeul",1982,108,NA,2.4,5,84.5,0,0,0,0,0,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Ggotip",1996,89,NA,8.1,35,0,0,0,0,0,4.5,14.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Ggotpineun bomi omyeon",2004,128,NA,7.4,43,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gharaana Mogudu",1992,149,NA,9,10,0,0,0,0,0,0,0,44.5,24.5,44.5,"",1,0,1,0,0,0,0 -"Gharam fi al-Karnak",1967,105,NA,3.4,8,0,24.5,14.5,14.5,14.5,24.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Ghare-Baire",1984,140,NA,7.8,95,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Ghastly Ones, The",1968,72,NA,4.1,37,24.5,4.5,4.5,4.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Ghayal",1990,163,NA,7.9,50,4.5,0,0,0,4.5,4.5,4.5,24.5,24.5,44.5,"",1,0,1,0,0,1,0 -"Ghazal al-banat",1949,120,NA,8.2,10,0,0,0,0,0,14.5,0,24.5,24.5,45.5,"",0,0,1,0,0,1,0 -"Ghetto",1997,122,NA,3.3,16,14.5,0,0,0,4.5,14.5,14.5,0,14.5,34.5,"",0,0,0,0,1,0,0 -"Ghosks Is the Bunk",1939,6,NA,6.7,9,0,0,0,0,24.5,0,45.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Ghost",1990,128,22000000,6.8,19005,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Ghost Bird: The Life and Art of Judith Deim",2000,54,NA,8.6,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,0,0,1,0,0 -"Ghost Breakers, The",1940,82,NA,7.5,320,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ghost Busters",1984,107,30000000,7.5,29762,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ghost Camera, The",1933,66,NA,6,26,0,0,4.5,14.5,14.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ghost Catchers",1944,68,NA,7.1,25,0,0,4.5,0,4.5,4.5,24.5,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Ghost Chasers",1951,69,NA,6.9,44,0,0,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Ghost Club, The",2003,85,NA,2.5,35,24.5,4.5,14.5,4.5,4.5,4.5,0,4.5,4.5,24.5,"PG",0,0,0,0,0,0,0 -"Ghost Comes Home, The",1940,79,NA,6,32,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Ghost Cop",2004,8,NA,4.4,6,34.5,0,14.5,0,14.5,0,0,34.5,0,0,"",0,0,0,0,0,0,1 -"Ghost Dad",1990,83,NA,3.8,1214,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ghost Dance",1983,100,NA,3.8,16,14.5,0,4.5,14.5,14.5,0,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Ghost Dog",1997,90,NA,5.1,65,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ghost Dog: The Way of the Samurai",1999,116,NA,7.5,13542,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",1,0,0,1,0,0,0 -"Ghost Fever",1987,86,NA,2.4,51,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ghost Goes Gear, The",1966,79,NA,4.2,15,4.5,14.5,24.5,24.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Ghost Goes West, The",1935,95,NA,6.8,151,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Ghost Goes Wild, The",1947,66,NA,6.3,6,0,0,0,14.5,0,14.5,64.5,0,0,0,"",0,0,1,0,0,0,0 -"Ghost Hunters: Point of Contact",2003,54,NA,5.9,7,14.5,0,0,14.5,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ghost Patrol",1936,60,NA,4.7,13,4.5,14.5,4.5,4.5,34.5,14.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Ghost Reader",2001,14,NA,7.2,8,64.5,0,0,0,0,0,0,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Ghost Riders",1987,85,NA,5,12,44.5,4.5,14.5,4.5,4.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Ghost Rock",2003,101,NA,3.4,97,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Ghost Ship",1952,74,NA,4.8,23,0,4.5,4.5,14.5,44.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Ghost Ship",2002,91,35000000,5.3,8399,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Ghost Ship, The",1943,69,NA,6.5,163,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ghost Story",1974,89,NA,4.6,41,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ghost Story",1981,110,NA,6,967,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ghost Talks, The",1949,16,NA,6.6,63,0,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Ghost Town",1956,77,100000,4.5,10,0,0,14.5,34.5,14.5,14.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Ghost Town",1988,85,NA,4.3,115,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ghost Town Renegades",1947,58,NA,6,9,0,0,0,14.5,0,84.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Ghost Train, The",1941,85,NA,5.8,109,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ghost Valley",1932,54,NA,6,21,4.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Ghost Walks, The",1934,69,NA,6.1,17,0,0,0,4.5,24.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ghost Wanted",1940,7,NA,7.2,18,0,0,0,4.5,0,34.5,14.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Ghost World",2000,111,7000000,7.8,17976,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Ghost and Mr. Chicken, The",1966,90,NA,6.8,658,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Ghost and Mrs. Muir, The",1947,104,NA,7.8,2058,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Ghost and the Darkness, The",1996,109,55000000,6.4,8360,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Ghost and the Guest, The",1943,61,NA,5,13,0,4.5,0,14.5,45.5,14.5,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Ghost in the Invisible Bikini, The",1966,82,NA,3.7,113,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ghost in the Machine",1993,104,NA,4.3,618,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ghost in the Noonday Sun",1973,90,NA,4.4,26,24.5,4.5,0,4.5,4.5,4.5,4.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Ghost of Dragstrip Hollow",1959,65,NA,3.5,49,14.5,24.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ghost of F. Scott Fitzgerald, The",2002,12,NA,4.6,13,0,0,4.5,4.5,24.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Ghost of Frankenstein, The",1942,67,NA,5.7,420,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ghost of Greville Lodge, The",2000,88,NA,5.5,28,14.5,0,4.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ghost of Hidden Valley",1946,56,NA,4.1,6,0,0,34.5,0,14.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Ghost of Slumber Mountain, The",1918,19,3000,5.3,14,0,0,0,24.5,34.5,4.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Ghost of St. Michael's, The",1941,82,NA,7.6,50,0,0,0,0,0,14.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Ghost of Stephen Foster",2000,4,NA,6.7,14,14.5,0,0,0,0,24.5,0,14.5,4.5,44.5,"",0,1,0,0,0,0,1 -"Ghost of Zorro",1949,167,NA,5.4,17,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ghost of Zorro",1959,69,NA,8,6,0,0,0,0,14.5,0,0,45.5,0,34.5,"",0,0,0,0,0,0,0 -"Ghost of the Needle",2003,86,NA,6.6,69,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"R",0,0,0,0,0,0,0 -"Ghost, The",2000,86,NA,4,87,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"GhostWatcher",2002,94,NA,4.1,183,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Ghostbite",1996,76,250000,3.8,14,64.5,0,0,0,0,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Ghostbusters II",1989,103,NA,5.7,14552,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,1,1,0,0,0,0 -"Ghostess with the Mostess, The",1988,75,NA,7.3,8,24.5,0,0,0,0,24.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Ghosthunter",2000,20,NA,5.7,23,4.5,4.5,0,4.5,4.5,0,0,4.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Ghosting, The",1992,110,NA,1.6,11,45.5,4.5,4.5,0,0,4.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Ghostkeeper",1981,88,NA,3.8,31,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Ghostlight",2003,80,NA,5,30,0,0,4.5,0,14.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Ghosts Can't Do It",1990,90,NA,2.2,331,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Ghosts That Still Walk",1977,92,NA,3,14,44.5,0,14.5,14.5,0,0,0,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ghosts of Attica",2001,90,NA,8.3,8,0,0,0,0,0,0,14.5,34.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Ghosts of Berkeley Square, The",1947,85,NA,6.3,24,0,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Ghosts of Edendale, The",2003,90,NA,4.7,154,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Ghosts of Hamilton Street",2003,106,NA,5.8,49,4.5,4.5,0,0,4.5,4.5,14.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Ghosts of Mars",2001,98,28000000,4.6,6368,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Ghosts of Mississippi",1996,130,36000000,6.4,2268,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ghosts of the Abyss",2003,43,13000000,6.6,664,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG",0,0,0,0,1,0,0 -"Ghosts on the Loose",1943,67,NA,4.8,171,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ghosts... of the Civil Dead",1988,93,NA,7.1,208,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ghoul, The",1933,77,NA,5.6,165,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ghoul, The",1975,88,NA,4.4,192,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ghoulies",1985,82,1000000,3.2,612,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ghoulies II",1987,89,NA,3.3,319,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ghoulies III: Ghoulies Go to College",1993,94,NA,3.2,162,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ghoulies IV",1994,84,NA,2.1,219,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ghouls, The",2003,81,9000,6.1,43,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Ghulam-E-Musthafa",1997,162,NA,6,13,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,0,"",1,0,0,1,0,0,0 -"Ghulami",1985,199,NA,7.1,20,0,0,0,0,14.5,0,14.5,14.5,14.5,45.5,"",1,0,0,0,0,0,0 -"Gia poion ktypa i koudouna",1968,82,NA,5.7,9,0,0,0,24.5,24.5,44.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Giallo a Venezia",1979,91,NA,5.4,42,14.5,0,4.5,4.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Giallo napoletano",1978,114,NA,4.6,25,4.5,4.5,4.5,4.5,34.5,4.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Gialloparma",1999,122,NA,2.5,6,64.5,0,0,0,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Giant",1956,201,5400000,7.5,4210,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Giant Claw, The",1957,75,NA,2.8,177,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Giant From the Unknown",1958,77,NA,4.6,43,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Giant Gila Monster, The",1959,74,138000,2.8,432,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Giant Spider Invasion, The",1975,84,300000,2.3,931,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Giant of Norway, The",1939,11,NA,5.2,5,0,44.5,0,0,24.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Giant of Thunder Mountain, The",1991,88,NA,5.5,43,14.5,4.5,0,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Giantland",1933,8,NA,7,25,0,0,0,4.5,4.5,14.5,45.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Giardini dell'Eden, I",1998,95,4000000,6.8,17,4.5,4.5,0,0,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Giardino dei Finzi-Contini, Il",1970,94,NA,7.7,742,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Gibel Otrara",1991,176,NA,8,19,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gibraltar",1938,105,NA,4.4,6,0,0,0,34.5,14.5,0,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Gideon",1999,96,NA,6.9,328,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,1,1,0,1,0 -"Gideon's Day",1958,118,NA,6.6,52,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gidget",1959,95,NA,6,391,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Gidget Goes Hawaiian",1961,101,NA,4.6,158,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Gidget Goes to Rome",1963,104,NA,4.4,103,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Gierig",1999,92,NA,5.4,14,24.5,4.5,4.5,0,14.5,24.5,0,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Gifle, La",1974,104,NA,5.9,163,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Gift",1966,96,NA,7.6,5,0,0,0,0,24.5,24.5,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Gift Horse",1952,100,NA,6.1,35,0,0,0,4.5,14.5,24.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Gift Wrapped",1952,7,NA,6.7,42,0,14.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Gift for Heidi, A",1958,71,NA,5.3,8,14.5,0,14.5,0,34.5,0,14.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Gift of Gab",1934,70,NA,3.6,15,4.5,14.5,24.5,4.5,14.5,14.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Gift of Love, The",1958,105,NA,5.7,57,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Gift of the Magi, The",1980,16,NA,6.2,7,0,0,0,0,14.5,14.5,44.5,14.5,0,14.5,"",0,0,0,1,0,0,1 -"Gift, The",1977,16,NA,8.4,11,0,0,0,0,0,0,24.5,4.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Gift, The",2000,111,10000000,6.8,12440,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Giftas",1955,74,NA,3.3,10,24.5,0,0,0,34.5,0,14.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Giftes - nej tak!",1936,101,NA,5.2,6,0,0,0,14.5,34.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Gig, The",1985,92,NA,6.6,56,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gigante di Metropolis, Il",1961,92,NA,3.8,23,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Giganti della Tessaglia, I",1960,95,NA,5.4,13,0,4.5,4.5,4.5,34.5,34.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Gigantic (A Tale of Two Johns)",2002,102,NA,7.8,261,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Giger's Alien",1979,34,NA,8.9,7,0,0,0,0,0,14.5,14.5,0,14.5,45.5,"",0,0,0,0,1,0,1 -"Giger's Necronomicon",1975,40,NA,8,5,0,0,0,0,44.5,0,0,0,0,64.5,"",0,0,0,0,1,0,1 -"Gigi",1949,82,NA,6.3,39,0,0,0,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gigi",1958,119,3319355,7,1956,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Gigli",2003,121,54000000,2.3,11285,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Gigot",1962,104,NA,6.7,296,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Gilberte de Courgenay",1941,115,NA,5.8,15,0,0,4.5,0,14.5,24.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Gilda",1946,110,NA,7.6,2525,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gilda Live",1980,96,NA,6.7,124,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,1,0,0 -"Gilded Lily, The",1935,80,NA,6.8,51,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Gilded Stones",2004,9,NA,7,7,0,0,0,0,0,14.5,0,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Gildersleeve on Broadway",1943,65,NA,5.4,8,0,14.5,0,24.5,0,0,24.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Gildersleeve's Bad Day",1943,63,NA,5.9,31,0,0,0,4.5,24.5,14.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gildersleeve's Ghost",1944,64,NA,5.5,32,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Giliap",1975,135,NA,4.6,118,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gilsoddeum",1986,100,NA,4.3,9,14.5,0,0,14.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gimaghin sanaedeul",1998,107,NA,6.9,9,14.5,0,0,0,0,24.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gimlet",1995,95,NA,5.3,43,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gimme Shelter",1970,91,NA,7.6,1229,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Gimme an 'F'",1984,93,NA,3.1,70,24.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gina",1975,95,NA,5.9,69,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Gina, an Actress, Age 29",2001,22,NA,6.7,27,24.5,4.5,0,0,4.5,0,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,1 -"Ginecologo della mutua, Il",1977,78,NA,4.1,21,4.5,14.5,4.5,24.5,0,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ginevra",1992,142,NA,8.6,5,0,0,0,0,0,24.5,24.5,24.5,44.5,0,"",0,0,0,1,0,0,0 -"Ging chaat goo si",1985,90,NA,7.4,1644,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Ging chaat goo si juk jaap",1988,92,NA,7,842,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Ginger",1971,102,NA,3,67,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ginger Lynn: The Movie",1988,80,NA,8.8,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Ginger Meggs",1982,100,NA,4.3,27,4.5,14.5,0,4.5,0,0,4.5,4.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Ginger Snaps",2000,110,5000000,6.8,3968,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ginger Snaps Back: The Beginning",2004,94,NA,6,610,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Ginger Snaps: Unleashed",2004,94,3500000,6.6,1118,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Ginger e Fred",1986,125,NA,7,548,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ginger in the Morning",1974,90,NA,4.9,24,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,0,14.5,"",0,0,1,1,0,1,0 -"Gingerbread Man, The",1998,114,25000000,5.7,2806,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Gino",1994,89,NA,4.3,5,0,0,0,44.5,24.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Ginostra",2002,135,NA,4.6,170,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ginrei no hate",1947,89,NA,7.9,16,0,0,4.5,0,4.5,0,14.5,24.5,0,45.5,"",1,0,0,1,0,0,0 -"Ginza gesho",1951,87,NA,7.3,15,0,0,0,4.5,0,14.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Giocattolo, Il",1979,118,NA,6.1,37,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gion bayashi",1953,90,NA,7.7,85,0,0,0,0,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Gion no shimai",1936,95,NA,8.1,163,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Giordano Bruno",1973,114,NA,6.8,42,4.5,0,0,4.5,4.5,14.5,4.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Giorgino",1994,177,NA,6.4,118,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Giornata balorda, La",1960,84,NA,8.7,7,0,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Giornata particolare, Una",1977,110,NA,7.5,847,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Giorni",2001,90,NA,6.7,100,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Giorni d'amore",1954,98,NA,6.5,13,0,0,0,0,24.5,14.5,4.5,34.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Giorni del commissario Ambrosio, I",1988,96,NA,6.3,6,0,14.5,0,0,0,14.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Giorni dell'amore e dell'odio, I",2001,100,NA,3.5,6,64.5,0,0,14.5,0,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Giorni dell'ira, I",1968,111,NA,7,91,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Giorni di gloria",1945,71,NA,8.1,7,0,0,0,0,0,24.5,14.5,0,14.5,44.5,"",0,0,0,0,1,0,0 -"Giorni dispari",2000,87,NA,6.9,11,0,0,0,0,0,24.5,24.5,34.5,0,4.5,"",0,0,0,0,0,0,0 -"Giorno del Cobra, Il",1980,91,NA,5.5,28,0,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,0,"",1,0,0,0,0,0,0 -"Giorno della civetta, Il",1968,112,NA,6.8,46,0,0,0,0,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Giorno della prima di Close Up, Il",1996,7,NA,7.7,51,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Giorno in pretura, Un",1954,88,NA,7.1,29,0,0,0,0,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Giorno prima, Il",1987,106,NA,5.8,40,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Giovane Toscanini, Il",1988,109,14000000,4.7,36,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Giovane normale, Il",1969,98,NA,6.8,5,0,0,24.5,0,0,24.5,24.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Giovani",2003,90,NA,5,5,24.5,0,0,24.5,0,24.5,44.5,0,0,0,"",0,0,0,1,0,1,0 -"Giovani e belli",1996,90,NA,2.6,9,44.5,0,14.5,0,24.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Giovani mariti",1957,98,NA,6.2,16,0,0,0,24.5,4.5,34.5,4.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Giovani, belle... probabilmente ricche",1982,88,NA,5,5,0,24.5,0,44.5,0,0,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Giovanna d'Arco al rogo",1954,80,NA,3.9,13,24.5,0,4.5,0,14.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Giovanni Falcone",1993,124,NA,6.7,23,0,0,4.5,4.5,4.5,0,34.5,4.5,4.5,34.5,"",0,0,0,1,1,0,0 -"Giovannona coscialunga, disonorata con onore",1973,94,NA,6.2,41,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Giovedi, Il",1963,100,NA,7.8,15,0,0,0,0,4.5,4.5,24.5,44.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Gipgo puleun bam",1985,93,NA,5.5,6,34.5,0,0,0,14.5,0,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Gipusu",2001,83,NA,6.3,6,0,0,0,0,34.5,0,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Giraffe, Le",2000,84,NA,3.8,5,44.5,0,0,0,24.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Girafot",2001,115,NA,8.6,22,0,0,0,4.5,0,0,14.5,4.5,34.5,34.5,"",1,0,0,1,0,0,0 -"Girasoli, I",1970,98,NA,6.6,150,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Giravolte",2001,85,NA,5.5,6,14.5,0,0,0,34.5,34.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Girl",1998,99,NA,5.7,896,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Girl 6",1996,108,12000000,5,1453,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Girl Can't Help It, The",1956,99,NA,6.7,361,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Girl Chewing Gum, The",1976,12,NA,7.2,26,0,0,0,0,14.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Girl Crazy",1932,75,NA,6.7,42,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Girl Crazy",1943,99,1140850,7,181,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Girl Downstairs, The",1938,77,NA,6.2,10,0,0,0,24.5,0,44.5,24.5,24.5,0,0,"",0,0,1,0,0,1,0 -"Girl Fever",2002,98,NA,4.7,434,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Girl From Monday, The",2005,84,NA,4.6,76,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Girl From Tobacco Row, The",1966,87,NA,3.7,12,14.5,4.5,14.5,0,4.5,4.5,0,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Girl Gang",1954,63,NA,4.7,21,24.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Girl Gets Moe, The",1997,102,NA,4.5,60,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Girl Go Boom",2000,3,NA,5.5,15,4.5,14.5,14.5,0,4.5,14.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Girl Grief",1932,20,NA,7.9,5,0,0,0,24.5,0,0,44.5,24.5,24.5,0,"",0,0,1,0,0,0,1 -"Girl Guide",1995,93,NA,4.8,48,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Girl Happy",1965,96,NA,5,263,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Girl He Left Behind, The",1956,103,NA,5.8,25,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Girl Hunters, The",1963,98,NA,5.2,78,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Girl Is a Girl, A",1999,87,NA,5.8,63,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Girl King",2002,80,NA,4.8,16,14.5,4.5,4.5,0,14.5,4.5,4.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Girl Missing",1933,69,107000,6.1,33,0,0,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Girl Most Likely, The",1957,98,NA,5.8,53,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Girl Must Live, A",1939,92,NA,5.9,10,0,0,14.5,14.5,0,45.5,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Girl Named Tamiko, A",1963,110,NA,5.3,16,0,0,4.5,14.5,44.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Girl Next Door, The",1953,92,NA,6.5,21,0,0,0,4.5,4.5,24.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Girl Next Door, The",2004,110,NA,6.8,10452,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"R",0,0,1,0,0,1,0 -"Girl Play",2004,80,1000000,3.3,63,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Girl Rush",1944,65,NA,4.4,32,4.5,0,14.5,24.5,34.5,4.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Girl Rush, The",1955,85,NA,5,24,4.5,0,4.5,24.5,14.5,34.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Girl Said No, The",1930,92,NA,6.7,16,14.5,14.5,0,0,4.5,0,24.5,4.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Girl Shy",1924,80,NA,7.9,246,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,1,0,0,1,0 -"Girl Stroke Boy",1971,86,NA,3,7,14.5,0,14.5,14.5,0,44.5,0,14.5,0,0,"",0,0,1,1,0,0,0 -"Girl Trouble",1942,81,NA,5.8,7,0,0,0,14.5,14.5,45.5,0,0,14.5,0,"",0,0,1,0,0,0,0 -"Girl Under the Waves, The",2001,80,NA,6.8,16,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Girl Who Came Late, The",1991,82,NA,5,45,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Girl Who Dared, The",1944,56,NA,6,9,0,0,0,24.5,24.5,44.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Girl Who Had Everything, The",1953,69,NA,4.8,55,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Girl Who Knew Too Much, The",1969,95,NA,5.8,8,0,0,14.5,14.5,0,0,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Girl Who Stayed at Home, The",1919,60,NA,7.4,12,0,4.5,0,0,4.5,4.5,44.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Girl Without a Room",1933,78,NA,6.9,8,0,0,0,0,0,14.5,34.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Girl Wrestler",2003,56,230000,8,8,0,0,0,0,14.5,0,24.5,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Girl and Her Trust, The",1912,17,NA,7.6,125,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Girl and the Gambler, The",1939,63,NA,4.1,6,14.5,0,14.5,14.5,34.5,0,14.5,0,0,0,"",0,0,1,1,0,0,0 -"Girl for Girl",2000,91,NA,3.5,35,14.5,4.5,4.5,4.5,14.5,4.5,0,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Girl from 10th Avenue, The",1935,69,NA,6.6,121,0,4.5,4.5,4.5,4.5,14.5,4.5,24.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Girl from Calgary, The",1932,64,NA,8.7,5,0,0,0,0,24.5,0,24.5,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Girl from Jones Beach, The",1949,78,NA,4.5,76,14.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Girl from Mexico, The",1939,71,NA,5.7,15,0,0,4.5,0,4.5,14.5,34.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Girl from Missouri, The",1934,70,511000,6.5,131,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Girl from Petrovka, The",1974,103,NA,5,52,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Girl from S.E.X., The",1982,88,NA,6.1,6,0,0,0,0,14.5,34.5,0,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Girl in Black Stockings, The",1957,73,NA,6.1,41,0,0,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Girl in Every Port, A",1928,62,NA,6.2,58,4.5,4.5,0,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Girl in Every Port, A",1952,86,NA,4.9,72,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Girl in Gold Boots",1969,94,NA,1.8,913,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Girl in Lovers Lane, The",1959,78,NA,2.1,98,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Girl in Room 13",1961,79,NA,6.5,6,0,14.5,0,0,0,14.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Girl in White, The",1952,92,NA,6,33,0,0,0,14.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Girl in a Swing, The",1988,119,NA,4.5,166,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Girl in the Cadillac",1995,89,NA,4.5,60,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Girl in the Kremlin, The",1957,81,NA,3.4,11,14.5,0,14.5,0,0,14.5,4.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Girl in the Lay-By, The",2000,10,NA,7,6,0,0,0,0,0,34.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Girl in the News",1941,78,NA,6.5,14,0,0,0,4.5,0,24.5,34.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Girl in the Picture, The",1986,84,NA,5.2,36,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,0,"",0,0,1,0,0,1,0 -"Girl in the Red Dress, The",2002,12,NA,6.2,10,14.5,0,14.5,14.5,24.5,0,44.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Girl in the Red Velvet Swing, The",1955,104,NA,6.5,69,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Girl of Silence, The",1995,90,NA,6,6,0,0,0,0,45.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Girl of the Golden West, The",1938,121,NA,6.1,71,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Girl of the Night",1960,93,NA,5.6,7,0,0,14.5,0,14.5,24.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Girl on a Chain Gang",1965,96,NA,6.1,7,14.5,0,14.5,14.5,0,24.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Girl on a Motocycle, The",1968,91,NA,5.1,240,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Girl on the Boat, The",1962,90,NA,5.3,16,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Girl on the Bridge, The",1951,76,NA,5.2,6,14.5,0,0,0,0,0,34.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Girl on the Run",1958,77,NA,7.7,10,0,0,0,0,14.5,14.5,14.5,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Girl on the Run",1985,75,NA,4.5,5,0,0,0,24.5,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Girl with Brains in Her Feet, The",1997,98,NA,5.3,29,4.5,4.5,0,4.5,4.5,14.5,34.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Girl with Green Eyes",1964,91,NA,6.5,81,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Girl with a Pearl Earring",2003,100,NA,7.3,6391,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Girl with the Hungry Eyes, The",1995,84,NA,4.2,50,24.5,14.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Girl's Best Years, A",1937,19,NA,5.2,9,0,0,0,24.5,34.5,24.5,14.5,0,14.5,0,"",0,0,1,0,0,1,1 -"Girl's Folly, A",1917,30,NA,7.1,21,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Girl's Own Story, A",1984,27,NA,6.7,61,4.5,4.5,4.5,0,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Girl, Interrupted",1999,127,24000000,7,16362,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Girl, The",1986,105,NA,6.3,19,0,4.5,14.5,4.5,0,34.5,24.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Girl, a Guy, and a Gob, A",1941,90,NA,6.4,35,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Girl, the Body, and the Pill, The",1967,80,NA,2,11,45.5,0,0,0,4.5,4.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Girlfight",2000,110,NA,7,2418,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Girlfriend from Hell",1990,92,NA,4,78,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Girlfriends",1978,86,NA,6,59,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Girlfriends",1993,69,NA,4.6,5,0,44.5,0,0,0,44.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Girlhood",2003,82,NA,7.3,49,0,0,0,4.5,4.5,4.5,34.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Girls",1980,95,NA,4.5,15,0,0,24.5,24.5,24.5,4.5,4.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Girls About Town",1931,66,NA,7.1,22,0,0,0,0,4.5,14.5,4.5,24.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Girls Are for Loving",1973,90,NA,4.3,43,4.5,4.5,4.5,4.5,4.5,14.5,4.5,0,4.5,44.5,"",0,0,0,1,0,0,0 -"Girls Come First",1975,43,NA,1.5,5,24.5,24.5,24.5,0,24.5,0,0,0,0,24.5,"",0,0,1,0,0,0,1 -"Girls Demand Excitement",1931,69,NA,3.7,13,34.5,4.5,4.5,4.5,0,0,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Girls Guitar Club, The",2001,14,NA,6.4,16,14.5,0,0,0,14.5,0,14.5,14.5,0,44.5,"",0,0,1,0,0,0,1 -"Girls Just Want to Have Fun",1985,90,NA,5.4,1346,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Girls Like Us",1997,60,NA,6.7,20,0,0,4.5,0,0,24.5,34.5,34.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Girls Night Out",1997,32,NA,4.9,15,14.5,0,4.5,0,4.5,4.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Girls Nite Out",1984,96,NA,3,55,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Girls School Screamers",1986,84,NA,3.1,69,24.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Girls Taking Time Checks",1904,3,NA,3.3,9,14.5,0,24.5,14.5,24.5,0,0,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Girls Town",1959,90,NA,3.1,134,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Girls Town",1996,90,NA,5.9,283,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Girls U.S.A.",1980,71,NA,4.7,5,24.5,0,0,0,44.5,24.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Girls Winding Armatures",1904,2,NA,2.8,7,14.5,14.5,24.5,24.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Girls and Daddy, The",1909,15,NA,4.9,8,14.5,0,14.5,0,14.5,24.5,24.5,0,14.5,0,"",0,0,0,1,0,0,1 -"Girls in Chains",1943,75,NA,1.8,7,24.5,24.5,14.5,0,14.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Girls in Prison",1956,87,NA,4.7,22,4.5,0,4.5,14.5,24.5,34.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Girls of Pleasure Island, The",1953,95,NA,6,23,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Girls of the A Team, The",1985,89,NA,5.4,7,0,0,0,0,14.5,0,14.5,0,0,74.5,"",0,0,0,0,0,0,0 -"Girls on Fire",1984,82,NA,5.3,12,4.5,0,4.5,4.5,24.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Girls on Probation",1938,63,NA,2.7,21,44.5,4.5,0,4.5,14.5,4.5,0,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Girls on the Beach, The",1965,80,NA,4.4,62,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Girls on the Loose",1958,77,NA,5.1,7,0,0,14.5,14.5,0,14.5,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Girls on the Road",1972,76,NA,2.9,12,24.5,24.5,14.5,0,0,0,0,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Girls! Girls! Girls!",1962,106,NA,4.6,320,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Girls' Dormitory",1936,66,NA,5.4,10,0,24.5,14.5,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,1,0,1,0 -"Girls' Night",1998,102,NA,6.8,250,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Girls' Room, The",2000,101,NA,5.6,58,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Girltalk",1987,85,NA,6.1,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Giro City",1982,102,NA,5.3,9,0,0,0,24.5,24.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Giro di lune tra terra e mare",1997,124,NA,8.8,19,4.5,0,0,0,0,14.5,4.5,14.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Girolimoni, il mostro di Roma",1972,98,NA,6.3,27,0,0,0,4.5,24.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Gisele Kerozene",1989,5,NA,6.5,81,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Giselle",1983,90,NA,3.4,16,24.5,14.5,4.5,0,0,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Giselle",1991,92,NA,5.4,6,0,0,0,0,34.5,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Gishiki",1971,123,NA,8,48,0,4.5,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Git Along, Little Dogies",1937,68,NA,5.7,17,0,4.5,0,14.5,14.5,44.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Gitan, Le",1975,102,NA,6.7,133,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Gitane, La",1986,95,NA,4.5,26,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Gitanes",1997,8,NA,5.8,9,0,0,14.5,0,0,64.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Gitanjali",1989,142,NA,7.7,46,14.5,0,0,4.5,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Gitano",2000,106,NA,4.6,66,24.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Gitarrmongot",2004,89,NA,6,6,14.5,0,0,0,0,0,45.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Giubbe rosse",1974,88,NA,6.4,6,0,0,0,0,34.5,0,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Giudice ragazzino, Il",1994,92,NA,6.4,17,4.5,0,0,4.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Giudizio universale, Il",1961,100,NA,6.4,56,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Giugno '44 - Sbarcheremo in Normandia",1968,96,NA,2,5,24.5,44.5,44.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Giulia e Giulia",1987,98,NA,4.9,211,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Giulietta degli spiriti",1965,137,NA,7.3,1091,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Giulietta e Romeo",1996,90,NA,6.4,6,0,0,0,14.5,0,0,14.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Giulio Cesare, il conquistatore delle Gallie",1962,103,NA,5.7,13,4.5,0,0,4.5,24.5,34.5,14.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Giuseppe Verdi",1953,118,NA,5.8,12,0,0,0,14.5,0,14.5,4.5,0,24.5,34.5,"",0,0,0,1,0,1,0 -"Giustiziere dei mari, Il",1961,90,NA,4.9,7,14.5,0,0,14.5,24.5,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Giustiziere del Bronx, Il",1989,85,NA,3.8,33,34.5,24.5,24.5,4.5,0,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Giv'a 24 Eina Ona",1955,101,NA,6,19,4.5,0,0,4.5,4.5,14.5,34.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Giv'at Halfon Eina Ona",1975,92,NA,8.3,164,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Give 'em Hell, Harry!",1975,104,NA,7.3,77,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Give It to Me White Boy",2001,5,NA,4.6,5,24.5,0,0,0,0,24.5,24.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Give Me Liberty",1936,21,NA,6.1,12,0,0,0,14.5,0,0,45.5,0,0,34.5,"",0,0,0,1,0,0,1 -"Give Me Your Heart",1936,88,NA,6.5,16,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Give Me a Sailor",1938,80,NA,6.4,42,0,0,0,4.5,4.5,44.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Give My Regards to Broad Street",1984,108,9000000,4.1,320,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Give My Regards to Broadway",1948,92,NA,6,21,0,0,0,0,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Give Up Yer Aul Sins",2001,5,NA,7.2,73,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Give Us This Day",1949,120,NA,8.2,37,0,0,4.5,0,4.5,14.5,4.5,14.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Give Us Wings",1940,62,NA,5.5,7,0,0,0,24.5,24.5,24.5,0,14.5,0,0,"",0,0,1,1,0,0,0 -"Give Us the Earth!",1947,21,NA,5.9,7,0,0,0,0,14.5,14.5,0,24.5,0,44.5,"",0,0,0,0,1,0,1 -"Give Us the Moon",1944,95,NA,4.9,19,0,14.5,14.5,4.5,14.5,24.5,0,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Give a Girl a Break",1953,82,NA,5.6,61,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Give and Take, and Take",2003,80,18000,7.1,16,14.5,0,0,0,14.5,0,0,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Give and Tyke",1957,6,NA,7,6,0,0,0,14.5,0,0,14.5,14.5,34.5,14.5,"",0,1,1,0,0,0,1 -"Giving It Up",1999,90,NA,4,111,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Giving Tree, The",2000,89,NA,4.5,145,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Gizmo!",1977,77,NA,7.1,96,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,1,0,1,0,0 -"Gjest Baardsen",1939,99,NA,6.8,38,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Glaadiator",2002,9,NA,6.8,31,4.5,4.5,0,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Glad Rags to Riches",1932,10,NA,6.5,16,0,0,0,14.5,4.5,14.5,4.5,34.5,0,24.5,"",0,0,1,0,0,0,1 -"Gladiator",1992,101,NA,5.7,1012,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Gladiator",2000,155,103000000,8,92495,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",1,0,0,1,0,0,0 -"Gladiator Cop",1995,92,NA,2.7,88,34.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,14.5,"R",1,0,0,0,0,0,0 -"Gladiator, The",1938,72,NA,6.9,19,14.5,4.5,4.5,4.5,0,34.5,0,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Gladiatore invincibile, Il",1962,90,NA,4.4,6,14.5,0,34.5,0,14.5,0,0,34.5,0,0,"",1,0,0,0,0,0,0 -"Gladiatorerna",1969,90,NA,6.1,15,0,0,0,14.5,24.5,24.5,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Gladiatrici, Le",1963,84,NA,7.8,11,0,24.5,4.5,0,4.5,0,4.5,4.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Glaive et la balance, Le",1963,131,NA,6.9,21,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Glam",2001,92,NA,2.8,65,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"NC-17",0,0,0,0,0,0,0 -"Glamour",1934,74,NA,5.2,7,0,0,14.5,14.5,14.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Glamour",2000,115,NA,4.3,25,14.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Glaneurs et la glaneuse, Les",2000,82,NA,7.3,532,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Glanz von Berlin, Der",2002,91,NA,7,16,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Glas",1958,11,NA,7.2,74,4.5,4.5,4.5,4.5,4.5,0,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Glas Wasser, Das",1960,81,NA,8.8,20,0,0,0,0,4.5,4.5,0,14.5,44.5,34.5,"",0,0,1,0,0,0,0 -"Glasberget",1953,101,NA,7.8,5,0,0,0,0,44.5,0,0,64.5,0,0,"",0,0,0,1,0,0,0 -"Glass Alibi, The",1946,68,NA,7.2,5,0,24.5,0,0,0,44.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Glass Bottom Boat, The",1966,110,NA,6,513,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Glass Cage, The",1955,59,NA,5.1,7,0,0,14.5,14.5,0,24.5,14.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Glass Cage, The",1964,84,NA,5.5,10,0,0,0,24.5,14.5,24.5,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Glass Cage, The",1996,96,NA,4.2,61,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Glass Jar, The",1999,92,NA,5.1,14,14.5,0,0,4.5,14.5,4.5,0,4.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Glass Key, The",1935,80,NA,6.2,33,0,4.5,0,4.5,14.5,24.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Glass Key, The",1942,85,NA,7.3,426,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Glass Menagerie, The",1950,107,NA,6.9,234,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Glass Menagerie, The",1987,134,NA,7.2,423,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Glass Mountain, The",1949,88,NA,6,14,0,0,0,0,4.5,4.5,24.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Glass Shield, The",1994,109,NA,6,341,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Glass Slipper, The",1955,93,NA,5.8,133,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Glass Wall, The",1953,82,NA,6.1,22,0,0,0,0,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Glass Web, The",1953,78,NA,6.1,46,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Glasses",2001,25,NA,4.7,5,24.5,0,24.5,24.5,24.5,24.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Glastonbury the Movie",1995,96,NA,5.4,12,0,4.5,4.5,0,0,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Glatzkopfbande, Die",1963,74,NA,6.3,6,0,0,14.5,0,0,14.5,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Glauber o Filme, Labirinto do Brasil",2003,98,NA,6.9,20,0,0,0,0,0,24.5,34.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Glaze of Cathexis",1990,3,NA,7,36,4.5,4.5,0,4.5,4.5,24.5,34.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Gleaming the Cube",1989,105,NA,5.4,1062,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Glen & Glenda",1994,74,NA,4.2,14,34.5,0,0,0,24.5,14.5,4.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Glen and Randa",1971,93,NA,4.4,39,14.5,14.5,0,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Glen or Glenda",1953,69,NA,3.4,1533,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Glengarry Glen Ross",1992,100,NA,7.8,11485,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Glenn Gould: Off the Record",1959,30,NA,7.6,8,0,0,0,0,0,14.5,14.5,45.5,0,24.5,"",0,0,0,0,1,0,1 -"Glenn Gould: On the Record",1959,30,NA,7.5,8,0,0,0,0,0,24.5,0,34.5,0,34.5,"",0,0,0,0,1,0,1 -"Glenn Miller Story, The",1953,115,NA,7.2,1181,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Glenn Tilbrook: One for the Road",2004,70,50000,7,9,24.5,0,0,0,0,0,14.5,34.5,0,34.5,"",0,0,0,0,1,0,0 -"Glenroy Bros., No. 2",1894,1,NA,4.2,15,0,4.5,24.5,34.5,24.5,0,4.5,0,0,4.5,"",0,0,0,0,1,0,1 -"Glenroy Brothers (Comic Boxing)",1894,1,NA,5.4,97,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,0,0,1,0,1 -"Glimmer Man, The",1996,88,NA,4.8,2606,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Glimpse of the San Diego Exposition, A",1915,7,NA,4.9,5,0,0,0,24.5,64.5,0,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Glimpses of Florida",1941,10,NA,5.7,9,0,0,0,24.5,14.5,64.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Glimpses of Old England",1949,9,NA,5.3,7,0,0,0,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Glimpses of Ontario",1942,9,NA,6,5,0,0,0,0,24.5,24.5,44.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Glissando",1985,165,NA,9.8,37,4.5,0,0,0,0,0,4.5,4.5,14.5,74.5,"",0,0,1,1,0,0,0 -"Glissando",2002,72,NA,7.6,5,0,24.5,0,0,0,0,0,44.5,0,44.5,"",0,0,0,1,0,0,0 -"Glitch!",1988,88,NA,3,50,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Glitter",2001,104,22000000,2.1,5209,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Glitterball",1977,56,NA,6.7,23,0,0,0,14.5,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Glitterbug",1994,60,NA,6.4,20,4.5,0,0,0,0,14.5,24.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Global Affair, A",1964,84,NA,5.1,53,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Global Effect",2002,92,NA,5.2,54,4.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Global Heresy",2002,106,12000000,5.7,373,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Glocken aus der Tiefe",1993,60,NA,8.1,12,0,0,0,0,0,0,44.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Glomdalsbruden",1926,74,NA,5.8,11,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,0,"",0,0,0,1,0,1,0 -"Gloomy Sunday - Ein Lied von Liebe und Tod",1999,113,NA,7.4,747,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Gloria",1980,123,NA,6.8,929,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gloria",1999,108,30000000,4.9,1144,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Glorifying the American Girl",1929,87,NA,5.7,44,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Glorious",2004,7,NA,8.7,6,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Glory",1956,100,NA,5.7,49,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Glory",1989,122,18000000,8.1,21861,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Glory Alley",1952,79,NA,5.7,36,0,0,4.5,14.5,24.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Glory Brigade, The",1953,82,NA,6,70,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Glory Days",1979,65,NA,8.1,61,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",1,0,0,1,0,0,0 -"Glory Daze",1996,100,NA,5.4,770,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Glory Guys, The",1965,112,NA,5.6,52,0,0,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Glory Stompers, The",1968,85,NA,5.4,28,4.5,14.5,4.5,14.5,0,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Gloutonnes, Les",1973,80,NA,4.3,6,0,34.5,14.5,0,0,0,0,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Glove Taps",1937,11,NA,8.3,24,0,0,0,0,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Glove, The",1978,90,NA,4.6,35,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Glove, The",2003,11,4500,7.2,7,14.5,0,0,0,0,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Glut",1984,112,NA,5.7,10,0,0,0,14.5,0,0,14.5,34.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Gluvi barut",1990,116,NA,8.4,19,0,0,0,0,0,0,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Glykia symmoria",1983,154,NA,7.9,75,0,0,0,4.5,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Gmar Gavi'a",1991,105,800000,7.5,38,0,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gniew",1998,89,NA,4.7,14,4.5,4.5,14.5,24.5,14.5,4.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Gnome Named Gnorm, A",1992,84,NA,3.4,174,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Gnome-Mobile, The",1967,84,NA,5.9,226,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Go",1999,103,6500000,7.4,20663,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Go",2001,122,NA,7.9,411,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Go Away Stowaway",1967,6,NA,6.5,10,0,0,0,0,24.5,14.5,44.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Go Chase Yourself",1938,75,NA,5.7,17,0,0,0,0,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Go Down Death",1944,56,NA,5.8,15,0,4.5,0,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Go Fish",1994,84,15000,5.8,621,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,0,0,1,0 -"Go Fly a Kit",1957,7,NA,6.6,23,0,0,0,4.5,14.5,4.5,34.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Go Further",2003,80,NA,5.8,84,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,1,0,0 -"Go Getter, The",1937,92,NA,6.6,17,0,0,0,0,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Go Go Amigo",1965,6,NA,7.3,18,0,0,14.5,4.5,0,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Go Into Your Dance",1935,89,NA,6.3,54,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Go Naked in the World",1961,103,NA,5,45,0,0,14.5,14.5,24.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Go Now",1995,81,NA,7.2,362,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Go Tell the Spartans",1978,114,NA,6.7,335,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Go Tigers!",2001,103,NA,7.7,353,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"R",0,0,0,0,1,0,0 -"Go Trabi Go 2",1992,93,NA,3.9,43,14.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Go West",1925,65,NA,7.3,261,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Go West",1940,80,NA,6.7,683,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Go West Young Man",1936,82,NA,6.4,41,0,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Go West, Young Lady",1941,70,NA,5.4,26,4.5,0,0,0,0,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Go West, Young Man!",2003,84,NA,7,12,0,4.5,0,0,0,24.5,34.5,24.5,0,4.5,"",0,0,0,0,1,0,0 -"Go for Broke",2002,85,NA,4.8,29,0,4.5,14.5,4.5,14.5,24.5,24.5,4.5,0,14.5,"R",0,0,1,0,0,0,0 -"Go for Broke!",1951,92,NA,6.9,157,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Go for Gold!",1997,100,NA,3.8,19,14.5,0,24.5,0,14.5,14.5,4.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Go to Hell",1999,90,NA,5.5,30,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Go, Johnny, Go!",1959,75,NA,5.4,34,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Go, Man, Go!",1954,82,NA,5.8,30,4.5,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Go-Between, The",1970,118,1000000,7.3,454,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Go-Con! Japanese Love Culture",2000,100,NA,6.8,45,4.5,14.5,0,4.5,0,14.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Go-Go-Girl vom Blow Up, Das",1969,92,NA,4,7,0,14.5,24.5,14.5,14.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Go-get-'em Haines",1936,61,NA,6.1,9,0,14.5,0,0,0,44.5,34.5,14.5,0,0,"",1,0,0,0,0,0,0 -"GoBots: War of the Rock Lords",1986,75,NA,4,87,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Goal Atzmi",1996,16,NA,6.9,7,0,0,14.5,0,0,24.5,0,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Goal Club",2001,99,NA,9.2,13,0,0,0,0,0,0,14.5,14.5,4.5,64.5,"",1,0,0,1,0,0,0 -"Goal! The World Cup",1966,107,NA,6.2,24,0,0,0,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Goat on Fire and Smiling Fish",1999,90,40000,6.3,254,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,1,0 -"Goat, The",1921,23,NA,8.2,122,0,0,0,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Gobbo, Il",1960,103,NA,6.5,6,0,0,0,14.5,34.5,0,0,14.5,0,34.5,"",0,0,0,1,0,0,0 -"God Has a Rap Sheet",2003,118,NA,5.4,45,14.5,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"God Is My Co-Pilot",1945,90,NA,6.5,115,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"God Is My Partner",1957,82,NA,4.3,5,24.5,0,0,0,44.5,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"God Made Man",2000,88,NA,6.7,11,14.5,0,0,0,4.5,4.5,0,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"God Respects Us When We Work, But Loves Us When We Dance",1968,20,NA,8.4,6,14.5,0,0,0,0,0,45.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"God Said, 'Ha!'",1998,85,NA,7.2,286,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"God Told Me To",1976,91,NA,6.3,333,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"God of Day Had Gone Down Upon Him, The",2000,50,NA,7.4,6,0,0,0,0,0,0,34.5,14.5,45.5,0,"",0,0,0,0,0,0,0 -"God sobaki",1993,133,NA,7.5,16,0,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"God's Army",2000,108,300000,6.4,354,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"PG",0,0,0,1,0,0,0 -"God's Country",1946,64,NA,6,6,0,0,14.5,34.5,0,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"God's Country and the Man",1931,59,NA,7.8,5,0,0,24.5,0,0,0,44.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"God's Country and the Woman",1937,85,NA,5.9,35,0,0,0,14.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"God's Dominion: In the Name of the Father",1993,51,NA,2.8,8,24.5,14.5,0,14.5,0,14.5,0,0,24.5,14.5,"",0,0,0,0,1,0,0 -"God's Gift to Women",1931,72,NA,3.9,40,4.5,14.5,14.5,14.5,4.5,24.5,14.5,4.5,4.5,0,"",0,0,1,0,0,1,0 -"God's Helper",2001,10,15000,7,16,0,4.5,0,0,0,0,24.5,0,0,64.5,"",0,0,0,1,0,0,1 -"God's Little Acre",1958,118,NA,6.8,175,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"God's Lonely Man",1996,101,NA,6.1,68,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"God's Outlaw",1986,93,NA,7.5,8,0,0,0,0,14.5,0,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"God's Step Children",1938,105,NA,5.2,15,24.5,0,0,14.5,14.5,0,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"God, Sex & Apple Pie",1998,97,NA,4.1,125,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,"R",0,0,1,1,0,0,0 -"God, The",2003,4,NA,6.6,11,4.5,0,0,0,4.5,0,24.5,34.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Goda viljan, Den",1992,180,NA,7.5,540,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Godass",2000,73,NA,4.6,22,4.5,14.5,4.5,4.5,14.5,14.5,14.5,0,14.5,4.5,"",0,0,0,1,0,0,0 -"Goddess of 1967, The",2000,119,NA,7.1,447,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Goddess of Spring, The",1934,9,NA,6.2,38,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Goddess, The",1958,104,NA,6.9,59,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gode og det onde, Det",1975,78,NA,6,10,14.5,0,14.5,24.5,0,0,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Godelureaux, Les",1961,99,NA,5.3,12,0,4.5,0,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Godfather Comes to Sixth St., The",1975,27,NA,6.7,7,14.5,0,14.5,0,14.5,0,0,14.5,0,44.5,"",0,0,0,0,0,0,1 -"Godfather, The",1972,175,6000000,9.1,122755,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Godfather: Part II, The",1974,200,13000000,8.9,71363,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Godfather: Part III, The",1990,169,54000000,7.3,22385,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Godmoney",1997,99,NA,5.1,73,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Godmonster of Indian Flats",1973,89,NA,2.9,49,34.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Godmother",1999,150,NA,5.8,29,4.5,0,4.5,4.5,0,4.5,4.5,24.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Gods Must Be Crazy II, The",1989,98,NA,5.9,1252,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gods Must Be Crazy, The",1980,109,NA,6.8,5581,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Gods and Generals",2003,209,56000000,5.7,3002,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG-13",1,0,0,1,0,0,0 -"Gods and Monsters",1998,105,3500000,7.6,9020,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Gods of Times Square, The",1999,93,NA,6.1,20,14.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Godsend",2004,102,NA,4.8,3981,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Godsend, The",1980,93,NA,3.6,71,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Godsend: The Evil Decimation",1999,58,NA,5.2,21,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Godson, The",1971,75,NA,4.1,21,34.5,14.5,4.5,4.5,4.5,4.5,24.5,4.5,0,0,"",1,0,0,1,0,0,0 -"Godson, The",1998,100,NA,2.8,397,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Godson, The",1999,28,NA,3.5,31,14.5,4.5,4.5,4.5,4.5,0,0,4.5,4.5,45.5,"",0,0,1,0,0,0,1 -"Godspell",1973,103,1300000,6.1,586,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Godthumb, The",2001,32,NA,7.2,111,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Godzilla",1998,133,125000000,4.4,22695,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Godzilla Versus Disco Lando",1998,8,NA,6.9,88,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,44.5,"",0,1,0,0,0,0,1 -"Godzilla vs. the Netherlands",1996,6,NA,5.4,13,14.5,0,4.5,4.5,0,0,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Godzilla, King of the Monsters!",1956,80,NA,6.6,777,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Gog",1954,85,250000,5,71,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gogo no Yuigon-jo",1995,110,NA,6.2,17,4.5,0,0,24.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Goh-hime",1992,142,NA,6.1,18,0,0,0,14.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Gohatto",1999,100,NA,7,1445,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Goin' Coconuts",1978,96,NA,3.6,77,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Goin' Down Slow",1988,86,NA,6.2,15,0,0,0,4.5,24.5,24.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Goin' Down the Road",1970,90,NA,7.5,157,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Goin' South",1978,109,NA,6,780,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Goin' to Town",1935,74,NA,6,26,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Going All the Way",1997,103,NA,5.5,572,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Going Ape!",1981,87,NA,3,182,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Going Back",1983,79,NA,4.8,28,4.5,0,4.5,4.5,14.5,4.5,0,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Going Bananas",1988,95,NA,2.9,62,45.5,4.5,14.5,14.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Going Berserk",1983,85,NA,4.6,187,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Going Bye-Bye!",1934,20,NA,7.8,117,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Going Down",1983,94,NA,7.9,8,0,0,0,24.5,14.5,0,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Going Equipped",1987,5,NA,6.6,24,0,4.5,0,0,24.5,4.5,24.5,14.5,14.5,14.5,"",0,1,0,0,1,0,1 -"Going Greek",2001,90,198000,4.8,261,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Going Highbrow",1935,68,NA,6.4,8,0,0,0,0,14.5,45.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Going Hollywood",1933,78,914000,6.4,104,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Going Hollywood: The War Years",1988,106,NA,7.1,14,0,4.5,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Going Home",1944,4,NA,7.2,10,0,0,0,0,0,44.5,24.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Going Home",1971,97,NA,5.7,56,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Going Home",1987,100,NA,6.6,12,4.5,0,0,4.5,0,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Going Home",2002,15,NA,8.8,6,0,0,0,0,0,14.5,14.5,0,0,64.5,"",0,0,1,1,0,0,1 -"Going My Way",1944,130,NA,7.4,918,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Going Nomad",1998,97,NA,6.4,16,4.5,4.5,4.5,0,14.5,4.5,14.5,4.5,0,34.5,"",0,0,1,1,0,0,0 -"Going Off Big Time",2000,86,NA,6.2,165,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Going Overboard",1989,99,NA,2.1,1351,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Going Places",1938,84,NA,3.9,35,24.5,4.5,4.5,0,14.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Going Postal",1999,14,NA,6,5,44.5,0,0,0,0,0,0,24.5,0,44.5,"",0,0,1,0,0,0,1 -"Going Sane",1986,89,NA,4.4,7,0,0,0,24.5,45.5,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Going Spanish",1934,11,NA,5.8,22,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Going Under",1990,80,NA,2.9,181,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Going Upriver: The Long War of John Kerry",2004,87,NA,7.8,487,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"PG-13",0,0,0,0,1,0,0 -"Going in Style",1979,97,NA,6.7,410,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Going the Distance",2004,93,NA,5.3,183,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Going to Blazes!",1948,21,NA,6.3,13,0,0,0,4.5,4.5,14.5,44.5,0,4.5,14.5,"",0,0,0,0,1,0,1 -"Going to Kansas City",1998,97,NA,5.8,148,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Going! Going! Gosh!",1952,7,NA,6.6,47,0,0,4.5,4.5,0,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Gois, O",1969,88,NA,8.7,10,0,0,0,0,14.5,0,14.5,24.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Gojira",1954,98,1000000,6.9,1106,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Gojira",1984,87,NA,4.8,449,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Gojira VS Desutoroia",1995,103,NA,6,339,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Gojira VS Mekagojira",1993,105,NA,6.3,251,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG",1,0,0,1,0,0,0 -"Gojira VS Supesugojira",1994,106,NA,5,273,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gojira ni-sen mireniamu",1999,99,1000000,5.6,1150,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",1,0,0,0,0,0,0 -"Gojira tai Biorante",1989,104,NA,5.9,278,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gojira tai Megaro",1973,78,NA,3.5,511,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gojira tai Mekagojira",1974,84,NA,5.1,355,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gojira tai Mekagojira",2002,88,NA,6.6,189,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"PG",1,0,0,0,0,0,0 -"Gojira tai Mosura",1992,100,NA,5.5,338,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gojitmal",1999,112,NA,5.6,399,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gojoe reisenki",2000,138,NA,6.7,182,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Gojuman-nin no isan",1963,97,NA,8.5,6,0,0,0,0,0,0,14.5,0,0,84.5,"",1,0,0,1,0,0,0 -"Gokiburi-tachi no tasogare",1987,105,NA,6.1,64,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Gola profonda nera",1976,83,NA,2.3,18,34.5,24.5,14.5,0,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Golae sanyang",1984,112,NA,5.2,5,44.5,0,0,0,0,0,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Golasy",2002,89,NA,5.2,17,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Gold",1932,58,NA,5.1,5,0,0,24.5,0,44.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Gold",1934,120,NA,5.4,14,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Gold",1974,120,NA,5.5,227,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Gold Cup, The",2000,92,NA,6.3,13,14.5,0,14.5,0,14.5,24.5,14.5,0,0,14.5,"",0,0,1,1,0,1,0 -"Gold Diggers in Paris",1938,97,NA,6.2,31,4.5,0,0,0,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Gold Diggers of '49",1936,8,NA,6.2,16,0,0,0,0,24.5,34.5,14.5,4.5,14.5,0,"",0,1,1,0,0,0,1 -"Gold Diggers of 1933",1933,96,433000,8,556,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Gold Diggers of 1935",1935,98,NA,6.9,204,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gold Diggers of 1937",1936,101,NA,6.4,82,0,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gold Diggers of Broadway",1929,101,NA,8,11,0,0,0,0,4.5,0,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Gold Diggers, The",1983,87,NA,4.5,9,14.5,14.5,0,24.5,34.5,0,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Gold Diggers: The Secret of Bear Mountain",1995,94,NA,5.4,570,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Gold Dust Gertie",1931,65,NA,5.9,19,14.5,0,0,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gold Express, The",1958,58,NA,4.5,7,0,0,14.5,44.5,44.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Gold Fever",1999,41,NA,7,5,0,0,0,0,0,24.5,64.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Gold Ghost, The",1934,20,NA,6.6,6,0,0,0,0,14.5,14.5,45.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Gold Guitar, The",1966,84,NA,5.3,9,14.5,14.5,14.5,14.5,14.5,0,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Gold Is Where You Find It",1938,94,NA,6.5,46,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gold Mine In the Sky",1938,60,NA,8.1,5,0,0,0,0,24.5,0,24.5,24.5,44.5,0,"",0,0,0,0,0,0,0 -"Gold Raiders",1951,56,50000,5.5,16,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gold Rush Daze",1939,7,NA,6.7,10,0,0,0,0,0,64.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Gold Rush Maisie",1940,82,NA,5.5,27,0,0,4.5,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,1,1,0,0,0 -"Gold Rush, The",1925,82,923000,8.3,6429,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Gold in the Streets",1996,94,NA,5.2,26,14.5,4.5,0,0,0,24.5,44.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Gold of the Seven Saints",1961,88,NA,4.9,29,4.5,4.5,0,14.5,4.5,34.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Goldbergs, The",1950,83,NA,3.4,12,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Goldbrick, The",1943,3,NA,6.4,7,0,0,0,0,14.5,14.5,0,24.5,0,44.5,"",0,1,0,0,0,0,1 -"Golden Age of Comedy, The",1957,79,NA,7,48,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,1,0,0 -"Golden Apples of the Sun",1973,80,NA,1.8,29,64.5,24.5,4.5,0,0,0,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Golden Arrow, The",1936,68,NA,6.2,118,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Golden Blade, The",1953,81,NA,5.1,45,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Golden Boat, The",1990,83,NA,6.9,17,4.5,0,4.5,4.5,14.5,4.5,0,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Golden Bowl, The",2000,130,15000000,6,1145,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Golden Boy",1939,99,NA,6.5,145,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Golden Boy",1996,91,NA,4,22,14.5,4.5,14.5,14.5,14.5,4.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Golden Braid",1990,91,NA,5.7,28,0,4.5,4.5,4.5,4.5,34.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Golden Child, The",1986,94,NA,5.3,6056,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Golden Dawn",1930,81,NA,4.9,24,4.5,4.5,24.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Golden Dreams",2001,25,NA,6.4,32,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Golden Earrings",1947,95,1000000,6.4,120,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Golden Eggs",1941,8,NA,6.7,36,0,0,4.5,0,14.5,24.5,34.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Golden Eighties",1986,96,NA,5.2,33,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Golden Equator, The",1956,18,NA,5.3,10,0,0,0,0,64.5,14.5,24.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Golden Eye, The",1948,69,NA,6.7,89,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Golden Fleecing, The",1940,69,NA,6.4,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Golden Gate (Palace II)",2002,21,NA,7.3,33,4.5,0,0,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Golden Girl",1951,108,NA,5.3,38,4.5,0,4.5,4.5,24.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Golden Glamour",1955,15,NA,4.2,5,0,0,0,64.5,24.5,0,24.5,0,0,0,"",0,0,0,0,1,0,1 -"Golden Gloves",1961,28,NA,8.8,9,0,0,0,0,0,0,24.5,34.5,34.5,14.5,"",0,0,0,0,1,0,1 -"Golden Hawk, The",1952,83,NA,5.2,10,0,0,0,24.5,64.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Golden Horde, The",1951,77,NA,4.7,15,4.5,4.5,0,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Golden Idol, The",1954,71,NA,6.4,5,0,0,0,0,0,44.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Golden Ivory",1957,89,NA,3.7,6,14.5,14.5,14.5,0,45.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Golden Louis, The",1909,5,NA,6.1,8,14.5,14.5,0,14.5,0,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,1 -"Golden Mistress, The",1954,83,NA,3.1,5,24.5,0,0,44.5,0,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Golden Needles",1974,92,NA,4.5,36,4.5,4.5,4.5,34.5,34.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Golden Ninja Warrior",1986,85,NA,2.2,36,34.5,14.5,4.5,14.5,4.5,4.5,0,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Golden Rendezvous",1977,101,NA,6.2,57,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Golden Salamander",1950,96,NA,5.9,28,0,4.5,0,4.5,24.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Golden Seal, The",1983,94,NA,4.6,49,4.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Golden Stallion, The",1949,67,NA,5.6,20,0,0,0,4.5,14.5,34.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Golden Touch, The",1935,10,NA,6.8,61,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Golden Voyage of Sinbad, The",1974,105,NA,6.3,755,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Golden Yeggs",1950,7,NA,6.5,88,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"GoldenEye",1995,130,80000000,6.8,22991,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Goldene Banane von Bad Porno, Die",1971,95,NA,3,23,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Goldene Gans, Die",1964,67,NA,5.1,10,0,14.5,14.5,14.5,0,34.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Goldene Jurte, Die",1961,79,NA,8.8,6,0,0,0,0,0,0,14.5,34.5,0,45.5,"",0,0,0,1,0,0,0 -"Goldene Stadt, Die",1942,109,NA,5.9,34,14.5,4.5,4.5,4.5,4.5,14.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Goldengirl",1979,104,NA,3.9,66,14.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Goldenrod",1976,99,NA,4.9,9,0,0,14.5,0,24.5,0,34.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Goldfinger",1964,112,3000000,7.8,19754,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Goldfish Game",2002,105,NA,6.4,17,14.5,14.5,14.5,0,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Goldfish Memory",2003,85,NA,5.8,195,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Goldframe",1969,4,NA,5.8,9,0,0,0,14.5,14.5,34.5,0,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Goldie",1931,68,NA,5.3,11,0,24.5,4.5,0,4.5,24.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Goldilocks and the Three Bares",1963,69,25000,2.7,18,24.5,14.5,14.5,14.5,0,0,14.5,0,14.5,4.5,"",0,0,1,1,0,0,0 -"Goldilocks and the Three Bears",1939,11,NA,4.9,7,0,0,0,24.5,14.5,14.5,0,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Goldilocks and the Three Bears",1995,88,NA,2.1,11,24.5,4.5,4.5,0,24.5,0,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Goldimouse and the Three Cats",1960,6,NA,6.2,29,0,0,4.5,14.5,14.5,14.5,44.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Goldirocks",2003,94,NA,4.6,20,14.5,0,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Goldstein",1965,85,NA,6.7,7,0,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Goldsucher von Arkansas, Die",1964,105,NA,4.3,6,0,0,0,34.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Goldtown Ghost Riders",1953,57,NA,5.6,11,0,4.5,0,4.5,4.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Goldwyn",2001,118,NA,7,39,0,4.5,0,0,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Goldwyn Follies, The",1938,120,1800000,5.2,61,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Goldy: The Last of the Golden Bears",1984,91,NA,4.2,12,24.5,0,0,14.5,0,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gole ruggenti",1992,98,NA,3.4,19,45.5,4.5,4.5,0,4.5,0,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Golem",1980,92,NA,7.6,12,0,0,0,4.5,0,4.5,24.5,14.5,34.5,4.5,"",0,0,0,0,0,0,0 -"Golem, Der",1915,60,NA,7.5,176,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Golem, Le",1936,83,NA,6.3,31,0,0,4.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Golem, l'esprit de l'exil",1992,105,NA,7.2,21,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Golem, wie er in die Welt kam, Der",1920,91,NA,7.4,409,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Golet v udoli",1995,90,NA,6.3,22,4.5,0,0,0,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Golf Specialist, The",1930,20,NA,6.9,188,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Golfballs!",1999,82,NA,3.8,75,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Golfo, El",1969,94,NA,4.8,11,0,4.5,0,0,4.5,4.5,14.5,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Golfos, Los",1962,88,NA,5.4,8,0,14.5,0,0,14.5,24.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Golgo 13",1973,104,NA,5.1,14,14.5,4.5,0,4.5,0,0,24.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Golgotha",1935,95,NA,5.9,22,4.5,0,4.5,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Golia alla conquista di Bagdad",1964,80,NA,4.9,6,34.5,34.5,0,0,14.5,0,0,0,14.5,0,"",1,0,0,1,0,0,0 -"Goliath II",1960,15,NA,6.6,19,0,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Goliath contro i giganti",1961,90,NA,4.2,7,0,0,24.5,24.5,0,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Goliath e la schiava ribelle",1963,86,NA,5,8,0,34.5,14.5,24.5,14.5,0,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Gololyod",2003,65,NA,6,30,34.5,0,4.5,0,14.5,0,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Golos",1982,92,NA,6.7,5,0,0,0,0,24.5,24.5,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Golpe de estadio",1998,105,NA,7.3,88,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Golpes a mi puerta",1994,105,NA,7.4,26,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Goluboy shchenok",1976,62,NA,8.3,19,0,0,4.5,0,4.5,4.5,0,4.5,34.5,44.5,"",0,1,0,0,0,0,0 -"Gomen",2002,103,NA,7.9,17,0,0,0,0,0,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Gomez - Kopf oder Zahl",1998,85,NA,7,10,0,14.5,24.5,0,0,0,0,24.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Gomgashtei dar Aragh",2002,108,NA,7.3,196,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gonderilmemis mektuplar",2003,110,NA,5.8,31,4.5,4.5,4.5,14.5,0,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gone Are the Days!",1963,99,NA,6.5,36,0,4.5,0,0,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Gone Bad: Episode 2",2002,5,NA,8.3,6,0,0,0,0,14.5,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Gone Batty",1954,7,NA,6.2,20,0,0,0,4.5,24.5,24.5,34.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Gone Fishin'",1997,94,53000000,3.8,1884,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Gone Is the One Who Held Me Dearest in the World",2003,95,NA,7.8,6,0,0,0,0,0,14.5,45.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Gone in 60 Seconds",1974,98,NA,6.1,877,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Gone in Sixty Seconds",2000,117,90000000,5.7,25400,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Gone to Earth",1950,110,NA,6.9,114,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Gone to the Dogs",1939,83,NA,6.7,7,0,0,0,0,24.5,0,14.5,44.5,14.5,0,"",0,0,1,0,0,0,0 -"Gone with the West",1975,95,NA,4.3,24,24.5,14.5,14.5,4.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Gone with the Wind",1939,233,3900000,8.1,28836,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Gone, But Not Forgotten",2003,90,NA,5.8,109,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gong",2003,81,NA,7.6,12,0,0,0,0,4.5,14.5,34.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Gong Show Movie, The",1980,89,NA,3.1,135,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Gong fu",2004,99,20000000,7.9,5299,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"R",1,0,1,0,0,0,0 -"Gong fu xiao zi",1977,91,NA,5.7,6,14.5,0,0,14.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Gong pu II",1995,99,NA,7,10,0,0,0,0,14.5,24.5,34.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Gong tau",1975,93,NA,5.9,16,4.5,4.5,14.5,14.5,14.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Gong with the Pink",1971,7,NA,5.1,8,0,14.5,0,14.5,34.5,34.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Gong yi leng xie jin mian ren",1999,90,NA,5.7,5,24.5,0,0,24.5,0,44.5,0,24.5,0,0,"",1,0,0,0,0,0,0 -"Gongdong gyeongbi guyeok JSA",2000,110,NA,7.6,1589,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Gonggongui jeog",2002,138,NA,7.1,197,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Gonggongui jeog 2",2005,148,NA,6,11,4.5,0,0,14.5,14.5,4.5,14.5,24.5,0,0,"",1,0,0,1,0,0,0 -"Gongpo taxi",2000,94,NA,3.1,5,64.5,0,24.5,0,24.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Gongyuan 2000 nian",2000,109,NA,6.3,153,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Gonin",1995,109,NA,6.7,532,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Gonin 2",1996,108,NA,6.3,82,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Gonks Go Beat",1965,90,NA,5,6,34.5,0,0,34.5,0,0,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Goo Goo Goliath",1954,7,NA,6.5,22,0,0,0,0,14.5,14.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Goo laam gwa lui",2000,101,NA,7.1,226,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Goo waak chai ching yee pin ji hung hing sap saam mooi",1998,122,NA,6.9,78,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Good Advice",2001,93,NA,6.1,1296,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Good Baby, A",2000,87,NA,6.3,137,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Good Book, The",1997,81,9000,6.1,9,0,0,0,14.5,0,24.5,34.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Good Boy",2003,1,NA,6.4,5,44.5,0,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Good Boy!",2003,88,18000000,4.7,683,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Good Burger",1997,103,9000000,4,1714,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Good Bye Lenin!",2003,121,NA,7.8,9334,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"R",0,0,1,1,0,1,0 -"Good Companions, The",1933,95,NA,6,19,0,0,0,4.5,14.5,14.5,14.5,4.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Good Companions, The",1957,104,NA,4.9,13,4.5,0,0,24.5,4.5,14.5,34.5,4.5,0,4.5,"",0,0,0,0,0,1,0 -"Good Day for a Hanging",1959,85,NA,6,58,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Good Die Young, The",1954,100,NA,6,76,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Good Dog",2003,7,NA,4.8,15,4.5,0,4.5,24.5,24.5,0,0,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Good Earth, The",1937,138,2800000,7.9,473,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Good Egg, The",1939,7,NA,6.1,10,0,0,14.5,14.5,14.5,24.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Good Fairy, The",1935,98,NA,7.5,137,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Good Father, The",1985,90,NA,6,100,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Good Fellows, The",1943,70,NA,9,7,14.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Good Fight, The",1984,98,NA,9.2,18,0,0,0,0,0,0,0,0,44.5,45.5,"",0,0,0,0,1,0,0 -"Good Girl, The",2002,93,5000000,6.9,8254,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Good Girls Don't",1993,85,NA,3.9,22,34.5,4.5,0,24.5,4.5,4.5,4.5,0,4.5,14.5,"",1,0,1,0,0,0,0 -"Good Girls Go to Paris",1939,75,NA,5.3,6,0,0,0,34.5,0,34.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Good Girls of Godiva High, The",1979,70,NA,7.6,9,0,0,0,0,24.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Good Grief",1998,77,NA,6.9,9,0,0,0,14.5,0,14.5,44.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Good Guys Wear Black",1979,95,NA,4.3,253,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Good Guys and the Bad Guys, The",1969,91,NA,5.8,104,4.5,4.5,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Good Housekeeping",2000,90,NA,6.3,42,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Good Humor Man, The",1950,80,NA,6.9,42,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Good Kurds, Bad Kurds: No Friends But the Mountains",2000,72,NA,5.3,9,24.5,0,0,0,14.5,0,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Good Life, The",1997,95,NA,5,23,14.5,4.5,4.5,14.5,4.5,4.5,4.5,0,0,34.5,"",1,0,1,0,0,0,0 -"Good Little Monkeys",1935,8,NA,5.2,8,0,0,0,14.5,14.5,34.5,0,0,0,34.5,"",0,1,1,0,0,0,1 -"Good Luck",1996,95,NA,6.1,246,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Good Luck Mr. Grosky",2002,7,NA,6.5,10,0,0,0,0,0,24.5,34.5,34.5,0,24.5,"",0,0,1,0,0,0,1 -"Good Luck, Miss Wyckoff",1979,90,NA,4.6,36,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Good Man in Africa, A",1994,94,20000000,4.6,473,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Good Man's Sin, The",1999,26,NA,5.7,16,0,0,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Good Morning, Babylon",1987,117,NA,6.5,319,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Good Morning, Boys",1937,79,NA,7,49,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Good Morning, Miss Dove",1955,120,NA,6.2,122,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Good Morning, Vietnam",1987,119,13000000,7.1,13823,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Good Morning... and Goodbye!",1967,80,55000,3.5,53,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Good Mother, The",1988,103,NA,5.7,312,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Good Neighbor",2001,86,NA,3.2,72,64.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Good Neighbor Sam",1964,130,NA,6.4,290,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Good News",1930,90,NA,5.9,18,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Good News",1947,93,1662718,7.1,217,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Good News: Von Kolporteuren, toten Hunden und anderen Wienern",1990,130,NA,7.9,14,0,0,4.5,0,0,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Good Night Elmer",1940,7,NA,6.4,30,4.5,14.5,14.5,14.5,4.5,14.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Good Night Valentino",2003,15,NA,6.3,15,0,0,0,4.5,0,24.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Good Night to Die, A",2003,100,NA,4.8,152,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Good Night, Nurse!",1918,26,NA,6.3,45,4.5,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Good Noose",1962,6,NA,6.6,23,4.5,0,4.5,4.5,0,34.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Good Old Boy: A Delta Boyhood",1988,108,NA,5.3,27,4.5,4.5,0,4.5,0,14.5,14.5,14.5,0,34.5,"",1,0,0,0,0,0,0 -"Good Policeman, The",1991,110,NA,5.2,19,4.5,14.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Good Sam",1948,114,NA,5.5,83,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Good Scouts",1938,8,NA,7.7,51,0,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Good Shepherd, The",2004,90,NA,5.1,31,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Good Son, The",1993,87,NA,5.7,3468,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Good Stuff",2001,6,NA,8.7,6,0,0,0,14.5,0,0,0,0,34.5,45.5,"",0,0,1,1,0,0,1 -"Good Things, The",2001,26,NA,5,43,4.5,0,0,0,4.5,4.5,14.5,4.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Good Time Girl",1948,81,NA,5.7,15,0,0,0,44.5,0,4.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Good Time for a Dime, A",1941,8,NA,7.2,38,0,0,4.5,4.5,0,4.5,44.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Good Time with a Bad Girl, A",1967,61,NA,4.8,8,24.5,24.5,0,0,14.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Good Times",1967,91,NA,4.4,64,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Good Wife, The",1987,98,NA,5.9,118,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Good Will Hunting",1997,126,10000000,7.8,60858,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Good Will to Men",1955,9,NA,7.6,20,14.5,0,0,0,14.5,0,24.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Good Woman of Bangkok, The",1991,82,NA,5.9,43,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Good Woman, A",2004,93,NA,6.3,51,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Good to Go",1986,90,1500000,3.2,17,24.5,14.5,4.5,4.5,24.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Good to See You Again, Alice Cooper",1974,81,NA,6.2,14,0,0,0,4.5,0,0,24.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Good, the Bad and the Horny, The",1985,85,NA,7,7,0,0,0,0,0,0,45.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Good, the Bad, and Huckleberry Hound, The",1988,94,NA,4.5,16,14.5,4.5,0,4.5,14.5,14.5,0,4.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Good, the Rad and the Gnarly, The",1987,75,NA,8.2,5,0,0,0,0,24.5,0,0,44.5,0,44.5,"",0,0,0,0,0,0,0 -"Good-bye Cruel World",1983,90,NA,3,12,45.5,0,4.5,4.5,0,0,0,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Good-bye, Emmanuelle",1977,100,NA,3.5,183,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Good-bye, My Lady",1956,94,NA,6.4,95,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Goodbye 42nd Street",1986,4,NA,5.2,6,14.5,0,0,34.5,0,0,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Goodbye Again",1933,66,NA,6.5,38,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Goodbye Again",1961,120,NA,6.3,179,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Goodbye America",1997,116,NA,5,117,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,1,0,1,0 -"Goodbye Bruce Lee",1975,84,NA,6,30,14.5,4.5,0,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Goodbye Charlie",1964,116,NA,5.5,236,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Goodbye Charlie Bright",2001,87,NA,6.3,127,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Goodbye Emma Jo",1998,40,NA,8.7,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Goodbye Gemini",1970,89,NA,6.2,8,0,0,0,14.5,14.5,34.5,0,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Goodbye Girl, The",1977,110,NA,7.2,2053,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Goodbye Lover",1998,102,NA,5.4,1122,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Goodbye Paradise",1983,119,NA,4.2,16,24.5,0,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Goodbye People, The",1984,104,NA,4.8,11,4.5,4.5,0,14.5,0,0,0,34.5,0,24.5,"",0,0,1,0,0,0,0 -"Goodbye Pork Pie",1981,90,NA,6,171,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Goodbye e amen",1977,103,NA,7.3,15,0,0,0,0,4.5,14.5,24.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Goodbye to You",2001,82,NA,7.9,7,0,0,0,14.5,0,0,44.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Goodbye, Casanova",2000,85,NA,5.7,10,0,0,14.5,0,14.5,0,0,14.5,14.5,64.5,"",0,0,0,0,0,1,0 -"Goodbye, Columbus",1969,102,NA,6.4,338,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Goodbye, Cruel World",2003,12,NA,6.9,10,0,0,0,0,14.5,24.5,64.5,0,0,14.5,"",0,0,1,0,0,0,1 -"Goodbye, Franklin High",1978,94,NA,6.1,7,0,0,0,0,0,45.5,0,0,44.5,0,"",0,0,1,1,0,0,0 -"Goodbye, Miss Turlock",1947,11,NA,6.5,9,0,0,0,14.5,0,14.5,34.5,44.5,0,0,"",0,0,0,0,0,0,1 -"Goodbye, Mr. Chips",1939,114,NA,7.9,1780,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Goodbye, Mr. Chips",1969,155,9000000,6.5,466,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Goodbye, My Fancy",1951,107,NA,6,72,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Goodbye, New York",1985,90,NA,4.7,43,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Goodbye, Norma Jean",1976,95,NA,2.4,34,44.5,14.5,14.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Goodfellas",1990,145,25000000,8.6,68219,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Goodman Town",2002,105,NA,6.2,7,0,0,0,0,0,45.5,14.5,14.5,0,14.5,"",1,0,1,0,0,0,0 -"Goodnight Bill",2005,19,NA,9.6,7,0,0,0,0,0,0,0,0,44.5,45.5,"",0,0,0,1,0,0,1 -"Goodnight Irene",2005,14,15000,7.6,8,0,0,0,0,0,0,24.5,24.5,0,45.5,"",0,0,0,1,0,0,1 -"Goodnight, Sweet Marilyn",1989,93,NA,2.5,21,44.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Goodnite Charlie",2005,119,100000,9.8,34,0,4.5,0,0,0,0,0,4.5,4.5,84.5,"",1,0,0,0,0,0,0 -"Goof on the Roof",1953,16,NA,7.5,46,0,0,0,4.5,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Goofy Goofy Gander",1950,7,NA,5.3,9,14.5,0,0,0,14.5,24.5,44.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Goofy Gophers, The",1947,7,NA,7.2,46,0,0,0,0,4.5,14.5,14.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Goofy Groceries",1941,8,NA,6.1,9,0,0,0,0,14.5,45.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Goofy Gymnastics",1949,6,NA,7.2,90,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Goofy Movie, A",1995,78,NA,6.2,1488,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,1,1,0,0,1,0 -"Goofy Movies Number Four",1934,10,NA,3.8,9,14.5,14.5,14.5,14.5,14.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Goofy Movies Number Six",1934,8,NA,4.8,12,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Goofy Movies Number Two",1934,10,NA,5,6,0,14.5,0,0,34.5,14.5,34.5,0,0,0,"",0,0,1,0,0,0,1 -"Goofy and Wilbur",1939,8,NA,6.9,64,4.5,0,4.5,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Goofy's Freeway Troubles",1965,13,NA,7.4,34,0,0,0,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Goofy's Glider",1940,8,NA,6.8,51,4.5,4.5,0,4.5,4.5,4.5,34.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Googoosh: Iran's Daughter",2000,158,NA,4.3,9,0,0,0,24.5,34.5,0,14.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Goomer",1999,80,NA,4.7,22,14.5,14.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Goonies, The",1985,114,19000000,7.2,18895,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Goonland",1938,8,NA,7.5,25,0,0,4.5,0,4.5,14.5,4.5,24.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Goopy Geer",1932,6,NA,5.9,12,14.5,4.5,4.5,0,14.5,24.5,0,0,4.5,14.5,"",0,1,1,0,0,0,1 -"Goopy Gyne Bagha Byne",1968,132,NA,8,77,0,0,0,0,0,4.5,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Goose Boxer",1978,90,NA,5.5,7,0,0,0,14.5,14.5,24.5,14.5,14.5,0,14.5,"",1,0,1,0,0,0,0 -"Goose Steps Out, The",1942,79,NA,6.4,42,0,0,0,0,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Goose That Laid the Golden Egg, The",1936,7,NA,5.9,21,4.5,0,4.5,0,14.5,14.5,4.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Goose and the Gander, The",1935,65,NA,6.2,41,0,0,4.5,4.5,14.5,24.5,4.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Gopher Broke",1958,6,NA,6.4,32,0,0,4.5,4.5,4.5,34.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Gopher Broke",2004,4,NA,7.5,53,0,0,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Gopher Goofy",1942,7,NA,6.5,5,0,0,0,0,0,44.5,0,44.5,0,24.5,"",0,1,1,0,0,0,1 -"Gopher Spinach",1954,6,NA,6.1,26,0,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Gor",1988,98,NA,3,163,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Goraczka",1981,122,NA,7.5,14,4.5,0,0,0,4.5,14.5,24.5,0,44.5,4.5,"",0,0,0,1,0,0,0 -"Gordel van smaragd",1997,120,NA,6.3,40,0,0,14.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Gordon Sisters Boxing, The",1901,2,NA,4.2,13,0,4.5,34.5,14.5,4.5,24.5,4.5,4.5,0,0,"",1,0,0,0,1,0,1 -"Gordon of Ghost City",1933,220,NA,7.1,7,0,0,0,0,24.5,14.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Gordon's War",1973,85,NA,5.7,39,4.5,4.5,4.5,4.5,34.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gordon, il pirata nero",1961,88,NA,5.7,22,0,0,4.5,34.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gordy",1995,90,NA,3.6,173,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gore Gore Girls, The",1972,81,NA,4.1,193,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Goreville, U.S.A.",1997,64,NA,2.8,10,24.5,0,0,24.5,14.5,0,14.5,0,24.5,24.5,"",0,0,0,0,1,0,0 -"Gorgeous Hussy, The",1936,103,NA,5.1,112,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gorgo",1961,78,NA,5.2,346,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gorgon, The",1964,83,NA,5.7,324,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gorgones kai mages",1968,90,NA,5.5,14,0,0,14.5,0,24.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Gori vatra",2003,105,NA,7,217,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Gori, gori, moya zvezda",1969,94,NA,6.4,23,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Gori, gori, oganche",1994,240,NA,7.5,6,0,14.5,0,0,0,0,0,45.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gorilla Bathes at Noon",1993,83,NA,4.5,41,14.5,0,4.5,14.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Gorilla Man, The",1943,64,NA,5,12,4.5,0,0,24.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gorilla My Dreams",1948,7,NA,7.2,76,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Gorilla Mystery, The",1930,7,NA,6.6,39,4.5,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Gorilla at Large",1954,83,NA,4.7,83,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gorilla von Soho, Der",1968,96,NA,5,31,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Gorilla, The",1939,66,NA,5.2,121,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gorillas in the Mist: The Story of Dian Fossey",1988,129,NA,6.8,3443,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gorille vous salue bien, Le",1958,95,NA,5.6,26,0,0,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Gorilles, Les",1964,88,NA,5.1,8,14.5,0,0,0,14.5,14.5,0,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Gorky Park",1983,130,NA,6.6,2217,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gorod Zero",1988,103,NA,6.7,66,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Gorotica",1993,60,NA,3.3,26,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gorozhane",1975,86,NA,5.6,11,0,0,0,0,14.5,24.5,0,44.5,4.5,0,"",0,0,0,1,0,0,0 -"Gorp",1980,90,NA,3.7,69,24.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gory Gory Hallelujah",2003,96,100000,6.4,39,4.5,4.5,0,4.5,0,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Goseuteu mamma",1996,105,NA,3,9,34.5,34.5,0,0,14.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Gosford Park",2001,137,15000000,7.3,16831,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Goshogaoka",1998,63,NA,6,7,14.5,0,0,24.5,0,0,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Gospa",1995,125,NA,5.7,69,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"PG",0,0,0,1,0,0,0 -"Gospel According to Al Green",1984,94,NA,8.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Gospel According to Philip K. Dick, The",2001,80,NA,4.1,59,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Gospel Road: A Story of Jesus",1973,86,NA,4.6,33,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Gospel of John, The",2003,180,NA,7.1,366,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"PG-13",0,0,0,1,0,0,0 -"Gospel of Lou, The",2003,72,NA,6.5,13,24.5,14.5,0,0,0,0,0,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Gospodin oformitel",1988,109,NA,7.2,26,0,4.5,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Gospodin za edin den",1983,87,NA,8,34,0,0,0,0,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Gossenkind",1992,88,NA,4.8,14,14.5,4.5,0,14.5,4.5,4.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Gossip",1953,10,1000,4.4,5,0,0,24.5,0,24.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,1 -"Gossip",2003,12,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Gostanza da Libbiano",2000,93,NA,7.2,40,14.5,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gosti iz galaksije",1981,82,NA,5.3,14,0,0,0,4.5,0,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Got 2 Believe",2002,113,NA,7.4,10,14.5,0,0,0,0,14.5,14.5,44.5,24.5,14.5,"",0,0,0,0,0,1,0 -"Gota de sangre para morir amando, Una",1973,88,NA,4.9,20,14.5,0,14.5,14.5,4.5,34.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Gotcha!",1985,101,NA,5.7,1387,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Gotejar da Luz, O",2002,103,NA,9.1,26,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Gotham Fish Tales",2003,80,NA,7.2,22,0,0,0,0,0,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Gothic",1986,87,NA,5.1,1180,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gothic Romance, A",2004,32,5000,8.2,9,0,0,0,0,34.5,0,0,0,14.5,45.5,"",0,0,1,0,0,1,1 -"Gothika",2003,98,40000000,5.8,10524,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Gott ist ein toter Fisch",2001,88,NA,5.8,5,24.5,0,24.5,0,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Gott ist tot",2003,95,NA,6.1,21,4.5,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Gottesanbeterin, Die",2001,93,NA,6.8,59,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gottlieb",2001,35,NA,6.6,13,0,0,0,0,4.5,24.5,24.5,14.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Goulash",2001,14,NA,8.6,5,0,0,24.5,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Goulve, La",1972,90,NA,6.1,5,0,0,24.5,0,24.5,0,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Goupi mains rouges",1943,96,NA,7.6,56,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Governess, The",1998,115,NA,6.1,828,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Government Agents vs Phantom Legion",1951,167,NA,4.9,10,0,24.5,14.5,14.5,14.5,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Government Girl",1943,94,NA,5.3,49,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gowanus, Brooklyn",2004,19,NA,7.1,13,4.5,0,0,0,0,14.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Goya - oder Der arge Weg der Erkenntnis",1971,136,NA,6.4,23,0,0,0,0,4.5,14.5,14.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Goya en Burdeos",1999,106,NA,6.4,474,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Goyangileul butaghae",2001,112,NA,7.1,385,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Goyokin",1969,124,NA,7.3,58,0,0,0,4.5,4.5,4.5,4.5,24.5,4.5,44.5,"",1,0,0,1,0,0,0 -"Gozaresh",1977,112,NA,8.1,5,0,0,0,0,0,24.5,24.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Grabben i graven bredvid",2002,94,NA,5.9,464,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Grace",2003,17,NA,5.5,10,44.5,0,0,0,0,14.5,14.5,24.5,0,24.5,"",0,0,1,1,0,0,1 -"Grace and the Storm",2004,92,NA,7.7,52,14.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Grace of God, The",1997,75,NA,5,10,14.5,0,14.5,0,14.5,0,14.5,14.5,0,45.5,"",0,0,0,1,1,0,0 -"Grace of My Heart",1996,116,5000000,6.5,982,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Gracie Allen Murder Case, The",1939,78,NA,6.5,25,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Gracze",1995,103,NA,4.8,5,0,24.5,0,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Graduada, La",1971,86,NA,1.8,5,64.5,0,24.5,0,24.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Graduate, The",1967,105,3000000,8.2,27555,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Graduating Peter",2001,75,NA,5.8,12,0,0,4.5,0,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Graduation Day",1981,96,250000,3.5,153,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Graduation Day",2003,105,NA,6.1,17,4.5,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Grafenberg Spot, The",1985,90,NA,7.3,81,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Graffiante desiderio",1993,97,NA,4.1,11,4.5,4.5,0,44.5,14.5,0,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Graffiti Artist, The",2004,80,NA,7.5,49,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Graffiti Bridge",1990,95,NA,3.7,297,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Grail, The",2002,84,NA,6.7,5,0,0,0,0,24.5,0,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Grajacy z talerza",1995,107,NA,5.2,10,14.5,14.5,0,0,14.5,0,0,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Grampy's Indoor Outing",1936,6,NA,5.9,8,0,0,0,14.5,0,64.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Gran Calavera, El",1949,92,NA,7.2,46,4.5,0,0,0,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gran Casino",1947,85,NA,5.8,27,4.5,0,0,14.5,24.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Gran Gato, El",2003,105,NA,6.7,8,0,0,0,0,14.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Gran Paradiso",2000,102,NA,6.9,102,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Gran Slalom",1996,84,NA,4.2,11,14.5,4.5,14.5,4.5,4.5,14.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Gran aventura, La",1974,90,NA,5,5,24.5,0,0,24.5,0,24.5,44.5,0,0,0,"",1,0,1,0,0,0,0 -"Gran bollito",1977,115,NA,4.5,15,4.5,0,0,14.5,0,14.5,14.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Gran circo Chamorro, El",1955,107,NA,4.7,8,0,14.5,0,0,0,14.5,34.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Gran familia, La",1962,98,NA,5.9,52,4.5,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Gran fiesta, La",1985,101,NA,6.4,24,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Gran vida, La",2000,109,NA,6.5,273,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Granatovyy braslet",1964,90,NA,5.8,7,0,14.5,14.5,0,14.5,0,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Grand Bounce, The",1937,11,NA,6.4,11,0,0,0,0,4.5,14.5,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Grand Canary",1934,78,NA,6,22,0,0,0,4.5,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Grand Canyon",1958,29,NA,7,42,0,0,4.5,14.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Grand Canyon",1991,134,NA,6.7,4350,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Grand Canyon Trail",1948,67,NA,5.2,13,0,0,0,14.5,34.5,34.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Grand Canyon: The Hidden Secrets",1984,35,NA,6.9,74,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Grand Canyonscope",1954,7,NA,7.6,23,0,0,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Grand Central Murder",1942,73,NA,6.6,78,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Grand Dame, The",1931,9,NA,5.4,9,0,0,0,14.5,14.5,24.5,45.5,0,0,0,"",0,0,1,0,0,0,1 -"Grand Exit",1935,68,NA,4.3,5,0,24.5,0,0,0,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Grand Hotel",1932,112,700000,7.5,1807,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Grand Hotel Excelsior",1982,115,NA,4.8,100,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grand Isle",1991,112,NA,5.2,58,4.5,4.5,14.5,14.5,4.5,4.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Grand Meaulnes, Le",1967,103,NA,8,48,0,0,0,0,4.5,4.5,14.5,4.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Grand Old Girl",1935,72,NA,3,5,0,24.5,24.5,24.5,24.5,0,24.5,0,0,0,"",0,0,0,1,0,1,0 -"Grand Ole Opry",1940,67,NA,4,6,0,0,14.5,0,0,14.5,0,34.5,0,34.5,"",0,0,1,0,0,0,0 -"Grand Prix",1966,179,9000000,6.4,971,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Grand Prix: Challenge of the Champions",1966,13,NA,5.6,13,0,0,0,14.5,14.5,34.5,4.5,0,4.5,14.5,"",0,0,0,0,1,0,1 -"Grand Slam",1933,67,164000,5.4,41,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grand Slam Opera",1936,20,NA,7.8,14,0,0,0,0,0,0,24.5,44.5,24.5,4.5,"",0,0,1,0,0,0,1 -"Grand Theft Auto",1977,84,602000,5,263,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grand Theft Parsons",2003,88,NA,5.9,365,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Grand amour, Le",1969,87,NA,6.1,9,0,0,0,0,14.5,24.5,24.5,34.5,0,14.5,"",0,0,1,0,0,1,0 -"Grand bleu, Le",1988,119,NA,7.4,8055,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Grand blond avec une chaussure noire, Le",1972,90,NA,7,701,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Grand bonheur",1993,165,NA,5.9,14,14.5,4.5,0,14.5,24.5,0,14.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Grand carnaval, Le",1983,130,NA,5.7,35,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grand chef, Le",1959,100,NA,5.9,14,0,14.5,14.5,4.5,0,4.5,24.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Grand chemin, Le",1987,104,NA,7.7,331,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Grand jeu, Le",1934,120,NA,7.8,22,0,0,0,4.5,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Grand jeu, Le",1954,100,NA,5.6,9,0,0,0,24.5,14.5,14.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Grand oral",2001,15,NA,6.1,5,0,0,24.5,0,0,0,64.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Grand pardon, Le",1982,130,NA,5.6,80,4.5,0,4.5,14.5,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Grand restaurant, Le",1966,82,NA,6.5,302,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Grand serpent du monde, Le",1999,99,NA,5.8,27,14.5,0,4.5,0,4.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Grand voyage, Le",2004,108,NA,7,50,4.5,0,4.5,0,0,4.5,34.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Grandad Rudd",1935,90,NA,4.5,5,0,24.5,0,0,24.5,0,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Grande Arte, A",1991,99,NA,5.7,128,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Grande Blek, Il",1987,105,NA,6.6,13,14.5,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Grande Cidade, A",1966,80,NA,4.8,12,4.5,4.5,0,0,24.5,14.5,0,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Grande Elias, O",1950,118,NA,6.7,17,4.5,0,0,0,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Grande Mentecapto, O",1989,101,NA,9.1,12,0,0,0,0,0,4.5,24.5,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Grande Momento, O",1958,80,NA,7.1,15,0,0,0,0,4.5,24.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Grande attacco, Il",1978,90,NA,4.2,46,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Grande botto, Il",2000,95,NA,5.8,12,0,0,0,4.5,24.5,24.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Grande bouffe, La",1973,135,NA,7.1,1096,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"NC-17",0,0,0,1,0,0,0 -"Grande cocomero, Il",1993,102,NA,6.5,108,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Grande colpo dei sette uomini d'oro, Il",1967,92,NA,5.5,17,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Grande colpo di Surcouf, Il",1966,97,NA,6.7,6,0,0,0,0,14.5,34.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Grande duello, Il",1972,98,NA,5.3,53,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Grande frousse, La",1964,80,NA,6.1,53,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Grande guerra, La",1959,135,NA,8.7,240,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,1,1,0,0,0 -"Grande illusion, La",1937,114,NA,8.3,5020,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Grande lessive (!), La",1968,95,NA,5.7,35,4.5,4.5,4.5,0,24.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grande migration, La",1995,8,NA,7.4,5,0,0,0,0,0,44.5,0,44.5,24.5,0,"",0,1,0,0,0,0,1 -"Grande olimpiade, La",1961,142,NA,5.5,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,0,0,1,0,0 -"Grande petite",1994,105,NA,4.5,5,0,0,44.5,24.5,0,0,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Grande racket, Il",1976,104,NA,7,37,0,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Grande sauterelle, La",1967,95,NA,5.5,10,0,0,14.5,24.5,14.5,44.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Grande silenzio, Il",1968,101,NA,7.8,635,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Grande speranza, La",1954,86,NA,5.8,9,0,14.5,0,0,34.5,14.5,34.5,0,0,14.5,"",1,0,0,1,0,1,0 -"Grande strada azzurra, La",1957,105,NA,6.8,104,0,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Grande vadrouille, La",1966,132,NA,7.7,1258,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Grande vie!, La",2001,80,NA,3.4,17,14.5,0,14.5,0,14.5,4.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Grandes bouches, Les",1999,105,NA,5.7,31,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grandes familles, Les",1958,92,NA,7,64,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Grandes gueules, Les",1966,120,NA,7.6,80,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Grandes jouisseuses, Les",1978,90,NA,4.6,11,0,4.5,0,0,34.5,4.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Grandes manoeuvres, Les",1955,106,NA,6.7,97,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Grandes vacances, Les",1967,100,NA,6.2,179,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grandeur nature",1974,101,NA,5.4,33,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Grandfathers and Revolutions",2000,53,NA,4.4,10,0,24.5,0,0,0,0,14.5,0,24.5,45.5,"",0,0,0,0,1,0,0 -"Grandi magazzini",1986,110,NA,3.7,98,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Grandma's Boy",1922,60,100000,7.2,109,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Grandma's House",1989,90,NA,3.8,74,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Grandma's Reading Glass",1900,1,NA,5.8,40,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Grandmother, The",1970,34,NA,7.3,397,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Grandpa's Reading Glass",1902,1,NA,3.2,7,24.5,0,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,1 -"Grands ducs, Les",1996,85,NA,5.8,174,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grands enfants, Les",1980,83,NA,5.3,9,0,0,14.5,14.5,24.5,0,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Grands moyens, Les",1975,84,NA,4.6,12,0,4.5,4.5,14.5,4.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Grands sentiments font les bons gueuletons, Les",1973,105,NA,6.2,9,24.5,0,0,0,0,24.5,0,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Grandview, U.S.A.",1984,97,NA,4.6,377,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Granica",1990,100,NA,8.6,8,14.5,0,0,14.5,0,0,0,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Granitza",1994,83,NA,7.2,18,0,0,4.5,14.5,4.5,0,14.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Granny Get Your Gun",1940,56,NA,5.9,20,0,4.5,0,4.5,14.5,34.5,24.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Granny, The",1995,85,1000000,4.2,142,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Grano de mostaza, El",1962,87,NA,2.7,5,24.5,0,0,0,24.5,0,0,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Granturismo",2000,16,NA,5.5,16,0,4.5,4.5,0,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Grapes of Wrath, The",1940,128,NA,8.2,7855,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Graphique de Boscop, Le",1976,108,NA,7.9,10,0,0,0,0,0,14.5,24.5,14.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Grasp",2002,17,NA,5.9,21,4.5,4.5,0,0,14.5,4.5,44.5,14.5,4.5,0,"",0,0,1,0,0,0,1 -"Grass",1999,80,NA,7.2,624,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Grass Arena, The",1991,90,NA,9.2,23,0,0,0,0,0,4.5,0,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Grass Harp, The",1995,107,NA,6.4,419,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG",0,0,1,1,0,0,0 -"Grass Is Greener, The",1960,104,NA,6.5,634,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grass: A Nation's Battle for Life",1925,71,NA,7.8,88,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Grassfire",2003,103,NA,7.6,5,0,0,24.5,0,0,0,0,44.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Grasshopper and the Ants, The",1934,8,NA,7.7,107,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Grasshopper, The",1970,98,NA,5.6,79,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Grateful Dawg",2000,81,NA,7.1,115,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"PG-13",0,0,0,0,1,0,0 -"Grateful Dead Movie, The",1977,131,NA,7.3,125,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Grauzone",1979,99,NA,9.3,8,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,0,0,0,0,0 -"Grauzone",2004,18,NA,8.4,9,34.5,0,0,0,0,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Grave Secrets",1989,90,NA,3.7,25,4.5,14.5,14.5,24.5,14.5,24.5,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Grave Tales",2004,90,NA,2,8,0,24.5,0,0,0,0,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Grave of the Vampire",1974,95,NA,5.4,54,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Grave, The",1996,90,4000000,5.6,303,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Gravel",2003,16,NA,6.3,16,0,0,0,14.5,14.5,14.5,34.5,0,24.5,0,"",0,0,0,1,0,0,1 -"Gravesend",1997,85,65000,5,111,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Graveyard",2003,22,NA,5.4,23,4.5,4.5,0,4.5,4.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Graveyard Alive",2003,80,NA,7.4,19,14.5,0,4.5,0,14.5,14.5,4.5,44.5,0,14.5,"",0,0,1,0,0,0,0 -"Graveyard Jamboree with Mysterious Mose",1999,4,NA,5.7,12,0,0,4.5,4.5,4.5,4.5,24.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Graveyard Shift",1987,89,NA,4,109,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Graveyard Shift",1990,89,10500000,3.8,1074,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Graveyard Story, The",1990,93,NA,4,13,24.5,0,34.5,4.5,0,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Gravity",1976,8,NA,6.4,19,4.5,0,0,4.5,0,4.5,14.5,14.5,0,64.5,"",0,0,1,0,0,0,1 -"Gravy Train, The",1974,94,NA,6,43,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gray Lady Down",1978,111,NA,5.7,435,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gray Matter",2000,26,NA,8,6,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Gray's Anatomy",1996,80,350000,7,337,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Grayeagle",1978,104,NA,4.8,60,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Grays, The",1991,45,NA,6,6,0,0,14.5,34.5,0,14.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Grayson",2004,6,17791,8.5,96,4.5,0,0,0,0,4.5,4.5,4.5,24.5,64.5,"",1,0,0,0,0,0,1 -"Grazie di tutto",1998,92,NA,7.3,20,0,0,0,0,4.5,24.5,24.5,44.5,4.5,0,"",0,0,1,0,0,0,0 -"Grazie nonna",1975,95,NA,4.3,16,14.5,0,14.5,14.5,24.5,0,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Grazie, zia",1968,94,NA,6,19,4.5,0,0,4.5,14.5,14.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Grease",1978,110,6000000,6.8,22214,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Grease 2",1982,115,NA,3.4,5728,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Greased Lightning",1977,96,NA,5.6,193,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Greaser's Palace",1972,91,NA,4.7,184,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Great",1975,30,NA,8.4,34,0,0,4.5,0,0,0,14.5,0,4.5,74.5,"",0,1,0,0,1,0,1 -"Great Alaskan Mystery, The",1944,223,NA,7.5,10,0,0,0,0,0,45.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Great American Broadcast, The",1941,90,NA,5.4,20,4.5,0,0,0,14.5,24.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Great American Chase, The",1979,98,NA,7.2,380,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Great American Cowboy, The",1973,89,NA,6.7,12,0,0,0,0,4.5,14.5,4.5,4.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Great American Mug, The",1945,10,NA,5.9,6,0,0,0,14.5,45.5,0,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Great American Pastime, The",1956,90,NA,5.5,15,0,0,14.5,24.5,24.5,14.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Great American Songbook, The",2003,174,NA,7,22,0,4.5,0,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Great American West, The",1997,41,NA,8.3,6,0,0,0,0,0,34.5,0,0,34.5,34.5,"",0,0,0,0,1,0,1 -"Great Balls of Fire!",1989,108,NA,5.8,2265,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Great Bank Hoax, The",1978,87,NA,4.6,15,0,4.5,0,24.5,24.5,4.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Great Bank Robbery, The",1969,98,NA,5.4,87,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Great Barrier Reef",1981,39,NA,6.9,33,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Great Barrier, The",1937,83,NA,5.7,15,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Great Big Bunch of You, A",1932,7,NA,6.1,8,0,0,0,0,14.5,45.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Great Bikini Off-Road Adventure, The",1994,90,NA,3.8,95,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Great Carrot-Train Robbery, The",1969,7,NA,6,11,4.5,0,4.5,24.5,0,4.5,4.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Great Caruso, The",1951,109,NA,6.2,205,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Great Catherine",1968,99,NA,4.3,40,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Great Chase, The",1962,77,NA,7,33,4.5,0,4.5,0,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Great Dan Patch, The",1949,94,NA,6.3,26,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Great Dance: A Hunter's Story, The",2000,90,NA,6.7,15,0,0,0,0,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Great Day",1945,80,NA,5.6,11,4.5,0,0,4.5,14.5,24.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Great Day in Harlem, A",1994,60,NA,7.1,100,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Great Day in the Morning",1956,92,NA,5.9,52,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Great De Gaulle Stone Operation, The",1965,6,NA,6.2,7,0,0,0,24.5,0,14.5,44.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Great Diamond Robbery, The",1953,70,NA,5.1,22,4.5,0,4.5,4.5,44.5,4.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Great Dictator, The",1940,124,2000000,8.4,10465,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Great Divide, The",1929,72,NA,6.7,9,0,0,14.5,14.5,0,44.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Great Escape, The",1963,172,4000000,8.3,20075,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Great Expectations",1917,50,NA,5.2,8,24.5,0,0,0,14.5,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Great Expectations",1934,100,NA,5.2,34,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Great Expectations",1946,118,NA,8.1,2340,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Great Expectations",1998,111,NA,6.4,8139,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Great Flamarion, The",1945,78,NA,6.4,67,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Great Gabble, The",2003,11,8000,9.3,6,0,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,1,0,0,1 -"Great Gabbo, The",1929,92,NA,6.6,60,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Great Garrick, The",1937,89,NA,6.8,65,0,0,4.5,0,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Great Gatsby, The",1949,91,NA,6.6,87,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Great Gatsby, The",1974,144,6500000,6.1,2419,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Great Gildersleeve, The",1943,62,NA,6.4,27,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Great Guns",1941,74,NA,5.6,72,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Great Guy",1936,75,NA,4.9,94,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Great Impersonation, The",1935,77,NA,5.6,6,0,0,0,14.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Great Impostor, The",1961,113,NA,6.9,212,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Great Indian Wars 1840-1890, The",1991,96,NA,4.8,8,0,0,14.5,24.5,34.5,14.5,0,0,0,14.5,"",0,0,0,0,1,0,0 -"Great Jasper, The",1933,85,NA,7,7,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Great Jesse James Raid, The",1953,73,NA,4.5,6,0,14.5,14.5,0,34.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Great Jewel Robber, The",1950,91,NA,6.6,11,4.5,0,0,0,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Great John L., The",1945,96,NA,5.9,11,0,0,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Great K & A Train Robbery, The",1926,53,NA,5,43,14.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Great Land of Small, The",1987,93,NA,3.6,36,34.5,4.5,14.5,4.5,4.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Great Lengths",2004,20,25000,7,5,0,24.5,0,0,24.5,0,0,24.5,0,44.5,"",0,0,1,0,0,1,1 -"Great Lester Boggs, The",1975,94,NA,4.4,16,24.5,14.5,4.5,14.5,4.5,14.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Great Lie, The",1941,108,NA,7.2,320,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Great Locomotive Chase, The",1956,85,NA,6.7,107,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Great Lover, The",1931,71,NA,5.4,6,0,0,0,14.5,14.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Great Lover, The",1949,80,NA,6.7,75,4.5,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Great Man Votes, The",1939,72,NA,6.5,93,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Great Man's Lady, The",1942,90,NA,6.6,45,4.5,0,0,4.5,14.5,4.5,34.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Great Man, The",1956,98,NA,6.8,50,0,0,0,14.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Great McCarthy, The",1975,106,NA,8.2,8,0,0,0,0,0,14.5,24.5,24.5,0,34.5,"",0,0,1,0,0,0,0 -"Great McGinty, The",1940,82,NA,7.7,305,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Great McGonagall, The",1974,95,NA,5.5,36,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Great Mike, The",1944,72,NA,6.5,5,0,0,24.5,0,44.5,0,0,24.5,0,24.5,"",0,0,1,1,0,0,0 -"Great Missouri Raid, The",1951,84,NA,5.9,23,0,0,0,4.5,14.5,34.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Great Moment, The",1944,83,NA,5.8,63,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Great Morgan, The",1946,57,NA,5.1,27,24.5,0,0,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Great Mouse Detective, The",1986,73,NA,6.9,1490,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,1,0,0,0,0,0 -"Great Mr. Handel, The",1942,89,NA,6.5,10,0,0,14.5,0,0,34.5,0,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Great Mr. Nobody, The",1941,71,NA,5.7,15,4.5,0,0,4.5,44.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Great Muppet Caper, The",1981,95,NA,6.7,1924,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Great Mystic, The",1946,63,NA,5.2,5,0,0,0,24.5,0,44.5,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Great Northfield, Minnesota Raid, The",1972,91,NA,6.4,171,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Great O'Malley, The",1937,71,NA,6.7,52,4.5,4.5,0,4.5,14.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Great Outdoors, The",1988,91,NA,5.7,3469,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Great Piggy Bank Robbery, The",1946,8,NA,8.4,91,0,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Great Profile, The",1940,71,NA,6,25,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Great Race, The",1965,160,12000000,6.9,2248,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Great Riviera Bank Robbery, The",1979,102,NA,5.9,15,0,0,0,14.5,0,4.5,14.5,14.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Great Rock 'n' Roll Swindle, The",1980,103,NA,6.6,366,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Great Rupert, The",1950,88,NA,6.1,49,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Great Sadness of Zohara, The",1983,38,NA,7.8,6,14.5,0,0,0,0,0,14.5,0,14.5,45.5,"",0,0,0,0,1,0,1 -"Great Santini, The",1979,115,NA,7.2,1203,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Great Scout and Cathouse Thursday",1976,102,NA,5.6,143,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Great Sinner, The",1949,110,NA,6.2,78,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Great Sioux Massacre, The",1965,91,NA,5.6,44,4.5,4.5,4.5,4.5,34.5,24.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Great Sioux Uprising, The",1953,80,NA,5.1,24,0,0,14.5,24.5,24.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Great Skycopter Rescue, The",1978,96,NA,3.1,8,24.5,14.5,0,14.5,14.5,0,0,14.5,0,24.5,"",1,0,0,0,0,0,0 -"Great St. Louis Bank Robbery, The",1959,89,NA,5.6,107,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Great St. Trinian's Train Robbery, The",1966,93,NA,5.3,140,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Great Texas Dynamite Chase, The",1976,90,NA,5.3,70,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Great Train Robbery, The",1903,12,0,7.4,849,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,1 -"Great Victor Herbert, The",1939,91,NA,5,9,0,0,0,0,34.5,0,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Great Waldo Pepper, The",1975,107,NA,6.4,869,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Great Wall, A",1986,97,NA,6.8,102,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Great Waltz, The",1938,104,NA,6.2,94,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Great Waltz, The",1972,135,NA,4.4,38,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Great White Dope, The",2000,4,NA,8.7,7,0,0,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Great White Hope, The",1970,103,6000000,6.9,369,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Great White Hype, The",1996,91,NA,5.3,1699,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Great Ziegfeld, The",1936,185,NA,7.1,589,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Greater Tuna",1994,102,NA,5,46,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Greatest Places, The",1998,40,NA,5.5,55,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Greatest Question, The",1919,80,NA,7.5,13,0,0,0,0,4.5,24.5,24.5,14.5,34.5,0,"",0,0,0,1,0,0,0 -"Greatest Show on Earth, The",1952,152,4000000,6.7,1361,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Greatest Story Ever Told, The",1965,225,20000000,6,1097,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Greatest, The",1977,101,NA,4.4,152,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Greed",1924,239,NA,8.3,1539,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Greed of William Hart, The",1948,80,NA,5.7,12,0,4.5,0,4.5,24.5,4.5,14.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Greedy",1994,113,NA,5.7,2119,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Greedy Humpty Dumpty",1936,7,NA,4.7,14,4.5,0,24.5,14.5,4.5,24.5,4.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Greedy for Tweety",1957,6,NA,7.2,45,0,0,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Greek Mirthology",1954,7,NA,5.7,22,4.5,4.5,0,0,24.5,34.5,14.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Greek Tycoon, The",1978,107,NA,4.7,175,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Greeks Had a Word for Them, The",1932,79,NA,6.2,23,0,0,4.5,4.5,14.5,4.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Green",1998,88,NA,5.6,115,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Green Archer, The",1940,285,NA,6.7,25,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Green Arrow Fan Film",2004,3,4000,6.2,5,24.5,0,0,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Green Berets, The",1968,141,7000000,4.9,1851,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Green Buddha, The",1955,62,NA,4.4,5,44.5,0,0,0,44.5,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Green Card",1990,107,NA,6,5175,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Green Card Fever",2003,100,NA,5.3,73,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Green Cockatoo, The",1937,65,NA,4.9,8,0,0,24.5,14.5,0,24.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Green Diggity Dog",2001,97,NA,1.4,5,24.5,0,0,24.5,0,24.5,0,0,0,44.5,"",0,0,1,0,0,1,0 -"Green Dolphin Street",1947,140,NA,6.5,195,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Green Dragon",2001,115,NA,6.1,249,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Green Eyes",1934,68,NA,4.8,10,0,0,14.5,14.5,34.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Green Eyes for Anastice",2004,93,10000,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Green Fields",1937,99,8000,6.2,25,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Green Fingers",1947,83,NA,6.2,10,0,0,0,14.5,0,24.5,34.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Green Fire",1954,100,NA,5.6,153,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Green Glove, The",1952,88,NA,6.6,56,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Green Goddess, The",1930,73,NA,5.2,45,4.5,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Green Grass of Wyoming",1948,89,NA,6.7,22,0,0,4.5,4.5,4.5,34.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Green Grow the Rushes",1951,77,NA,5.2,24,0,0,4.5,14.5,24.5,14.5,4.5,14.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Green Hell",1940,87,NA,6.7,53,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Green Helmet, The",1961,88,NA,5.4,34,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Green Hornet Strikes Again!, The",1941,293,NA,8.5,86,0,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,44.5,"",1,0,0,0,0,0,0 -"Green Hornet, The",1940,99,NA,7.6,89,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Green Hour, The",2002,25,NA,3.7,18,14.5,24.5,4.5,0,0,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Green Ice",1981,110,NA,4.8,124,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Green Light",1937,85,NA,5.8,53,0,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Green Man, The",1956,80,NA,7.4,211,4.5,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Green Mansions",1959,104,3000000,5,216,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Green Mile, The",1999,188,60000000,8.1,60142,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Green Monkey",1998,10,NA,5.1,15,4.5,4.5,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Green Oaks",2003,31,NA,6.6,5,24.5,0,0,0,24.5,0,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Green Pastures, The",1936,93,NA,6.9,130,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Green Plaid Shirt",1997,87,NA,5.3,132,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Green Promise, The",1949,93,NA,5.7,30,0,0,4.5,4.5,24.5,44.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Green Scarf, The",1954,96,NA,5.4,5,0,0,0,0,24.5,0,24.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Green Slime, The",1968,90,NA,3.3,338,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Green Years, The",1946,127,NA,6.2,91,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Green for Danger",1946,91,NA,8.1,233,0,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Green-Eyed Blonde, The",1957,76,NA,5.7,14,4.5,0,0,14.5,14.5,4.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Greendale",2003,87,NA,6.3,124,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Greene Murder Case, The",1929,69,NA,7.1,14,0,0,0,0,0,14.5,34.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Greener",2004,89,NA,6.5,16,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Greener Hills, The",1939,11,NA,5,8,0,0,0,34.5,14.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Greener Yard, The",1949,7,NA,6.8,14,0,0,4.5,0,4.5,24.5,24.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Greengage Summer, The",1961,99,NA,7.1,64,0,0,0,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,1,0,1,0 -"Greenkeeping",1992,85,NA,4.6,11,4.5,14.5,4.5,14.5,0,0,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Greenskeeper, The",2002,90,80000,4.7,38,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Greenwich Village",1944,82,NA,6.4,36,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Greetings",1968,88,39000,5.6,349,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Greetings Bait",1943,7,NA,6.8,28,0,0,0,0,14.5,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Greetings from Africa",1996,8,NA,7.9,5,0,0,0,0,0,0,24.5,84.5,0,0,"",0,0,1,0,1,0,1 -"Gregorio",1985,85,NA,6.2,7,0,0,0,0,14.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Gregory's Girl",1981,91,NA,7,1398,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Gregory's Two Girls",1999,116,NA,5.3,128,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Greifer, Der",1930,82,NA,6.1,7,0,14.5,0,0,24.5,24.5,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Greippi",1999,20,NA,4.9,17,0,0,14.5,14.5,14.5,24.5,4.5,0,24.5,4.5,"",0,0,0,1,0,0,1 -"Gremlins",1984,106,11000000,6.8,15044,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Gremlins 2: The New Batch",1990,106,50000000,5.9,7780,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grendel Grendel Grendel",1981,88,NA,7.1,36,0,0,0,4.5,4.5,4.5,14.5,14.5,4.5,45.5,"",0,1,0,0,0,0,0 -"Grenouille et la baleine, La",1987,91,NA,6,85,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Grenouilles qui demandent un roi, Les",1923,9,NA,8.2,34,0,0,0,0,4.5,4.5,4.5,44.5,14.5,24.5,"",0,1,1,1,0,0,1 -"Grens, De",1984,100,NA,5.9,11,0,0,0,0,44.5,14.5,4.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Gretchen & the Night Danger",2004,26,4000,7.5,11,0,0,0,4.5,0,0,14.5,0,24.5,44.5,"",0,0,0,1,0,0,1 -"Gretchen Brettschneider Skirts Thirty",2003,15,NA,6.9,13,24.5,4.5,0,0,0,0,0,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Gretchen the Greenhorn",1916,58,NA,6.9,19,0,0,0,0,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Grev Axel",2001,86,NA,6.1,150,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Grey Fox, The",1982,110,NA,7.4,369,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Grey Gardens",1975,100,NA,7.8,415,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Grey Hounded Hare, The",1949,7,NA,7.5,37,0,4.5,4.5,0,4.5,14.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Grey Owl",1999,118,30000000,5.7,629,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Grey Zone, The",2001,108,5000000,7.3,1553,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Grey, The",2004,86,NA,8.8,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"R",0,0,0,1,0,0,0 -"Greyfriars Bobby: The True Story of a Dog",1961,91,NA,6.7,120,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Greystoke: The Legend of Tarzan, Lord of the Apes",1984,143,NA,5.9,3360,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Gridlock'd",1997,91,NA,6.8,1860,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Grido, Il",1957,116,NA,7.8,229,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Grieche sucht Griechin",1966,89,NA,5.8,22,0,0,14.5,24.5,4.5,4.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Griechische Feigen",1976,95,NA,5.6,30,4.5,4.5,24.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Grief",1993,87,NA,5.2,122,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Grief",1994,18,NA,5.4,7,14.5,0,0,14.5,14.5,24.5,0,14.5,0,14.5,"",0,0,0,1,0,0,1 -"Griekse tragedie, Een",1985,7,NA,7,45,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Grievous Bodily Harm",1988,96,NA,5.2,34,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Grifters, The",1990,110,NA,7.1,4999,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Grijpstra & De Gier",1979,86,NA,5.7,133,4.5,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grijs",1996,11,NA,5.5,30,4.5,4.5,0,14.5,14.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Grillen",2003,6,NA,4.9,17,4.5,4.5,24.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,"",0,0,1,1,0,0,1 -"Grilo Feliz, O",2001,80,NA,4.3,17,14.5,4.5,0,0,4.5,14.5,24.5,4.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Grim",1995,86,1000000,1.6,228,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Grim Prairie Tales",1990,86,NA,4.9,155,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Grimm",2003,110,3700000,6.2,201,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Grin and Bear It",1954,7,NA,7.6,22,0,0,0,0,0,4.5,44.5,4.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Grin and Share It",1957,7,NA,5.7,8,0,0,0,14.5,45.5,0,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Grind",1997,96,NA,4.3,147,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Grind",2003,105,NA,4.5,1244,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"PG-13",0,0,1,0,0,0,0 -"Gringuito",1998,100,NA,6.6,36,14.5,0,0,4.5,4.5,24.5,14.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Grinning Evil Death",1990,7,NA,6.3,17,4.5,0,4.5,0,0,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Grip of the Strangler",1958,78,NA,5.2,77,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Gripes",1943,3,NA,6.6,7,0,0,0,0,0,45.5,14.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Grips, Grunts and Groans",1937,19,NA,7.8,90,4.5,0,4.5,0,0,14.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Gripsholm",2000,100,NA,6.2,120,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Gris",2003,9,NA,7.3,6,0,0,0,0,14.5,14.5,14.5,0,45.5,0,"",0,0,0,0,0,0,1 -"Grisjakten",1970,94,NA,6.5,8,0,0,0,0,14.5,34.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Grissom Gang, The",1971,128,NA,6.6,138,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Grito en el cielo, El",1998,101,NA,7,44,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Grito, El",1968,120,NA,6.2,11,14.5,0,0,0,0,44.5,4.5,0,4.5,14.5,"",0,0,0,0,1,0,0 -"Grito, El",2000,99,NA,4.7,13,14.5,4.5,0,14.5,4.5,34.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Gritos en la noche",1962,86,NA,5.3,162,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Grizzly",1976,97,750000,3.9,236,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Grizzly Adams and the Legend of Dark Mountain",1999,98,NA,4.2,14,4.5,4.5,34.5,24.5,14.5,4.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Grizzly Falls",1999,94,NA,5.1,112,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Grizzly Mountain",1997,96,NA,4.5,45,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Grocer's Wife, The",1991,100,NA,3.8,12,4.5,4.5,0,4.5,24.5,24.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Grocery Boy, The",1932,7,NA,5.1,7,0,0,24.5,0,0,24.5,14.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Grocery Clerk, The",1920,27,NA,4.1,10,0,0,34.5,14.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Groom Lake",2002,92,750000,3.7,95,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Groom Wore Spurs, The",1951,80,NA,5,11,4.5,4.5,0,14.5,0,34.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Groomsmen, The",2001,89,NA,5.5,108,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Groove",2000,86,500000,6,1171,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Groove Requiem in the Key of Ski",1991,89,NA,9.3,7,0,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Groove Tube, The",1974,75,200000,5.4,490,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Groping",1980,8,NA,3.8,17,4.5,14.5,14.5,0,0,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Gros et le maigre, Le",1961,15,NA,6.4,124,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Gross Anatomy",1989,109,NA,5.8,1008,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gross Out",1991,82,NA,2,11,74.5,0,0,0,0,4.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Grosse Bagarozy, Der",1999,96,NA,5.5,165,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Grosse Pointe Blank",1997,107,15000000,7.4,20400,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Grosse fatigue",1994,92,NA,6.5,417,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Grot, De",2001,90,NA,7.4,304,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Grote vakantie, De",2000,145,NA,7.1,28,14.5,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Grotesque",1988,78,NA,3.7,59,24.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Grotesque, The",1995,99,NA,5.2,172,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Grotten van Han van Vloten, De",2003,9,NA,5.2,8,0,0,14.5,14.5,24.5,14.5,34.5,0,0,0,"",0,0,1,1,0,0,1 -"Groucho Marx's Home Movies",1933,22,NA,6.8,14,0,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,1,0,1 -"Ground Control",1998,93,NA,6,376,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Ground Zero",1987,109,NA,6.3,105,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Grounded",2003,15,NA,3.7,19,34.5,4.5,4.5,0,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Groundhog Day",1993,101,NA,8,44819,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG",0,0,1,0,0,1,0 -"Grounds for Marriage",1951,90,NA,6.4,25,4.5,0,0,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Groundstar Conspiracy, The",1972,103,NA,5.6,104,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Group",2002,106,NA,6.4,22,4.5,14.5,0,4.5,4.5,4.5,14.5,34.5,4.5,0,"",0,0,1,1,0,0,0 -"Group Madness",1983,48,NA,6.3,21,4.5,4.5,4.5,0,0,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Group Marriage",1973,85,NA,3.4,7,14.5,0,0,14.5,14.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Group, The",1966,150,NA,6.5,162,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Groupie",1993,82,NA,3.1,6,34.5,0,0,0,0,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Groupies",1970,84,NA,2,14,24.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Growin' a Beard",2003,29,10000,8.7,7,0,0,0,0,14.5,0,14.5,24.5,44.5,0,"",0,0,0,0,1,0,1 -"Growing Hair",2002,91,NA,7.1,9,14.5,0,0,0,0,0,24.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Growing Up in America",1988,90,NA,6.3,7,0,0,0,0,14.5,24.5,14.5,0,24.5,14.5,"",0,0,0,0,1,0,0 -"Groza",1934,78,NA,6.2,8,0,0,0,0,14.5,14.5,45.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Groznyy vek",1976,105,NA,8,15,0,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Grudge, The",2004,92,10000000,5.9,11441,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Grue Crew, The",1999,94,NA,5.6,14,4.5,0,0,4.5,14.5,24.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Gruesome Twosome, A",1945,7,NA,7.2,32,0,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Gruesome Twosome, The",1967,72,80000,3.4,89,14.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Grumpier Old Men",1995,101,25000000,6.2,3711,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Grumpy Old Men",1993,103,NA,6.7,5857,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Grunt",1983,90,NA,2.1,6,34.5,0,34.5,0,0,0,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Grunt! The Wrestling Movie",1985,90,NA,4.4,43,24.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Gruppenbild mit Dame",1977,100,NA,6.5,30,4.5,4.5,4.5,0,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gruppo di famiglia in un interno",1974,121,NA,7.3,305,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Gryozy",1915,37,NA,8.8,13,0,0,0,0,0,4.5,14.5,4.5,34.5,34.5,"",0,0,0,1,0,0,1 -"Grzeszny zywot Franciszka Buly",1980,106,NA,5.4,7,0,0,0,14.5,24.5,14.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Gu cheng bielian",1998,114,NA,5.3,16,14.5,0,4.5,14.5,4.5,14.5,14.5,14.5,14.5,0,"",0,0,0,1,0,1,0 -"Gu feng",1994,91,NA,7.2,11,0,0,0,0,14.5,4.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gu huo zai san",1996,98,NA,6.6,102,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gu huo zi zhi ren zai jiang hu",1996,197,NA,7.1,184,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Gu jing you hun",1974,92,NA,4,7,14.5,0,14.5,0,0,24.5,14.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Guadalcanal Diary",1943,93,NA,7.2,251,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Guaguasi",1983,107,NA,7.9,15,0,0,0,0,0,0,24.5,44.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Guang Dong shi hu",1979,90,NA,5,13,0,0,4.5,14.5,14.5,14.5,0,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Guang Zhou sha ren wang zhi ren pi ri ji",1995,84,NA,5.5,6,0,14.5,0,0,14.5,0,0,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Guang dong xiao lao hu",1971,80,NA,4.9,215,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Guangyinde gushi",1983,106,NA,7.2,21,0,0,0,0,4.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Guantanamera",1995,105,NA,6.8,450,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Guante, El",2005,10,NA,7.4,5,0,0,0,0,0,64.5,0,0,24.5,24.5,"",0,1,0,0,0,0,1 -"Guapo del '900, Un",1960,84,NA,7,8,0,0,0,0,0,14.5,24.5,0,24.5,34.5,"",0,0,0,1,0,0,0 -"Guappi, I",1973,130,NA,5.7,14,0,0,14.5,0,14.5,14.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Guarani, O",1996,91,NA,8,35,24.5,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Guard Dog",2004,5,NA,7.9,56,0,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Guarda il cielo: Stella, Sonia, Silvia",2000,97,NA,6.7,18,4.5,0,0,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Guardami",1999,95,NA,6,59,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Guarded Secrets",1997,91,NA,1.7,19,34.5,24.5,14.5,4.5,0,4.5,14.5,0,0,4.5,"R",0,0,0,0,0,0,0 -"Guardia, guardia scelta, brigadiere e maresciallo",1956,90,NA,6,21,0,0,4.5,0,14.5,24.5,34.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Guardian",2000,92,NA,3.6,142,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Guardian Angel",1994,97,NA,3.8,48,4.5,14.5,14.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Guardian of the Abyss",1980,50,NA,6.6,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Guardian of the Wilderness",1976,112,NA,5.3,21,4.5,0,4.5,4.5,14.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Guardian, The",1990,92,NA,4.6,479,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Guardian, The",1999,100,NA,3.1,11,4.5,0,4.5,4.5,24.5,14.5,0,0,0,24.5,"R",1,0,0,0,0,0,0 -"Guardie e ladri",1951,109,NA,7.5,90,4.5,0,0,4.5,0,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Guarding Eddy",2004,96,NA,9.1,9,0,0,0,0,0,0,0,34.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Guarding Tess",1994,96,NA,6,2770,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Guardsman, The",1931,82,NA,5.8,56,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Gubben kommer",1939,87,NA,5.7,7,0,0,14.5,0,0,45.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Guddi",1971,121,NA,6,32,0,0,4.5,0,4.5,14.5,14.5,34.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Gudia",1997,139,NA,6.4,11,0,0,0,4.5,0,14.5,4.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Gudrun",1992,97,NA,7,11,0,0,0,0,0,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Guelwaar",1992,115,NA,7,48,4.5,0,0,0,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Guendalina",1956,103,NA,4.9,9,0,0,0,24.5,14.5,0,0,45.5,0,14.5,"",0,0,1,0,0,0,0 -"Guernica",1978,25,NA,6.6,17,0,4.5,0,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Guerra Conjugal",1975,93,NA,3,7,14.5,0,14.5,14.5,0,0,24.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Guerra continua, La",1962,84,NA,4.3,6,0,0,14.5,14.5,34.5,0,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Guerra de Canudos",1997,170,6000000,7.5,126,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Guerra dei robot, La",1978,99,NA,1.9,50,44.5,4.5,14.5,4.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Guerra del cerdo, La",1975,90,NA,6.5,11,0,0,0,0,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Guerra del ferro - Ironmaster, La",1983,98,NA,3.1,64,24.5,14.5,4.5,14.5,4.5,4.5,0,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Guerra di Troia, La",1961,105,NA,5.1,51,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Guerra do Brasil - Toda Verdade Sobre a Guerra do Paraguai",1987,104,NA,3.6,5,0,44.5,0,24.5,0,0,0,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Guerra dos Pelados, A",1970,98,NA,5.9,5,0,0,0,0,44.5,0,44.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Guerra gaucha, La",1942,90,NA,7.9,22,4.5,0,0,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Guerre d'un seul homme, La",1982,105,NA,8.5,11,4.5,0,0,0,0,0,0,24.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Guerre dans le Haut Pays, La",1999,105,NA,4.7,13,0,4.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Guerre des boutons, La",1962,90,NA,7.3,213,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Guerre des polices, La",1979,100,NA,6.3,27,4.5,0,0,4.5,4.5,24.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Guerre des tuques, La",1984,92,NA,7.3,250,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Guerre du feu, La",1981,100,12500000,7.1,2059,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Guerre est finie, La",1966,121,NA,7.5,228,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Guerre sans nom, La",1992,240,NA,6.9,5,0,0,0,0,24.5,24.5,24.5,0,44.5,0,"",0,0,0,0,1,0,0 -"Guerreros",2002,96,NA,7.1,274,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Guerriere dal seno nudo, Le",1974,89,NA,5,24,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Guerrieri dell'anno 2072, I",1984,90,NA,4.2,116,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Guerriero Camillo, Il",1999,90,NA,3.5,9,14.5,14.5,0,34.5,24.5,0,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Guerriers et captives",1994,94,NA,7.3,6,0,0,0,14.5,0,0,0,34.5,0,45.5,"",0,0,0,1,0,0,0 -"Guess What Happened to Count Dracula?",1970,80,NA,2.7,21,44.5,4.5,14.5,4.5,4.5,0,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Guess What We Learned in School Today?",1971,96,NA,3.8,9,0,0,34.5,14.5,14.5,24.5,0,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Guess Who",2005,106,NA,4.9,1355,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Guess Who's Coming to Dinner",1967,108,4000000,7.5,3892,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Guest House Paradiso",1999,89,NA,5.1,1491,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Guest Room",2003,20,NA,8,6,0,0,0,0,0,0,34.5,45.5,0,14.5,"",0,0,0,1,0,0,1 -"Guest Wife",1945,90,NA,6.4,45,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Guest in the House",1944,121,NA,6.1,21,4.5,4.5,0,4.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Guest of Honor, The",2001,15,30000,6.8,15,0,0,0,24.5,0,0,24.5,14.5,14.5,34.5,"",0,0,1,1,0,0,1 -"Guests of Hotel Astoria",1989,124,NA,7.6,5,0,24.5,0,0,0,0,0,44.5,0,44.5,"",0,0,0,0,0,0,0 -"Gueule d'amour",1937,94,NA,7.2,48,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gueule de l'autre, La",1979,100,NA,4.9,29,14.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gueule ouverte, La",1974,82,NA,5.9,30,4.5,0,4.5,0,0,24.5,24.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Guggen - Du store gauda",2001,16,NA,5.7,6,34.5,0,0,0,14.5,0,14.5,0,0,34.5,"",0,1,0,0,0,0,1 -"Gui da gui",1980,102,NA,7.4,208,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",1,0,1,0,0,0,0 -"Gui lin rong ji",1998,96,NA,6.7,12,0,0,0,0,14.5,14.5,4.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Gui ma shuang xing",1974,107,NA,7.8,18,0,4.5,0,0,0,14.5,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Gui xin niang",1987,88,NA,5.9,33,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Gui yao gui",1990,100,NA,7.1,43,4.5,0,0,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Guichets du Louvre, Les",1974,95,NA,8,7,0,0,0,0,14.5,0,0,45.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Guide for the Married Man, A",1967,89,NA,6.4,437,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Guided Mouse-ille",1967,7,NA,4.9,19,14.5,0,0,4.5,34.5,14.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Guided Muscle",1955,7,NA,6.8,59,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Guignolo, Le",1980,108,NA,4.8,213,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Guihuaxiang",1987,112,NA,8.1,7,0,0,0,0,0,14.5,14.5,45.5,0,14.5,"",0,0,0,1,0,0,0 -"Guilt of Janet Ames, The",1947,83,NA,7.1,5,0,0,0,0,0,24.5,0,64.5,24.5,0,"",0,0,0,1,0,0,0 -"Guiltrip",1995,90,NA,6.5,31,0,0,0,0,14.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Guilty Bystander",1950,91,NA,6.3,11,0,0,0,4.5,4.5,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Guilty Generation, The",1931,82,NA,4.8,5,0,24.5,0,0,24.5,0,24.5,24.5,0,24.5,"",0,0,0,1,0,1,0 -"Guilty Hands",1931,69,NA,6.7,51,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Guilty Parents",1934,75,NA,4.4,5,0,0,24.5,24.5,0,0,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Guilty as Charged",1991,95,NA,4.9,74,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Guilty as Hell",1932,80,NA,5.7,5,0,0,24.5,0,0,0,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Guilty as Sin",1993,107,NA,5.5,940,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Guilty by Suspicion",1991,105,NA,6.3,1565,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Guilty of Treason",1950,86,NA,6,15,4.5,0,4.5,4.5,0,34.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Guilty, The",1947,71,NA,8,11,0,0,0,0,4.5,4.5,24.5,4.5,34.5,4.5,"",0,0,0,0,0,0,0 -"Guilty, The",2000,112,NA,6.3,752,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Guinea Pig, The",1948,97,NA,6.3,38,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Guinevere",1999,104,2600000,6.3,804,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Guita, La",1970,90,NA,6.4,5,0,0,0,0,0,24.5,64.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Guizi lai le",2000,162,NA,8.4,362,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Gula bilen, Den",1963,95,NA,4.7,16,0,0,0,34.5,14.5,14.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Gula divisionen",1954,86,NA,6.3,26,0,0,14.5,4.5,14.5,34.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gulczas, a jak myslisz?",2001,100,NA,2.4,122,74.5,4.5,4.5,4.5,4.5,4.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Guldregn",1988,90,NA,6.5,61,4.5,0,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Guling jie shaonian sha ren shijian",1991,188,NA,8.4,222,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Gull-Pian",1988,25,NA,6,16,4.5,0,0,0,14.5,14.5,14.5,0,4.5,34.5,"",0,0,0,0,0,0,1 -"Gulle Minnaar, De",1990,100,NA,3.4,86,24.5,14.5,14.5,14.5,4.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Gulliver Mickey",1934,9,NA,6.9,40,0,4.5,4.5,0,4.5,24.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Gulliver's Travels",1939,76,NA,6.6,304,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Gulliver's Travels",1977,81,NA,4.6,50,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Gullsandur",1984,98,NA,5.8,7,14.5,0,14.5,0,24.5,14.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Gulp",2001,7,NA,6.7,42,4.5,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Gum gee yuk yip",1994,107,NA,7.1,145,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gum gee yuk yip 2",1996,107,NA,6,49,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Gumball 3000: The Movie",2003,100,NA,6.1,112,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Gumball Rally, The",1976,105,NA,5.7,586,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Gumby: The Movie",1995,88,NA,5.7,88,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Gumiho",1994,115,NA,5.2,23,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,1,0 -"Gummi-Tarzan",1981,89,NA,6.8,112,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gummo",1997,89,NA,5.6,3177,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Gums",1976,90,NA,6.1,9,24.5,0,0,0,0,0,45.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Gumshoe",1971,88,NA,6.2,123,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Gumshoe Kid, The",1990,98,NA,3.2,10,14.5,14.5,24.5,14.5,34.5,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Gumyeong",2000,94,NA,6,6,0,14.5,14.5,0,0,0,45.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Gun Battle at Monterey",1957,67,NA,4.4,9,0,14.5,0,24.5,24.5,14.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Gun Belt",1953,77,NA,5.2,11,0,0,0,24.5,24.5,34.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Gun Brothers",1956,79,NA,4.8,15,4.5,0,14.5,4.5,14.5,34.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Gun Drill by Naval Cadets at Newport Training School",1900,1,NA,2.6,5,0,44.5,44.5,0,0,24.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Gun Duel in Durango",1957,73,NA,5,9,0,0,0,24.5,14.5,45.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Gun Fever",1958,83,NA,5.8,8,14.5,0,0,14.5,14.5,0,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Gun Fury",1953,83,NA,5.4,81,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gun Girls",1956,67,NA,6.6,6,14.5,0,0,0,14.5,14.5,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Gun Glory",1957,89,NA,5.4,65,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Gun Hawk, The",1963,92,NA,5.2,22,14.5,4.5,0,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gun Is Loaded, The",1989,35,NA,6.6,5,0,0,24.5,0,24.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Gun Law",1938,60,NA,3.8,13,4.5,0,14.5,34.5,4.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Gun Runners, The",1958,83,NA,5.9,20,0,0,0,24.5,34.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Gun Shy",2000,101,10000000,5.4,1701,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Gun Smugglers",1948,61,NA,7.7,6,0,14.5,0,0,0,14.5,0,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Gun That Won the West, The",1955,71,NA,4.3,10,14.5,0,24.5,24.5,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Gun for a Coward",1957,88,NA,5.4,33,4.5,4.5,0,14.5,34.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gun in Betty Lou's Handbag, The",1992,89,NA,4.6,445,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gun in His Hand, A",1945,19,NA,7.1,9,0,0,0,0,14.5,34.5,14.5,44.5,0,0,"",0,0,0,1,0,0,1 -"Gun the Man Down",1956,74,NA,2.8,9,34.5,34.5,0,0,14.5,0,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Gun, From 6 to 7:30 p.m., The",2003,98,NA,6.9,18,14.5,4.5,0,4.5,4.5,0,0,24.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Gun, a Car, a Blonde, A",1997,103,NA,4.7,104,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Guna",1992,167,NA,7,35,4.5,0,0,14.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Gunan il guerriero",1983,81,NA,2,38,44.5,14.5,4.5,14.5,14.5,0,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Gunblast Vodka",2000,97,NA,3,69,34.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Guncrazy",1992,97,800000,5.5,437,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gundamma Katha",1962,166,NA,9.5,13,0,0,0,0,0,0,4.5,0,24.5,64.5,"",0,0,1,1,0,0,0 -"Gunfight at Comanche Creek",1963,90,NA,5.5,43,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gunfight at Dodge City, The",1959,81,NA,6.5,30,0,0,4.5,4.5,4.5,34.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Gunfight at the O.K. Corral",1957,122,NA,7.2,1394,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Gunfight in Abilene",1967,86,NA,5.1,38,0,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gunfight, A",1971,89,NA,6.2,154,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gunfighter",1998,98,NA,3.5,95,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Gunfighter's Moon",1995,100,NA,6.1,128,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,0,0,1,0 -"Gunfighter, The",1950,85,NA,7.5,1029,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Gunfighters",1947,87,NA,5.2,37,14.5,4.5,0,0,4.5,24.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Gunfighters of Casa Grande",1964,90,NA,4.5,13,0,34.5,0,24.5,34.5,4.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Gung Ho",1986,111,NA,5.8,2167,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Gung Ho!",1943,88,NA,5.9,141,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gunga Din",1939,117,1910000,7.6,1988,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Gunga Jumna",1961,178,NA,6,17,0,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Gungala la vergine della giungla",1967,87,NA,2.2,7,24.5,24.5,0,0,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Gungun hongchen",1990,94,NA,7.8,45,0,0,0,0,4.5,14.5,4.5,14.5,24.5,44.5,"",0,0,0,0,0,1,0 -"Gunki hatameku motoni",1972,96,NA,8.4,23,0,0,0,0,4.5,14.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Gunman from Bodie, The",1941,62,NA,6.6,12,0,0,0,14.5,4.5,24.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Gunman in the Streets",1950,86,NA,6.8,14,0,0,0,0,4.5,24.5,44.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Gunman's Walk",1958,97,NA,5.8,64,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Gunmen",1994,96,NA,4.6,642,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Gunmen from Laredo",1959,67,NA,4.8,18,4.5,14.5,24.5,14.5,14.5,14.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Gunn",1967,94,NA,5.8,48,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gunnar Hedes saga",1923,101,NA,7.1,18,4.5,0,0,0,14.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Gunner Palace",2004,85,NA,6.4,203,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,0,1,0,0 -"Gunplay",1951,61,NA,6.5,10,0,0,24.5,0,0,14.5,14.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Gunplay",1996,83,NA,5.5,6,14.5,14.5,14.5,0,0,0,0,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gunpoint",1966,86,NA,6.6,22,0,0,4.5,4.5,14.5,14.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Gunro no keifu",1997,140,NA,3.3,12,14.5,0,4.5,4.5,0,14.5,0,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Gunrunner, The",1984,78,2000000,3.2,84,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Guns",1990,96,NA,3.3,90,24.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Guns A-Poppin",1957,17,NA,4.7,25,24.5,14.5,14.5,14.5,14.5,14.5,4.5,0,0,0,"",0,0,1,0,0,0,1 -"Guns Don't Argue",1957,92,NA,4.8,10,14.5,24.5,0,24.5,14.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Guns and Guitars",1936,58,NA,7.2,7,0,0,0,14.5,0,0,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Guns and Lipstick",1995,96,NA,1.9,11,24.5,4.5,34.5,4.5,0,4.5,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Guns and the Fury, The",1981,90,NA,3.1,18,14.5,4.5,24.5,24.5,4.5,0,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Guns at Batasi",1964,103,NA,7.1,118,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Guns of August, The",1964,100,NA,6.9,40,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Guns of Darkness",1962,102,NA,5.9,19,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Guns of Fort Petticoat, The",1957,82,NA,5.6,90,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Guns of Hate",1948,61,NA,5.5,24,0,0,4.5,14.5,14.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Guns of Navarone, The",1961,156,6000000,7.6,5157,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Guns of a Stranger",1973,91,NA,6,5,24.5,0,0,0,24.5,0,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Guns of the Magnificent Seven",1969,105,NA,4.6,195,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Guns of the Pecos",1937,56,NA,5.4,14,0,0,4.5,4.5,34.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Guns of the Timberland",1960,91,NA,5.3,29,0,4.5,4.5,24.5,14.5,34.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Guns, Girls, and Gangsters",1959,70,NA,6.2,17,0,0,4.5,14.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Gunshy",1998,100,NA,5.7,240,34.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gunsight Ridge",1957,85,NA,5.3,12,0,0,0,24.5,4.5,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Gunslinger",1956,71,NA,3.3,232,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Gunsmoke",1953,79,NA,6.3,53,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gunsmoke Ranch",1937,53,35000,4.9,8,0,0,14.5,24.5,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Gunsmoke in Tucson",1958,80,NA,3.7,10,0,14.5,14.5,14.5,44.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Guo dao feng bi",1997,121,NA,4.5,15,14.5,0,0,0,0,24.5,4.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Guo hai sui dao",1999,89,NA,4.9,18,14.5,0,14.5,4.5,14.5,4.5,4.5,34.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Guo jong",1998,102,NA,5.5,17,0,0,0,14.5,14.5,14.5,44.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Guo nian hui jia",1999,90,NA,7.3,117,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Gupta vs Gordon",2003,88,NA,3,20,4.5,0,14.5,0,0,4.5,0,14.5,34.5,34.5,"",0,0,1,1,0,0,0 -"Gurbet kuslari",1964,90,NA,4.3,12,0,4.5,0,24.5,0,0,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Guru in Seven",1998,107,NA,4.4,16,14.5,0,0,0,4.5,4.5,14.5,14.5,34.5,0,"",0,0,0,1,0,0,0 -"Guru kommt, Ein",1985,98,NA,4.8,12,4.5,14.5,0,0,4.5,4.5,4.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Guru, The",1969,112,NA,5,23,0,4.5,14.5,4.5,14.5,34.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Guru, The",2002,94,11000000,5.9,3505,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Guru, the Mad Monk",1970,62,20000,3.2,23,24.5,14.5,14.5,4.5,0,14.5,4.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Gus",1976,96,NA,5.5,226,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Gusanos no llevan bufanda, Los",1992,96,NA,3.8,12,4.5,4.5,14.5,14.5,4.5,14.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Gusarskaya ballada",1962,96,NA,6.3,78,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Gusha no bindume",2004,96,NA,7.3,71,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Gutta",1988,4,NA,4.7,10,0,0,0,64.5,14.5,0,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Gutter Balls",2003,29,4000,8.3,7,14.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,1,0,0,0,1 -"Guv'nor, The",1935,88,NA,7.1,13,0,0,0,0,4.5,4.5,45.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Guy",1997,91,NA,7,118,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Guy From Harlem, The",1977,86,NA,3.6,17,34.5,14.5,0,0,4.5,0,0,14.5,0,34.5,"",1,0,0,1,0,0,0 -"Guy Maddin: Waiting for Twilight",1997,60,NA,6.1,51,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Guy Named Joe, A",1943,120,NA,6.9,264,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Guy Thing, A",2003,101,20000000,5.3,2885,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Guy Walks Into a Bar, A",1997,28,NA,6,61,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Guy Who Bought Mustique, The",2000,78,NA,6.9,27,4.5,0,0,0,4.5,14.5,44.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Guy de Maupassant",1982,131,NA,5.8,13,0,4.5,0,0,34.5,34.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Guy's Dog",1998,11,NA,7.4,7,0,0,14.5,0,14.5,0,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Guyana: Crime of the Century",1979,90,NA,5.1,46,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Guys and Dolls",1955,152,5500000,7.2,1988,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Guys, The",2002,85,NA,6.4,281,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Guyver, The",1991,92,NA,3.7,507,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Guyver: Dark Hero",1994,127,900000,4.9,283,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Gwai pin Wong ji joi yin hung bong",1999,84,NA,4.1,7,0,14.5,44.5,14.5,0,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Gwan geun shut daam",1998,95,NA,6.4,94,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Gwang tin lung foo wooi",1989,99,NA,4.4,30,24.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gwangdongwan So Hwa-jin",1983,85,NA,6,6,0,0,14.5,0,0,34.5,14.5,0,0,34.5,"",1,0,0,1,0,0,0 -"Gwen, le livre de sable",1985,107,NA,8.2,6,0,0,0,0,14.5,0,0,34.5,34.5,14.5,"",0,1,0,0,0,0,0 -"Gwendoline",1984,87,NA,4.1,348,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Gwicheondo",1996,96,NA,2.4,6,14.5,34.5,14.5,0,0,0,14.5,0,14.5,0,"",1,0,0,0,0,0,0 -"Gwiyeowo",2004,116,NA,4.9,35,14.5,0,14.5,4.5,34.5,14.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Gyae-got-un nalui ohu",1996,108,NA,6.6,52,4.5,0,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Gyakufunsha kazoku",1984,106,NA,7.8,49,4.5,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Gycklarnas afton",1953,93,NA,7.7,365,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Gyeolhon iyagi",1992,95,NA,6.3,21,0,0,4.5,0,14.5,44.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Gyeolhoneun michinjishida",2002,105,NA,7.6,95,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Gyeongmajang ganeun kil",1991,138,NA,7.3,16,4.5,0,0,0,0,24.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Gymkata",1985,90,NA,2.8,570,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Gymnasium Exercises and Drill at Newport Training School",1900,1,NA,3.1,9,14.5,14.5,34.5,24.5,14.5,0,14.5,0,0,0,"",0,0,0,0,1,0,1 -"Gymnoi sto dromo",1968,85,NA,6.1,8,0,0,0,0,14.5,34.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Gynaika mou trelathike, I",1966,92,NA,8.3,6,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,0,0,0,0,0,0 -"Gynaikes dilitirio",1993,98,NA,7.2,40,4.5,4.5,0,4.5,0,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Gynecologists, The",2003,12,NA,6,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,1,0,0,0,1 -"Gyodoso World Cup",2001,104,NA,4.3,10,14.5,0,14.5,34.5,14.5,0,34.5,14.5,0,0,"",0,0,1,1,0,0,0 -"Gypped in the Penthouse",1955,16,NA,6.2,28,4.5,0,4.5,0,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Gypsy",1962,143,4000000,7.1,675,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Gypsy 83",2001,94,NA,6.6,187,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Gypsy Angels",1980,92,NA,2.1,12,44.5,14.5,14.5,0,0,0,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Gypsy Boys",1999,103,NA,4.4,56,14.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Gypsy Colt",1953,72,NA,6,19,0,0,4.5,0,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Gypsy Moths, The",1969,107,NA,5.9,245,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Gypsy Warriors, The",1978,77,NA,4.5,10,0,24.5,14.5,14.5,14.5,34.5,0,14.5,14.5,0,"",0,0,1,1,0,0,0 -"Gypsy Wildcat",1944,77,NA,5.4,11,0,0,0,34.5,4.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Gypsy and the Gentleman, The",1958,107,NA,5.5,41,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Gyros tou thanatou, O",1983,94,NA,4.1,9,14.5,0,14.5,34.5,0,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"H",1990,94,NA,6.4,39,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"H Is for House",1973,10,NA,6.6,74,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"H Story",2001,111,NA,6.8,46,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"H-2 Worker",1990,70,NA,7.7,7,0,0,0,14.5,14.5,0,14.5,0,24.5,24.5,"",0,0,0,0,1,0,0 -"H-8",1958,105,NA,7.8,41,0,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"H-Bomb",1971,98,NA,3.6,6,14.5,14.5,14.5,14.5,34.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"H.H. Holmes: America's First Serial Killer",2004,64,NA,6.8,32,0,0,0,4.5,4.5,24.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"H.M. Pulham, Esq.",1941,120,NA,7.4,113,0,0,4.5,0,4.5,14.5,14.5,44.5,4.5,14.5,"",0,0,0,1,0,0,0 -"H.M.S. Bounty Sails Again!",1962,8,NA,5.7,5,0,0,0,0,64.5,24.5,24.5,0,0,0,"",0,0,0,0,1,0,1 -"H.M.S. Defiant",1962,101,NA,7,309,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"H.O.T.S.",1979,93,NA,3.8,327,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"H.R. Pukenshette",2000,10,NA,5.7,28,14.5,0,4.5,14.5,4.5,0,0,4.5,4.5,45.5,"",0,0,1,0,0,0,1 -"H2S",1969,85,NA,4.4,5,64.5,0,0,0,0,0,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"H3",2001,88,NA,6.1,16,4.5,4.5,0,0,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"HS - hors service",2001,95,NA,4.4,62,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"HUFTERS & hofdames",1997,91,NA,6.5,236,14.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"HWY: An American Pastoral",1969,50,30000,9,14,4.5,0,14.5,0,0,0,0,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Ha ett underbart liv",1992,89,NA,4.9,141,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Ha woo deung",1998,95,NA,4.8,5,0,0,44.5,0,0,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Ha yat dik mo mo cha",2000,98,NA,6.2,70,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Ha! Ha! Ha!",1934,7,NA,6,29,0,0,14.5,4.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Haakon Haakonsen",1990,92,NA,5.8,328,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Haathon Ki Lakeeren",1986,139,NA,8.3,9,0,0,0,0,0,0,0,44.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Hababam sinifi merhaba",2004,118,NA,4.2,118,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Habanera, La",1937,100,NA,5.7,56,0,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Habeas Corpus",1928,20,NA,6.6,45,0,0,4.5,14.5,4.5,14.5,45.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Habibti min elskede",2002,30,NA,7.4,9,0,0,0,0,0,24.5,34.5,34.5,14.5,0,"",0,0,0,1,0,0,1 -"Habiographia Shel Ben",2003,105,NA,6.2,6,0,0,0,45.5,0,0,0,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Habit",1997,112,200000,5.7,307,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Habitante incierto, El",2004,90,NA,7.7,9,0,0,0,0,0,14.5,34.5,34.5,24.5,0,"",0,0,0,0,0,0,0 -"Habla, mudita",1973,88,NA,4.8,6,0,0,0,14.5,34.5,0,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Hable con ella",2002,112,NA,8.1,12609,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Haboleshet Hokeret",2000,94,NA,5.1,11,4.5,14.5,0,0,24.5,0,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Hacerse el sueco",2001,105,NA,6.2,34,0,0,4.5,0,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hachiko monogatari",1987,107,NA,7.2,19,0,0,0,0,0,14.5,4.5,24.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Hackers",1995,107,NA,5.8,10520,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Hacks",2002,93,200000,8.1,56,0,0,4.5,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Hadaka no shima",1960,94,NA,7.6,119,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Hadashi no Gen",1983,85,NA,8.9,160,0,0,4.5,0,0,4.5,4.5,24.5,24.5,44.5,"",0,1,1,1,0,0,0 -"Hadashi no pikunikku",1993,92,NA,6.3,12,0,0,0,0,4.5,24.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Hadduta misrija",1982,115,NA,6.6,32,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hades",1995,86,NA,5.8,7,0,0,0,24.5,0,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Hadj Cheriff",1894,1,NA,4.1,14,0,4.5,44.5,14.5,4.5,14.5,4.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Hadley's Rebellion",1984,96,NA,5.7,19,4.5,0,4.5,4.5,4.5,0,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Hae anseon",2002,91,NA,6.5,174,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Haebyeoneuro gada",2000,91,NA,5.1,58,4.5,4.5,4.5,24.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Haengbokhan jangeuisa",2000,99,NA,7,18,0,0,4.5,0,0,14.5,45.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Haepi-endeu",1999,99,NA,7.1,162,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Hag in a Black Leather Jacket",1964,17,NA,7.4,9,24.5,0,0,0,0,0,14.5,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Hagedis teveel, Een",1960,35,NA,1.9,16,34.5,0,4.5,24.5,0,0,0,4.5,0,34.5,"",0,0,0,0,0,0,1 -"Hagiga B'Snuker",1975,90,NA,6.5,68,4.5,4.5,4.5,0,4.5,14.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Haha wo kowazuya",1934,93,NA,6.5,22,4.5,0,0,0,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hahn ist tot, Der",1988,12,NA,8.2,26,0,4.5,0,0,4.5,0,4.5,14.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Hai shang hua",1998,125,NA,7.3,365,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Haider lebt - 1. April 2021",2002,80,NA,5.1,41,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Haie und kleine Fische",1957,120,NA,6.4,23,0,4.5,0,4.5,4.5,0,34.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Haiku Tunnel",2001,88,NA,5.9,624,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Hail",1971,85,NA,5.6,13,0,0,4.5,4.5,0,4.5,0,44.5,0,34.5,"",0,0,1,0,0,0,0 -"Hail Caesar",1994,100,NA,2.8,172,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hail Columbia",1935,10,NA,4.7,9,0,0,14.5,14.5,64.5,14.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Hail Columbia!",1982,37,NA,8.4,34,0,0,4.5,14.5,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Hail Sid Caesar! The Golden Age of Comedy",2001,85,NA,6.1,13,0,4.5,0,0,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,1,0,1,0,0 -"Hail the Conquering Hero",1944,101,NA,7.7,515,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Hail, Brother",1935,18,NA,5.3,7,0,0,0,0,74.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Hail, Hero!",1969,100,NA,4.7,36,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hainburg - Je t'aime, gendarme",2001,94,NA,8.2,10,14.5,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Haine",1980,90,NA,6.6,24,0,4.5,4.5,0,0,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Haine, La",1995,96,NA,7.8,5714,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Hair",1979,121,11000000,6.8,4248,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Hair High",2004,77,NA,6.5,60,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,1,0 -"Hair Show",2004,105,NA,2.6,33,34.5,4.5,4.5,4.5,0,0,4.5,14.5,4.5,34.5,"PG-13",0,0,1,0,0,1,0 -"Hair-Raising Hare",1946,7,NA,8.2,159,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Haircut, The",1982,22,NA,7.5,12,24.5,0,0,4.5,4.5,4.5,4.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Hairied and Hurried",1965,7,NA,5.2,14,4.5,0,14.5,14.5,4.5,24.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Hairshirt",1998,89,65000,4.2,242,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Hairspray",1988,92,2000000,6.6,2752,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Hairy Ape, The",1944,92,NA,5.7,35,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Haitan de yitian",1983,166,NA,8.1,26,0,0,0,0,0,4.5,14.5,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Haiti. Uden titel",1996,82,NA,6.9,7,0,0,0,0,0,24.5,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Haixian",2001,86,NA,5.4,26,0,14.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Hajde da se volimo",1987,87,NA,3.4,18,34.5,4.5,4.5,4.5,0,0,0,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Hajde da se volimo 2",1989,95,NA,6.9,8,24.5,0,0,0,0,0,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Hajde da se volimo 3",1990,92,NA,5,10,45.5,0,0,0,0,0,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Hajka",1977,104,NA,7.1,9,14.5,0,0,0,0,14.5,24.5,24.5,34.5,0,"",0,0,0,0,0,0,0 -"Hak bak sam lam",2003,104,NA,6.8,93,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hak gam",1997,126,NA,5.9,66,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hak hap",1996,102,NA,5.7,2115,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Hakai",1962,119,NA,6.8,9,0,0,0,0,24.5,0,24.5,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Haker",2002,90,NA,3.5,61,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Hakkari'de Bir Mevsim",1983,110,NA,7.9,20,4.5,0,0,0,4.5,0,14.5,24.5,45.5,4.5,"",0,0,0,1,0,0,0 -"Hakkodasan",1977,169,NA,6.6,11,0,0,0,0,4.5,0,44.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Hakkyousuru kuchibiru",2000,85,NA,4.4,52,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hakob Hovnatanyan",1967,8,NA,6.9,27,0,0,0,0,0,14.5,44.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Haksaeng bukgun shinwi",1996,116,NA,6.1,17,0,4.5,0,0,4.5,0,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Hakuchi",1951,265,NA,7.5,233,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hakuchi",1999,146,NA,7.7,17,4.5,4.5,4.5,0,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Hakuchu no buraikan",1961,82,NA,3.8,10,24.5,0,0,0,24.5,24.5,0,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Hakuchu no torima",1966,99,NA,6.7,34,0,14.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hakuja den",1958,76,NA,6.6,19,0,0,0,0,24.5,4.5,24.5,24.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Hakuoki",1959,109,NA,7.1,6,0,0,0,0,0,14.5,34.5,34.5,14.5,0,"",1,0,0,1,0,0,0 -"Hal Buckley",2001,25,NA,3.5,6,45.5,14.5,0,0,0,14.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Halalabad Blues",2002,120,NA,4.6,43,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Halbe Miete",2002,92,NA,7.3,80,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Halbe Treppe",2002,105,NA,6.9,384,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Halbe Welt",1993,83,NA,4.4,19,14.5,0,4.5,4.5,14.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Halbstarken, Die",1956,89,NA,7,31,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Halbzarte, Die",1958,92,NA,5.1,15,0,0,24.5,4.5,34.5,4.5,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Haletudsen",2004,19,NA,6.9,14,0,0,0,0,4.5,24.5,34.5,24.5,4.5,0,"",0,0,0,1,0,0,1 -"Half Angel",1951,77,NA,5,23,0,0,0,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Half Baked",1998,73,NA,6.1,6119,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Half Human: The Story of the Abominable Snowman",1957,63,NA,2.8,32,14.5,14.5,34.5,14.5,14.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Half Japanese: The Band That Would Be King",1993,90,NA,6.6,51,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Half Life",1985,87,NA,6,10,14.5,0,0,0,0,14.5,0,34.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Half Marriage",1929,68,NA,4.8,10,14.5,0,0,24.5,34.5,14.5,24.5,0,14.5,0,"",0,0,0,1,0,1,0 -"Half Moon Street",1986,90,NA,4.9,548,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Half Naked Truth, The",1932,77,NA,7.5,50,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Half Past Dead",2002,98,30000000,3.9,2099,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Half Shot at Sunrise",1930,78,NA,6.9,35,0,0,0,0,24.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Half Sister",2002,3,NA,9.3,6,0,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,1,0,0,1 -"Half Ticket",1962,168,NA,8,14,0,0,4.5,0,0,0,4.5,24.5,14.5,45.5,"",0,0,1,0,0,1,0 -"Half Way to Hell",1961,67,NA,1,7,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Half a Hero",1953,71,NA,5.9,21,14.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Half a Sixpence",1967,143,NA,6,119,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Half-Breed, The",1916,50,NA,7.9,7,0,0,0,0,0,24.5,14.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Half-Breed, The",1952,81,NA,5.4,34,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Half-Cocked",1994,90,NA,4.5,25,14.5,0,4.5,4.5,4.5,0,24.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Half-Fare Hare",1956,7,NA,6.7,28,4.5,4.5,0,0,24.5,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Half-Shot Shooters",1936,19,NA,7.3,67,4.5,0,4.5,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Half-Wits Holiday",1947,18,NA,7.5,87,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Halfway House, The",1944,95,NA,6.3,34,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Halfway Point",2005,90,NA,9.3,6,0,0,0,0,0,0,0,34.5,0,64.5,"",0,0,1,1,0,0,0 -"Hall of Mirrors",2001,106,NA,3.1,26,0,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Hallelujah",1929,100,NA,6.8,165,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hallelujah I'm a Bum",1933,68,NA,6.9,84,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hallelujah Trail, The",1965,156,NA,6.5,456,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hallelujah the Hills",1963,82,NA,3.8,24,4.5,4.5,14.5,0,4.5,0,4.5,4.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Halliday Brand, The",1957,79,NA,6.2,43,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Hallo Janine!",1939,93,NA,6.2,12,4.5,0,0,4.5,14.5,14.5,24.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Hallo Taxi",1958,94,NA,4.9,11,0,0,0,4.5,34.5,24.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Halloween",1978,101,325000,7.7,19248,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Halloween 4: The Return of Michael Myers",1988,88,5000000,5,3177,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Halloween 5",1989,96,5000000,4.2,2597,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Halloween H20: 20 Years Later",1998,85,17000000,5.3,8153,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Halloween II",1981,90,2500000,5.7,5157,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Halloween III: Season of the Witch",1982,96,2500000,3.6,4020,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Halloween Tree, The",1993,90,NA,7.6,107,4.5,4.5,0,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,1,0,0,0,0,0 -"Halloween: Resurrection",2002,89,15000000,4.3,4323,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Halloween: The Curse of Michael Myers",1995,88,5000000,4.2,2662,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Halls of Anger",1970,96,NA,5.3,38,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Halls of Montezuma",1951,113,NA,6.6,326,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hallucination Generation",1966,90,NA,4.2,9,0,14.5,34.5,14.5,14.5,0,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Halmat na borovinkite",2002,108,NA,9.1,30,4.5,0,4.5,4.5,0,0,4.5,4.5,34.5,45.5,"",0,0,1,0,0,0,0 -"Halo Effect, The",2004,97,NA,5,44,45.5,0,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Halo taxi",1983,98,NA,3.7,9,34.5,14.5,14.5,0,34.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Ham & Cheese",2004,88,NA,3.6,73,24.5,4.5,4.5,0,0,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Ham in a Role, A",1949,7,NA,7.5,20,0,0,0,0,4.5,14.5,34.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Hamam",1997,94,NA,6.8,1058,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Hamara Shahar - Bombay, Our City",1985,82,NA,7,8,0,0,0,0,0,0,34.5,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Hamateur Night",1939,8,NA,6.9,26,4.5,0,0,0,4.5,14.5,44.5,4.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Hambone and Hillie",1984,90,NA,5.1,33,14.5,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Hamburg Altona",1989,107,NA,7.6,5,0,44.5,0,0,24.5,0,0,0,44.5,0,"",0,0,0,1,0,0,0 -"Hamburger Hill",1987,112,NA,6.4,2606,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hamburger Krankheit, Die",1979,117,NA,4.1,26,14.5,0,0,4.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Hamburger... The Motion Picture",1986,90,NA,3.3,378,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hamena oneira",1961,95,NA,8.7,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,1,0,0,0 -"Hamenos ta pairnei ola, O",2003,121,NA,5.7,45,4.5,0,14.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Hamenos thisavros tou Hoursit Pasa, O",1995,85,NA,4,6,0,64.5,0,0,0,0,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Hamesh Hamesh",1980,89,NA,7.7,6,0,0,0,0,0,34.5,34.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Hameyu'ad",1990,94,NA,7,7,0,0,0,0,0,0,45.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Hamilton",1998,117,NA,5.8,861,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hamis a baba",1991,78,NA,7.1,43,4.5,0,4.5,0,4.5,14.5,24.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Hamlet",1921,131,NA,8.5,31,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Hamlet",1948,155,NA,7.8,1647,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Hamlet",1969,117,NA,6.3,122,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hamlet",1976,65,NA,7.4,11,0,0,0,0,0,14.5,24.5,44.5,0,4.5,"",0,0,0,0,0,0,0 -"Hamlet",1996,242,18000000,7.7,10065,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Hamlet liikemaailmassa",1987,86,NA,7.3,164,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Hammar",1992,100,NA,5.9,7,0,14.5,14.5,0,0,44.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Hammer",1972,92,NA,3.6,36,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Hammer Down",1992,83,NA,3.6,8,24.5,34.5,0,0,0,14.5,0,0,0,24.5,"",1,0,0,1,0,0,0 -"Hammer and Cycle",2004,27,NA,9.7,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,0,1,0,1 -"Hammerhead",1968,100,NA,4.9,21,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Hammers Over the Anvil",1991,95,NA,5.5,174,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hammersmith Is Out",1972,108,NA,4.7,77,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Hammett",1982,97,NA,6.1,350,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hamnstad",1948,94,NA,6.4,88,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hamoon",1990,120,NA,7.2,48,0,0,4.5,0,0,0,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Hamos sto aigaio",1985,109,NA,5.5,14,4.5,14.5,0,0,0,24.5,14.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Hamsar",1994,100,NA,6.7,6,0,0,0,0,34.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Hamsarayan",1982,17,NA,6.3,7,0,0,0,0,0,24.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,1 -"Hamshahri",1983,52,NA,4.6,5,24.5,0,0,24.5,0,44.5,24.5,0,0,0,"",0,0,0,0,1,0,0 -"Hamsin",1982,90,NA,5.7,5,0,24.5,0,0,24.5,0,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Hamster PSA",1997,3,NA,9.2,5,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,0,1,0,0,0,1 -"Hamsun",1996,157,NA,7.1,243,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hamyeondoinda",2000,93,NA,4.3,18,0,4.5,14.5,34.5,34.5,0,4.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Han Solo Affair, The",2002,3,NA,5.3,36,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Han de Wit",1990,90,NA,5.7,12,0,0,4.5,0,0,34.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Han, Hun, Dirch og Dario",1962,106,NA,6.2,23,4.5,0,4.5,4.5,0,24.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Hana a jej bratia",2000,77,NA,5.5,14,4.5,0,14.5,24.5,0,0,24.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Hana no ran",1988,139,NA,6.5,10,0,0,0,0,34.5,0,34.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hana to Alice",2004,135,NA,7.6,180,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Hana to hebi",1974,74,NA,5.3,5,24.5,0,0,0,0,24.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Hana-bi",1997,103,NA,7.7,4836,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Hanaoka Seishu no tsuma",1967,100,NA,7.3,13,0,0,0,0,4.5,4.5,0,45.5,34.5,0,"",0,0,0,1,0,0,0 -"Hand Behind the Mouse: The Ub Iwerks Story, The",1999,90,600000,6.4,24,4.5,0,0,4.5,0,14.5,4.5,14.5,14.5,34.5,"",0,1,0,0,1,0,0 -"Hand Gun",1994,90,NA,5.2,87,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Hand Is Pinker Than the Eye, The",1967,6,NA,6.4,11,0,0,0,0,0,45.5,14.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Hand That Rocks the Cradle, The",1992,110,NA,6.2,5565,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hand in Hand",1960,78,NA,6.7,70,4.5,0,0,0,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Hand in Hand",1996,4,NA,3.3,5,0,0,44.5,24.5,0,24.5,0,0,24.5,0,"",0,1,0,0,0,0,1 -"Hand of Death",1962,58,NA,3.8,37,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Hand of Fate",1999,98,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,0,1,0,0 -"Hand of Night, The",1966,88,NA,4.2,10,14.5,0,0,34.5,14.5,24.5,0,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Hand, The",1960,61,NA,3.2,8,14.5,34.5,0,0,14.5,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Hand, The",1981,104,NA,4.5,692,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Handbikemovie",2003,99,NA,3.4,12,14.5,0,14.5,24.5,4.5,4.5,0,0,4.5,14.5,"",0,0,0,0,1,0,0 -"Handcart",2002,110,NA,4.6,24,44.5,4.5,4.5,0,24.5,0,4.5,4.5,0,4.5,"PG",0,0,0,0,0,0,0 -"Handful of Dust, A",1988,118,NA,6.7,313,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Handicap",2004,8,NA,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,1,0,0,1,1 -"Handle with Care",1932,72,NA,3,5,0,0,24.5,0,0,0,24.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Handle with Care",1958,82,NA,4.7,11,0,0,0,24.5,14.5,4.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Handle with Care",1977,98,NA,6.6,110,0,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Handle with Care",1998,3,NA,7,5,0,0,0,0,0,0,84.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Handmaid's Tale, The",1990,108,NA,5.8,1261,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hands Across the Border",1944,72,NA,6.3,8,0,0,0,0,0,45.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Hands Across the Rockies",1941,56,NA,6,7,0,14.5,0,14.5,14.5,24.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Hands Across the Table",1935,81,NA,6.8,92,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Hands Up!",1926,60,NA,8.9,24,0,0,0,0,4.5,4.5,4.5,14.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Hands of Ida, The",1995,30,NA,4.2,5,64.5,0,0,0,0,0,0,0,44.5,0,"",0,0,0,0,0,0,1 -"Hands of Orlac, The",1961,82,NA,6,41,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hands of a Stranger",1962,95,NA,4.6,15,14.5,0,0,0,44.5,4.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Hands of the Ripper",1971,85,NA,5.5,153,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Handsworth Songs",1986,61,NA,6,7,0,0,14.5,0,24.5,14.5,24.5,14.5,0,0,"",0,0,0,0,1,0,0 -"Handvoll Gras, Eine",2000,100,NA,7.3,65,4.5,0,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Handvoll Helden, Eine",1967,94,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Hanele",1999,85,NA,5.6,35,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Hang 'Em High",1968,114,1800000,6.7,3003,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hang Time",2001,26,NA,6.7,13,0,0,0,0,0,14.5,14.5,4.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Hang Time",2003,7,NA,8,10,14.5,0,0,0,0,14.5,34.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Hang Your Hat On the Wind",1969,48,NA,6.1,5,0,0,0,24.5,0,24.5,0,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Hang the DJ",1998,90,NA,6.6,27,0,0,4.5,0,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Hangar 18",1980,97,NA,4.7,274,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hangfire",1991,91,NA,3.5,66,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hangin' with the Homeboys",1991,88,1900000,6.6,216,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Hanging Garden, The",1997,91,NA,7.2,1018,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Hanging Tree, The",1959,106,1350000,7.2,307,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hanging Up",2000,94,40000000,4.4,3129,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Hangman's Bride, The",1996,20,NA,5.8,5,0,0,0,0,24.5,0,0,44.5,44.5,0,"",0,0,0,0,0,0,1 -"Hangman's Curse",2003,106,2000000,4.9,405,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"PG-13",0,0,0,0,0,0,0 -"Hangman's House",1928,80,NA,4.8,35,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hangman's Knot",1952,81,NA,6.8,70,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hangman, The",1959,87,NA,6.1,21,0,0,0,14.5,4.5,24.5,14.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Hangman, The",1964,12,NA,7.4,9,0,0,0,0,14.5,0,0,0,24.5,64.5,"",0,1,0,0,0,0,1 -"Hangmen",1987,90,NA,2.6,204,44.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hangmen Also Die",1943,134,NA,7.5,335,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hangnail, The",1999,2,NA,5.5,33,14.5,0,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hangover Square",1945,77,NA,7,106,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Hank Aaron: Chasing the Dream",1995,120,NA,8.5,32,4.5,4.5,0,4.5,0,0,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Hank Williams First Nation",2005,92,300000,7.4,10,14.5,0,0,0,0,0,44.5,14.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Hank Williams: The Show He Never Gave",1982,86,NA,6.2,30,0,0,0,0,4.5,0,4.5,34.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Hank and Mike",2000,15,NA,3.1,9,14.5,0,24.5,0,0,0,0,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Hanky Panky",1982,110,NA,4.9,292,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hanna D. - La ragazza del Vondel Park",1984,84,NA,2.9,14,24.5,14.5,0,0,4.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Hanna K.",1983,111,NA,5.1,95,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hanna's War",1988,148,NA,5.3,103,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hannah",1996,118,NA,8.1,17,0,0,0,0,4.5,14.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Hannah Lee",1953,75,NA,7.1,17,0,0,0,4.5,4.5,14.5,14.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Hannah and Her Sisters",1986,106,6400000,7.8,7597,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Hannah med H",2003,100,NA,3.4,59,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hannibal",2001,133,87000000,6.2,28876,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Hannibal & Jerry",1997,75,NA,6.5,106,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hannibal Brooks",1969,101,NA,5.9,165,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Hannie Caulder",1971,85,NA,6,233,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hanno cambiato faccia",1971,90,NA,8.2,14,0,0,0,0,0,0,24.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Hanochi",2004,121,NA,6.6,11,0,0,4.5,4.5,4.5,24.5,34.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Hanoi Hilton, The",1987,125,NA,5.4,169,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hanoi, martes 13",1967,38,NA,2.7,6,0,34.5,0,0,0,14.5,0,14.5,0,34.5,"",0,0,0,0,1,0,1 -"Hanover Street",1979,109,NA,5.8,707,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Hanre Goze Orin",1977,109,NA,7.2,11,0,0,0,0,0,4.5,34.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Hans Christian Andersen",1952,112,4000000,6.5,473,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hans Onsdagsveninde",1943,99,NA,6.1,6,0,0,14.5,0,14.5,0,14.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Hans Staden",1999,92,NA,6.8,63,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Hans Warns - Mein 20. Jahrhundert",1999,105,NA,5,12,0,14.5,4.5,4.5,24.5,0,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hans och hennes",2001,96,NA,5.7,298,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hans: het leven voor de dood",1983,155,NA,8.1,15,0,0,0,0,0,4.5,14.5,34.5,44.5,4.5,"",0,0,0,0,1,0,0 -"Hansel & Gretel",2002,89,NA,4.7,97,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"PG",0,0,0,0,0,0,0 -"Hansel and Gretel",1988,84,NA,7.6,39,0,4.5,0,0,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Hansel e Gretel",1990,87,NA,4.3,13,34.5,0,4.5,4.5,4.5,14.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Hanuman",1998,90,NA,6.1,74,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hanussen",1955,95,NA,3.7,5,0,24.5,0,24.5,0,0,44.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Hanussen",1988,140,NA,7.6,230,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Hanyo",1960,90,NA,8.7,35,0,0,4.5,0,0,4.5,14.5,24.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Hao xia",1978,106,NA,6.6,191,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Haonan haonu",1995,108,NA,7.1,156,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Hapax Legomena I: Nostalgia",1971,36,NA,7.5,21,4.5,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Hapkido",1972,97,NA,6.4,21,4.5,0,0,0,4.5,14.5,24.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Happening, The",1967,101,NA,5.1,124,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Happiest Days of Your Life, The",1950,81,NA,7.8,170,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Happiest Millionaire, The",1967,164,NA,5.8,249,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Happily Ever After",1993,75,NA,4.4,71,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",0,1,0,0,0,0,0 -"Happiness",1998,134,3000000,7.7,11737,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Happiness Ahead",1934,86,NA,7.4,27,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Happiness Cage, The",1972,94,NA,5.5,50,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Happiness Is a Warm Gun",2001,95,NA,2.7,39,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Happy Accidents",2000,110,NA,7.3,1440,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Happy Anniversary",1959,83,NA,5.9,32,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Happy Birthday",2002,95,NA,5.9,28,4.5,4.5,0,14.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Happy Birthday to John",1996,24,NA,6.7,10,24.5,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Happy Birthday to Me",1981,110,2250000,4.4,425,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Happy Birthday, Gemini",1980,107,NA,4.9,36,4.5,0,14.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Happy Birthday, Wanda June",1971,105,NA,5.4,68,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Happy Birthdaze",1943,8,NA,6,7,0,0,0,0,14.5,44.5,0,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Happy Campers",2001,94,NA,5.4,543,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Happy Days",1930,80,NA,5.6,10,24.5,0,0,0,0,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Happy Days",1936,9,NA,6.1,9,0,0,14.5,24.5,24.5,14.5,0,14.5,24.5,0,"",0,1,0,0,0,0,1 -"Happy Days",1995,12,NA,5.5,8,0,0,14.5,14.5,14.5,24.5,24.5,0,14.5,0,"",0,0,0,1,0,0,1 -"Happy End am Wolfgangsee",1966,94,NA,2.9,10,34.5,14.5,14.5,24.5,0,0,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Happy Ending",2005,16,NA,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Happy Ending, The",1969,117,NA,6.5,91,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Happy Ever After",1932,86,NA,8.8,7,0,14.5,0,0,0,0,0,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Happy Ever After",1954,88,NA,6.6,30,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Happy Family Plan",1999,121,NA,6.2,21,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Happy Gilmore",1996,92,10000000,6.8,17746,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Happy Go Ducky",1958,6,NA,5.3,19,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Happy Go Lovely",1951,97,NA,6.2,82,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Happy Go Lucky",1943,81,NA,6.3,30,4.5,0,0,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Happy Halloween",2001,10,NA,2.2,26,24.5,4.5,0,0,0,0,0,4.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Happy Hell Night",1992,84,NA,5,54,4.5,4.5,14.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Happy Here and Now",2002,89,NA,5.3,50,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Happy Hoboes",1933,7,NA,5.3,5,0,24.5,0,0,24.5,44.5,24.5,0,0,0,"",0,1,1,0,0,0,1 -"Happy Holidaze from the Jonzes",2001,19,NA,1.8,15,4.5,14.5,0,0,4.5,0,0,4.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Happy Hooker Goes Hollywood, The",1980,88,NA,2.5,51,34.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Happy Hooker Goes to Washington, The",1977,89,NA,2.6,77,24.5,14.5,24.5,4.5,4.5,4.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Happy Hooker, The",1975,96,NA,3.1,108,14.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Happy Hooligan",1903,1,NA,3.9,7,0,0,44.5,14.5,0,44.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Happy Hottentots, The",1930,11,NA,6.9,12,14.5,0,0,4.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Happy Hour",1987,88,NA,2.9,35,34.5,24.5,4.5,4.5,4.5,14.5,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Happy Hour",2003,93,NA,6.3,68,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,24.5,"",0,0,1,1,0,0,0 -"Happy Is the Bride",1957,84,NA,6.3,8,0,0,0,0,24.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Happy Land",1943,73,NA,6.1,28,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Happy Landing",1938,102,NA,6.7,15,0,0,4.5,0,14.5,24.5,24.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Happy Mother's Day, A",1963,26,NA,5.6,10,24.5,0,0,0,14.5,34.5,24.5,0,14.5,14.5,"",0,0,0,0,1,0,1 -"Happy Mother's Day, Love George",1973,90,NA,4.7,28,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Happy New Year",1987,85,NA,5.7,91,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Happy Now",2001,97,NA,6.1,82,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Happy Prince, The",1974,25,NA,7.5,42,0,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,1,0,0,0,0,1 -"Happy Road, The",1957,99,500000,5.4,34,4.5,0,0,24.5,4.5,24.5,4.5,4.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Happy Thieves, The",1962,88,NA,4.7,15,0,4.5,0,24.5,24.5,24.5,4.5,0,0,4.5,"",0,0,1,1,0,0,0 -"Happy Time, The",1952,94,NA,6.1,24,0,4.5,0,0,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Happy Times and Jolly Moments",1943,18,NA,6.7,22,4.5,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Happy Years, The",1950,110,NA,7.1,121,0,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Happy You and Merry Me",1936,7,NA,5.3,19,0,0,4.5,34.5,14.5,24.5,14.5,14.5,0,4.5,"",0,1,0,0,0,0,1 -"Happy as the Grass Was Green",1973,105,NA,8,7,0,0,0,0,0,0,14.5,44.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Happy, Texas",1999,98,1700000,6.4,3453,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Happy-Go-Nutty",1944,7,NA,7.6,29,0,4.5,0,0,14.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Haqeeqat",1964,184,NA,6.9,11,0,4.5,0,0,0,0,4.5,14.5,0,64.5,"",1,0,0,0,0,0,0 -"Har Dil Jo Pyar Karega...",2000,173,NA,5.4,51,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Har du set Alice?",1981,91,NA,4.3,8,0,14.5,24.5,14.5,24.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Harakiri",1919,108,NA,7,17,0,0,0,0,14.5,34.5,0,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Harald",1997,88,NA,7.2,31,0,0,0,0,4.5,24.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Harald Handfaste",1946,74,NA,5.1,12,0,0,4.5,24.5,14.5,24.5,0,0,14.5,4.5,"",1,0,0,0,0,1,0 -"Harano Sur",1957,162,NA,6.8,16,0,4.5,0,0,0,14.5,4.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Harbour Beat",1990,99,NA,5.2,12,0,0,0,0,44.5,44.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Hard",1998,102,NA,4.3,67,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Hard Ball",2001,109,21000000,6,3083,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Hard Boiled Mahoney",1947,63,NA,6.6,42,0,0,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hard Bounty",1995,88,NA,3.6,94,14.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Hard Candy",1976,75,NA,3.2,22,14.5,24.5,14.5,4.5,0,14.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Hard Candy",2005,103,NA,2.8,42,4.5,34.5,0,4.5,4.5,0,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Hard Case, The",1995,20,NA,5.4,45,14.5,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Hard Choices",1985,90,NA,5.8,41,4.5,4.5,0,4.5,14.5,24.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hard Contract",1969,106,NA,5.1,79,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hard Core Logo",1996,92,NA,7.1,630,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,1,1,0,0,0 -"Hard Country",1981,104,NA,5.3,83,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hard Day's Night, A",1964,87,560000,7.7,6314,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Hard Day's Work, A",1997,13,NA,6.4,5,24.5,0,0,0,0,44.5,0,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Hard Drive",1994,92,NA,4.6,25,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Hard Evidence",1995,100,NA,4.6,47,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Hard Fat",2002,23,NA,5.1,15,0,4.5,0,0,14.5,0,14.5,4.5,4.5,45.5,"",0,0,1,0,1,0,1 -"Hard Feelings",1982,105,4000000,5.9,7,0,0,0,0,14.5,44.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Hard Guy, The",1930,6,NA,5.9,61,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Hard Hombre",1931,65,60000,3.6,5,24.5,0,24.5,44.5,0,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Hard Hunted",1992,93,NA,3.1,84,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Hard Knocks",1979,77,NA,4.5,5,24.5,0,0,24.5,0,24.5,44.5,0,0,0,"",1,0,0,0,0,0,0 -"Hard Knocks",1980,85,NA,4.3,11,14.5,0,0,14.5,14.5,34.5,0,0,4.5,0,"",0,0,0,1,0,0,0 -"Hard Labour",2002,10,NA,6.3,6,0,0,0,0,0,45.5,34.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Hard Little Man",2002,5,NA,4.8,10,14.5,0,0,44.5,0,24.5,34.5,0,0,0,"",0,0,0,1,0,0,1 -"Hard Luck",1921,22,NA,7.7,96,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Hard Luck Hero",2003,79,NA,5.8,56,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Hard Man, The",1957,80,NA,4.6,22,4.5,4.5,0,4.5,24.5,14.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Hard Men",1996,86,NA,5.2,156,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Hard Promises",1991,95,NA,5.2,102,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Hard Rain",1998,97,70000000,5.5,6161,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Hard Ride, The",1971,86,NA,4.7,26,4.5,4.5,4.5,4.5,44.5,4.5,14.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Hard Road, The",1970,85,NA,5.7,9,14.5,0,0,14.5,34.5,14.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hard Rock Nightmare",1988,87,NA,6.3,10,0,0,14.5,24.5,14.5,14.5,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Hard Rock Zombies",1984,90,NA,2.8,117,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Hard Soap, Hard Soap",1977,76,NA,5.9,7,0,0,0,24.5,0,14.5,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Hard Target",1993,73,15000000,5.4,4372,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hard Ticket to Hawaii",1987,96,NA,3.7,164,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hard Time",1996,91,NA,4.4,16,14.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,14.5,0,"R",0,0,0,0,0,0,0 -"Hard Time Romance",1991,90,NA,5,7,0,0,0,0,24.5,14.5,0,0,0,45.5,"",0,0,1,0,0,1,0 -"Hard Times",1975,93,NA,6.8,717,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Hard Truth, The",1994,100,NA,4.8,72,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hard Vice",1994,86,NA,2.7,60,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hard Way, The",1943,109,NA,7.2,95,0,0,4.5,4.5,4.5,24.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Hard Way, The",1991,111,NA,6,2510,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Hard Word, The",2002,102,NA,6.1,813,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Hard asfalt",1986,109,NA,5,17,4.5,14.5,4.5,14.5,4.5,24.5,14.5,0,14.5,4.5,"",0,0,0,1,0,0,0 -"Hard to Die",1990,77,NA,3.4,107,14.5,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Hard to Get",1938,82,NA,6.6,32,0,0,4.5,0,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Hard to Handle",1933,78,189000,6.9,60,0,4.5,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hard to Hold",1984,93,NA,3.9,146,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hard to Kill",1990,100,NA,4.8,2879,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hard, Fast and Beautiful",1951,78,NA,5.3,49,0,0,4.5,24.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hardball",1997,92,NA,4.8,58,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Hardbodies",1984,88,NA,3.5,432,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hardbodies 2",1986,88,NA,2.1,249,34.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hardcore",1977,80,NA,4.2,50,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hardcore",1979,109,NA,6.3,697,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hardcore",2004,96,NA,6.2,53,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Hardcore Championship Fucking",1999,79,NA,8.4,11,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Harder They Come, The",1972,120,NA,6.8,577,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Harder They Fall, The",1956,109,NA,7.4,601,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hardface",2000,1,NA,6.9,8,0,0,0,0,0,34.5,14.5,34.5,0,14.5,"",0,1,0,0,0,0,1 -"Hardgore",1974,63,NA,5.7,24,4.5,4.5,4.5,14.5,4.5,4.5,24.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Hardly Boys in Hardly Gold, The",1995,28,NA,5.5,19,0,0,4.5,4.5,24.5,0,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Hardly Working",1980,91,NA,4.4,104,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hardship of Miles Standish, The",1940,9,NA,5.5,12,0,4.5,4.5,0,24.5,45.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Hardware",1990,93,1500000,5.2,1323,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Hardware Wars",1977,13,8000,7.2,572,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,1,0,0,0,1 -"Hardwood",2004,29,NA,6.6,20,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Hardwood Process",1996,14,NA,9.2,5,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,0,0,0,0,0,1 -"Hardys Ride High, The",1939,81,NA,6.3,18,4.5,0,0,4.5,14.5,14.5,44.5,14.5,0,0,"",0,0,1,1,0,0,0 -"Hare Brush",1955,7,NA,7.5,53,4.5,0,0,4.5,4.5,4.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Hare Conditioned",1945,7,NA,7,69,4.5,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hare Do",1949,7,NA,7.6,46,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Hare Force",1944,7,NA,6.9,61,0,0,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hare Grows In Manhattan, A",1947,8,NA,7.3,53,0,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Hare Lift",1952,7,NA,7.2,32,0,0,0,0,4.5,14.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hare Rama Hare Krishna",1971,149,NA,7.1,38,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Hare Remover",1946,7,NA,6.6,30,4.5,0,4.5,0,4.5,24.5,24.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Hare Ribbin'",1944,8,NA,6.8,40,4.5,4.5,0,0,14.5,14.5,4.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Hare Splitter",1948,7,NA,7,30,4.5,0,0,4.5,4.5,14.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hare Tonic",1945,8,NA,7.5,53,0,0,4.5,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Hare Trigger",1945,8,NA,7.4,62,4.5,0,0,0,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hare Trimmed",1953,7,NA,7.1,30,0,0,0,0,4.5,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Hare We Go",1951,7,NA,7.2,26,0,0,0,4.5,0,24.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Hare-Abian Nights",1959,7,NA,6.6,31,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hare-Brained Hypnotist, The",1942,7,NA,6.9,61,0,0,0,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hare-Breadth Hurry",1963,7,NA,7.1,43,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hare-Less Wolf",1958,7,NA,6.8,29,0,0,4.5,0,14.5,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hare-Way to the Stars",1958,7,NA,7.7,134,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Hare-um Scare-um",1939,8,NA,7.3,27,4.5,0,0,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Haredevil Hare",1948,7,NA,7.8,139,4.5,0,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Harem",1985,97,NA,4.2,136,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Harem Girl",1952,70,NA,4.3,6,14.5,0,14.5,0,0,34.5,0,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Harem Suare'",1999,112,NA,5.5,285,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Harem de Mme Osmane, Le",2000,100,NA,5.3,22,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Harem, L'",1967,100,NA,5.7,16,0,0,0,0,14.5,14.5,24.5,14.5,24.5,0,"",0,0,1,1,0,0,0 -"Hari Om",2004,108,NA,6.9,35,0,0,4.5,0,4.5,4.5,4.5,14.5,34.5,34.5,"",0,0,1,0,0,1,0 -"Hari-Bhari: Fertility",2000,134,NA,8.4,27,0,0,0,0,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Harimu Ogen",1985,89,NA,3,51,24.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Harlan County, U.S.A.",1976,103,NA,8.3,298,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Harlem Aria",1999,100,NA,4.6,44,0,14.5,0,14.5,4.5,4.5,4.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Harlem Globetrotters, The",1951,78,NA,5.7,23,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Harlem Nights",1989,116,NA,5,2036,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Harlem Rides the Range",1939,56,NA,5.4,20,0,0,4.5,24.5,24.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Harlequin",1980,95,NA,5.9,116,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Harlequin's Loving Evangeline",1998,95,NA,4.4,51,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Harley Davidson and the Marlboro Man",1991,98,NA,4.8,2215,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Harley-Davidson: The American Motorcycle",1993,73,NA,7.4,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Harlot",1965,70,NA,4.7,39,4.5,14.5,4.5,0,0,4.5,4.5,64.5,0,4.5,"",0,0,1,0,0,0,0 -"Harmagedon: Genma taisen",1983,131,NA,6.2,36,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Harmonic Distortion",2002,18,NA,6.9,8,14.5,0,0,0,14.5,0,14.5,0,14.5,45.5,"",0,0,0,1,0,0,1 -"Harmony Cats",1993,104,NA,4.7,87,4.5,34.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Harold & Kumar Go to White Castle",2004,90,9000000,7.1,8376,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Harold Teen",1934,66,NA,6,12,0,0,14.5,4.5,4.5,24.5,4.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Harold and Maude",1971,91,1200000,7.9,9173,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Haroumeni Imera",1976,100,NA,5.2,26,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Harper",1966,121,3500000,7,632,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Harper Valley P.T.A.",1978,93,NA,4.9,213,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Harpist, The",1997,93,3000000,4.8,9,24.5,0,14.5,14.5,0,14.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Harpya",1979,9,NA,7.4,49,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Harrad Experiment, The",1973,97,NA,4.4,199,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Harrad Summer",1974,103,NA,4.3,28,4.5,4.5,24.5,4.5,14.5,24.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Harriet Craig",1950,94,NA,6.9,90,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Harriet the Spy",1996,100,13000000,5.8,845,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Harrison Macauley Is Going to Kill Me",2003,68,50000,6,7,24.5,0,14.5,0,0,0,0,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Harrison's Flowers",2000,121,NA,7.2,1236,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Harrowing, The",1993,3,NA,6.9,6,14.5,0,0,0,0,0,14.5,34.5,34.5,0,"",0,0,0,0,0,0,1 -"Harry Black and the Tiger",1958,107,NA,6.1,53,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Harry Callahan/Clint Eastwood: Something Special in Films",1976,6,NA,6.1,6,0,0,14.5,0,14.5,0,34.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"Harry Chapin: The Final Concert",1981,89,NA,9.6,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Harry Munter",1969,101,NA,5.3,10,0,0,0,14.5,34.5,34.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Harry O: Such Dust As Dreams Are Made On",1973,90,NA,5.3,10,0,0,0,24.5,0,14.5,34.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Harry Potter and the Chamber of Secrets",2002,152,100000000,7.3,38394,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,0,0,0,0,0 -"Harry Potter and the Prisoner of Azkaban",2004,141,130000000,7.8,24973,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,0,0,0,0 -"Harry Potter and the Sorcerer's Stone",2001,152,130000000,7.2,46741,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,0,0,0,0,0 -"Harry Tracy, Desperado",1982,107,NA,6.5,56,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Harry and Max",2004,74,NA,3.4,85,24.5,34.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Harry and Son",1984,120,NA,5.5,296,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Harry and Tonto",1974,115,NA,7.2,586,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Harry and Walter Go to New York",1976,120,NA,4.7,165,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Harry and the Hendersons",1987,110,NA,5.4,2982,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Harry og kammertjeneren",1961,105,NA,8,63,4.5,0,4.5,0,4.5,4.5,14.5,24.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Harry's War",1981,98,NA,5.3,78,0,0,4.5,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Harry, un ami qui vous veut du bien",2000,117,NA,7.2,2838,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Hart of London, The",1970,80,NA,7.3,11,0,0,0,0,4.5,4.5,0,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Hart's War",2002,125,70000000,6.2,6368,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Harte Jungs",2000,83,NA,4.9,441,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hartes Brot",2000,7,NA,6.4,12,0,0,4.5,0,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"Hartopektra, I",1964,94,NA,8.3,41,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Haru",2001,112,NA,6.6,28,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Haruka naru yama no yobigoe",1980,95,NA,6.4,17,4.5,0,4.5,0,0,0,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Harukana jidai no kaidan o",1995,101,NA,7,14,0,0,0,0,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Harum Scarum",1965,95,NA,4.1,205,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Harvard Man",2001,99,5500000,4.9,1157,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Harvest",1998,96,NA,4.5,140,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Harvest of Fear",2004,95,100000,3.6,11,34.5,0,24.5,4.5,0,0,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Harvest, The",1993,93,NA,4.8,172,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Harvey",1950,104,NA,8.1,7879,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Harvey",2001,11,NA,6.6,19,0,0,0,4.5,14.5,14.5,34.5,4.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Harvey Girls, The",1946,102,2524315,7,456,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Harvie Krumpet",2003,23,NA,8.2,369,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,1,1,1,0,0,1 -"Haryu insaeng",2004,99,NA,5.6,32,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Has Anybody Seen My Gal?",1952,88,NA,6.9,114,0,0,0,0,14.5,14.5,24.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hasamba",1971,90,NA,5.4,7,14.5,0,24.5,0,14.5,14.5,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Hasan Kachal",1970,100,NA,7.7,15,0,0,0,0,4.5,0,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Hasard et la violence, Le",1974,83,NA,6.9,14,0,0,4.5,0,24.5,34.5,0,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Haschisch",2002,80,NA,7.8,14,0,0,0,0,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Hase und Igel",2000,6,NA,5.5,7,0,0,0,14.5,24.5,14.5,24.5,0,14.5,0,"",0,0,0,0,1,0,1 -"Hasen no marisu",2000,108,NA,6.2,18,4.5,0,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Hasenjagd - Vor lauter Feigheit gibt es kein Erbarmen",1994,102,NA,6.1,49,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Hasta cierto punto",1983,68,NA,6.2,25,0,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Hasta el viento tiene miedo",1968,90,NA,8.8,54,4.5,0,0,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Hasta en las mejores familias",1994,85,NA,2.3,7,84.5,0,0,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Hasta los huesos",2001,12,NA,7.1,40,4.5,4.5,0,0,0,24.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Hasta morir",1994,90,NA,5.7,27,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hasty Hare, The",1952,7,NA,7.8,70,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hasty Heart, The",1949,102,NA,7.2,154,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hasty Marriage, The",1931,21,NA,7.8,9,0,0,0,0,14.5,14.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Hat, Coat, and Glove",1934,65,NA,5.3,18,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Hatachi no binetsu",1993,114,NA,5.8,29,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Hatari!",1962,157,NA,7.1,1507,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hatch Up Your Troubles",1949,8,NA,7,38,4.5,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Hatchet Man, The",1932,74,NA,6,77,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hate* (*a comedy)",1999,22,NA,6.1,52,4.5,4.5,4.5,0,14.5,14.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Hated",1994,90,NA,7,191,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Hateshinaki yokubo",1958,101,NA,6.3,21,0,0,0,4.5,4.5,0,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hatful of Rain, A",1957,104,NA,6.9,106,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hathi",1998,97,NA,7,17,4.5,0,0,0,0,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Hathyar",1989,186,NA,8,8,0,0,0,0,0,14.5,0,14.5,34.5,34.5,"",1,0,0,0,0,0,0 -"Hating Alison Ashley",2005,100,NA,6,60,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Hatley High",2003,90,NA,6.4,120,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Hatred of a Minute",2002,83,300000,5.2,96,14.5,34.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Hats Off",1927,20,NA,7.4,7,0,0,0,0,14.5,0,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Hatschipuh",1987,95,NA,5.5,24,4.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,1,0,0,0,0,0 -"Hatsukoi",2000,113,NA,7.7,46,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Hatsukoi: Jigoku-hen",1968,108,NA,7.1,20,14.5,0,0,0,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hatter's Castle",1942,102,NA,7.2,41,0,0,0,0,0,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Hatuna Meuheret",2001,98,NA,7.2,729,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Hatzilu Et HaMatzil",1977,90,NA,6.1,6,0,0,0,0,34.5,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Hatzotzra Ba-Vadi",2002,97,NA,7.2,25,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,0,"",0,0,0,1,0,1,0 -"Haul in One, A",1956,6,NA,5.3,23,0,4.5,4.5,4.5,14.5,34.5,14.5,0,4.5,14.5,"",0,1,1,0,0,0,1 -"Haunted",1995,108,NA,6.1,1035,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Haunted",1998,83,NA,5.1,16,14.5,0,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Haunted",2002,18,NA,8.2,6,14.5,0,0,0,0,0,0,14.5,0,64.5,"",0,0,0,0,0,0,1 -"Haunted Castle",2001,38,NA,5,135,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"PG",0,1,0,0,0,0,1 -"Haunted Gold",1932,58,NA,3.8,50,14.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Haunted Harbor",1944,243,NA,8,14,0,0,0,0,0,0,24.5,45.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Haunted Honeymoon",1986,82,NA,4.4,750,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Haunted House",1929,7,NA,7,32,4.5,0,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Haunted House",1940,70,NA,4.1,5,0,0,0,44.5,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Haunted House of Horror, The",1969,79,NA,3.7,57,14.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Haunted House, The",1921,19,NA,7.2,136,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Haunted Mansion, The",2003,87,90000000,5,3341,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Haunted Mouse",1965,7,NA,4.9,31,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Haunted Palace, The",1963,87,NA,6.3,453,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Haunted Ranch",1943,57,NA,4.9,5,0,0,44.5,24.5,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Haunted Sea",1997,73,NA,2.2,87,44.5,24.5,14.5,14.5,4.5,4.5,4.5,0,0,4.5,"R",0,0,0,0,0,0,0 -"Haunted Spooks",1920,21,NA,6.6,58,0,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Haunted Summer",1988,106,NA,5,138,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Haunted World of Edward D. Wood Jr., The",1996,89,NA,5.2,66,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Haunted-ween",1991,88,NA,4.4,10,14.5,14.5,0,24.5,24.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Haunting Fear",1991,88,115000,3.7,50,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Haunting of Hell House, The",1999,90,NA,4,180,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"R",0,0,0,0,0,0,0 -"Haunting of M, The",1980,98,NA,6,18,0,0,0,0,4.5,34.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Haunting of Morella, The",1990,82,NA,3.9,119,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Haunting, The",1963,112,1400000,7.6,4641,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Haunting, The",1999,112,80000000,4.6,14425,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Haunts",1977,97,NA,4.2,23,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Hauru no ugoku shiro",2004,119,NA,8,889,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG",0,1,0,0,0,1,0 -"Haus im Ginster, Das",1992,93,NA,7.8,5,0,0,0,0,0,0,44.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Haus in Montevideo, Das",1963,123,NA,5.9,57,0,0,4.5,14.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hausfrauen Report international",1973,88,NA,3.9,6,64.5,0,0,14.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Hausfrauen-Report 2",1971,73,NA,2.6,6,34.5,14.5,14.5,14.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Hausfrauen-Report 4",1973,84,NA,2.8,6,14.5,34.5,0,0,34.5,0,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Hausnummer 15",2004,8,NA,8.7,9,14.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,0,0,0,0,1 -"Haustyrann, Der",1959,90,NA,5.6,37,0,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hausu",1977,87,NA,9.3,20,0,0,0,4.5,4.5,0,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Haut bas fragile",1995,169,NA,7.9,104,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Haut les coeurs!",1999,110,NA,6.8,165,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Haute tension",2003,85,NA,6.8,1484,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Hautes solitudes, Les",1974,80,NA,7.3,5,0,0,0,0,0,24.5,24.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Hav Plenty",1997,84,650000,5.3,256,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Havana",1990,140,NA,5.6,1094,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Havana Widows",1933,62,NA,6.2,35,0,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Havanna mi amor",2000,82,NA,5.9,25,0,4.5,0,14.5,4.5,14.5,24.5,4.5,24.5,0,"",0,0,0,0,1,0,0 -"Have Rocket, Will Travel",1959,76,380000,5.6,93,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Have You Ever Wondered?",1947,10,NA,6,10,0,0,14.5,34.5,14.5,0,34.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Have You Got Any Castles?",1938,7,NA,6.3,45,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Have You Seen This Man?",2003,18,NA,7.6,18,0,0,0,0,0,14.5,14.5,34.5,4.5,34.5,"",0,0,0,0,1,0,1 -"Have a Heart",1934,80,NA,6.1,28,4.5,0,0,4.5,14.5,14.5,34.5,4.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Haven",2004,115,NA,4.5,89,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Havinck",1987,99,NA,5.5,18,0,0,14.5,14.5,0,24.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Having Wonderful Crime",1945,70,NA,6.5,47,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Having Wonderful Time",1938,70,NA,6,58,0,0,4.5,14.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"Havoc",2000,17,NA,5.9,10,0,0,0,0,14.5,0,24.5,0,24.5,45.5,"",1,0,0,1,0,0,1 -"Hawa",2003,129,NA,4,13,24.5,14.5,14.5,14.5,0,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Hawai Middouei daikaikusen: Taiheiyo no arashi",1960,98,NA,5.1,14,4.5,4.5,0,4.5,0,14.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hawaii",1966,189,15000000,6.1,447,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hawaii, Oslo",2004,125,NA,7.2,429,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Hawaiian Aye Aye",1964,6,NA,6.2,20,0,0,4.5,14.5,14.5,34.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Hawaiian Gardens",2001,110,NA,2.9,21,34.5,24.5,4.5,24.5,4.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Hawaiian Holiday",1937,8,NA,7.2,67,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Hawaiians, The",1970,134,NA,5.9,161,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hawk of Powder River, The",1948,54,NA,5.9,5,0,0,0,0,44.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Hawk of the Wilderness",1938,213,NA,7,16,0,0,4.5,4.5,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Hawk the Slayer",1980,90,NA,4.7,444,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Hawk's Vengeance",1996,92,NA,4.5,29,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Hawk, The",1993,88,NA,5.3,71,4.5,4.5,4.5,4.5,14.5,44.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hawken's Breed",1987,93,NA,2.6,17,14.5,24.5,0,0,14.5,4.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hawks",1988,107,NA,6.9,264,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Hawmps!",1976,113,NA,4.4,92,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Hawthorne of the U.S.A.",1919,57,NA,7.2,6,0,0,0,0,0,34.5,14.5,14.5,0,34.5,"",0,0,1,0,0,1,0 -"Hay que matar a B.",1975,90,NA,4.9,18,0,0,14.5,24.5,24.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hay que romper la rutina",1974,90,NA,6.3,12,4.5,0,0,0,0,34.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Haya O Lo Haya",2003,102,NA,6.7,13,4.5,0,0,0,0,34.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Hayal Halayla",1984,86,NA,5.1,5,24.5,24.5,24.5,24.5,0,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Hayride to Hell",1995,10,NA,9.1,25,14.5,0,0,0,0,0,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,1 -"Hayseed",1997,93,NA,5.5,25,24.5,4.5,0,0,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hayseed, The",1919,27,NA,6.7,35,0,0,0,0,14.5,24.5,44.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Haz conmigo lo que quieras",2003,98,NA,6.2,69,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hazaar Chaurasi Ki Maa",1998,186,NA,6.9,15,0,0,0,4.5,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hazaaron Khwaishen Aisi",2003,120,NA,8,22,4.5,0,0,0,0,0,14.5,14.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Hazal",1979,90,NA,7.4,11,4.5,0,0,0,0,4.5,4.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Hazard",1948,95,NA,6.1,8,0,0,0,0,14.5,34.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Hazards of Helen, The",1914,12,NA,6.1,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",1,0,0,0,0,0,1 -"Hazing, The",1977,90,NA,4.3,29,14.5,0,24.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"He Bop",2000,25,NA,3.4,26,24.5,14.5,4.5,0,4.5,0,0,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"He Cooked His Goose",1952,16,NA,6.2,39,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"He Couldn't Say No",1938,57,NA,6,16,0,0,4.5,4.5,14.5,24.5,34.5,14.5,0,0,"",0,0,1,0,0,1,0 -"He Died with a Felafel In His Hand",2001,107,NA,6.5,356,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"He Done His Best",1926,20,NA,7.3,6,0,0,0,0,0,14.5,14.5,45.5,14.5,0,"",0,0,1,0,0,0,1 -"He Got Game",1998,137,25000000,6.6,4198,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"He Is My Brother",1976,90,NA,2.7,8,45.5,0,14.5,0,0,14.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"He Knows You're Alone",1980,94,NA,3.9,296,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"He Lan Du ren tou",1978,90,NA,2.9,8,24.5,14.5,0,0,14.5,14.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"He Laughed Last",1956,77,NA,5,10,0,0,0,24.5,45.5,0,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"He Makes Me Feel Like Dancin'",1983,51,NA,7.2,21,14.5,4.5,0,0,4.5,14.5,4.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"He Married His Wife",1940,83,NA,5.1,14,0,0,0,14.5,24.5,14.5,24.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"He Outta Be Committed",2000,87,NA,8.2,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"He Ran All the Way",1951,77,NA,7.3,100,0,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"He Rides Tall",1964,84,NA,6.1,9,0,0,0,24.5,24.5,14.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"He Said, She Said",1991,115,NA,5.5,1595,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"He Snoops to Conquer",1944,103,NA,3.4,6,14.5,0,0,0,14.5,0,14.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"He Walked by Night",1948,79,NA,7.5,337,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"He Was Her Man",1934,70,NA,6,55,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"He Was Once",1989,15,NA,6.1,17,0,0,4.5,4.5,4.5,0,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"He Who Gets Slapped",1924,80,NA,8.2,247,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"He Who Rides a Tiger",1965,103,NA,5.2,12,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"He liu",1997,116,NA,7.3,376,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"He ni zai yi qi",2002,117,NA,7.3,807,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"He's In Again",1918,24,NA,6.7,7,0,0,0,0,24.5,45.5,0,14.5,0,0,"",0,0,1,0,0,0,1 -"He's My Girl",1987,104,NA,3.4,108,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"He's a Cockeyed Wonder",1950,76,NA,4.9,6,0,0,14.5,14.5,14.5,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Head",1968,110,750000,6.1,1119,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Head Above Water",1996,92,NA,6,1887,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Head Office",1985,90,NA,5,304,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Head On",1980,86,NA,4.3,40,14.5,14.5,4.5,14.5,24.5,24.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Head On",1998,104,NA,7.1,854,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Head Over Heels",1937,84,NA,6.1,7,0,0,0,0,14.5,14.5,0,74.5,0,0,"",0,0,0,0,0,0,0 -"Head Over Heels",1979,92,NA,6.4,183,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Head Over Heels",2001,86,14000000,4.9,2632,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Head Shots",1996,90,NA,6.6,7,0,0,14.5,0,14.5,0,14.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Head in the Clouds",2004,132,NA,5.7,601,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Head of State",2003,95,NA,5.1,2960,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Head of the Family",1996,79,NA,4.1,212,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Headhunter",1990,92,NA,3.6,33,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Headhunter's Sister, The",1997,96,NA,2.8,11,14.5,0,0,4.5,0,24.5,0,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Headin' for Broadway",1980,89,NA,4.9,33,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heading Home",1920,56,NA,7.1,13,0,0,0,0,14.5,24.5,14.5,14.5,0,34.5,"",0,0,1,1,0,0,0 -"Headless Body in Topless Bar",1995,110,NA,4.1,71,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Headless Eyes, The",1971,78,NA,2.4,56,44.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Headless Ghost, The",1959,62,NA,3.4,16,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Headless Horseman, The",1922,51,NA,6.3,14,0,0,0,24.5,24.5,4.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Headlights",1999,1,NA,6.8,8,0,0,0,0,24.5,24.5,0,24.5,24.5,0,"",0,1,0,0,0,0,1 -"Headline Shooter",1933,61,NA,5.7,11,0,0,0,4.5,24.5,24.5,24.5,4.5,0,0,"",0,0,0,0,0,1,0 -"Headrush",2004,85,NA,6.2,103,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Heads or Tails",2005,100,17000,7.8,35,14.5,4.5,4.5,4.5,0,4.5,0,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Healer, The",1935,76,NA,6.2,5,0,24.5,0,0,24.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"HealtH",1982,105,NA,4.7,146,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Healthy, Wealthy and Dumb",1938,16,NA,7.7,67,0,4.5,4.5,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Hear My Song",1991,104,NA,7,515,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hear No Evil",1993,97,NA,4.7,221,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hearse, The",1980,95,NA,4.1,125,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Hearst Castle: Building the Dream",1996,40,NA,6.1,17,4.5,4.5,14.5,0,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Heart",1987,90,NA,4.8,27,14.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Heart",1999,81,NA,6.5,255,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Heart Beat",1980,110,NA,5.6,112,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Heart Condition",1990,100,NA,4.9,364,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Heart Is Deceitful Above All Things, The",2004,97,NA,6.1,214,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Heart Is a Lonely Hunter, The",1968,123,NA,7.6,522,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heart Land",1987,37,NA,7.5,6,0,0,14.5,0,0,14.5,0,14.5,0,45.5,"",0,0,0,0,1,0,1 -"Heart Like a Wheel",1983,113,NA,6.6,263,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Heart Within, The",1957,61,NA,6.4,6,0,0,0,0,45.5,14.5,0,34.5,0,0,"",0,0,0,1,0,0,0 -"Heart and Soul",1988,40,NA,5.9,23,0,0,0,4.5,14.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Heart and Souls",1993,93,NA,6.5,1908,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Heart of America",2003,87,3000000,6.1,204,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Heart of Arizona",1938,68,NA,6.9,22,0,0,0,4.5,14.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Heart of Dixie",1989,95,NA,4.9,143,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Heart of Me, The",2002,96,7000000,6.2,336,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"R",0,0,0,1,0,1,0 -"Heart of Midnight",1988,93,NA,4.9,216,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Heart of New York, The",1932,73,NA,4.8,21,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Heart of Texas Ryan, The",1917,56,NA,5.9,6,0,0,45.5,14.5,0,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Heart of a Child",1958,73,NA,4.3,6,14.5,0,0,0,34.5,14.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Heart of the Golden West",1942,65,NA,6.1,9,0,0,0,14.5,24.5,34.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Heart of the Matter, The",1953,100,NA,7.3,31,0,0,0,0,4.5,4.5,34.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heart of the North",1938,83,400000,5.1,10,0,14.5,0,24.5,24.5,34.5,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Heart of the Sea: Kapolioka'ehukai, The",2002,57,NA,7.7,11,0,0,0,0,0,0,4.5,34.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Heart of the Stag",1984,91,NA,6.3,22,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Heart of the Storm",2004,92,NA,6.9,22,14.5,0,4.5,0,0,14.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Heart of the Sun",1998,94,NA,4.9,16,14.5,0,0,14.5,14.5,4.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Heart of the West",1936,63,NA,7.4,18,0,0,0,0,24.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Heart of the World, The",2000,6,NA,8.5,264,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Heart to Heart",1949,21,NA,4.9,12,0,0,4.5,14.5,44.5,14.5,0,4.5,0,4.5,"",0,0,0,0,1,0,1 -"Heart to Heart.com",1999,90,NA,4,15,24.5,0,24.5,14.5,14.5,4.5,0,14.5,0,14.5,"R",0,0,1,0,0,1,0 -"Heartaches",1947,71,NA,7.5,6,0,0,0,0,14.5,14.5,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Heartaches",1981,92,NA,5.4,29,4.5,0,4.5,4.5,34.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Heartbeat",1946,102,NA,6.1,45,0,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Heartbeeps",1981,79,10000000,4.2,234,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Heartbreak Hospital",2002,91,NA,5,20,4.5,14.5,14.5,4.5,24.5,14.5,4.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Heartbreak Hotel",1988,97,NA,5.3,219,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Heartbreak Kid, The",1972,106,NA,6.5,389,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Heartbreak Ridge",1986,130,NA,6.2,3610,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Heartbreaker",1983,90,NA,4.1,18,14.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Heartbreakers",1984,98,NA,6.1,124,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heartbreakers",2001,110,40000000,6.2,8037,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Heartbreakers, Die",1983,114,NA,7.1,30,0,0,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Heartburn",1986,108,NA,5.6,1144,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Heartland",1980,96,NA,7,180,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heartland Reggae",1980,90,NA,7,16,0,0,0,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Heartlands",2002,90,NA,6.2,119,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Hearts Divided",1936,87,NA,5.8,30,4.5,4.5,0,24.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Hearts and Flowers",1919,23,NA,5.8,14,0,0,4.5,14.5,24.5,24.5,14.5,4.5,0,0,"",0,0,1,0,0,0,1 -"Hearts and Minds",1974,112,NA,8.5,415,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Hearts and Minds",1996,113,NA,8,522,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,0,0,0,0 -"Hearts in Atlantis",2001,101,31000000,6.7,6577,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Hearts in Bondage",1936,72,NA,5.5,8,0,0,0,14.5,24.5,14.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Hearts of Age, The",1934,8,NA,5.2,81,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Hearts of Darkness: A Filmmaker's Apocalypse",1991,96,NA,8.2,2573,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Hearts of Fire",1987,95,17000000,3.3,107,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hearts of the West",1975,102,NA,6.3,191,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Hearts of the World",1918,117,NA,7.2,76,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Heartsong",1995,20,NA,6.6,8,0,0,0,14.5,0,0,24.5,0,14.5,45.5,"",0,0,0,0,1,0,1 -"Heartstrings",2002,14,NA,7,13,0,0,0,4.5,0,0,34.5,14.5,14.5,24.5,"",0,0,1,1,0,1,1 -"Heartworn Highways",1981,92,NA,6.5,23,0,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Heat",1972,102,NA,6,289,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Heat",1986,101,NA,5,268,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Heat",1995,188,60000000,7.9,44588,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",1,0,0,1,0,0,0 -"Heat After Dark",1996,50,NA,6,29,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Heat Lightning",1934,63,NA,6.5,26,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heat Wave",1935,72,NA,5.3,7,0,0,14.5,14.5,14.5,44.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Heat and Dust",1983,133,NA,6.2,276,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Heat and Sunlight",1987,98,90000,5.1,18,4.5,0,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Heat of Madness",1966,82,NA,3.2,5,24.5,0,64.5,0,0,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Heat's On, The",1943,80,NA,4.4,35,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Heater",1999,85,NA,6,44,4.5,0,14.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Heathcliff: The Movie",1986,73,NA,2.8,35,24.5,14.5,4.5,14.5,4.5,4.5,4.5,0,0,24.5,"",0,1,1,0,0,0,0 -"Heathers",1989,102,NA,7.4,11110,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Heatscore",2002,28,NA,6,6,14.5,0,0,14.5,14.5,0,14.5,0,14.5,14.5,"",0,0,1,0,0,0,1 -"Heatseeker",1995,91,NA,3.9,65,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Heatstroke",1982,88,NA,4.3,13,14.5,0,4.5,0,4.5,14.5,0,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Heatwave",1982,91,NA,5.5,64,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Heatwave Lasted Four Days, The",1974,72,NA,4.7,6,0,0,0,14.5,0,34.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Heaven",1987,80,NA,6.3,80,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Heaven",1998,105,NA,6.8,293,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Heaven",2002,96,11000000,7.3,3857,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Heaven & Earth",1993,140,33000000,6.4,1987,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Heaven Before I Die",1997,95,NA,2.8,15,24.5,0,24.5,0,4.5,4.5,14.5,14.5,0,14.5,"PG",0,0,1,0,0,0,0 -"Heaven Can Wait",1943,112,NA,7.5,907,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Heaven Can Wait",1978,101,NA,6.8,3569,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Heaven Help Us",1985,104,NA,6.5,766,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Heaven Knows, Mr. Allison",1957,108,3000000,7.4,931,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Heaven Only Knows",1947,100,NA,6.1,46,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Heaven Scent",1956,7,NA,7.4,24,0,0,4.5,0,0,14.5,24.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Heaven Sucks!",1999,37,NA,5.9,16,24.5,0,0,0,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Heaven Tonight",1990,95,NA,2.7,11,34.5,4.5,4.5,0,0,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Heaven and Earth Magic",1962,66,NA,7.3,24,4.5,0,0,4.5,4.5,4.5,24.5,4.5,24.5,24.5,"",0,1,0,0,0,0,0 -"Heaven with a Barbed Wire Fence",1939,61,NA,6.1,6,0,0,0,0,34.5,14.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Heaven with a Gun",1969,101,NA,5.5,76,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Heaven's Burning",1997,100,NA,5.5,507,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Heaven's Gate",1980,219,44000000,6.2,1439,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heaven's Neighbors",2001,115,NA,4.9,128,24.5,4.5,4.5,0,0,0,0,4.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Heaven's Prisoners",1996,132,25000000,5.4,1405,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Heaven's Tears",1994,93,NA,4.3,44,14.5,14.5,4.5,4.5,4.5,14.5,14.5,0,4.5,14.5,"",0,0,0,1,0,1,0 -"Heavenly Bodies",1984,90,NA,3.9,103,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Heavenly Bodies!",1963,62,5000,1,15,64.5,0,0,0,0,0,0,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Heavenly Body, The",1943,95,NA,6,79,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Heavenly Creatures",1994,108,5000000,7.7,11453,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Heavenly Days",1944,71,NA,6.7,11,0,0,0,4.5,0,34.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Heavenly Daze",1948,16,NA,7.7,49,4.5,0,4.5,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Heavenly Desire",1979,90,NA,6.2,7,0,0,0,0,24.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Heavenly Kid, The",1985,90,NA,4.9,494,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Heavenly Music",1943,22,NA,6.9,13,0,0,0,4.5,4.5,34.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Heavenly Pursuits",1985,92,NA,6.8,61,0,0,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Heavenly Puss",1949,8,NA,8.4,45,0,0,0,4.5,4.5,0,14.5,24.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Heavens Above!",1963,105,NA,6.6,148,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Heavy",1995,105,NA,7.1,1304,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Heavy Metal",1981,90,9300000,6.2,4538,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,1,0,0,0,0,0 -"Heavy Metal 2000",2000,88,15000000,5.1,1148,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",1,1,0,0,0,0,0 -"Heavy Metal Comedy",2002,95,NA,7,10,0,0,0,0,34.5,24.5,0,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Heavy Metal Parking Lot",1986,15,NA,8,66,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Heavy Petting",1989,78,NA,5.3,80,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Heavy Traffic",1973,79,NA,6,272,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,1,0,0,0 -"Heavy Weights",1995,100,NA,5.3,1181,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Heb medelij, Jet!",1975,100,NA,5.3,15,0,4.5,4.5,14.5,0,24.5,14.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Hebi ichigo",2003,108,NA,7.2,8,0,0,0,0,14.5,0,45.5,0,14.5,24.5,"",0,0,1,1,0,0,0 -"Hebi no michi",1998,85,NA,6.1,35,4.5,0,0,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hebrew Hammer, The",2003,87,NA,6.3,810,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Heckling Hare, The",1941,7,NA,7.7,63,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Hector",1987,90,NA,6.6,288,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hector's Bunyip",1986,58,NA,6.7,7,0,14.5,14.5,0,44.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Hedd Wyn",1992,123,NA,6.9,112,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Hedda",1975,102,NA,6.6,51,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hedda Gabler",2004,88,NA,8.2,5,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"Hedda Hopper's Hollywood No. 6",1942,9,NA,7.3,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,0,1,0,1 -"Hedwig and the Angry Inch",2001,93,6000000,7.7,6072,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"R",0,0,1,1,0,1,0 -"Heftig og begeistret",2001,89,NA,7.1,287,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Hei bao tian xia",1993,91,NA,5.3,18,4.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hei jun ma",1995,103,NA,7.3,96,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hei kek ji wong",1999,89,NA,7.5,420,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hei lu",1972,94,NA,2.5,5,24.5,24.5,0,0,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Hei ma wang zi",1999,95,NA,5.3,38,14.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Hei mao",1991,91,NA,5.6,131,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hei shan lu",1994,97,NA,7.2,6,0,0,0,0,0,14.5,34.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Hei tai yang 731",1988,100,NA,5.5,274,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hei tai yang 731 xu ji zhi sha ren gong chang",1992,91,NA,4.1,61,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Hei tai yang Nan Jing da tu sha",1995,91,NA,6.3,27,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Hei yu duan chang ge zhi qi sheng zhu rou",1998,100,NA,4.3,17,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hei, rillumarei!",1954,83,NA,6.2,12,0,0,0,0,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Heian zhi guang",1999,104,NA,6.3,58,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Heidelberger Romanze",1951,97,NA,4.5,21,0,4.5,0,24.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Heiden von Kummerow und ihre lustigen Streiche, Die",1967,94,NA,7.8,11,0,0,0,0,4.5,4.5,14.5,0,34.5,24.5,"",0,0,0,0,0,0,0 -"Heideschulmeister Uwe Karsten",1954,96,NA,4.2,7,14.5,0,24.5,14.5,24.5,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Heidi",1937,88,NA,7.2,344,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heidi",1952,97,NA,6,39,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Heidi",1965,95,NA,5.7,27,0,0,0,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Heidi",2001,135,NA,5.9,21,4.5,4.5,4.5,0,0,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Heidi M.",2001,95,NA,6.9,49,0,0,0,4.5,4.5,34.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Heidi und Peter",1955,95,NA,5.8,18,0,0,4.5,0,0,44.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Heidi's Song",1982,94,NA,3.7,29,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Height of the Sky",1999,116,NA,5.6,17,14.5,0,4.5,0,0,0,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heights",2005,93,NA,4,78,4.5,14.5,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"R",0,0,0,1,0,0,0 -"Heilige Berg, Der",1926,106,NA,4.9,41,14.5,0,4.5,0,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Heilt Hitler!",1986,140,NA,5,5,24.5,24.5,0,0,0,44.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Heimat",1938,98,NA,5.7,17,0,0,0,0,24.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Heimspiel",2000,101,NA,7.9,13,4.5,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Heimweh nach St. Pauli",1963,102,NA,5.4,18,0,4.5,14.5,0,14.5,0,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Heinz im Mond",1934,82,NA,4.9,12,0,0,4.5,4.5,14.5,44.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Heir Bear",1953,6,NA,6.9,6,0,0,0,0,14.5,34.5,0,0,34.5,14.5,"",0,1,1,0,0,0,1 -"Heir to an Execution",2004,99,NA,7.2,78,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Heir-Conditioned",1955,7,NA,6.4,19,0,4.5,4.5,4.5,0,44.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Heiress, The",1949,115,2600000,7.9,1252,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Heisei tanuki gassen pompoko",1994,119,NA,7.8,494,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,1,1,0,0,0,0 -"Heiss weht der Wind",1964,102,NA,4.2,6,0,14.5,14.5,45.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Heist",1998,95,NA,3.8,41,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Heist, The",1999,81,NA,4.4,130,14.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Heitai yakuza",1965,103,NA,6.5,7,0,0,0,0,0,24.5,24.5,44.5,0,0,"",0,0,1,1,0,0,0 -"Hej du glada sommar!!!",1965,104,NA,6.1,8,14.5,0,14.5,24.5,0,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Hej-Rup!",1934,99,NA,7.5,34,4.5,0,4.5,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Heja Sverige!",1979,82,NA,3,5,24.5,0,24.5,0,0,0,0,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Held Hostage in Colombia",2003,48,NA,8.3,11,0,0,0,0,0,0,0,44.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Held Up",1999,89,8000000,4.6,555,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Held for Ransom",2000,91,5000000,4.5,136,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Helden",1958,96,NA,6,26,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Helden in Tirol",1998,108,NA,5.6,75,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Helden und andere Feiglinge",1998,96,NA,2.8,25,44.5,4.5,4.5,4.5,0,4.5,14.5,0,4.5,4.5,"",1,0,1,0,0,1,0 -"Helden wie wir",1999,93,NA,6.8,98,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Heldorado",1946,70,NA,6.3,12,0,0,0,4.5,24.5,0,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Helen Morgan Story, The",1957,118,NA,5.6,68,4.5,0,14.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Helen of Troy",1956,118,NA,5.9,277,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Helen's Babies",1924,85,NA,8.9,13,0,0,0,0,4.5,0,24.5,34.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Helena",1924,204,NA,9,15,0,0,0,0,4.5,14.5,0,14.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Helga - Vom Werden des menschlichen Lebens",1967,77,NA,4.5,7,0,14.5,14.5,14.5,0,14.5,44.5,0,0,0,"",0,0,0,0,1,0,0 -"Helgoland",2000,12,NA,4.6,7,0,0,14.5,24.5,24.5,14.5,0,0,14.5,0,"",0,0,0,0,1,0,1 -"Helicopter",2000,21,NA,6.8,88,24.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,1,0,1,0,0,1 -"Helimadoe",1994,90,NA,5.8,28,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,24.5,4.5,"",0,0,1,0,0,1,0 -"Helix... Loaded, The",2005,97,1000000,2.3,33,34.5,4.5,0,0,0,4.5,4.5,4.5,0,44.5,"R",1,0,1,0,0,0,0 -"Hell Below",1933,101,NA,6.5,45,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Hell Below Zero",1954,90,NA,5.3,39,4.5,4.5,0,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Hell Bent",1994,83,NA,4.1,16,34.5,4.5,0,0,14.5,4.5,0,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Hell Bent for Leather",1960,82,NA,5.7,49,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Hell Boats",1970,95,NA,4.5,19,14.5,4.5,0,4.5,44.5,14.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Hell Bound",1957,69,NA,6.7,7,0,14.5,0,0,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Hell Comes to Frogtown",1987,86,NA,4.4,372,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Hell Divers",1931,109,NA,6.1,68,0,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hell Drivers",1957,91,NA,6.6,320,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hell Harbor",1930,83,NA,6.2,16,0,0,0,14.5,24.5,14.5,4.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Hell High",1989,84,NA,3.7,48,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Hell Hole",1978,82,NA,2.4,8,0,24.5,0,14.5,14.5,0,0,0,0,45.5,"",1,0,0,0,0,0,0 -"Hell House",2001,85,NA,7.1,300,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Hell Is a City",1960,88,NA,6.3,75,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hell Is for Heroes",1962,90,2500000,7.2,629,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hell Mountain",1998,94,NA,3.7,45,24.5,14.5,24.5,4.5,4.5,0,14.5,4.5,0,14.5,"R",1,0,0,1,0,0,0 -"Hell Night",1981,101,NA,4.7,467,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hell On Wheels",1967,97,NA,5.4,13,4.5,0,14.5,0,14.5,14.5,24.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Hell Ship Mutiny",1957,66,NA,4.4,7,24.5,0,14.5,0,14.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Hell Squad",1958,64,NA,4.5,14,4.5,4.5,0,24.5,24.5,14.5,4.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Hell Squad",1985,87,NA,2.7,36,44.5,4.5,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hell Up in Harlem",1973,94,NA,5.4,120,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hell and High Water",1954,99,NA,6.3,125,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hell for Leather",1998,28,NA,6.9,15,4.5,0,4.5,0,0,0,34.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Hell in the Heavens",1934,79,NA,5.9,5,0,0,0,0,64.5,0,0,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Hell in the Pacific",1968,103,NA,7.3,797,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hell on Frisco Bay",1955,98,NA,6.1,40,4.5,4.5,4.5,4.5,34.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hell on the Battleground",1990,86,NA,3.6,16,44.5,4.5,4.5,4.5,14.5,4.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Hell to Eternity",1960,131,800000,6.8,118,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hell with Heroes, The",1968,95,NA,5.9,50,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Hell's Angels",1930,127,3950000,7.6,329,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hell's Angels '69",1969,97,NA,4.1,39,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,0,24.5,"",1,0,0,1,0,0,0 -"Hell's Angels Forever",1983,93,NA,4.6,34,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Hell's Belles",1970,95,NA,5,32,0,0,4.5,24.5,14.5,14.5,4.5,24.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Hell's Bloody Devils",1970,92,150000,2.8,18,34.5,14.5,14.5,0,4.5,14.5,4.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Hell's Chosen Few",1968,92,NA,2.4,9,24.5,34.5,0,14.5,24.5,0,0,0,14.5,0,"",1,0,0,0,0,0,0 -"Hell's Crossroads",1957,73,NA,6.3,10,0,0,0,14.5,34.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Hell's Five Hours",1958,73,NA,7.5,7,0,0,14.5,0,0,14.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Hell's Half Acre",1954,88,NA,6.5,23,4.5,0,0,4.5,24.5,4.5,24.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Hell's Heroes",1930,68,NA,7.3,79,4.5,0,0,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hell's Highway",1932,62,NA,6.7,58,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hell's Hinges",1916,64,NA,7.1,96,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hell's House",1932,72,NA,5.6,111,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hell's Island",1955,84,NA,5.6,17,0,0,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Hell's Kitchen",1939,81,NA,4.5,51,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hell's Kitchen",1998,95,6000000,4.5,491,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hell's Outpost",1954,89,NA,6.9,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Hell's Paradox",1996,13,NA,4.3,5,0,0,44.5,44.5,24.5,0,0,0,0,0,"",1,0,0,0,0,0,1 -"Hell-Bent for Election",1944,13,NA,9.4,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,1,0,0,0,0,1 -"HellBent",2004,85,NA,4.9,55,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Hellborn",2003,90,NA,4.1,106,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Hellbound",1993,95,NA,3.4,239,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hellbound: Hellraiser II",1988,99,NA,5.6,3546,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hellboy",2004,132,66000000,6.7,15565,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Hellbreeder",2003,85,NA,3.2,105,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Hellcats of the Navy",1957,82,NA,4.4,144,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hellcats, The",1967,90,NA,1.6,280,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hellegat",1980,98,NA,5.8,18,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Heller Wahn",1983,100,NA,6.7,37,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Heller als der Mond",2000,88,NA,6,40,4.5,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Heller in Pink Tights",1960,100,NA,5.1,125,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Hellfighters",1968,121,NA,6,582,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Hellfire",1949,90,NA,6.9,44,0,0,0,4.5,4.5,4.5,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Hellfire Club, The",1960,90,NA,4.5,27,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hellgate",1952,87,NA,6.5,13,0,0,0,0,24.5,24.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Hellgate",1989,96,NA,3,100,34.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hellhole",1985,90,NA,4.6,49,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Hellinger",1997,90,NA,1.6,21,44.5,14.5,4.5,4.5,4.5,0,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Hellions, The",1961,80,NA,5.8,18,0,0,0,14.5,14.5,0,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Hellmaster",1992,92,NA,3.4,24,34.5,4.5,4.5,34.5,0,0,4.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Hello Again",1987,96,NA,4.3,583,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hello Aloha",1952,6,NA,6.4,38,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hello Down There",1969,88,NA,5.4,182,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hello Frisco, Hello",1943,99,NA,6.2,53,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hello Hemingway",1990,90,NA,6.2,13,0,0,0,4.5,0,0,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Hello How Am I",1939,6,NA,6.2,8,0,0,0,0,24.5,34.5,0,0,0,34.5,"",0,1,1,0,0,0,1 -"Hello Mary Lou: Prom Night II",1987,97,NA,4,360,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hello Pop!",1933,17,NA,8,14,24.5,0,0,0,0,14.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Hello, Dolly!",1969,146,25000000,6.3,1499,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Hello, Dolly!",2000,3,NA,5.8,8,14.5,0,24.5,0,14.5,24.5,24.5,0,0,0,"",0,1,1,0,0,0,1 -"Hello, Everybody!",1933,69,2000000,4.2,10,14.5,14.5,24.5,24.5,14.5,14.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Hello, Hello, Hello",1995,11,NA,8.4,12,4.5,0,0,0,0,0,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Hello, Sister",1933,62,NA,6.8,15,0,0,0,14.5,4.5,44.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Hello-Goodbye",1970,101,NA,3.2,27,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hellraiser",1987,89,1000000,6.5,6815,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hellraiser III: Hell on Earth",1992,97,NA,4.8,2404,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hellraiser: Bloodline",1996,86,4000000,4.2,2041,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Hellriders",1984,90,NA,2.7,25,45.5,14.5,14.5,0,0,0,14.5,4.5,0,0,"",1,0,0,1,0,0,0 -"Hells Angels on Wheels",1967,94,NA,4.7,237,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hellstrom Chronicle, The",1971,90,NA,6.8,125,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,1,0,0 -"Hellzapoppin",1941,84,NA,7.9,364,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Helmikuun manifesti",1939,99,NA,6.9,10,24.5,0,0,14.5,14.5,14.5,24.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Help Wanted, Female",1968,75,NA,5.9,8,0,0,14.5,0,34.5,24.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Help the Old",1998,10,NA,8.1,41,4.5,0,0,0,0,0,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Help!",1965,90,1500000,7.1,2517,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Help! My Snowman's Burning Down",1965,9,NA,7.1,7,0,0,0,0,0,0,44.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Help, de dokter verzuipt!",1974,94,NA,5.2,47,4.5,4.5,14.5,4.5,24.5,24.5,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Helping Grandma",1931,20,NA,7.7,31,0,0,4.5,4.5,4.5,4.5,4.5,24.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Helpless",1996,80,NA,6.1,20,14.5,14.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Helpmates",1932,20,NA,8.2,190,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Helsinki Napoli All Night Long",1987,105,NA,6.8,112,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Helten Henning",1998,35,NA,6.1,5,0,0,0,0,0,64.5,0,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Helter Skelter",1949,84,NA,4.9,17,4.5,4.5,0,14.5,34.5,0,14.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Helter Skelter",2000,83,NA,4.1,19,24.5,0,0,0,0,14.5,0,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Hem Hayu Asarah",1960,105,NA,6.8,5,0,0,0,0,0,44.5,44.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Hem ljuva hem",2001,101,NA,6.4,108,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hemingway's Adventures of a Young Man",1962,139,NA,5.2,68,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Hemingway: A Portrait",1999,10,NA,4.1,8,0,14.5,45.5,0,0,34.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Hemlige riddaren, Den",1997,12,NA,2.2,11,34.5,0,0,0,0,4.5,4.5,4.5,0,34.5,"",0,0,0,0,0,0,1 -"Hemligheten",1990,105,NA,2.7,13,14.5,0,0,4.5,4.5,4.5,14.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Hemmelig sommer",1969,42,NA,1,39,94.5,4.5,0,0,0,0,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Hemmeligheder",1997,45,NA,6.1,8,14.5,0,0,0,34.5,14.5,24.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Hemmelighedsfulde X, Det",1914,84,NA,8.2,20,0,0,0,0,0,14.5,4.5,44.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Hemmelighetsfulle leiligheten, Den",1948,75,NA,6.3,12,24.5,0,0,4.5,4.5,4.5,4.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Hemp for Victory",1943,15,NA,5,11,0,0,4.5,4.5,0,4.5,14.5,4.5,0,44.5,"",0,0,0,0,1,0,1 -"Hempas bar",1977,104,NA,5.5,8,14.5,0,0,14.5,24.5,45.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Hempmento",2004,28,NA,9.4,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,1,0,0,0,1 -"Hempsters: Plant the Seed",2003,90,250000,6.4,6,0,0,0,0,0,34.5,0,0,0,64.5,"",0,0,0,0,1,0,0 -"Hemso",2001,93,NA,4.2,67,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hen Hop",1942,4,NA,7.3,16,0,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Henhouse Henery",1949,7,NA,7.3,26,0,0,0,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Henker - Der Tod hat ein Gesicht",2002,84,NA,8,11,0,0,0,0,0,14.5,34.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Henker von London, Der",1963,92,NA,5.4,25,0,0,4.5,4.5,34.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Henna",1991,180,NA,7.2,16,0,0,4.5,0,14.5,4.5,14.5,24.5,0,34.5,"",0,0,0,1,0,1,0 -"Hennessy",1975,103,NA,5.6,63,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Henpecked Duck, The",1941,7,NA,6.7,26,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Henpecked Hoboes",1946,8,NA,6.9,26,4.5,4.5,0,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Henri Cartier-Bresson - Biographie eines Blicks",2003,72,NA,8.3,11,0,0,0,0,0,0,0,64.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Henrietta",1983,94,NA,6.2,15,0,0,4.5,0,4.5,24.5,14.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Henry & June",1990,136,NA,6.3,2441,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Henry & Verlin",1994,87,NA,3.5,39,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Henry Aldrich Gets Glamour",1943,72,NA,8.2,38,0,0,0,4.5,4.5,0,4.5,4.5,34.5,45.5,"",0,0,1,0,0,0,0 -"Henry Aldrich Haunts a House",1943,73,NA,8.1,47,0,0,0,0,4.5,4.5,4.5,4.5,34.5,44.5,"",0,0,1,0,0,0,0 -"Henry Aldrich Plays Cupid",1944,65,NA,8.2,37,0,0,0,0,0,0,4.5,4.5,34.5,44.5,"",0,0,1,0,0,0,0 -"Henry Aldrich Swings It",1943,64,NA,7.8,45,0,0,0,0,0,4.5,4.5,4.5,34.5,44.5,"",0,0,1,0,0,0,0 -"Henry Aldrich for President",1941,75,NA,6.9,47,4.5,0,0,0,0,0,4.5,14.5,34.5,44.5,"",0,0,1,0,0,0,0 -"Henry Aldrich's Little Secret",1944,75,NA,7.3,23,0,0,0,4.5,0,0,4.5,4.5,34.5,44.5,"",0,0,1,0,0,0,0 -"Henry Aldrich, Boy Scout",1944,66,NA,7.8,46,0,0,0,0,0,4.5,4.5,14.5,34.5,44.5,"",0,0,1,0,0,0,0 -"Henry Aldrich, Editor",1942,72,NA,7.3,49,4.5,0,0,4.5,0,4.5,4.5,14.5,34.5,34.5,"",0,0,1,0,0,0,0 -"Henry Fool",1997,137,NA,7.2,2050,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Henry Goes Arizona",1939,66,NA,5.8,29,4.5,4.5,0,4.5,24.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Henry Hill",1999,85,NA,5.2,30,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,0,24.5,"",0,0,1,1,0,1,0 -"Henry Miller Odyssey, The",1974,110,NA,8.9,10,0,0,0,14.5,0,0,14.5,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Henry V",1989,137,9000000,7.9,8241,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",1,0,0,1,0,0,0 -"Henry VIII and His Six Wives",1972,125,NA,6.6,84,4.5,0,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Henry X",2003,107,NA,3.7,10,44.5,0,0,24.5,0,0,14.5,0,24.5,14.5,"",0,0,1,0,0,0,0 -"Henry and Dizzy",1942,71,NA,6.5,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Henry and Marvin",2001,22,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,1,1,0,0,1 -"Henry the Ache",1934,20,NA,4.3,5,0,24.5,24.5,0,0,0,24.5,0,0,44.5,"",0,0,1,0,0,0,1 -"Henry: Portrait of a Serial Killer",1986,78,111000,7.1,3067,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Henry: Portrait of a Serial Killer, Part 2",1998,84,NA,4.7,161,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Hentai kazoku: Aniki no yomesan",1983,63,NA,5.9,13,0,4.5,4.5,0,0,0,14.5,44.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hep Cat, The",1942,6,NA,6.4,37,0,0,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Heping fandian",1995,89,NA,6.2,224,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Her Alibi",1989,94,NA,5.2,1415,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Her Cardboard Lover",1942,93,NA,4.7,72,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Her Crowning Glory",1911,14,NA,6,29,0,0,0,24.5,24.5,14.5,24.5,14.5,4.5,0,"",0,0,1,0,0,0,1 -"Her Eyes",2001,95,NA,7.7,9,0,0,0,0,0,44.5,14.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Her First Adventure",1908,6,NA,4.7,6,14.5,0,0,0,34.5,14.5,34.5,0,0,0,"",0,0,0,1,0,0,1 -"Her First Affaire",1933,71,NA,5.5,7,0,0,0,14.5,14.5,14.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Her First Biscuits",1909,6,NA,4.9,7,14.5,0,0,14.5,0,24.5,44.5,0,0,0,"",0,0,1,0,0,0,1 -"Her First Mate",1933,66,NA,6,6,0,0,0,14.5,0,14.5,45.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Her First Romance",1951,72,NA,5.4,8,0,0,0,24.5,24.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,1,0 -"Her Highness and the Bellboy",1945,112,NA,6,53,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Her Husband's Affairs",1947,84,NA,5,16,4.5,0,0,14.5,14.5,14.5,14.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Her Husband's Secretary",1937,61,NA,5.9,5,0,24.5,0,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Her Jungle Love",1938,81,NA,7.4,13,0,0,0,0,4.5,4.5,14.5,34.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Her Kind of Man",1946,78,NA,5.3,10,14.5,0,14.5,0,34.5,34.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Her Knight",2003,29,16878,8,9,0,0,0,0,14.5,0,24.5,34.5,14.5,24.5,"",0,0,0,0,0,1,1 -"Her Majesty",2001,105,NA,8.1,70,0,4.5,0,0,0,4.5,4.5,14.5,24.5,44.5,"PG",0,0,0,0,0,0,0 -"Her Majesty, Love",1931,75,NA,5,27,4.5,0,4.5,24.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Her Man",1930,85,NA,7,11,0,0,0,0,4.5,4.5,4.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Her Married Lover",1999,85,NA,4.9,80,4.5,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Her Name Was Lisa",1979,80,NA,5.6,7,14.5,0,0,0,14.5,14.5,0,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Her Sister from Paris",1925,70,NA,7.4,9,14.5,0,14.5,0,0,14.5,0,34.5,34.5,0,"",0,0,1,0,0,0,0 -"Her Summer",2004,80,NA,8.2,10,0,0,0,0,0,14.5,24.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Her Twelve Men",1954,91,NA,5.7,47,0,0,0,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Her Urge",2000,15,20000,5.5,11,0,0,0,4.5,0,4.5,0,4.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Her Wedding Night",1930,75,NA,7.4,7,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Hera Purple",2001,93,NA,4.7,15,34.5,4.5,4.5,0,4.5,0,14.5,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Herb Alpert and the Tijuana Brass Double Feature",1966,6,NA,6.9,5,0,0,0,0,0,24.5,0,24.5,44.5,24.5,"",0,1,0,0,0,0,1 -"Herbie Goes Bananas",1980,100,NA,4.4,587,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Herbie Goes to Monte Carlo",1977,100,NA,4.9,741,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Herbie Rides Again",1974,84,NA,5.2,755,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Herbie!",2004,18,NA,4.7,6,14.5,0,0,0,0,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Herbstmilch",1989,111,NA,7.1,75,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hercule et Sherlock",1996,95,NA,3.3,97,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hercules",1983,98,NA,2.6,378,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hercules",1997,92,70000000,6.6,5279,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Hercules Returns",1993,82,NA,6.8,198,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Hercules in New York",1970,91,NA,2.5,2669,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Herd",1999,18,NA,6.3,45,0,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Herd, The",1998,100,NA,7.9,22,4.5,0,0,4.5,0,4.5,4.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Herdeiros, Os",1970,110,NA,5.3,15,4.5,4.5,0,0,24.5,14.5,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Herding Horses Across a River",1904,1,NA,3.9,5,0,0,24.5,44.5,24.5,24.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Here After",2004,35,NA,9.7,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,1,0,0,1 -"Here Am I",1999,72,NA,8,6,0,0,0,0,14.5,0,0,45.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Here Come the Co-eds",1945,90,NA,6.2,97,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Here Come the Girls",1953,78,NA,5.9,45,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Here Come the Huggetts",1948,93,NA,5.8,17,0,0,0,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Here Come the Littles",1985,72,NA,7.1,25,0,0,0,0,14.5,4.5,4.5,14.5,24.5,44.5,"",0,1,0,0,0,0,0 -"Here Come the Marines",1952,66,NA,7.3,29,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Here Come the Nelsons",1952,75,NA,6.9,26,4.5,0,0,0,14.5,14.5,14.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Here Come the Tigers",1978,87,NA,1.9,36,34.5,14.5,4.5,4.5,4.5,14.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Here Come the Waves",1944,99,NA,6,30,4.5,0,0,0,24.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Here Comes Carter",1936,58,NA,5.6,7,0,0,0,14.5,14.5,24.5,0,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Here Comes Cookie",1935,63,NA,5.8,21,24.5,0,0,0,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Here Comes Flossie",1933,18,NA,6.6,5,0,0,24.5,0,0,24.5,64.5,0,0,0,"",0,0,1,0,0,0,1 -"Here Comes Happiness",1941,57,NA,5.2,9,0,14.5,0,14.5,14.5,24.5,24.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Here Comes Mr. Jordan",1941,94,NA,7.7,803,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Here Comes the Circus",1946,10,NA,1.8,16,34.5,34.5,0,0,24.5,0,4.5,0,0,0,"",0,0,0,0,1,0,1 -"Here Comes the Groom",1951,113,2117000,5.2,117,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Here Comes the Navy",1934,87,NA,6.5,68,0,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Here Is My Heart",1934,77,NA,8.2,6,0,0,0,0,14.5,0,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Here Today, Gone Tamale",1959,6,NA,6.3,25,0,0,14.5,4.5,4.5,34.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Here We Go Again",1942,77,NA,5.8,37,4.5,0,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Here We Go Round the Mulberry Bush",1967,96,NA,5.6,111,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Here on Earth",2000,93,15000000,4.8,2187,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Here to Where",2001,90,NA,7.2,9,14.5,0,0,0,14.5,14.5,0,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Here's to Life!",2000,94,NA,5.3,38,4.5,0,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Heremakono",2002,96,NA,6.7,104,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Herencia",2001,90,NA,8.3,143,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Herida luminosa, La",1997,100,NA,5.8,25,24.5,0,4.5,0,14.5,34.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Heritage of the Desert",1932,60,NA,5.4,7,0,14.5,14.5,0,14.5,24.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Herkes kendi evinde",2001,110,NA,7.6,35,14.5,0,0,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Herkus mantas",1972,145,NA,9.5,6,0,0,0,0,0,0,0,0,45.5,45.5,"",0,0,0,1,0,0,0 -"Herlock Sholmes in Be-a-Live-Crook",1930,8,NA,2.4,6,45.5,14.5,14.5,0,0,0,0,14.5,0,0,"",0,0,1,0,0,0,1 -"Herman",1990,88,NA,6.4,99,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Herman U.S.A.",2001,92,NA,5.6,45,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Hermanas",2005,88,NA,8.8,5,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Hermann der Cherusker - Die Schlacht im Teutoburger Wald",1967,82,NA,4.4,9,24.5,14.5,24.5,14.5,14.5,14.5,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Hermannsschlacht, Die",1996,71,NA,6.8,8,24.5,0,0,0,0,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Hermanos del hierro, Los",1961,95,NA,8.7,15,14.5,0,0,0,0,0,0,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Hermoso ideal",1948,85,NA,5.2,7,0,0,14.5,14.5,14.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Hero",1982,92,NA,2.6,5,0,24.5,24.5,0,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Hero",1992,117,42000000,6.2,4705,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Hero",2000,15,NA,6.8,13,4.5,4.5,0,0,0,24.5,34.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Hero",2001,11,NA,6.7,58,0,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Hero Ain't Nothin' But a Sandwich, A",1978,107,NA,6.8,21,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hero Cop: Yesterday and Today, The",1973,8,NA,6.7,5,0,0,24.5,0,0,24.5,24.5,0,24.5,24.5,"",0,0,0,0,1,0,1 -"Hero and the Terror",1988,96,NA,4.3,275,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hero at Large",1980,98,NA,6,282,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hero of Liao-Yang, The",1904,15,NA,3.8,5,24.5,0,0,24.5,24.5,0,24.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Hero's Island",1962,94,NA,5.2,30,4.5,4.5,4.5,24.5,24.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hero's Journey: The World of Joseph Campbell, The",1987,58,NA,5,24,24.5,4.5,4.5,0,4.5,0,14.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Heroes",1977,85,NA,5.6,306,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Heroes",1984,68,NA,6.3,6,0,14.5,0,0,0,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Heroes Die Young",1960,76,NA,3.5,9,24.5,0,24.5,34.5,14.5,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Heroes Stand Alone",1989,83,NA,2.7,6,14.5,0,34.5,0,14.5,0,14.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Heroes at Leisure",1939,10,NA,6.8,6,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,0,0,0,1,0,1 -"Heroes for Sale",1933,71,290000,7.1,64,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Heroes of Telemark, The",1965,131,NA,6,614,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Herr Arnes pengar",1919,122,NA,6.8,65,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Herr Arnes penningar",1954,88,NA,5.4,18,0,0,0,14.5,45.5,24.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Herr Bohm och sillen",1987,12,NA,8.8,6,0,0,0,0,0,14.5,34.5,0,0,45.5,"",0,1,0,0,0,0,1 -"Herr Kanzleirat, Der",1948,104,NA,3.5,12,4.5,0,14.5,0,14.5,24.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Herr Lehmann",2003,105,NA,7.3,621,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Herr Meets Hare",1945,7,NA,7.3,66,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Herr Ober!",1992,93,NA,6,58,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Herr Puntila und sein Knecht Matti",1955,97,NA,6.7,14,0,0,0,4.5,4.5,4.5,24.5,44.5,14.5,0,"",0,0,1,1,0,0,0 -"Herr Zwilling und Frau Zuckermann",1999,126,NA,7.4,35,0,0,4.5,4.5,0,4.5,0,14.5,44.5,24.5,"",0,0,0,0,1,0,0 -"Herr im Haus, Der",1940,80,NA,5.4,9,0,0,0,24.5,0,14.5,14.5,44.5,0,14.5,"",0,0,1,0,0,0,0 -"Herr mit der schwarzen Melone, Der",1960,88,NA,7,11,4.5,0,0,0,4.5,44.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Herra Sotaministeri",1957,90,NA,5,9,0,14.5,0,14.5,24.5,34.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Herre i kjole og hvidt, En",1942,95,NA,7.8,7,0,0,0,0,0,14.5,44.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Herren og hans tjenere",1959,83,NA,5.3,7,0,0,24.5,24.5,14.5,14.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Herrenpartie",1964,92,NA,9.2,8,0,0,0,0,0,0,0,24.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Herrin der Welt - Teil I",1960,98,NA,4.5,8,14.5,0,14.5,14.5,0,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Herrin von Atlantis, Die",1932,87,NA,6.4,9,24.5,0,14.5,0,34.5,0,0,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Herrliche Zeiten im Spessart",1967,105,NA,4.8,15,0,14.5,24.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Herrn Josefs letzte Liebe",1959,86,NA,3.8,10,24.5,14.5,14.5,14.5,24.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Herrscher ohne Krone",1957,104,NA,5.5,15,0,0,0,14.5,0,44.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hers to Hold",1943,94,NA,4.9,16,14.5,0,0,4.5,14.5,14.5,0,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Herschel Hopper: New York Rabbit",2000,45,NA,6.2,6,34.5,0,0,0,0,14.5,0,0,14.5,34.5,"",0,1,0,0,0,0,1 -"Hersenschimmen",1988,115,NA,6.4,18,0,4.5,0,0,24.5,0,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Hersey cok guzel olacak",1999,109,NA,7.7,347,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Herz",2001,100,NA,7.7,70,4.5,4.5,4.5,4.5,0,0,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Herz ohne Gnade",1958,95,NA,8.5,7,0,0,0,0,0,0,14.5,44.5,44.5,0,"",0,0,0,0,0,0,0 -"Herz von St. Pauli, Das",1957,95,NA,5,15,0,0,0,24.5,24.5,44.5,0,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Herzog Blaubarts Burg",1964,60,NA,7.4,5,0,0,0,0,0,24.5,44.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Hesder, Ha-",2000,102,NA,7.5,184,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hessed Mufla",1992,95,NA,5.7,49,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Hessi James",2002,6,NA,6.7,19,0,4.5,0,0,0,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hessian Renegades, The",1909,10,NA,5.2,10,14.5,0,0,24.5,14.5,0,44.5,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Hester Street",1975,90,NA,6.4,141,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Heterosapiens",2002,25,NA,6.1,6,0,0,0,0,34.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Hets",1944,101,NA,7.7,347,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Heugsuseon",2001,104,NA,6.4,78,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Heung gong yau gok hor lei wood",2001,108,NA,6.6,136,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Heunggong dai 1 hung chak",1998,90,NA,4,9,14.5,0,14.5,14.5,24.5,24.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Heureux anniversaire",1962,15,NA,7.9,7,0,0,0,0,0,0,14.5,0,24.5,45.5,"",0,0,1,0,0,0,1 -"Heureux qui comme Ulysse",1970,90,NA,6.5,35,0,0,0,0,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Heute heiratet mein Mann",1956,91,NA,4.9,19,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Heute nacht oder nie",1972,90,NA,5.2,7,0,0,14.5,0,14.5,0,0,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Hex",1973,92,NA,3.1,29,24.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hexagone",1994,90,NA,6.8,5,0,0,0,24.5,0,24.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Hexed",1993,90,NA,4.4,368,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hexer, Der",1964,95,NA,6.9,119,0,4.5,0,4.5,4.5,24.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hey Arnold! The Movie",2002,76,10000000,4.8,425,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG",0,1,1,0,0,0,0 -"Hey Arnold!: 24 Hours to Live",1996,14,NA,8.3,9,0,14.5,0,0,0,0,24.5,0,14.5,45.5,"",0,1,0,0,0,0,1 -"Hey Babe!",1980,101,NA,4.4,28,0,4.5,4.5,0,4.5,4.5,24.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Hey Babu Riba",1986,112,NA,8.2,87,4.5,4.5,0,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Hey Boy! Hey Girl!",1959,83,NA,5.2,46,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Hey Good Lookin'",1982,76,NA,5.3,67,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,1,1,0,0,0 -"Hey Ram",2000,186,NA,8.2,178,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Hey There, It's Yogi Bear",1964,89,NA,5.4,63,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Hey! Hey! USA",1938,88,NA,5.5,36,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hey! Is Dee Dee Home?",2003,64,NA,6.8,15,0,24.5,14.5,0,4.5,24.5,4.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Hey, Happy!",2001,75,NA,3.7,127,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hey, Let's Twist",1961,80,NA,2.9,26,14.5,14.5,14.5,14.5,4.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Hi De Ho",1937,11,NA,6.4,15,0,0,0,4.5,14.5,24.5,14.5,44.5,0,4.5,"",0,0,0,0,0,0,1 -"Hi Diddle Diddle",1943,72,NA,7.1,29,0,0,0,0,14.5,14.5,34.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hi Gang!",1941,100,NA,6.1,8,0,0,0,0,0,45.5,0,0,14.5,34.5,"",0,0,1,0,0,1,0 -"Hi no tori",1978,137,NA,7.4,19,14.5,0,0,0,4.5,14.5,34.5,14.5,14.5,14.5,"",1,1,1,1,0,0,0 -"Hi no tori 2772: Ai no kosumozon",1980,95,NA,4.3,40,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,1,0,0,0,0,0 -"Hi, Gaucho!",1935,59,NA,4.3,9,0,0,14.5,45.5,24.5,14.5,0,0,0,0,"",0,0,1,1,0,0,0 -"Hi, I'm Steve",1999,6,NA,4.1,18,4.5,24.5,14.5,14.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Hi, Mom!",1970,87,NA,5.9,509,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hi, Nellie!",1934,75,NA,6.6,46,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Hi-De-Ho",1947,64,NA,6.2,22,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hi-Jackers, The",1963,69,NA,5.4,10,0,0,0,0,34.5,44.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Hi-Life",1998,82,NA,5.7,250,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Hi-Line, The",1999,95,NA,5.9,166,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Hi-Lo Country, The",1998,114,NA,6,1089,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Hi-Riders",1978,90,NA,6.5,21,4.5,0,4.5,0,4.5,24.5,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Hi-Yo Silver",1940,69,NA,4.1,11,0,0,14.5,4.5,0,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Hiawatha",1952,80,NA,5.3,14,0,0,4.5,14.5,24.5,34.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Hiawatha's Rabbit Hunt",1941,8,NA,7,51,0,4.5,0,0,14.5,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hibernatus",1969,82,NA,6.2,348,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hibotan bakuto: hanafuda shobu",1969,98,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",1,0,0,0,0,0,0 -"Hic-cup Pup",1954,6,NA,6.3,37,0,0,0,14.5,0,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hiccup",1998,10,NA,7.4,7,0,0,0,0,0,0,45.5,14.5,14.5,14.5,"",0,0,1,1,0,0,1 -"Hick Chick, The",1946,7,NA,7,22,0,0,4.5,0,0,4.5,14.5,44.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hick Trek: The Moovie",1999,60,NA,4.2,32,24.5,4.5,4.5,4.5,0,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hick a Slick and a Chick, A",1948,7,NA,5.8,21,4.5,14.5,0,4.5,4.5,24.5,14.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Hickey & Boggs",1972,107,NA,6,110,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hidalgo",2004,136,78000000,6.6,7328,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Hidan of Maukbeiangjow, The",1973,93,NA,4.6,12,4.5,0,14.5,0,4.5,4.5,0,14.5,4.5,34.5,"",0,0,1,1,0,1,0 -"Hidden Agenda",1990,108,NA,6.6,482,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hidden Agenda",1998,95,NA,4.9,128,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Hidden Agenda",2001,98,5000000,4.2,266,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Hidden Assassin",1995,89,11000000,4.4,245,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Hidden Beauties",1999,77,NA,3.8,59,14.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Hidden Dimension, The",1997,45,NA,3.7,17,14.5,0,0,14.5,24.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,1,0,0 -"Hidden Eye, The",1945,69,NA,6.2,32,0,4.5,4.5,0,4.5,24.5,44.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hidden Fear",1957,80,NA,5.3,10,0,14.5,0,14.5,34.5,14.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Hidden Fears",1993,90,NA,4.4,25,34.5,4.5,4.5,4.5,14.5,4.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Hidden Fuhrer: Debating the Enigma of Hitler's Sexuality",2004,90,NA,8.2,30,4.5,0,4.5,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Hidden Gold",1940,60,NA,7.6,15,0,0,0,0,4.5,24.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Hidden Guns",1956,90,NA,5.4,5,0,0,0,0,44.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Hidden Hand, The",1942,63,NA,7,13,0,14.5,0,24.5,0,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Hidden Hawaii",1993,34,NA,6.5,24,0,0,0,14.5,4.5,34.5,14.5,24.5,4.5,0,"",0,0,0,0,1,0,1 -"Hidden II, The",1994,91,NA,3.1,171,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hidden Passion",2000,93,NA,2,28,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Hidden Valley",1932,57,NA,5.2,11,0,0,24.5,4.5,4.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Hidden Wars of Desert Storm, The",2001,64,NA,7.8,44,4.5,0,0,0,0,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Hidden, The",1987,96,NA,6.8,1956,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Hidden, The",1997,3,NA,2.9,16,24.5,0,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Hide and Creep",2004,85,20000,3.7,42,24.5,14.5,0,4.5,0,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Hide and Go Shriek",1988,90,NA,3.7,61,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Hide and Seek",1963,90,NA,7,8,0,0,0,0,0,14.5,45.5,24.5,0,14.5,"",1,0,0,1,0,0,0 -"Hide and Seek",2005,101,30000000,5.2,3784,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Hide and Shriek",1938,10,NA,7.1,28,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Hide in Plain Sight",1980,92,NA,6.5,118,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hide-Out",1934,81,NA,6.5,33,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Hideaway",1995,106,15000000,5,1303,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hideg napok",1966,96,NA,6.6,22,4.5,0,4.5,0,4.5,4.5,4.5,4.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Hideko no shasho-san",1941,54,NA,4.4,10,0,14.5,0,0,14.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hideous Kinky",1998,98,12000000,6.1,1615,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Hideous Sun Demon, The",1959,74,58500,3.6,120,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Hideous!",1997,82,NA,3.3,131,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Hiding Out",1987,98,NA,5.6,495,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Hiding Place, The",1975,150,NA,6.5,160,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Hierankl",2003,93,NA,5.9,65,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Higanbana",1958,118,NA,7.8,163,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"High",1967,80,NA,3.1,19,14.5,0,4.5,14.5,0,14.5,4.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"High Adventure",2001,90,NA,3.4,22,14.5,14.5,24.5,4.5,14.5,14.5,0,0,0,4.5,"",1,0,0,0,0,0,0 -"High Anxiety",1977,94,3400000,6.4,2557,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"High Art",1998,87,NA,6.8,2067,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"High Barbaree",1947,91,NA,5.9,55,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,"",1,0,0,0,0,0,0 -"High Boot Benny",1994,82,NA,5.7,9,14.5,14.5,0,24.5,14.5,14.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"High Bright Sun, The",1964,114,NA,5.5,36,0,4.5,0,14.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"High Command, The",1936,84,NA,6.4,21,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"High Cost of Loving, The",1958,87,NA,5.8,31,4.5,0,0,4.5,4.5,24.5,34.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"High Country, The",1981,98,NA,4,31,4.5,0,4.5,4.5,4.5,0,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"High Crimes",2002,115,42000000,6.1,6043,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"High Crusade, The",1994,100,NA,3.3,170,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"High Diving Hare",1949,7,NA,7.3,122,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"High Fidelity",1988,85,NA,6.6,14,0,0,0,0,14.5,0,4.5,34.5,24.5,24.5,"",0,0,0,0,1,0,0 -"High Fidelity",2000,113,20000000,7.6,29704,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,1,1,0,1,0 -"High Finance Woman",1989,100,NA,2.6,18,24.5,14.5,24.5,14.5,0,14.5,4.5,4.5,4.5,0,"",0,0,0,0,0,1,0 -"High Flight",1956,89,NA,4.7,13,0,4.5,4.5,34.5,14.5,4.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"High Flyers",1937,70,NA,7.8,16,4.5,0,0,0,4.5,4.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"High Freakquency",1998,90,NA,1.8,12,24.5,24.5,14.5,4.5,0,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"High Heels and Low Lifes",2001,86,NA,6.1,981,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,1,1,0,0,0 -"High Hell",1958,87,NA,4.5,5,24.5,0,0,24.5,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"High Hopes",1988,112,NA,7.3,357,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"High Lonesome",1950,81,NA,6,10,0,0,0,14.5,24.5,24.5,34.5,24.5,0,0,"",0,0,0,0,0,0,0 -"High Lonesome: The Story of Bluegrass Music",1994,95,NA,6,35,4.5,0,0,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"High Noon",1952,85,750000,8.3,12465,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"High Note",1960,6,NA,8.6,40,0,0,0,4.5,0,4.5,24.5,4.5,34.5,34.5,"",0,1,1,0,0,0,1 -"High Plains Drifter",1973,105,NA,7.4,4189,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"High Pressure",1932,72,NA,6.4,30,0,0,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"High Rise",1973,66,NA,7.5,5,0,0,0,0,0,0,44.5,64.5,0,0,"",0,0,0,0,0,0,0 -"High Risk",1981,90,NA,5.3,176,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"High Road",1996,80,NA,7.4,7,0,0,14.5,0,14.5,14.5,0,0,24.5,24.5,"",0,0,1,1,0,0,0 -"High Road to China",1983,105,NA,5.5,909,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"High Rolling",1977,89,NA,5.3,8,0,0,0,24.5,0,34.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"High School",1940,74,NA,8.8,8,0,0,0,0,14.5,0,0,24.5,14.5,45.5,"",0,0,0,1,0,0,0 -"High School",1968,75,NA,7.3,176,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"High School Big Shot",1959,70,NA,1.7,91,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"High School Caesar",1960,75,NA,3.8,45,14.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"High School Confidential!",1958,85,NA,5.4,127,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"High School Ghosthustlers",2000,74,NA,3.3,13,34.5,0,14.5,24.5,14.5,4.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"High School Hellcats",1958,69,NA,5.4,35,4.5,0,14.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"High School High",1996,86,NA,4.9,2336,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"High School Memories",1980,94,NA,5.3,27,4.5,0,0,4.5,14.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"High School Record",2005,89,NA,5,17,14.5,14.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"High Seas Hijack",1978,95,NA,4.7,9,34.5,14.5,34.5,0,0,0,14.5,0,14.5,0,"",1,0,0,0,0,0,0 -"High Season",1987,90,NA,5.2,81,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"High Sierra",1941,100,455000,7.5,1640,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"High Society",1955,61,NA,6.5,54,0,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"High Society",1956,111,NA,6.9,1612,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"High Spirits",1988,99,NA,4.8,1153,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"High Stakes",1931,72,NA,4.4,5,0,0,24.5,24.5,24.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"High Stakes",1986,82,NA,4.9,34,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"High Stakes",1989,102,NA,3.9,69,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"High Steaks",1962,7,NA,2.7,25,34.5,24.5,4.5,0,4.5,14.5,0,0,4.5,14.5,"",0,1,1,0,0,0,1 -"High Street Love Story",2002,10,NA,7.6,7,0,0,0,0,0,0,24.5,44.5,24.5,0,"",0,0,1,0,0,0,1 -"High Strung",1991,93,300000,6.2,391,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"PG",0,0,1,0,0,0,0 -"High Tide",1987,101,NA,7.4,214,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"High Tide at Noon",1957,109,NA,5.4,18,0,0,0,14.5,44.5,4.5,24.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"High Time",1960,103,NA,5.1,75,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"High Times Potluck",2002,90,NA,3.5,77,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"High Tomb",1995,86,NA,6.5,7,0,24.5,44.5,0,14.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"High Treason",1951,90,NA,5.7,17,14.5,4.5,0,4.5,4.5,44.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"High Velocity",1976,105,NA,4.4,22,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,0,14.5,"",1,0,0,1,0,0,0 -"High Voltage",1929,63,NA,5.5,11,0,0,4.5,24.5,14.5,14.5,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"High Voltage",1997,95,NA,4.5,94,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"High Wall",1947,99,NA,7.2,116,0,4.5,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"High Wind in Jamaica, A",1965,106,NA,6.5,261,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"High Yellow",1965,83,NA,2.5,10,45.5,14.5,14.5,14.5,0,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"High and Dizzy",1920,26,NA,7.4,34,0,0,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"High and the Flighty, The",1956,7,NA,6.4,35,0,0,0,14.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"High and the Mighty, The",1954,147,NA,7.1,817,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"High, Wide, and Handsome",1937,110,1900000,7,24,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"High-Ballin'",1978,97,2000000,4.5,75,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Higher Ed",2001,83,NA,7.3,7,14.5,0,0,0,24.5,0,0,0,0,45.5,"",0,0,1,0,0,0,0 -"Higher Learning",1995,127,NA,6.2,3289,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Higher Than a Kite",1943,18,NA,6.9,46,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Higher and Higher",1944,90,NA,5.4,83,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Highest Bidder, The",2003,3,NA,7.3,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,1,0,0,0,1 -"Highest Honor",1982,143,NA,5.7,26,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Highlander",1986,116,16000000,7.1,18146,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Highlander II: The Quickening",1991,92,30000000,3.4,9264,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Highlander III: The Sorcerer",1994,102,26000000,3.7,3388,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Highlander, The",1911,18,NA,3.3,14,45.5,0,4.5,0,4.5,0,0,0,0,24.5,"",0,0,0,0,0,1,1 -"Highlander: Endgame",2000,101,15000000,4.4,3773,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Highly Dangerous",1950,90,NA,6.5,29,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Highway",1999,57,NA,6.6,20,0,0,0,14.5,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Highway 301",1950,83,NA,6.1,18,4.5,0,0,4.5,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Highway 395",2000,89,NA,4.6,14,4.5,4.5,4.5,0,0,4.5,24.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Highway 61",1991,102,NA,7,483,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Highway Dragnet",1954,72,NA,5.2,18,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Highway Runnery",1965,7,NA,4.7,14,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,0,0,"",0,1,1,0,0,0,1 -"Highway Society",2000,90,NA,5.5,56,4.5,4.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Highway of Heartache",1994,86,NA,4.8,13,14.5,0,0,0,0,0,14.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Highway to Hell",1990,90,NA,5.7,58,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Highway to Hell",1992,94,9000000,5.3,423,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Highwayman, The",1951,82,NA,6.4,18,0,0,0,4.5,24.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Highwayman, The",2000,94,NA,3.5,96,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Highwaymen",2003,80,NA,5.6,954,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Highways by Night",1942,65,NA,7.1,7,0,0,0,0,14.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Hihintayin kita sa langit",1991,120,NA,7.1,9,24.5,0,0,0,0,0,24.5,14.5,0,44.5,"",0,0,0,1,0,1,0 -"Hija del Puma, La",1994,101,NA,5.5,34,14.5,0,4.5,0,14.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hija del canibal, La",2003,110,NA,6.5,243,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Hijack",1999,94,NA,3.5,62,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Hijack Stories",2000,90,NA,6.7,65,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hijacking Catastrophe: 9/11, Fear & the Selling of American Empire",2004,68,NA,8.4,102,4.5,4.5,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Hijacking Hollywood",1997,91,NA,5.1,127,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hijazo de mi vidaza",1972,95,NA,6,5,0,0,0,0,24.5,0,64.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Hijo de la novia, El",2001,123,NA,7.7,1933,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"R",0,0,1,1,0,0,0 -"Hijo genial, Un",2003,90,1000000,1.6,7,45.5,14.5,0,14.5,0,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Hijos de Fierro, Los",1972,134,NA,6.7,10,0,0,0,0,14.5,24.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Hijosen no onna",1933,100,NA,7.2,28,0,0,0,4.5,0,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hikari no ame",2001,130,NA,7.4,5,0,0,0,0,24.5,0,24.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Hikarigoke",1992,118,NA,7,9,0,0,0,14.5,0,34.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Hikayatul jawahiri thalath",1995,112,NA,7.3,17,4.5,0,44.5,4.5,0,0,0,24.5,14.5,0,"",0,0,0,1,1,0,0 -"Hikikomori: Tokyo Plastic",2004,75,1150000,7,7,14.5,0,0,0,0,0,44.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hilary and Jackie",1998,121,NA,7.4,2745,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Hilda Crane",1956,87,NA,5.1,22,0,4.5,14.5,4.5,4.5,4.5,14.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Hilda Humphrey",1997,20,NA,6.9,16,0,0,0,14.5,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Hilde Warren und der Tod",1917,80,NA,8.3,6,0,0,0,45.5,0,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hildegarde",2001,85,NA,4.3,47,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG",0,0,0,0,0,0,0 -"Hilfe, die Verwandten kommen",1971,80,NA,2.6,11,45.5,24.5,0,4.5,4.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Hilfe, ich bin ein Junge",2002,95,NA,6.7,30,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Hilfe, ich liebe Zwillinge",1969,84,NA,2.7,22,24.5,14.5,14.5,24.5,14.5,0,0,0,4.5,0,"",0,0,1,0,0,0,0 -"Hilfe, mich liebt eine Jungfrau",1970,82,NA,3.2,13,14.5,14.5,4.5,0,14.5,24.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Hill Farm, The",1989,18,NA,7.3,12,14.5,0,0,0,0,4.5,4.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Hill in Korea, A",1956,80,NA,7,39,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Hill, The",1965,123,NA,7.6,1506,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Hill-billing and Cooing",1956,6,NA,6.6,12,0,0,0,4.5,4.5,14.5,4.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Hillbilly Chainsaw Massacre",1995,6,NA,2,10,44.5,14.5,14.5,14.5,0,0,0,0,0,34.5,"",0,0,1,0,0,0,1 -"Hillbilly Hare",1950,7,NA,7.8,112,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Hillbilly Honeys",1997,85,NA,3.8,10,34.5,0,0,0,34.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Hillbilly Robot",2001,23,NA,6.8,9,24.5,0,0,0,24.5,0,0,0,14.5,44.5,"",0,0,0,0,0,0,1 -"Hillbillys in a Haunted House",1967,88,NA,2.3,56,34.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Hills Have Eyes Part II, The",1985,86,1000000,3.2,303,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hills Have Eyes, The",1977,86,230000,6,1560,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hills of Home",1948,97,NA,6.4,60,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hills of Oklahoma",1950,67,NA,5.2,5,0,0,24.5,24.5,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Hills of Old Wyoming",1937,78,NA,7.6,18,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Hills of Utah, The",1951,70,NA,5.6,10,0,0,14.5,24.5,14.5,44.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Hillz, The",2004,91,100000,3.1,80,44.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Himala",1982,124,NA,9.9,26,4.5,0,0,0,0,0,0,0,4.5,84.5,"",0,0,0,1,0,0,0 -"Himalaya - l'enfance d'un chef",1999,108,NA,7.2,1363,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Himatsuri",1985,120,NA,6.6,59,4.5,0,4.5,14.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Himiko",1974,100,NA,6,5,0,0,0,24.5,0,64.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Himitsu no hanazono",1997,85,NA,7.4,86,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Himlaspelet",1942,106,NA,8.2,7,0,0,0,0,14.5,14.5,0,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Himmel auf Erden, Der",1935,90,NA,7.4,12,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Himmel kann warten, Der",2000,98,NA,7.3,47,0,4.5,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Himmel og helvede",1988,121,NA,4.8,8,0,0,0,34.5,0,14.5,14.5,24.5,0,14.5,"",0,0,0,1,0,1,0 -"Himmel og helvete",1969,94,NA,5,39,24.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Himmel ohne Sterne",1955,105,NA,6.7,23,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Himmel, Scheich und Wolkenbruch",1979,90,NA,2.2,6,34.5,14.5,14.5,34.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Himmelfall",2002,83,NA,7,280,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Himmler Projekt, Das",2001,182,NA,8.9,22,0,0,0,4.5,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Himmo Melech Yerushalaim",1987,84,NA,7.6,10,14.5,0,14.5,0,0,14.5,34.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hincha, El",1951,102,NA,8.2,5,0,0,0,0,0,24.5,24.5,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Hindenburg, The",1975,125,NA,5.8,644,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hindle Wakes",1931,70,NA,5.5,11,0,0,0,4.5,0,34.5,0,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Hindle Wakes",1952,82,NA,5,8,0,0,14.5,0,0,45.5,14.5,14.5,14.5,0,"",0,0,0,1,0,1,0 -"Hindsight",1996,92,NA,3.5,31,14.5,4.5,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Hindsight Is 20/20...",2004,5,NA,7.2,53,0,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Hindustan Ki Kasam",1999,146,NA,4.1,22,4.5,14.5,14.5,4.5,24.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Hinter Schloss und Riegel",1931,3,NA,6.3,7,0,14.5,0,0,14.5,14.5,14.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Hinter dem Regenbogen",1999,90,NA,4.7,33,14.5,14.5,4.5,14.5,14.5,4.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Hinter den sieben Gleisen",1959,103,NA,7.4,26,0,0,0,0,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Hinterholz 8",1998,90,NA,7.1,232,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hip Hip Hora!",2004,90,NA,5.7,479,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hip Hip-Hurry!",1958,6,NA,6.3,36,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hip Hop Homos",2004,26,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,1 -"Hip hip hurra!",1987,110,NA,5.8,58,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hip, Edgy, Sexy, Cool",2002,86,NA,8.4,8,0,0,0,0,14.5,14.5,0,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"HipHopBattle.com: Hip Hop 4 Life",2001,98,12000,5.7,15,24.5,14.5,0,4.5,0,0,4.5,14.5,0,34.5,"PG-13",0,0,1,1,0,1,0 -"Hipnos",2004,93,NA,5.2,53,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hipnosis",1963,90,NA,4.9,6,0,14.5,0,14.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Hipokuratesu-tachi",1980,126,NA,7.5,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,1,1,0,0,0 -"Hippety Hopper",1949,7,NA,6.6,19,0,4.5,0,0,24.5,4.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Hippie Highway",2004,4,NA,9.3,6,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,1,0,0,0,1 -"Hippocampe, L'",1934,15,NA,7.6,12,0,0,0,0,0,0,24.5,45.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Hippy Hippy Sex",1968,68,NA,1,6,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Hippy Porn",1991,97,NA,1,23,44.5,4.5,0,0,4.5,0,0,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Hips, Hips, Hooray!",1934,68,NA,7.1,46,0,0,4.5,4.5,14.5,14.5,4.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hire: Ambush, The",2001,9,NA,7.2,770,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",1,0,0,0,0,0,1 -"Hire: Beat the Devil, The",2002,11,NA,7.1,729,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,1,0,0,0,1 -"Hire: Chosen, The",2001,11,NA,7,782,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,0,0,0,1 -"Hire: Hostage, The",2002,11,NA,7.2,688,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",1,0,0,1,0,0,1 -"Hire: Powder Keg, The",2001,14,NA,7.6,777,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",1,0,0,0,0,0,1 -"Hire: Star, The",2001,10,NA,7.5,1260,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,1,0,0,0,1 -"Hire: The Follow, The",2001,11,NA,7.5,725,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,1,1 -"Hire: Ticker, The",2002,11,NA,7.6,655,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",1,0,1,0,0,0,1 -"Hired Gun, The",1957,63,NA,5.6,23,0,4.5,0,14.5,24.5,24.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Hired Hand, The",1971,90,NA,6.5,233,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Hired Wife",1940,95,NA,6.9,27,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Hired to Kill",1992,91,NA,3.7,55,4.5,4.5,24.5,24.5,14.5,4.5,0,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Hired!",1940,19,NA,2.1,70,44.5,24.5,14.5,4.5,4.5,0,0,0,0,4.5,"",0,0,0,0,0,0,1 -"Hireling, The",1973,95,NA,6.8,44,0,0,0,4.5,14.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hiroshima Nagasaki August, 1945",1970,16,NA,8.2,9,0,0,0,0,0,0,34.5,24.5,0,44.5,"",0,0,0,0,1,0,1 -"Hiroshima mon amour",1959,90,NA,7.7,1790,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Hirtenreise ins dritte Jahrtausend",2002,124,NA,6.7,16,4.5,0,0,14.5,14.5,14.5,14.5,14.5,24.5,0,"",0,0,0,0,1,0,0 -"His Bitter Half",1950,8,NA,7.1,17,0,0,0,4.5,4.5,4.5,45.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"His Bitter Pill",1916,20,NA,4.9,9,0,0,14.5,34.5,14.5,34.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"His Brother's Ghost",1945,58,NA,5,8,0,24.5,0,14.5,24.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"His Brother's Wife",1936,88,NA,5.2,30,0,0,0,14.5,24.5,34.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"His Butler's Sister",1943,87,NA,5.9,44,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"His Double Life",1933,63,NA,5.9,24,0,4.5,0,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"His Family Tree",1935,69,NA,4,6,0,34.5,0,0,0,45.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"His Favorite Pastime",1914,16,NA,5.3,39,14.5,4.5,4.5,4.5,24.5,4.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"His First Flame",1927,48,NA,5.8,6,0,0,14.5,0,14.5,14.5,14.5,34.5,0,0,"",0,0,1,0,0,0,0 -"His First Flame",1935,18,NA,5.8,11,0,0,0,0,4.5,84.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"His Girl Friday",1940,92,NA,8.2,6667,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"His Hare Raising Tale",1951,7,NA,7.2,39,0,4.5,0,4.5,4.5,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"His Highness Abdullah",1990,156,NA,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"His Kind of Woman",1951,120,NA,7.4,276,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"His Lordship",1932,77,NA,6.6,8,0,0,14.5,0,14.5,14.5,14.5,45.5,0,0,"",0,0,1,0,0,0,0 -"His Lordship",1936,73,NA,5.4,7,0,0,0,0,45.5,44.5,0,0,0,0,"",0,0,1,0,0,1,0 -"His Majesty O'Keefe",1954,91,1550000,5.7,132,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"His Marriage Wow",1925,21,NA,7.2,12,0,0,0,0,4.5,14.5,34.5,24.5,14.5,0,"",0,0,1,0,0,0,1 -"His Mouse Friday",1951,7,NA,5.5,16,0,0,14.5,14.5,14.5,34.5,14.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"His Musical Career",1914,16,NA,5.9,26,0,0,14.5,4.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"His New Job",1915,32,NA,6.5,128,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"His New Profession",1914,16,NA,6.1,47,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,0,"",0,0,1,0,0,0,1 -"His People",1925,93,93000,6.7,6,0,0,0,0,14.5,0,14.5,45.5,14.5,0,"",0,0,0,1,0,0,0 -"His Prehistoric Past",1914,10,NA,5.3,33,0,4.5,24.5,4.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,1 -"His Private Secretary",1933,60,NA,4,38,14.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"His Regeneration",1915,15,NA,5.5,61,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"His Royal Slyness",1920,27,NA,6.9,20,0,0,0,14.5,4.5,34.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"His Silent Racket",1933,20,NA,6.9,6,0,0,0,34.5,0,14.5,34.5,14.5,0,0,"",0,0,1,0,0,0,1 -"His Trust",1911,14,NA,5,45,4.5,4.5,14.5,14.5,4.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,1 -"His Trust Fulfilled",1911,17,NA,5.1,25,14.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"His Trysting Place",1914,32,NA,6.5,31,0,0,0,4.5,24.5,4.5,44.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"His Woman",1931,76,NA,5.1,13,4.5,0,4.5,14.5,4.5,24.5,34.5,0,0,0,"",0,0,0,1,0,1,0 -"His and Hers",1997,82,NA,4.6,39,14.5,0,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"His/Herstory",2003,20,33000,7.6,5,0,0,0,0,0,24.5,24.5,44.5,24.5,0,"",0,0,0,1,0,0,1 -"Hisao",1998,9,NA,5,15,4.5,14.5,14.5,0,44.5,0,14.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Hishu monogatari",1977,93,NA,6.5,15,0,0,0,4.5,4.5,24.5,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hiss and Make Up",1943,8,NA,6.8,17,0,4.5,0,0,0,24.5,34.5,24.5,4.5,0,"",0,1,1,0,0,0,1 -"Hissatsu 4: Urami harashimasu",1987,131,NA,6.4,8,0,0,0,0,14.5,14.5,14.5,45.5,14.5,0,"",0,0,0,0,0,0,0 -"Hissatsu!",1984,123,NA,5.2,12,0,4.5,0,14.5,4.5,24.5,14.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Histoire d'O",1975,97,NA,5.3,592,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"NC-17",0,0,0,1,0,0,0 -"Histoire d'O: Chapitre 2",1984,95,NA,3.6,51,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Histoire d'un crime",1901,5,NA,5.7,29,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Histoire d'un poisson rouge",1959,19,NA,7.2,8,0,0,0,0,0,14.5,24.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Histoire d'un secret",2003,95,NA,7.9,23,0,0,0,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Histoire de Marie et Julien",2003,150,NA,6.4,164,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Histoire de Pen",2002,112,NA,6.6,126,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Histoires d'hiver",1999,105,NA,6.3,60,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Histoires extraordinaires",1968,121,NA,6.4,476,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Historia Naturae, Suita",1967,9,NA,4.7,24,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Historia de I y O, La",1999,18,NA,4.8,14,0,0,4.5,14.5,14.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Historia de entonces, Una",2000,111,NA,7,190,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Historia de todos, La",2003,10,NA,7.3,6,0,0,0,0,0,14.5,0,14.5,0,64.5,"",0,1,0,0,0,0,1 -"Historia de un beso",2002,108,NA,5.8,67,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Historia de un gran amor",1942,155,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,0,1,0,1,0 -"Historia kina w Popielawach",1998,100,NA,7.2,31,0,0,4.5,0,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Historia oficial, La",1985,112,NA,7.7,672,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Historia sexual de O",1984,90,NA,4.7,8,24.5,14.5,0,14.5,0,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Historias clandestinas en La Habana",1997,89,NA,6.5,22,14.5,0,0,0,0,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Historias de la puta mili",1994,97,NA,3.6,36,14.5,4.5,24.5,4.5,14.5,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Historias de la radio",1955,95,NA,6.7,52,4.5,0,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Historias del Kronen",1995,95,NA,6.4,193,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Historie milosne",1997,87,NA,6.8,116,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Historien om Kim Skov",1981,58,NA,2.8,137,74.5,4.5,4.5,0,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"History Is Made at Night",1937,97,NA,7.1,154,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"History Is Made at Night",1999,95,NA,4.4,285,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"History Lessons",2000,66,NA,5.2,15,0,14.5,14.5,4.5,4.5,24.5,4.5,24.5,0,14.5,"",0,0,0,0,1,0,0 -"History of Mr. Polly, The",1949,95,NA,6.6,59,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"History of the Wonderful World, The",1993,52,NA,7.8,5,0,0,0,0,44.5,0,0,0,24.5,44.5,"",0,1,0,0,0,0,0 -"History of the World Episode 1: The Discovery of Language, The",1994,3,NA,7.5,6,0,0,0,0,14.5,14.5,0,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"History of the World in Three Minutes Flat",1980,4,NA,7.3,9,0,0,0,0,14.5,14.5,14.5,0,0,64.5,"",0,1,0,0,0,0,1 -"History of the World: Part I",1981,97,11000000,6.4,5640,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hit & Run",2000,45,NA,7.1,16,0,0,4.5,4.5,0,0,4.5,34.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Hit List",1989,87,1500000,5.1,56,4.5,0,14.5,24.5,14.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hit Man and the Investigator, The",2001,2,NA,6.5,12,4.5,0,0,4.5,4.5,14.5,44.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Hit Me",1996,125,NA,5.8,142,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Hit Parade of 1943",1943,67,NA,5.1,16,14.5,4.5,0,14.5,34.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Hit Parade of 1947",1947,90,NA,5.5,7,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Hit and Run",1957,87,NA,5,13,4.5,0,4.5,4.5,0,14.5,14.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Hit and Runway",1999,108,1200000,6.7,189,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Hit the Deck",1955,117,NA,6,70,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hit the Dutchman",1992,118,NA,4.6,33,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hit the Ice",1943,82,NA,6.2,138,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hit the Road",1941,61,NA,6.8,6,0,0,0,0,14.5,14.5,14.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Hit the Saddle",1937,57,NA,5,6,0,0,14.5,0,45.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Hit!",1973,134,NA,6,47,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Hit, The",1984,100,NA,6.8,587,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Hit-and-Run Driver",1935,20,NA,6.6,6,0,0,0,0,0,14.5,64.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Hitch",2004,12,NA,6.9,15,14.5,0,0,0,0,24.5,4.5,34.5,0,24.5,"PG-13",0,0,0,1,0,0,1 -"Hitch",2005,118,70000000,6.8,7554,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Hitch Hike to Hell",1977,84,NA,3.4,27,14.5,14.5,14.5,4.5,0,0,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Hitch in Time, A",1978,57,NA,6.7,7,0,0,0,0,14.5,14.5,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Hitch, The",2001,15,NA,5.4,13,0,0,0,14.5,4.5,4.5,0,4.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Hitch-Hiker, The",1953,71,NA,6.9,341,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Hitcher, The",1986,97,6000000,6.8,4420,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Hitchhike to Happiness",1945,74,NA,5.6,5,0,0,0,44.5,0,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Hitchhiker",2003,16,0,5.3,17,14.5,0,0,0,0,4.5,14.5,14.5,34.5,14.5,"",1,0,0,1,0,0,1 -"Hitchhiker's Guide to the Galaxy, The",2005,110,50000000,6.9,7644,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG",0,0,1,0,0,0,0 -"Hitchhikers, The",1971,92,NA,3.6,13,14.5,24.5,14.5,0,4.5,0,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Hitclown",2001,13,NA,5.7,13,0,0,4.5,0,24.5,24.5,0,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Hitler",1962,107,NA,5.3,28,4.5,14.5,4.5,14.5,14.5,24.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Hitler - Beast of Berlin",1939,87,NA,4.6,7,24.5,14.5,14.5,14.5,0,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Hitler - ein Film aus Deutschland",1978,407,NA,9,70,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Hitler - eine Karriere",1977,155,NA,7.9,43,4.5,0,0,0,0,4.5,14.5,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Hitler Gang, The",1944,101,NA,5.9,9,0,0,0,14.5,14.5,14.5,34.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Hitler Lives",1945,17,NA,7.1,26,14.5,4.5,4.5,0,14.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,1 -"Hitler Tapes, The",1994,55,NA,2.7,23,4.5,0,4.5,0,0,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hitler's Children",1943,82,75000,6.1,116,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hitler's Madman",1943,84,NA,6.5,57,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hitler--Dead or Alive",1942,70,NA,4.8,24,14.5,4.5,4.5,14.5,24.5,14.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Hitler: The Last Ten Days",1973,108,NA,5.9,164,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hitlerjunge Quex: Ein Film vom Opfergeist der deutschen Jugend",1933,87,NA,5.7,55,24.5,4.5,0,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Hitlers Hitparade",2003,76,NA,7.1,7,0,0,0,0,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Hitman's Run",1999,91,NA,4.2,177,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Hitman, The",2002,6,1000,6.6,5,24.5,0,0,0,0,24.5,0,44.5,0,24.5,"",0,0,0,0,0,0,1 -"Hito-kiri Yota: Kyoken San-kyodai",1972,86,NA,5.6,5,0,0,0,0,24.5,24.5,0,0,24.5,44.5,"",1,0,0,0,0,0,0 -"Hitokiri",1969,140,NA,6.3,23,0,0,0,4.5,4.5,4.5,4.5,14.5,34.5,34.5,"",1,0,0,1,0,0,0 -"Hitonatsu no taiken: aoi sangosho",1981,68,NA,5.2,28,0,4.5,14.5,14.5,14.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Hitori musuko",1936,87,NA,8.5,61,0,0,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Hitter, The",1979,90,NA,4,17,4.5,24.5,4.5,14.5,34.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Hittin' the Trail",1937,58,NA,5.3,5,0,0,0,0,24.5,24.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Hittin' the Trail to Hallelujah Land",1931,7,NA,5.8,8,0,0,14.5,14.5,14.5,34.5,0,24.5,0,0,"",0,1,1,0,0,0,1 -"Hitting a New High",1937,85,NA,4.8,26,4.5,14.5,0,24.5,4.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Hitting the Ground",1996,102,NA,5.6,17,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Hittites",2003,120,NA,6.1,42,4.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Hiuch HaGdi",1986,95,NA,6.4,6,0,0,14.5,0,0,0,34.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Hjemkomst",2004,5,NA,6.6,14,0,0,0,0,4.5,44.5,34.5,4.5,4.5,0,"",0,0,0,1,0,0,1 -"Hjerternes fest",2001,27,NA,6.1,8,14.5,14.5,0,0,0,0,34.5,24.5,14.5,0,"",0,0,1,1,0,1,1 -"Hk",2003,13,NA,8.3,7,0,0,0,0,0,14.5,24.5,14.5,0,44.5,"",1,0,0,0,0,0,1 -"Hkhagoroloi Bohu Door",1995,106,NA,5.4,7,0,0,0,14.5,0,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Hlemmur",2002,86,NA,8.6,5,0,0,0,0,0,0,0,44.5,64.5,0,"",0,0,0,0,1,0,0 -"Ho fatto splash",1980,95,NA,6.7,35,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ho vinto la lotteria di Capodanno",1989,92,NA,5.3,61,4.5,4.5,4.5,4.5,24.5,34.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ho yuk",2002,82,NA,7,14,4.5,4.5,0,4.5,14.5,4.5,24.5,4.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Ho!",1968,103,NA,6.1,41,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hoa-Binh",1970,93,NA,5.9,8,0,0,0,14.5,0,14.5,45.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Hoagy Carmichael",1939,10,NA,5.8,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Hoax Call",2000,1,NA,4.5,10,14.5,14.5,0,0,24.5,14.5,34.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Hoaxters, The",1953,36,NA,3.6,13,24.5,4.5,0,14.5,14.5,4.5,14.5,0,14.5,0,"",0,0,0,0,1,0,1 -"Hob el banat",2004,110,NA,6.9,15,4.5,14.5,0,4.5,0,0,24.5,24.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Hobgoblins",1987,92,NA,1.8,2014,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hobo Bobo",1947,7,NA,6.1,23,4.5,0,4.5,4.5,4.5,34.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Hobo Gadget Band",1939,7,NA,7.8,9,0,0,0,14.5,0,34.5,0,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Hobo, The",1917,15,NA,5,5,0,0,0,0,100,0,0,0,0,0,"",0,0,1,0,0,0,1 -"Hobson's Choice",1954,107,NA,7.6,585,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Hochbetrieb",2004,6,NA,7.4,13,0,0,0,0,24.5,0,4.5,34.5,24.5,4.5,"",1,0,1,0,0,0,1 -"Hochelaga",2000,130,NA,7,170,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hochmat HaBeygale",2002,101,NA,6.1,33,4.5,0,4.5,0,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hochzaeitsnuecht",1992,108,NA,7.1,12,14.5,4.5,4.5,0,14.5,4.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Hochzeit auf Immenhof",1956,94,NA,5.3,30,0,4.5,14.5,4.5,34.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hochzeitskuh, Die",1999,86,NA,5.9,30,4.5,0,4.5,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hochzeitsnacht-Report",1972,82,NA,1.7,13,14.5,34.5,14.5,4.5,0,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Hochzeitsreise, Die",1969,85,NA,3.9,12,14.5,4.5,4.5,4.5,45.5,0,0,0,4.5,0,"",0,0,1,0,0,0,0 -"Hock hiap leong",2001,7,NA,6.1,12,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,0,"",0,0,0,0,1,0,1 -"Hockey Champ, The",1939,7,NA,7.2,44,4.5,0,0,0,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hockey Homicide",1945,8,NA,7.7,51,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Hockeyfeber",1983,104,NA,5.3,16,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Hocus Pocus",1993,96,28000000,5.3,3256,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hodet over vannet",1993,97,NA,6.8,273,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hodja fra Pjort",1985,76,NA,5.2,34,14.5,0,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hoedown",1950,64,NA,6.4,15,0,4.5,4.5,4.5,34.5,4.5,0,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hoero! Tekken",1982,98,NA,7.3,14,4.5,0,0,4.5,4.5,24.5,24.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Hoffa",1992,140,NA,6.3,2481,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hoffman",1970,113,NA,6.5,147,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hofkonzert, Das",1936,85,NA,4.5,68,24.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Hofmann's Potion",2002,56,NA,7.4,6,0,0,0,0,14.5,0,45.5,14.5,14.5,0,"",0,0,0,0,1,0,0 -"Hofrat Geiger, Der",1947,83,NA,6.5,9,0,0,0,0,24.5,0,34.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hog Wild",1930,19,NA,8,143,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Hog Wild",1980,95,NA,4.6,53,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,0,45.5,"",0,0,1,0,0,0,0 -"Hoge hakken, echte liefde",1981,93,NA,5.6,77,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hoh bit yau ngoh",1985,91,NA,4.6,12,4.5,0,0,14.5,14.5,4.5,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Hoi Maya",2004,12,NA,7.5,5,0,0,0,0,24.5,0,0,44.5,0,44.5,"",0,0,0,0,0,0,1 -"Hoi Polloi",1935,19,NA,8,121,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Hokuriku dairi senso",1977,98,NA,7,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",1,0,1,1,0,0,0 -"Hokus Pokus",1949,16,NA,6.9,66,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Hokuspokus",1953,90,NA,7.1,29,0,0,0,4.5,14.5,4.5,4.5,34.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Hokuspokus oder: Wie lasse ich meinen Mann verschwinden...?",1966,100,NA,5.5,30,4.5,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hokuto no ken",1986,110,NA,6.4,683,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,1,0,0,0,0,0 -"Hol volt, hol nem volt",1987,97,NA,5,48,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Holcroft Covenant, The",1985,112,NA,5.3,343,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hold 'Em Jail",1932,66,NA,5.4,23,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hold Back Tomorrow",1955,75,NA,4.2,8,14.5,14.5,0,0,0,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Hold Back the Dawn",1941,115,NA,7.7,191,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Hold Back the Night",1956,80,NA,6.9,13,0,0,0,0,14.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hold Back the Night",1999,104,NA,5.7,54,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Hold Me While I'm Naked",1966,17,NA,6.7,52,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Hold Me, Thrill Me, Kiss Me",1993,92,NA,5,141,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hold On!",1966,85,NA,4.2,27,14.5,0,14.5,24.5,4.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Hold That Baby!",1949,64,NA,6.1,18,0,0,4.5,4.5,24.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Hold That Blonde",1945,76,NA,5.8,10,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Hold That Co-ed",1938,80,NA,5.9,17,4.5,0,0,4.5,14.5,34.5,4.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Hold That Ghost",1941,86,190000,7.1,402,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hold That Hypnotist",1957,61,NA,6.2,9,0,0,0,0,14.5,24.5,44.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Hold That Kiss",1938,79,NA,6.8,25,0,4.5,0,0,24.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hold That Line",1952,67,NA,7.7,21,0,0,0,0,0,0,24.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Hold That Lion",1947,17,NA,7.5,60,0,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Hold That Pose",1950,7,NA,6.5,38,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Hold Up",2004,9,NA,6.9,10,0,0,0,0,14.5,24.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Hold Up, The",1972,14,NA,1.8,8,24.5,14.5,14.5,0,0,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Hold Your Man",1933,87,260000,7,153,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Hold da helt ferie",1965,95,NA,5.1,12,4.5,24.5,4.5,4.5,14.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Hold the Lion, Please",1942,8,NA,7.2,39,0,0,0,4.5,4.5,4.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hold-Up",1985,114,NA,6.4,281,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hole Ahava B'Shikun Gimel",1995,94,NA,4.6,58,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Hole Idea, The",1955,7,NA,7.5,23,0,0,0,0,4.5,4.5,24.5,34.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Hole in One, A",2004,97,NA,6.7,31,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hole in the Head, A",1959,120,NA,5.9,332,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hole in the Wall, The",1929,73,NA,5.3,6,0,0,0,14.5,0,14.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Hole, The",1962,15,NA,8,14,0,0,0,0,0,24.5,4.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Hole, The",2001,102,NA,6.5,4927,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Holes",2003,117,30000000,7.2,5235,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"PG",0,0,1,1,0,0,0 -"Holes in Heaven",1998,53,NA,4.9,5,0,0,44.5,0,0,0,64.5,0,0,0,"",0,0,0,0,1,0,0 -"Holgi",2000,90,NA,6.7,22,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Holi",1984,120,NA,7.3,11,0,0,0,0,24.5,0,24.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Holiday",1930,98,NA,6.1,24,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Holiday",1938,95,NA,7.7,1550,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Holiday Affair",1949,87,NA,6.5,218,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Holiday Camp",1948,97,NA,5.7,27,0,0,4.5,4.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Holiday Greetings 1941",1941,2,NA,6.2,7,0,0,0,14.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Holiday Highlights",1940,7,NA,5.6,12,0,0,4.5,0,24.5,4.5,34.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Holiday Inn",1942,100,3200000,7.4,1252,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Holiday Romance",1998,19,NA,7.2,46,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Holiday for Drumsticks",1949,7,NA,7,26,0,4.5,0,0,4.5,14.5,44.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Holiday for Lovers",1959,103,NA,5.1,20,0,4.5,4.5,4.5,44.5,34.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Holiday for Shoestrings",1946,7,NA,6.7,17,0,0,0,0,14.5,34.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Holiday for Sinners",1952,72,NA,6.4,21,4.5,0,0,4.5,4.5,24.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Holiday in Havana",1949,73,NA,7.2,8,0,0,0,0,14.5,14.5,0,14.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Holiday in Mexico",1946,128,NA,6.3,60,4.5,0,14.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Holiday in Seoul",1997,98,NA,6.4,16,0,0,0,0,14.5,24.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Holiday in Storyland, A",1930,10,NA,5.8,5,24.5,0,24.5,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Holiday on the Buses",1973,85,NA,4.7,125,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Holiday on the Moon",1994,18,NA,4.9,12,4.5,0,4.5,0,44.5,4.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,1 -"Holidays on the River Yarra",1990,88,NA,3.1,20,24.5,4.5,14.5,24.5,14.5,0,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Holka nebo kluk",1939,100,NA,3.1,5,0,24.5,44.5,0,44.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Hollands licht",2003,94,NA,6.6,31,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Hollow Gate",1988,76,NA,2.2,35,64.5,24.5,0,4.5,0,0,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Hollow Man",2000,112,95000000,5.3,16168,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Hollow Point",1995,102,NA,5.3,402,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Hollow Reed",1996,104,NA,7.4,412,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Hollow Triumph",1948,83,NA,6.4,96,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Holly - Bolly",2004,12,NA,9.2,6,0,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,1,1,0,0,1 -"Holly and the Ivy, The",1952,80,NA,7.8,86,0,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Hollywood (and Vine)",1993,18,NA,8.3,9,0,0,0,0,24.5,0,14.5,0,44.5,24.5,"",0,0,0,1,0,0,1 -"Hollywood Babylon",1972,87,NA,4.9,11,0,0,14.5,0,14.5,24.5,4.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Hollywood Boulevard",1936,75,NA,6.4,8,0,14.5,0,14.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Hollywood Boulevard",1976,83,60000,4.9,116,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hollywood Buddha",2003,99,NA,4.7,30,24.5,0,4.5,14.5,4.5,14.5,0,4.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Hollywood Canine Canteen",1946,7,NA,6.1,15,0,0,0,0,44.5,14.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Hollywood Canteen",1944,124,NA,6.8,259,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Hollywood Cavalcade",1939,97,2000000,6.1,43,0,0,0,4.5,14.5,14.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Hollywood Chainsaw Hookers",1988,75,23000,4.1,241,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hollywood Cop",1988,101,NA,1.5,13,44.5,14.5,4.5,0,14.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Hollywood Daffy",1946,7,NA,7.2,35,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hollywood Dreams",1994,82,NA,2.2,55,34.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hollywood Dreams Take 2",1995,81,NA,1,10,64.5,14.5,0,0,24.5,0,14.5,0,0,0,"R",0,0,1,0,0,0,0 -"Hollywood Ending",2002,112,16000000,6.3,3673,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Hollywood Extra Girl",1935,11,NA,5.9,13,0,0,0,4.5,4.5,45.5,4.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Hollywood Goes to Town",1938,9,NA,5.8,16,4.5,14.5,0,14.5,0,14.5,14.5,4.5,0,14.5,"",0,0,0,0,1,0,1 -"Hollywood Handicap",1938,10,NA,4.9,11,4.5,0,14.5,0,4.5,34.5,14.5,0,4.5,0,"",0,0,1,0,0,0,1 -"Hollywood Handicap, The",1932,20,NA,2.8,15,34.5,14.5,4.5,4.5,0,14.5,4.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Hollywood Harry",1986,96,120000,4,13,4.5,0,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hollywood High",1976,81,NA,2.4,31,24.5,14.5,4.5,4.5,4.5,4.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Hollywood High Part 2",1981,86,NA,1.4,17,24.5,34.5,14.5,0,0,0,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Hollywood Hobbies",1939,10,NA,5.7,31,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,1,0,1 -"Hollywood Homicide",2003,116,75000000,5.2,5312,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Hollywood Hot Tubs",1984,103,NA,3.2,91,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hollywood Hot Tubs 2: Educating Crystal",1990,100,NA,2.5,38,14.5,14.5,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hollywood Hotel",1937,109,NA,5.4,53,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Hollywood Kid Eu Saeng-ae",1994,114,NA,5,32,4.5,0,0,0,14.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Hollywood Knights, The",1980,91,NA,5.5,1185,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Hollywood Mavericks",1990,90,NA,6.3,25,0,0,0,14.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Hollywood My Home Town",1965,54,NA,6.9,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Hollywood Newsreel",1934,9,NA,4.9,11,0,0,4.5,14.5,24.5,24.5,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Hollywood North",2003,89,7000000,5.7,114,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Hollywood Outtakes",1984,81,NA,8.5,43,0,4.5,4.5,0,0,4.5,24.5,24.5,24.5,24.5,"",0,0,1,0,1,0,0 -"Hollywood Palms",2001,86,NA,5.4,28,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Hollywood Party",1934,70,NA,6,96,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hollywood Party",1937,21,NA,5.8,9,0,0,14.5,14.5,24.5,34.5,0,24.5,0,0,"",0,0,1,0,0,0,1 -"Hollywood Rated 'R'",1997,53,NA,3.5,43,24.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Hollywood Revue of 1929, The",1929,116,NA,6.6,150,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hollywood Salome",1998,77,NA,7.7,7,0,14.5,0,0,0,0,0,45.5,0,24.5,"",0,0,0,0,0,0,0 -"Hollywood Shuffle",1987,78,100000,6.7,614,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hollywood Sign, The",2001,90,12000000,5.3,196,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Hollywood Stadium Mystery",1938,66,NA,6.4,7,0,0,0,24.5,0,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Hollywood Steps Out",1941,7,NA,6.7,63,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hollywood Story",1951,76,NA,7.1,14,0,0,0,0,4.5,14.5,24.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Hollywood Strangler Meets the Skid Row Slasher, The",1979,72,NA,2,45,44.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hollywood Ten, The",1950,15,NA,6.9,22,0,0,0,0,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Hollywood Uncensored",1987,75,NA,7.3,12,4.5,0,4.5,4.5,0,24.5,0,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Hollywood Vampyr",2002,90,NA,5.2,61,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,24.5,44.5,"R",0,0,0,1,0,0,0 -"Hollywood Vice Squad",1986,101,NA,4,58,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,14.5,"",1,0,1,1,0,0,0 -"Hollywood Victory Caravan",1945,20,NA,5.9,26,14.5,14.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Hollywood Without Make-Up",1950,50,NA,6.3,13,0,4.5,0,4.5,4.5,24.5,24.5,24.5,0,4.5,"",0,0,0,0,1,0,0 -"Hollywood Wonderland",1947,16,NA,4.9,12,0,14.5,4.5,4.5,14.5,24.5,14.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Hollywood You Never See, The",1934,11,NA,6.4,5,0,0,24.5,0,0,44.5,24.5,0,0,24.5,"",0,0,0,0,1,0,1 -"Hollywood Zap",1986,88,NA,2.6,30,34.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,0,14.5,"R",0,0,1,0,0,0,0 -"Hollywood on Trial",1976,105,NA,6,25,14.5,0,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Hollywood or Bust",1956,95,NA,6.2,283,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hollywood's Magical Island: Catalina",2003,52,NA,6.2,7,14.5,0,0,0,0,0,44.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Hollywood's New Blood",1988,77,NA,2,15,64.5,14.5,0,14.5,0,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Hollywood's World of Flesh",1963,72,14000,1.1,5,24.5,0,0,0,0,0,0,0,84.5,0,"",0,0,0,0,1,0,0 -"Hollywood.com",2001,87,NA,7.2,11,4.5,0,4.5,0,0,0,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hollywood: Style Center of the World",1940,11,NA,5.2,9,14.5,0,0,24.5,14.5,44.5,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Holmim, Ha-",1987,120,NA,4.8,15,0,14.5,4.5,0,4.5,24.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Holocaust 2000",1977,96,NA,4.2,112,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Holocaust parte seconda: i ricordi, i deliri, la vendetta",1980,76,NA,3.1,13,44.5,4.5,14.5,14.5,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Holocaust szemei, A",2000,56,NA,8.2,26,14.5,4.5,4.5,4.5,0,0,14.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Holocausto porno",1981,113,NA,3.6,84,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hologram Man",1995,101,NA,3.1,80,24.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Holt of the Secret Service",1941,278,NA,8.4,9,0,0,0,0,24.5,0,34.5,24.5,0,24.5,"",1,0,0,1,0,0,0 -"Holubice",1960,68,NA,7.5,22,0,0,0,0,0,14.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Holy Land, The",2001,102,NA,6.9,119,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Holy Lola",2004,128,NA,6.6,52,0,4.5,0,0,14.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Holy Man",1998,114,60000000,4.9,3497,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"Holy Matrimony",1943,87,NA,7.6,43,0,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Holy Matrimony",1994,93,NA,4.6,275,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Holy Mountain, The",1973,114,750000,7.6,598,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Holy Smoke",1999,115,NA,5.7,3555,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Holy Terror, A",1931,53,NA,5.7,25,14.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hom rong",2004,103,NA,8,47,4.5,0,0,4.5,0,4.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Homa vaftike kokkino, To",1964,130,NA,6.1,28,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Homage",1995,97,NA,5.4,59,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Homage to Chagall: The Colours of Love",1977,88,NA,8,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,0,1,0,0 -"Homard, Le",1995,4,NA,8.3,6,0,0,0,0,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Hombre",1967,111,NA,7.3,1174,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hombre Esponja, El",2002,19,NA,7.5,6,0,0,0,0,14.5,0,34.5,14.5,34.5,0,"",0,0,0,1,0,0,1 -"Hombre de la esquina rosada, El",1962,70,NA,9.2,6,0,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,0,1,0,0,0 -"Hombre de papel, El",1963,110,NA,5.6,17,0,0,4.5,4.5,14.5,0,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Hombre llamado Noon, Un",1973,98,NA,4.7,45,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hombre mirando al sudeste",1986,105,NA,7.7,472,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Hombre que se quiso matar, El",1942,80,NA,6.8,8,0,0,14.5,0,0,0,0,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Hombre que se quiso matar, El",1970,91,NA,6.5,5,0,0,0,0,0,64.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Hombre y el monstruo, El",1959,78,NA,6.6,11,0,0,0,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hombre y un colt, Un",1967,85,NA,4.8,8,0,0,14.5,14.5,14.5,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Hombres complicados",1997,87,NA,6.6,129,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hombres felices",2001,93,NA,5.3,62,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Hombres siempre mienten, Los",1995,100,NA,6.3,35,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Home",1998,11,NA,7.3,26,4.5,0,0,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Home Alone",1990,103,15000000,6.4,21670,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Home Alone 2: Lost in New York",1992,120,NA,5,12899,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Home Alone 3",1997,102,NA,3.6,3531,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Home Base",2002,9,NA,7.7,68,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Home Before Dark",1958,136,NA,5.8,51,0,0,4.5,4.5,4.5,14.5,4.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Home Before Dark",1997,110,NA,5.8,31,4.5,0,0,4.5,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Home Before Midnight",1979,111,NA,4.4,16,0,14.5,4.5,14.5,34.5,14.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Home Defense",1943,7,NA,6.3,47,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Home Early",1939,9,NA,6.8,6,0,0,0,0,14.5,0,34.5,45.5,0,0,"",0,0,1,0,0,0,1 -"Home Economics Story, The",1951,25,NA,2.3,36,45.5,14.5,4.5,4.5,0,4.5,4.5,0,4.5,4.5,"",0,0,0,0,1,0,1 -"Home Fries",1998,91,15000000,4.9,2374,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Home Improvements",1985,29,NA,9.7,7,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,0,0,0,0,1 -"Home Invaders",2001,100,NA,1.1,21,34.5,0,0,0,0,0,0,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Home Is Where the Hart Is",1987,94,NA,3,17,14.5,24.5,24.5,4.5,14.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Home Made Home",1951,7,NA,6.4,38,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Home Movie",2001,66,NA,7.2,216,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Home Movies",1940,8,NA,6.9,12,0,4.5,0,0,24.5,14.5,34.5,0,0,14.5,"",0,0,1,0,0,0,1 -"Home Movies",1979,90,400000,4.6,103,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Home Page",1999,102,NA,4.7,18,4.5,14.5,14.5,4.5,14.5,0,34.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Home Road Movies",2001,12,NA,7.2,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,1,0,1,0,0,1 -"Home Room",2002,133,NA,7.3,540,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Home Security",2003,9,NA,8,12,0,0,0,0,0,0,4.5,34.5,0,45.5,"",0,0,1,0,0,0,1 -"Home Stories",1990,6,NA,6,18,14.5,0,0,0,14.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Home Sweet Home",1973,91,NA,7.1,167,4.5,0,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Home Sweet Home",1981,85,NA,3.4,33,34.5,24.5,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Home Town Story",1951,61,NA,4.8,68,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Home alone da riber",2002,105,NA,3.3,6,14.5,0,0,0,34.5,0,0,0,0,45.5,"",0,0,1,1,0,0,0 -"Home at Seven",1952,85,NA,8.3,30,0,0,4.5,0,14.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Home at the End of the World, A",2004,96,6500000,6.5,1693,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Home for the Bullets, A",2005,90,NA,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",1,0,0,0,0,0,0 -"Home for the Holidays",1995,103,NA,6.2,2289,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Home from the Hill",1960,149,NA,7,329,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Home in Indiana",1944,103,NA,6.3,55,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Home in Oklahoma",1946,72,NA,6.7,19,0,0,0,0,4.5,34.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Home of Angels",1994,90,NA,3.1,7,14.5,44.5,0,0,14.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Home of Our Own, A",1993,104,12000000,6.5,398,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Home of Your Own, A",1964,45,NA,7.8,15,0,0,0,0,0,14.5,4.5,24.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Home of the Brave",1949,88,NA,7.5,136,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Home of the Brave",2004,75,NA,6.9,23,0,4.5,0,0,4.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Home of the Brave: A Film by Laurie Anderson",1986,90,NA,6.7,115,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Home on the Prairie",1939,58,NA,6.6,5,0,0,0,0,24.5,44.5,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Home on the Range",1935,54,NA,5.6,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Home on the Range",1946,55,NA,5.9,11,0,0,4.5,44.5,0,24.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Home on the Range",2004,76,110000000,5.4,1510,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,1,1,0,0,0,0 -"Home, Sweet Home",1914,55,NA,5.7,17,0,0,4.5,14.5,14.5,34.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Home, Sweet Homicide",1946,90,NA,5.9,44,0,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Home, Tweet Home",1950,7,NA,6.6,25,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Homebodies",1974,96,NA,6.5,56,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Homeboy",1988,115,NA,4.8,239,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Homecoming",1948,113,NA,6.1,83,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Homecoming, The",1973,111,NA,7.9,83,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Homegrown",1998,101,NA,5.7,1121,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Homeless Flea, The",1940,8,NA,6.2,9,0,0,0,0,34.5,34.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Homeless Hare",1950,7,NA,7.7,58,0,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Homeless in America",2004,30,500000,7.2,10,34.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,1,0,1 -"Homem Dos Papagaios, O",1953,95,NA,6,5,0,0,0,0,0,64.5,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Homem Nu, O",1968,118,NA,7.8,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Homem Nu, O",1997,78,NA,7.6,67,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Homem Que Comprou o Mundo, O",1968,90,NA,8.6,5,0,0,0,0,24.5,0,0,44.5,0,44.5,"",0,0,1,0,0,0,0 -"Homem Que Copiava, O",2003,124,NA,8.4,496,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"R",0,0,1,1,0,1,0 -"Homem da Capa Preta, O",1986,120,NA,7.9,25,0,0,0,4.5,4.5,4.5,14.5,44.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Homem da Casa, O",2003,5,NA,6.4,7,0,0,14.5,0,24.5,14.5,14.5,0,14.5,14.5,"",1,0,1,0,0,0,1 -"Homem do Ano, O",2003,113,NA,7.6,287,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Homem do Pau-Brasil, O",1982,106,NA,8.7,9,14.5,0,0,0,0,0,14.5,24.5,45.5,0,"",0,0,1,0,0,0,0 -"Homem do Sputnik, O",1959,98,NA,6.3,24,4.5,0,0,0,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Homem que Virou Suco, O",1981,97,NA,7.4,18,14.5,0,0,0,0,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Homenaje a la hora de la siesta",1962,85,NA,5.6,7,0,0,0,0,44.5,14.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Homens Que Sabiam Demais, Os",1996,64,NA,7.5,8,0,0,0,0,14.5,0,34.5,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Homer",1970,91,NA,5.4,8,0,0,0,24.5,0,14.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Homer & Eddie",1989,102,NA,4.3,265,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Homesdale",1971,50,NA,5.7,9,0,0,0,14.5,0,24.5,14.5,14.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Homesteader Droopy",1954,7,NA,8.1,39,0,0,4.5,0,4.5,14.5,4.5,24.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Homestretch, The",1947,99,NA,5,6,0,0,0,0,34.5,0,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hometown Legend",2002,108,2000000,4.6,186,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Hometown USA",1979,93,NA,3.9,22,14.5,4.5,4.5,14.5,4.5,4.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Homeward Bound II: Lost in San Francisco",1996,89,NA,5.2,879,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Homeward Bound: The Incredible Journey",1993,84,NA,6.3,2190,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Homework",1982,90,NA,2.6,72,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Homicidal",1961,87,NA,6.6,203,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Homicide",1949,77,NA,5.7,23,0,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Homicide",1991,102,NA,6.8,842,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Homicide for Three",1948,60,NA,4.4,7,0,0,14.5,14.5,44.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Homme atlantique, L'",1981,45,NA,4.7,6,14.5,0,0,0,0,0,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Homme aux bras ballants, L'",1997,3,NA,7,13,0,0,0,4.5,4.5,24.5,4.5,44.5,0,4.5,"",0,1,0,0,0,0,1 -"Homme aux yeux d'argent, L'",1985,97,NA,6.3,11,4.5,0,0,4.5,4.5,14.5,44.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Homme de Rio, L'",1964,112,NA,6.9,491,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,24.5,"",1,0,1,0,0,1,0 -"Homme de ma vie, L'",1992,103,NA,5.4,37,4.5,0,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Homme de ma vie, L'",1999,90,NA,5.3,6,0,14.5,0,14.5,34.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Homme de nulle part, L'",1937,83,NA,6.7,8,0,0,0,0,24.5,0,24.5,14.5,34.5,0,"",0,0,0,1,0,0,0 -"Homme des foules, L'",2001,90,NA,7.5,32,0,0,4.5,4.5,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Homme du train, L'",2002,90,NA,7.4,1614,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Homme est une femme comme les autres, L'",1998,100,NA,6.7,203,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Homme orchestre, L'",1970,85,NA,5.6,129,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Homme qui a perdu son ombre, L'",1991,102,NA,5.1,17,4.5,0,4.5,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Homme qui aimait les femmes, L'",1977,120,NA,7.3,643,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Homme qui marche",1999,4,NA,7,5,0,0,0,0,44.5,0,0,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Homme qui ment, L'",1968,95,NA,7.4,20,0,0,4.5,0,0,4.5,14.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Homme qui plantait des arbres, L'",1987,30,NA,9,312,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,1,0,1,0,0,1 -"Homme sans ombre, L'",2004,9,NA,7.8,24,4.5,4.5,4.5,0,0,4.5,4.5,4.5,44.5,24.5,"",0,1,0,1,0,0,1 -"Homme sur les quais, L'",1993,106,NA,6,18,0,0,0,4.5,14.5,0,44.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hommes de joie pour femmes vicieuses",1974,70,NA,4.3,7,14.5,14.5,14.5,0,24.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Hommes du port, Les",1995,64,NA,7.3,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Hommes, femmes, mode d'emploi",1996,122,NA,5.9,216,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Homo Eroticus",1971,92,NA,4.6,12,0,4.5,4.5,4.5,44.5,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Homo Faber",1991,117,NA,6.9,543,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Homo Heights",1998,92,NA,3.8,36,24.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Homo Promo",1993,62,NA,3.8,9,24.5,24.5,0,0,14.5,14.5,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Homo Sapiens 1900",1998,88,NA,8,20,4.5,4.5,4.5,4.5,0,24.5,14.5,14.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Homo Videocus",1990,20,NA,2.2,10,24.5,0,0,0,14.5,14.5,0,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Hon",2002,55,NA,2.3,14,24.5,24.5,4.5,4.5,0,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Hon Kon daiyasokai: Tatchi & Magi",1997,112,NA,4.5,5,0,0,0,44.5,24.5,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Hon dansade en sommar",1951,103,NA,7.5,83,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Honarpisheh",1993,88,NA,6.7,41,4.5,4.5,4.5,0,0,4.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Hondo",1953,83,NA,7,562,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Honest",2000,110,NA,4.1,243,24.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Honey",2003,94,17000000,3.9,3067,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Honey Baby",2003,105,NA,6.6,27,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Honey Harvester",1949,7,NA,6.3,19,0,0,0,14.5,0,44.5,4.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Honey I Blew Up the Kid",1992,89,NA,4.2,3172,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Honey Pot, The",1967,132,6000000,7.2,217,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Honey Throat",1980,75,NA,6.4,8,0,0,0,0,24.5,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,1,0 -"Honey's Money",1962,6,NA,6.6,19,0,0,0,14.5,4.5,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Honey, I Shrunk the Audience",1995,23,NA,7.4,347,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Honey, I Shrunk the Kids",1989,101,NA,5.9,9038,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Honey-Mousers, The",1956,7,NA,6.7,23,4.5,0,0,4.5,4.5,24.5,14.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Honeybaby, Honeybaby",1974,89,NA,4.3,5,24.5,0,44.5,24.5,24.5,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Honeybee",2001,90,NA,1.9,26,74.5,0,0,4.5,0,0,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Honeychile",1951,89,NA,7.1,5,24.5,0,0,0,24.5,24.5,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Honeyland",1935,10,NA,5.9,6,0,0,0,0,14.5,14.5,34.5,0,0,34.5,"",0,1,0,0,0,0,1 -"Honeymoon",1947,74,NA,6,26,0,0,4.5,14.5,4.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Honeymoon",1969,61,NA,6.3,7,0,0,14.5,0,14.5,14.5,24.5,14.5,14.5,0,"",0,0,0,0,1,0,0 -"Honeymoon",1997,93,NA,5.2,11,0,0,0,0,34.5,4.5,4.5,0,24.5,14.5,"",0,0,1,1,0,1,0 -"Honeymoon Horror",1982,88,50000,2.1,21,44.5,4.5,0,4.5,4.5,4.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Honeymoon Hotel",1964,89,NA,5.6,28,0,4.5,4.5,14.5,24.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Honeymoon Killers, The",1970,115,NA,6.7,318,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Honeymoon Machine, The",1961,87,NA,5.7,151,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Honeymoon for Three",1941,75,NA,6.1,30,0,0,0,4.5,24.5,24.5,24.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Honeymoon in Bali",1939,95,NA,6.6,33,4.5,4.5,0,0,14.5,24.5,14.5,4.5,24.5,4.5,"",0,0,1,0,0,1,0 -"Honeymoon in Vegas",1992,96,NA,5.9,3795,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Honeymooners, The",2003,89,NA,4.7,35,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Honeypie",1976,84,NA,5.7,9,0,0,0,0,14.5,24.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Honeysuckle Rose",1980,119,NA,5.9,211,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Honeytrap, The",2002,90,NA,6.7,34,0,0,0,4.5,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Hong Kong",1952,94,NA,3.8,37,24.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Hong Kong 97",1994,91,NA,3.8,133,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hong Kong Confidential",1958,67,NA,5.5,9,0,0,14.5,14.5,24.5,14.5,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Hong Kong: 'The Hub of the Orient'",1937,8,NA,5.5,10,0,0,0,24.5,24.5,34.5,14.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"Hong Xiguan zhi Shaolin wu zu",1994,95,NA,6,686,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hong deng qu",1996,91,NA,5.1,27,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hong faan kui",1996,91,7500000,6.5,4644,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Hong fen",1994,115,NA,6.3,45,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hong fen zhi zun",1991,100,NA,4.8,11,0,4.5,0,0,24.5,14.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Hong gao liang",1987,91,NA,7.4,902,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Hong he gu",1999,115,NA,6.8,34,4.5,4.5,4.5,4.5,0,4.5,44.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Hong kil dong",1986,108,NA,7.3,25,0,4.5,0,4.5,0,14.5,4.5,14.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Hong meigui, bai meigui",1994,110,NA,6.2,40,4.5,0,4.5,0,4.5,24.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hong se lian ren",1998,98,NA,6.3,35,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Hong se niang zi jun",1970,105,NA,6.9,7,0,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hong shih zi",1996,168,NA,8,7,0,0,0,0,14.5,14.5,14.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Hong ying tao",1995,120,NA,8,142,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Hong-Kong (HKG)",1999,13,NA,5.7,11,14.5,0,0,4.5,0,0,24.5,4.5,24.5,4.5,"",0,0,0,0,1,0,1 -"Hongos",1999,22,NA,5.4,27,14.5,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Honigmond",1996,92,NA,4.9,21,14.5,14.5,24.5,14.5,4.5,0,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Honkers, The",1972,102,NA,5.5,46,4.5,4.5,0,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Honky",1971,92,NA,4.4,20,14.5,4.5,14.5,4.5,14.5,14.5,0,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Honky Tonk",1941,105,NA,6.4,127,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Honky Tonk Freeway",1981,107,24000000,4.5,206,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Honkytonk Man",1982,122,NA,6.1,784,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Honneponnetje",1988,95,NA,4.5,86,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Honneur de la tribu, L'",1993,90,NA,3.2,8,0,0,14.5,14.5,0,0,0,0,24.5,45.5,"",0,0,1,0,0,0,0 -"Honneurs de la guerre, Les",1960,85,NA,6.6,14,0,0,4.5,0,4.5,24.5,4.5,44.5,4.5,0,"",0,0,0,1,0,0,0 -"Honnou",1966,97,NA,4,6,0,0,14.5,34.5,14.5,0,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Honogurai mizu no soko kara",2002,101,NA,7.1,3001,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Honolulu",1939,83,NA,6.5,59,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Honolulu",2001,84,NA,7,49,14.5,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,1,1,0,1,0 -"Honor Among Lovers",1931,75,NA,6.2,16,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Honor Bound",1988,98,NA,5.5,11,14.5,0,0,4.5,24.5,14.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Honorable Stanislas, agent secret, L'",1963,91,NA,3.9,6,45.5,14.5,0,0,0,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Honorable, The",2002,88,50000,6.8,30,24.5,4.5,0,0,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Honorary Consul, The",1983,104,NA,5,218,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Honourable Wally Norman, The",2003,88,NA,5.2,78,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hood",2001,29,NA,7.2,8,0,24.5,0,0,0,24.5,0,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Hoodlum",1997,130,NA,5.7,1803,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Hoodlum & Son",2003,92,NA,5,27,4.5,0,4.5,4.5,14.5,24.5,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Hoodlum Empire",1952,88,NA,5.7,19,0,0,0,24.5,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Hoodlum Priest",1961,101,NA,6.9,43,4.5,0,0,0,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Hoodlum Saint, The",1946,91,NA,5.5,44,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hoodlum, The",1919,78,NA,7.8,10,0,0,0,0,0,14.5,14.5,74.5,14.5,0,"",0,0,1,0,0,0,0 -"Hoodlum, The",1951,61,NA,6.4,15,0,0,0,0,24.5,24.5,14.5,24.5,24.5,0,"PG",0,0,0,1,0,0,0 -"Hoods",1998,90,NA,4.9,69,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Hoodwink",1981,89,NA,6.3,8,0,0,0,34.5,0,14.5,14.5,24.5,14.5,0,"",0,0,0,0,0,1,0 -"Hoofs and Goofs",1957,16,NA,4.2,45,24.5,14.5,24.5,4.5,24.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,1 -"Hoogste tijd",1995,120,NA,6.7,44,4.5,0,0,4.5,4.5,4.5,34.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Hook",1991,144,70000000,5.8,19368,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hook & Ladder Hokum",1933,6,NA,5.4,14,0,0,0,4.5,34.5,24.5,4.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hook, Line & Sinker",1969,91,NA,4.2,94,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hook, Line and Sinker",1930,75,NA,6.5,29,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Hook, Line and Stinker",1958,6,NA,6.8,35,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Hook, Lion and Sinker",1950,7,NA,6.5,19,0,0,0,0,14.5,14.5,44.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Hook, The",1963,98,NA,6.4,91,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hooked",2003,62,NA,5.1,15,4.5,0,0,14.5,0,14.5,24.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Hooked Bear",1956,6,NA,7.5,24,0,0,0,0,4.5,14.5,24.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Hooked Generation, The",1968,92,NA,2.8,18,24.5,24.5,14.5,4.5,24.5,4.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Hookers on Davie",1984,88,NA,7.8,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Hoop Dreams",1994,170,700000,7.9,4668,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Hoop-La",1933,85,NA,6.8,25,0,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Hooper",1978,97,NA,5.9,804,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hooray for Love",1935,72,NA,5.7,21,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hoose-Gow, The",1929,18,NA,7.3,97,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Hoosier Schoolboy",1937,62,NA,5.9,15,0,0,14.5,24.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hoosiers",1986,115,NA,7.5,6350,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hootenanny Hoot",1963,91,NA,4,24,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Hoover",2000,93,NA,3.4,21,24.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Hoover Street Revival",2002,104,NA,7.2,14,4.5,0,0,4.5,0,24.5,24.5,24.5,4.5,4.5,"PG-13",0,0,0,0,1,0,0 -"Hop - a je tu lidoop",1977,87,NA,3.6,13,14.5,4.5,0,24.5,14.5,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Hop and Go",1943,7,NA,7.2,5,0,0,0,0,24.5,24.5,0,0,0,64.5,"",0,1,1,0,0,0,1 -"Hop to It!",1925,19,NA,4.7,17,0,0,0,24.5,34.5,14.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Hop, Look and Listen",1948,7,NA,6.6,23,0,0,0,4.5,14.5,24.5,34.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Hop, Skip & Jump",1999,16,NA,5.8,31,4.5,0,0,14.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Hop, Skip and a Chump",1942,7,NA,6,11,0,0,0,0,34.5,24.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Hop-Along Cassidy",1935,60,85000,7.5,40,0,0,4.5,0,4.5,4.5,24.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Hopalong Cassidy Returns",1936,74,NA,7.5,27,0,0,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Hopalong Casualty",1960,6,NA,6.9,38,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Hopalong Rides Again",1937,65,NA,7.2,20,0,0,0,0,14.5,24.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Hope Floats",1998,114,30000000,5.3,4382,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Hope Springs",2003,92,NA,5,799,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Hope and Glory",1987,113,NA,7.4,2245,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Hope and Play",2004,101,10500,6.4,7,24.5,0,0,0,0,0,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Hopeaa rajan takaa",1963,66,NA,8.3,29,0,0,0,0,4.5,4.5,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Hopeless",2000,80,NA,7.1,10,24.5,0,0,0,0,0,24.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Hopnick",1990,60,NA,4.3,18,0,4.5,0,44.5,4.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Hoppity Goes to Town",1941,78,NA,6.5,97,0,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,1,1,0,0,0,0 -"Hoppity Pop",1946,3,NA,6.9,7,0,0,0,0,14.5,0,45.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Hoppy Daze",1961,6,NA,6.4,17,0,0,0,14.5,0,24.5,34.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Hoppy Serves a Writ",1943,67,NA,5.9,35,4.5,4.5,0,0,24.5,24.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Hoppy's Holiday",1947,60,NA,7.2,21,0,0,0,4.5,4.5,24.5,0,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Hoppy-Go-Lucky",1952,7,NA,5.6,15,14.5,0,0,0,24.5,0,44.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Hopscotch",1980,104,NA,7,1083,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hopscotch",2004,7,1000,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,1,0,0,1 -"Hor B'Levana",1964,90,NA,6.2,13,0,4.5,0,0,4.5,0,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Hora Marcada, A",2000,100,NA,6.7,30,4.5,0,0,0,14.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Hora bruja, La",1985,105,NA,6.7,18,0,0,0,4.5,0,4.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hora da Estrela, A",1985,96,NA,8.2,117,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Hora de los valientes, La",1998,115,NA,6.8,61,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Hora e a Vez de Augusto Matraga, A",1965,109,NA,6.6,16,14.5,0,0,0,0,4.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Horizon",1993,5,NA,5.2,6,14.5,0,14.5,0,0,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Horizons West",1952,81,NA,6,52,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Horizontal Lieutenant, The",1962,90,NA,5.4,49,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Horloger de Saint-Paul, L'",1974,105,NA,7,184,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hormoner og andre demoner",2001,26,NA,6.2,9,0,0,0,0,14.5,14.5,14.5,24.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Hormoon",2004,35,NA,8.4,64,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,1,0,0,0,1 -"Horn Blows at Midnight, The",1945,78,NA,7.1,207,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hornet's Nest, The",1955,64,NA,5,14,0,0,0,14.5,34.5,24.5,24.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Hornets' Nest",1970,110,NA,5.2,72,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Horns and Halos",2002,79,NA,7.4,121,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Horny Vampire, The",1971,45,NA,1.7,10,44.5,14.5,0,0,14.5,14.5,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Horoki",1962,124,NA,8.8,15,0,0,0,0,0,0,0,24.5,44.5,34.5,"",0,0,0,1,0,0,0 -"Horoscope",1991,5,NA,5.5,21,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Horoskop",1969,87,NA,4.8,7,0,14.5,0,0,0,24.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Horrible Dr. Bones, The",2000,72,NA,2.2,64,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Horrible Livingroom Robot, The",2000,3,NA,8.2,10,24.5,0,0,0,0,0,0,0,0,84.5,"",1,0,0,0,0,0,1 -"Horripilante bestia humana, La",1968,83,NA,4.5,63,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Horror",2000,2,NA,6.1,13,4.5,0,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Horror 101",2000,84,NA,4,88,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Horror Express",1973,84,NA,6.1,673,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Horror Heaven",1984,22,NA,3.7,19,24.5,0,4.5,34.5,14.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Horror Hospital",1973,85,NA,4.5,129,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Horror Island",1941,60,NA,5.1,12,0,0,0,0,44.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Horror Show, The",1989,95,NA,3.5,303,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Horror Story",1972,84,NA,2.5,7,45.5,0,0,0,0,14.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Horror Story",1997,74,NA,4.8,7,0,0,24.5,14.5,0,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Horror of Frankenstein, The",1970,95,NA,4.7,192,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Horror of It All, The",1963,75,NA,3.4,21,14.5,4.5,0,14.5,34.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Horror of Party Beach, The",1964,78,120000,2.2,418,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Horror of the Blood Monsters",1970,85,NA,2.1,76,45.5,14.5,14.5,4.5,4.5,0,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Horrors of the Black Museum",1959,95,NA,6,119,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hors jeu",1998,91,NA,4.7,23,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Hors la vie",1991,97,NA,7.1,35,0,0,0,4.5,0,14.5,24.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hors-la-loi",1985,107,NA,5.7,15,4.5,0,0,4.5,24.5,14.5,14.5,34.5,0,0,"",1,0,0,1,0,0,0 -"Horse Feathers",1932,68,NA,7.7,2029,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Horse Hare",1960,7,NA,6.9,15,0,0,0,0,0,24.5,44.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Horse Soldiers, The",1959,119,NA,6.9,1016,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Horse Whisperer, The",1998,170,60000000,6.4,6744,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Horse in the Gray Flannel Suit, The",1968,113,NA,5,116,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Horse with the Flying Tail, The",1960,48,NA,6.4,18,0,0,0,0,14.5,14.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Horse's Mouth, The",1958,97,NA,7,388,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Horse, La",1970,90,NA,6.7,42,0,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Horsefly Fleas, A",1948,7,NA,7,18,0,0,0,0,4.5,24.5,44.5,14.5,14.5,0,"",0,1,1,0,0,0,1 -"Horseless Prince, The",2003,10,NA,4.5,23,14.5,0,0,0,0,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Horsemen, The",1971,109,6000000,5.7,86,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Horseplay",2003,93,NA,3.9,36,24.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Horseplayer",1990,89,NA,4.4,28,0,4.5,14.5,14.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Horses on Mars",2001,8,NA,5.7,51,4.5,4.5,0,0,4.5,4.5,14.5,4.5,4.5,45.5,"",0,1,1,0,0,0,1 -"Horses' Collars",1935,17,NA,7.5,71,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Horseshoe",1998,10,NA,5.1,14,14.5,0,0,0,0,0,34.5,34.5,14.5,0,"",0,0,0,1,0,0,1 -"Horsey",1997,89,NA,2.3,26,34.5,4.5,4.5,4.5,4.5,0,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Horsie's Retreat",2005,76,NA,5.2,6,0,14.5,34.5,0,0,34.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Horsing Around",1957,16,NA,3.7,29,24.5,24.5,14.5,14.5,4.5,4.5,14.5,0,0,4.5,"",0,0,1,0,0,0,1 -"Horton Hatches the Egg",1942,10,NA,8.1,58,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Horvatov izbor",1985,114,NA,8.8,8,0,0,0,0,0,0,0,45.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Hoshi no koe",2003,25,NA,7.9,254,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,0,0,0,1,1 -"Hoshi tsugu mono",1990,105,NA,8.7,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Hospital Fragment",1999,3,NA,6,37,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Hospital Massacre",1983,89,NA,2.9,61,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hospital, The",1971,103,NA,7,644,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Hospitaliky",1937,5,NA,7.1,9,0,0,0,14.5,0,14.5,24.5,34.5,24.5,0,"",0,1,1,0,0,0,1 -"Hospitality",1999,20,NA,6.1,22,0,0,0,0,14.5,4.5,4.5,4.5,4.5,45.5,"",0,0,1,1,0,0,1 -"Host, The",1960,30,NA,4,11,14.5,0,14.5,0,4.5,4.5,14.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Host, The",2001,25,NA,4.9,8,0,0,14.5,0,0,0,14.5,14.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Hostage",1983,93,NA,3.8,22,0,14.5,24.5,4.5,14.5,0,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Hostage",1993,98,NA,4.8,70,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hostage",1999,91,NA,5.3,15,14.5,0,0,24.5,4.5,4.5,14.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Hostage",2005,113,52000000,6.6,3709,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hostage Negotiator, The",2001,87,NA,5.1,42,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Hostage, The",1998,90,NA,6.8,10,0,14.5,0,14.5,0,24.5,24.5,24.5,0,24.5,"",1,0,0,0,0,0,0 -"Hostages",1943,88,NA,6.4,7,14.5,0,0,0,14.5,14.5,0,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hostile Environment",1998,85,NA,2.6,24,14.5,14.5,14.5,14.5,0,4.5,0,4.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Hostile Guns",1967,91,NA,5,19,0,4.5,0,14.5,24.5,24.5,24.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Hostile Intent",1997,90,NA,4.3,144,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Hostile Intentions",1994,90,NA,4.5,61,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hostile Takeover",1997,92,NA,4.6,11,0,34.5,0,0,14.5,4.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Hostile Witness",1968,101,NA,5.8,11,0,0,0,4.5,14.5,34.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Hot Air Salesman, The",1937,6,NA,6.2,6,0,0,0,34.5,0,34.5,14.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Hot Blood",1956,85,NA,4.9,31,0,0,4.5,4.5,34.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hot Box, The",1972,85,NA,3.3,34,24.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hot Boyz",1999,92,NA,3.5,207,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Hot Car Girl",1958,71,NA,2.6,11,44.5,4.5,4.5,0,4.5,0,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Hot Cars",1956,60,NA,6.4,10,0,0,0,14.5,14.5,24.5,14.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Hot Chick, The",2002,100,NA,5.6,5753,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Hot Child in the City",1979,64,NA,5.6,5,24.5,0,0,0,44.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Hot Child in the City",1987,85,NA,1.8,144,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hot Chili",1985,86,NA,3.7,62,24.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hot Chocolate",1992,93,NA,2.6,42,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hot Club California",1999,89,NA,3.1,32,14.5,24.5,4.5,24.5,0,4.5,4.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"Hot Cross Bunny",1948,7,NA,7.3,61,0,0,4.5,0,0,14.5,34.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Hot Dallas Nights",1981,83,NA,5.8,8,0,0,14.5,0,14.5,14.5,0,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Hot Dog",2000,9,NA,7.4,16,0,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Hot Dog... The Movie",1984,96,NA,3.5,457,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hot Dogs: Wau - wir sind reich!",1999,84,NA,3.1,30,24.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,0,14.5,"",0,1,0,0,0,0,0 -"Hot Enough for June",1964,98,NA,6,67,0,0,4.5,4.5,24.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hot Gun",1986,79,NA,4.9,10,24.5,0,14.5,0,14.5,24.5,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Hot Heiress, The",1931,79,NA,6.3,33,0,0,0,14.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Hot Ice",1955,16,NA,6.3,36,14.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Hot Ice",1978,94,NA,2.1,16,34.5,14.5,14.5,14.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Hot Java",2004,12,15000,9.1,19,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Hot Lead",1951,60,NA,5.9,7,0,0,0,0,24.5,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Hot Millions",1968,106,NA,7.1,270,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hot Moves",1985,85,NA,4.5,66,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hot News Margie",1931,7,NA,4.3,8,0,0,14.5,45.5,0,0,24.5,0,0,14.5,"",0,0,1,0,0,0,1 -"Hot Nights on the Campus",1966,67,NA,2.7,6,34.5,0,0,0,14.5,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Hot Noon or 12 O'Clock for Sure",1953,6,NA,6.6,7,0,0,24.5,14.5,0,14.5,0,14.5,24.5,0,"",0,1,1,0,0,0,1 -"Hot Pepper",1973,54,NA,6,6,14.5,0,0,0,0,64.5,14.5,0,0,0,"",0,0,0,0,1,0,0 -"Hot Potato",1976,87,NA,4.3,33,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Hot Pursuit",1983,90,NA,5.4,5,0,0,0,0,24.5,0,44.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Hot Pursuit",1987,93,NA,5,493,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hot Rackets",1979,78,NA,6,17,14.5,0,4.5,0,0,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Hot Rhythm",1944,79,NA,6.1,8,0,0,14.5,14.5,24.5,0,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Hot Rock, The",1972,100,NA,6.7,713,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hot Rod",1950,61,NA,7.7,9,0,0,0,14.5,0,0,24.5,0,34.5,34.5,"",1,0,0,1,0,0,0 -"Hot Rod Gang",1958,71,NA,5.2,26,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Hot Rod Girl",1956,71,NA,4.5,39,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Hot Rod Rumble",1957,79,NA,6.4,6,0,0,14.5,0,14.5,0,34.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Hot Rods to Hell",1967,100,NA,3.8,109,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Hot Sands",1931,10,NA,3.6,11,14.5,14.5,14.5,0,24.5,4.5,4.5,0,0,0,"",0,0,1,0,0,0,1 -"Hot Saturday",1932,73,NA,5.7,16,4.5,0,0,14.5,4.5,34.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Hot Scots, The",1948,17,NA,8.1,48,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Hot Shots",1956,62,NA,6,15,4.5,0,4.5,4.5,14.5,4.5,44.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Hot Shots!",1991,84,NA,6.2,10637,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Hot Shots! Part Deux",1993,86,NA,5.8,8538,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Hot Spell",1958,86,NA,5.5,51,0,0,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hot Splash",1988,89,NA,1.8,10,24.5,24.5,0,14.5,0,0,14.5,34.5,0,14.5,"",1,0,1,0,0,0,0 -"Hot Spur",1968,87,NA,1.8,12,44.5,0,4.5,4.5,0,24.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Hot Stuff",1956,16,NA,5.7,36,14.5,24.5,14.5,4.5,4.5,24.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Hot Stuff",1971,9,NA,6.1,13,0,4.5,0,0,24.5,14.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Hot Stuff",1979,91,NA,5.5,174,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hot Summer Night",1957,86,NA,5.9,33,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hot Summer in Barefoot County",1974,90,NA,3,18,24.5,14.5,14.5,0,14.5,0,14.5,0,0,14.5,"",1,0,1,0,0,0,0 -"Hot T-Shirts",1979,86,NA,1.6,18,24.5,34.5,14.5,0,0,4.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Hot Ticket",1996,81,NA,3.7,37,24.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Hot Times",1974,84,NA,4,18,14.5,0,14.5,14.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Hot Times at Montclair High",1989,87,NA,3.6,36,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Hot Tomorrows",1977,73,NA,6.3,13,0,4.5,14.5,0,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Hot Touch, The",1982,93,4700000,4.8,13,0,0,14.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Hot Tubs II: The Terror Returns",2001,5,NA,3.3,6,14.5,0,0,34.5,0,0,0,34.5,0,14.5,"",0,0,1,0,0,0,1 -"Hot Water",1924,60,NA,7.3,151,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Hot Wax Zombies On Wheels",1999,88,160000,2.4,52,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Hot to Trot",1988,83,NA,3.7,632,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hot-Blooded Woman",1965,75,NA,4.4,8,34.5,0,0,14.5,0,0,0,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hot-Rod and Reel!",1959,6,NA,6.3,27,0,4.5,0,14.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"HotRod: The Movie",2004,72,NA,9,9,0,0,0,0,14.5,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Hotaru",2000,164,NA,6.7,25,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hotaru",2001,114,NA,6.4,12,0,0,0,4.5,14.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Hotaru no haka",1988,85,NA,8.3,6886,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,1,0,1,0,0,0 -"Hotaru-gawa",1987,115,NA,6.1,5,0,0,0,0,0,64.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Hotel",1967,124,NA,6,169,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hotel",1997,1,NA,5.4,6,14.5,0,0,0,0,45.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Hotel",2001,93,NA,4.9,369,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hotel",2004,83,NA,4.6,93,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hotel Anchovy",1934,18,NA,5.8,36,4.5,4.5,4.5,14.5,4.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Hotel Berlin",1945,98,NA,6.4,83,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hotel Central",1983,105,NA,6.9,8,0,0,0,0,0,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hotel Colonial",1987,104,NA,2.7,30,24.5,14.5,14.5,24.5,4.5,14.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Hotel Danubio",2003,98,NA,5.7,13,4.5,4.5,0,0,0,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hotel Exotica",1998,88,NA,3.7,61,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hotel Hooker",1975,58,NA,8.5,8,0,0,0,0,0,0,0,74.5,0,24.5,"",0,0,0,0,0,0,0 -"Hotel Imperial",1927,85,NA,7.6,20,0,0,0,0,4.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Hotel Imperial",1939,67,NA,6.6,7,0,14.5,0,0,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Hotel New Hampshire, The",1984,109,7500000,5.8,2065,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Hotel Paradise",1995,29,NA,5.5,31,4.5,4.5,4.5,0,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Hotel Paradiso",1966,95,NA,6.3,126,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hotel Reserve",1944,79,NA,6.4,71,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hotel Rienne",2003,27,NA,6.4,8,0,0,0,0,14.5,34.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Hotel Room",1998,86,NA,6.9,10,0,0,0,0,14.5,24.5,24.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Hotel Rwanda",2004,121,NA,8.5,8328,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG-13",0,0,0,1,0,0,0 -"Hotel Sahara",1951,96,NA,6.5,32,0,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hotel Sorrento",1995,112,NA,6.6,87,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Hotel Splendide",2000,98,NA,6.4,181,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hotel St. Pauli",1988,121,NA,5.1,50,24.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hotel Torgo",2004,28,NA,9.4,24,4.5,0,0,0,0,0,4.5,0,4.5,84.5,"",0,0,0,1,1,0,1 -"Hotel alojamiento",1966,110,NA,3.8,8,0,34.5,24.5,14.5,14.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Hotel de Love",1996,96,NA,6.3,276,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Hotel paura",1996,100,NA,4,20,14.5,0,24.5,0,14.5,4.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Hotel pro cizince",1967,103,NA,9,6,0,0,0,0,0,14.5,0,14.5,0,64.5,"",0,0,1,1,0,0,0 -"Hotel y domicilio",1995,105,NA,7.9,26,14.5,4.5,4.5,4.5,4.5,0,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hoteles",2004,90,NA,5,12,14.5,0,24.5,14.5,4.5,0,14.5,4.5,4.5,0,"",0,0,1,1,0,0,0 -"Hoteru haibisukasu",2002,90,NA,7.1,22,0,0,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hotet",2004,103,NA,4.6,327,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hothouse Rose II",1992,86,NA,8,9,0,0,14.5,14.5,14.5,0,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Hotoke",2001,113,NA,6.8,6,0,0,0,0,14.5,0,34.5,14.5,0,34.5,"",0,0,0,0,0,1,0 -"Hotte im Paradies",2003,118,NA,7.4,56,4.5,0,4.5,0,0,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hottest Bid, The",1995,93,NA,1.9,13,14.5,14.5,14.5,0,0,0,0,14.5,0,34.5,"NC-17",0,0,0,0,0,0,0 -"Hotwire",1980,95,NA,1.5,6,64.5,14.5,14.5,0,0,0,0,0,0,0,"",1,0,1,0,0,0,0 -"Houdini",1953,106,NA,6.7,384,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Houdinis hund",2002,12,NA,6,17,14.5,0,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Houhokekyo tonari no Yamada-kun",1999,104,NA,8,291,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG",0,1,1,0,0,0,0 -"Houligans kato ta heria apo ta niata",1983,106,NA,7.2,10,14.5,0,0,0,0,24.5,14.5,0,0,64.5,"",1,0,0,1,0,0,0 -"Hound Hunters",1947,7,NA,6.9,22,0,0,0,0,14.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hound for Trouble, A",1951,7,NA,6.6,23,0,0,0,0,14.5,34.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hound of the Baskervilles, The",1932,72,NA,5.3,6,0,0,14.5,14.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Hound of the Baskervilles, The",1939,80,NA,7.6,941,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Hound of the Baskervilles, The",1959,87,NA,6.8,815,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hound of the Baskervilles, The",1978,78,NA,4.1,196,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hound-Dog Man",1959,87,NA,5.5,18,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Hounds of Notre Dame",1980,96,NA,6.2,8,0,0,0,0,0,24.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Hour Before the Dawn, The",1944,75,NA,4.3,8,14.5,0,14.5,14.5,34.5,0,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Hour for Lunch, An",1939,9,NA,5.7,6,0,0,14.5,0,14.5,0,45.5,0,14.5,0,"",0,0,1,0,0,0,1 -"Hour of 13, The",1952,80,NA,6,52,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hour of the Assassin",1987,96,NA,4.9,32,14.5,4.5,4.5,14.5,24.5,24.5,4.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Hour of the Gun",1967,100,1800000,6.4,235,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hour of the Pig, The",1993,102,NA,6.8,477,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hourglass",1995,90,NA,3.9,65,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hours and Times, The",1991,60,NA,6.4,81,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hours, The",2002,114,25000000,7.6,16692,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"House",1986,93,3000000,5.5,1672,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"House",1996,85,NA,5.4,32,14.5,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"House Across the Bay, The",1940,88,NA,5.8,36,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"House Across the Lake, The",1954,68,NA,4.8,7,0,0,0,14.5,0,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"House Across the Street, The",1949,69,NA,5.8,42,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"House Builder-Upper, The",1938,6,NA,6.6,9,0,0,14.5,0,0,0,45.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"House Calls",1978,98,NA,6.6,321,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"House Cleaning Blues",1937,6,NA,6.7,22,0,0,0,0,0,45.5,4.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"House Divided, A",1913,13,NA,5.9,30,14.5,4.5,0,4.5,4.5,4.5,44.5,24.5,4.5,0,"",0,0,1,0,0,0,1 -"House Divided, A",1931,70,NA,6.1,13,0,14.5,0,4.5,14.5,14.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"House Divided, A",1998,30,NA,4.5,9,24.5,14.5,14.5,0,24.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,1 -"House Hunting Mice",1948,7,NA,7.6,35,0,0,0,4.5,0,4.5,44.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"House I Live In, The",1945,11,NA,6.8,40,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"House II: The Second Story",1987,88,NA,4.5,819,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"House IV",1992,94,NA,2.5,216,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"House Is Not a Home, A",1964,98,NA,6.2,13,0,4.5,0,4.5,4.5,24.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"House Made of Dawn",1987,90,NA,6.1,8,0,0,24.5,0,34.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"House Next Door, The",2002,87,NA,4.5,131,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"House Party",1983,20,NA,7.6,7,14.5,0,0,0,0,0,14.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"House Party",1990,100,NA,5.5,1065,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"House Party 3",1994,100,NA,3.3,282,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"House That Cried Murder, The",1973,85,NA,4.2,7,0,14.5,0,0,0,0,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"House That Dripped Blood, The",1970,102,NA,6,284,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"House Where Evil Dwells, The",1982,88,NA,3.6,97,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"House by the River",1950,88,NA,7.1,89,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"House by the Sea, A",2000,93,NA,5,6,0,0,0,0,34.5,0,0,0,14.5,45.5,"",0,0,0,1,0,0,0 -"House in Marsh Road, The",1960,70,NA,5.1,7,0,0,14.5,0,14.5,24.5,14.5,0,24.5,0,"",0,0,0,0,0,0,0 -"House in Nightmare Park, The",1973,100,NA,5,47,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"House in the Hills, A",1993,95,NA,5.1,239,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"House in the Middle, The",1954,13,NA,5.1,6,0,14.5,0,0,0,64.5,0,14.5,0,0,"",0,0,0,0,1,0,1 -"House in the Square, The",1951,90,NA,6.4,74,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,0,1,0,1,0 -"House in the Woods, The",1959,60,NA,5.9,6,0,0,0,0,34.5,0,0,64.5,0,0,"",0,0,0,1,0,0,0 -"House of 1000 Corpses",2003,88,7000000,5.1,6136,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"House of Angelo, The",1997,90,NA,5,15,14.5,0,0,0,0,14.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"House of Bamboo",1955,102,NA,6.5,156,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"House of Cards",1968,105,NA,5.4,66,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"House of Cards",1993,109,NA,5.6,534,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"House of D",2004,97,NA,6.1,343,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"PG-13",0,0,0,1,0,0,0 -"House of Dark Shadows",1970,102,750000,5.7,328,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"House of Darkness, The",1913,17,NA,5.8,20,4.5,0,4.5,0,24.5,34.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,1 -"House of Dracula",1945,67,NA,5.6,378,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"House of Evil",1968,89,NA,2.4,23,24.5,24.5,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"House of Fear, The",1939,67,NA,5.5,18,0,0,0,4.5,24.5,34.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"House of Frankenstein",1944,71,NA,6,477,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"House of Games",1987,102,NA,7.5,3798,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"House of God, The",1984,108,NA,5.7,51,4.5,0,0,4.5,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,1,0,0,0 -"House of Horrors",1946,65,NA,5.4,40,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"House of Luk",2001,99,NA,6.2,27,24.5,4.5,0,4.5,14.5,0,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"House of Mirth, The",2000,140,10000000,6.9,2167,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG",0,0,0,1,0,1,0 -"House of Mystery",1934,62,NA,5.8,11,0,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"House of Mystery",1961,56,NA,5.5,6,0,0,0,0,14.5,34.5,0,34.5,14.5,0,"",0,0,0,0,0,0,0 -"House of Numbers",1957,90,NA,6.1,45,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"House of Rothschild, The",1934,94,NA,6.7,47,4.5,0,0,4.5,4.5,14.5,34.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"House of Sand and Fog",2003,126,16000000,7.8,8164,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"House of Secrets",1936,70,NA,6.3,17,0,0,0,4.5,14.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"House of Secrets",1956,85,NA,5.3,26,0,4.5,0,14.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"House of Seven Corpses, The",1974,90,NA,3.5,86,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"House of Strangers",1949,101,NA,7.1,111,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"House of Terror",1975,90,NA,2.4,7,14.5,14.5,14.5,0,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"House of Tomorrow, The",1949,7,NA,7.3,50,0,0,0,4.5,4.5,14.5,24.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"House of Usher",1960,79,270000,6.8,1031,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"House of Usher, The",1988,92,NA,3.1,76,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"House of Wax",1953,90,658000,6.9,1386,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"House of Wax",2005,105,30000000,4.6,1298,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"House of Whipcord",1974,102,NA,5.1,109,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"House of Women",1962,85,NA,6.3,11,0,4.5,0,14.5,0,0,4.5,45.5,0,4.5,"",0,0,0,1,0,0,0 -"House of Yes, The",1997,85,1500000,6.5,2345,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"House of the Black Death",1965,89,NA,1.6,20,44.5,34.5,14.5,0,4.5,0,0,14.5,0,4.5,"",0,0,0,0,0,0,0 -"House of the Damned",1963,62,NA,5,20,0,14.5,14.5,14.5,24.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"House of the Damned",1996,92,NA,4.5,83,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"House of the Dead",2003,90,7000000,2.3,3921,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"House of the Living Dead",1973,85,NA,2.8,23,24.5,14.5,14.5,4.5,24.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"House of the Long Shadows",1983,100,7500000,5.8,239,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"House of the Rising Sun",1987,86,NA,5.3,10,24.5,0,14.5,34.5,24.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"House of the Seven Gables, The",1940,89,NA,7.4,79,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"House of the Seven Hawks, The",1959,92,NA,5.9,53,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"House of the Spirits, The",1993,146,40000000,6.3,3205,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"House of the Tiger King",2004,105,NA,4.7,16,4.5,0,0,24.5,14.5,0,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"House on 56th Street, The",1933,68,NA,5.4,37,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"House on 92nd Street, The",1945,88,NA,7.1,171,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"House on Bare Mountain",1962,62,NA,4.6,36,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"House on Carroll Street, The",1988,101,NA,6,401,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"House on Haunted Hill",1959,75,200000,6.6,1608,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"House on Haunted Hill",1999,99,19000000,5.1,9694,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"House on Skull Mountain, The",1974,89,NA,3.7,31,14.5,14.5,4.5,14.5,14.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"House on Sorority Row, The",1983,91,425000,5.2,187,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"House on Telegraph Hill, The",1951,93,NA,6.3,44,4.5,0,0,0,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"House on Todville Road, The",1994,93,NA,4.7,12,4.5,4.5,0,24.5,0,4.5,4.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"House on Turk Street, The",2002,103,12000000,5.5,1048,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"House on a Hill, A",2003,89,NA,7,5,0,0,0,0,0,0,64.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"House!",2000,90,NA,6.1,145,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"House: After Five Years of Living",1955,11,NA,6,15,14.5,0,4.5,4.5,0,34.5,24.5,4.5,0,14.5,"",0,0,0,0,1,0,1 -"HouseSitter",1992,102,NA,5.7,3045,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Houseboat",1958,110,NA,6.5,1062,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Housebound",2000,89,NA,5.3,29,14.5,14.5,0,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Houseguest",1995,113,NA,5.7,839,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Household Saints",1993,124,NA,6.7,322,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Householder, The",1963,100,NA,6.8,38,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Housekeeper's Daughter, The",1939,71,NA,4.7,13,4.5,0,0,34.5,14.5,4.5,34.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Housekeeping",1987,116,NA,7.2,403,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Housewife",1934,69,NA,6.1,101,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Housewife From Hell",1993,82,NA,3.2,11,34.5,14.5,24.5,0,0,0,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Housewives: The Making of the Cast Album",1994,8,NA,4.5,12,4.5,0,0,0,0,14.5,4.5,0,4.5,45.5,"",0,0,0,0,0,0,1 -"Housing Problems",1935,16,NA,7.8,12,0,0,0,0,4.5,4.5,45.5,0,0,34.5,"",0,0,0,0,1,0,1 -"Houston Story, The",1956,79,NA,6.3,14,0,0,0,4.5,14.5,24.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"How Am I Driving",2002,4,NA,7,9,24.5,0,0,0,14.5,14.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,1 -"How Arnold Won the West",2004,80,NA,6.5,53,4.5,4.5,0,4.5,14.5,4.5,34.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"How Come Nobody's on Our Side?",1975,84,NA,3.6,6,0,14.5,14.5,34.5,0,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"How Dinosaurs Learned to Fly",1995,6,NA,6.8,16,0,0,0,0,14.5,24.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"How Do I Love Thee?",1970,110,NA,4.7,13,4.5,0,24.5,14.5,14.5,14.5,24.5,0,0,0,"",0,0,1,1,0,0,0 -"How Green Is My Spinach",1950,7,NA,7.8,10,0,0,0,0,0,34.5,24.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"How Green Was My Valley",1941,118,1250000,7.9,2662,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"How Harry Became a Tree",2001,99,6000000,6.7,115,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"How High",2001,95,12000000,4.9,2916,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"How High Is Up?",1940,17,NA,8.1,64,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"How I Got Into College",1989,86,NA,5.6,470,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"How I Learned to Stop Worrying and Love the Superlaser",2003,4,NA,1,7,45.5,0,14.5,0,0,0,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"How I Play Golf, by Bobby Jones No. 1: 'The Putter'",1931,14,NA,6.9,8,0,0,0,0,14.5,24.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"How I Saved the World",2001,18,40000,7.2,6,0,14.5,0,14.5,0,0,14.5,0,0,45.5,"",0,0,1,0,0,0,1 -"How I Spent My Summer Vacation",1997,73,NA,5.5,38,14.5,0,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,"",0,0,1,0,0,0,0 -"How I Won the War",1967,109,NA,5.9,353,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"How It Feels to Be Run Over",1900,1,NA,6.3,41,4.5,0,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"How Jones Lost His Roll",1905,7,NA,5,7,24.5,0,0,0,24.5,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"How Life Is",2004,5,NA,8.7,11,0,0,0,0,0,0,24.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"How Men Propose",1913,6,NA,5.3,25,4.5,4.5,0,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"How Much",1999,29,NA,5.5,15,14.5,0,0,0,14.5,0,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,1 -"How Much Affection?",1957,20,NA,3,9,14.5,24.5,34.5,24.5,0,14.5,0,0,0,0,"",0,0,0,1,0,0,1 -"How Much for a Half Kilo?",2000,22,NA,6.2,11,24.5,4.5,4.5,0,0,0,0,0,0,45.5,"",0,0,0,0,0,0,1 -"How Now Boing Boing",1954,7,NA,6.4,31,0,0,0,14.5,4.5,14.5,34.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"How Rare a Possession: The Book of Mormon",1987,64,NA,7.4,38,4.5,4.5,4.5,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"How Stella Got Her Groove Back",1998,124,20000000,5,1475,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"How Sweet It Is!",1968,99,NA,5.5,69,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"How They Get There",1997,3,NA,7.6,76,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"How They Make Adult Movies",1997,60,NA,3.8,14,24.5,0,4.5,0,24.5,14.5,0,0,4.5,24.5,"",0,0,0,0,1,0,0 -"How Wings Are Attached to the Backs of Angels",1996,10,NA,8,18,0,0,0,0,14.5,4.5,0,4.5,24.5,45.5,"",0,1,0,0,0,0,1 -"How the Garcia Girls Spent Their Summer",2005,128,NA,2.9,43,4.5,24.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"How the Grinch Stole Christmas",2000,104,123000000,5.7,12680,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"How the West Was Won",1962,162,14000000,6.9,2029,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"How to Be Very, Very Popular",1955,89,NA,5.6,35,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"How to Be a Cyber-Lovah",2001,7,NA,8.2,6,0,0,0,0,0,14.5,34.5,0,14.5,34.5,"",0,0,1,0,0,0,1 -"How to Be a Detective",1936,9,NA,7.3,21,0,0,0,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"How to Be a Model (A 12 Step Plan)",2003,82,NA,9.3,17,0,0,0,0,0,0,4.5,4.5,44.5,44.5,"",0,0,0,0,1,0,0 -"How to Be a Player",1997,93,NA,4.3,409,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"How to Be a Sailor",1944,7,NA,6.8,54,4.5,0,0,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"How to Beat the High Co$t of Living",1980,105,NA,5.4,218,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"How to Behave",1936,10,NA,6.8,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"How to Break 90",1933,9,NA,4.2,10,0,24.5,14.5,14.5,14.5,44.5,0,0,0,14.5,"",0,0,0,0,1,0,1 -"How to Cheat in the Leaving Certificate",1997,80,NA,6,19,14.5,14.5,0,0,0,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"How to Commit Marriage",1969,95,NA,5.1,105,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"How to Dance",1953,6,NA,7,49,0,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"How to Deal",2003,102,16000000,5.5,1537,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"How to Disappear Completely",2004,8,NA,8.8,8,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,1,0,0,1 -"How to Draw a Bunny",2002,90,NA,7.9,91,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"How to Eat",1939,9,NA,7.4,8,0,0,0,0,0,14.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"How to Figure Income Tax",1938,9,NA,7.5,9,0,0,0,14.5,0,14.5,34.5,14.5,34.5,0,"",0,0,1,0,0,0,1 -"How to Fish",1942,7,NA,6.7,49,4.5,0,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"How to Fly the B-24D Airplane",1942,58,NA,8.3,7,14.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,0,0,1,0,0 -"How to Frame a Figg",1971,103,NA,5.8,87,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"How to Get Ahead in Advertising",1989,95,NA,6.8,762,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"How to Get the Man's Foot Outta Your Ass",2003,109,NA,7.6,1151,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"How to Have an Accident at Work",1959,7,NA,7.5,24,0,0,0,0,4.5,24.5,14.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"How to Have an Accident in the Home",1956,7,NA,7.7,22,0,0,0,0,4.5,0,24.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"How to Judge Character by the Face",1986,9,NA,1.3,16,84.5,14.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"How to Kill Your Neighbor's Dog",2000,107,7300000,7,907,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"How to Kiss",1989,6,NA,6.8,83,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,1,1,0,0,1,1 -"How to Live with a Vegan Without Killing Them",2004,84,330000,5.5,10,34.5,0,0,0,0,14.5,34.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"How to Lose a Guy in 10 Days",2003,116,50000000,6.1,9257,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"How to Make Friends",2004,7,NA,7.2,17,24.5,0,0,4.5,0,0,4.5,4.5,0,45.5,"",0,0,0,0,0,0,1 -"How to Make Love to a Woman",1995,5,NA,6.6,65,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"How to Make Movies",1918,16,NA,6.2,11,0,0,0,0,4.5,45.5,24.5,4.5,0,0,"",0,0,1,0,0,0,1 -"How to Make a Doll",1968,81,NA,1.8,19,44.5,14.5,14.5,0,14.5,4.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"How to Make a Monster",1958,73,NA,4.4,97,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"How to Make an American Quilt",1995,109,NA,5.9,2462,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"How to Make the Cruelest Month",1998,99,NA,6.2,17,4.5,0,0,4.5,0,14.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"How to Marry a Millionaire",1953,95,NA,6.8,1653,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"How to Murder Your Wife",1965,118,NA,6.5,662,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"How to Murder a Rich Uncle",1957,79,NA,6.4,24,4.5,4.5,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"How to Play Baseball",1942,8,NA,6.8,56,4.5,4.5,0,0,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"How to Play Football",1944,7,NA,6.7,65,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"How to Play Golf",1944,8,NA,6.9,51,4.5,4.5,0,4.5,4.5,4.5,45.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"How to Raise a Baby",1938,10,NA,5.7,11,0,0,0,24.5,14.5,4.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"How to Ride a Horse",1950,8,NA,5.9,22,4.5,0,0,4.5,4.5,14.5,45.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"How to Save a Marriage (And Ruin Your Life)",1968,102,NA,5.1,52,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"How to Sleep",1935,11,NA,6.4,66,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"How to Sleep",1953,7,NA,6.5,49,4.5,4.5,0,0,14.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"How to Start the Day",1937,10,NA,7.1,12,0,4.5,0,0,0,44.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"How to Steal a Million",1966,123,6000000,7.2,1655,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"How to Steal the World",1968,86,NA,5.2,39,0,4.5,14.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"How to Stuff a Wild Bikini",1965,93,NA,4.2,137,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"How to Succeed in Business Without Really Trying",1967,121,NA,7,627,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"How to Succeed with Sex",1970,77,NA,1.1,8,74.5,14.5,0,14.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"How to Survive a Broken Heart",1991,80,NA,6.3,10,0,14.5,0,0,24.5,24.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"How to Swim",1942,8,NA,6.8,53,4.5,4.5,4.5,0,0,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"How to Train a Dog",1936,8,NA,7.6,12,0,0,0,0,0,14.5,14.5,44.5,14.5,4.5,"",0,0,1,0,0,0,1 -"How to Undress In Front of Your Husband",1937,20,NA,2.9,11,14.5,14.5,14.5,4.5,0,4.5,4.5,0,0,14.5,"",0,0,0,1,0,0,1 -"How to Vote",1936,10,NA,7.6,11,0,0,0,0,4.5,0,24.5,34.5,0,24.5,"",0,0,1,0,0,0,1 -"How to Watch Football",1938,9,NA,7.2,9,0,0,0,14.5,14.5,24.5,14.5,0,0,44.5,"",0,0,1,0,0,0,1 -"How's Your News?",1999,82,NA,6.5,75,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"How've You Bean?",1933,18,NA,6.2,5,0,0,0,0,24.5,0,24.5,24.5,0,44.5,"",0,0,1,0,0,0,1 -"Howard Zinn: You Can't Be Neutral on a Moving Train",2004,78,NA,7.7,37,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Howard in Particular",1979,14,NA,6.8,37,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Howard the Duck",1986,110,30000000,3.9,6582,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Howards End",1992,140,NA,7.4,5098,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Howards of Virginia, The",1940,117,NA,6.1,67,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Howling II: Stirba - Werewolf Bitch",1985,91,NA,2.6,575,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Howling III",1987,94,NA,3,381,24.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Howling, The",1981,91,1000000,6.3,2546,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Howrah Bridge",1958,153,NA,7.5,6,0,0,0,0,0,14.5,34.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Hoyat gwan tsoi loi",1991,126,NA,7.2,20,4.5,4.5,0,0,4.5,4.5,24.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Hr. Boe & Co.'s Anxiety",2001,35,NA,8.3,18,4.5,0,4.5,0,0,14.5,24.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Hra o jablko",1976,100,NA,6.4,26,0,0,4.5,4.5,0,24.5,4.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Hra s kameny",1965,8,NA,8.4,27,0,0,0,4.5,0,4.5,14.5,34.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Hrad z pisku",1994,80,NA,4.7,12,14.5,0,0,4.5,4.5,14.5,0,14.5,0,34.5,"",0,0,0,0,0,1,0 -"Hrein og bein",2003,56,NA,7.2,11,0,0,0,4.5,0,0,34.5,34.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Hringurinn",1985,80,NA,6.4,6,0,0,0,0,34.5,0,0,0,14.5,45.5,"",0,0,0,0,1,0,0 -"Hristina",1960,81,NA,6.4,8,0,0,0,0,14.5,24.5,34.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Hrvatska mora",2005,110,NA,4.1,7,45.5,0,0,0,0,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Hsi yen",1993,106,1000000,7.5,2342,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Hsia nu",1969,200,NA,7.5,261,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",1,0,0,0,0,0,0 -"Hsia yu-yen",1968,89,NA,7.4,48,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,1,0 -"Hsiao chuan yi chao",1979,92,NA,6.4,382,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Hsiao pi te ku shih",1983,100,NA,7.8,26,0,0,0,0,0,14.5,14.5,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Hsimeng jensheng",1993,142,NA,6.8,192,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hsing Hsing wang",1977,90,NA,4.3,167,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Hu Du Men",1996,87,NA,7.1,48,0,4.5,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Hu Halach B'Sadot",1967,90,NA,6.1,5,0,0,24.5,0,0,44.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Hu Tu Tu",1999,172,NA,6.7,18,0,0,4.5,0,0,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hu xue tu long zhi hong tian xian jing",1994,88,NA,4.5,15,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,0,24.5,"",1,0,0,0,0,0,0 -"Hu-Man",1975,93,NA,5.6,7,0,0,14.5,14.5,0,14.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Hua Mu Lan",1964,106,NA,7.5,6,0,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Hua hun",1995,118,NA,5.9,68,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hua jai tor ra nong",2003,90,NA,4.5,53,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hua ji shi dai",1981,94,NA,4.6,17,14.5,14.5,0,14.5,0,0,24.5,0,4.5,14.5,"",1,0,1,1,0,0,0 -"Hua jie kuang ben",1992,95,NA,5.4,23,0,4.5,14.5,4.5,34.5,14.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Hua pi zhi yinyang fawang",1993,95,NA,3.4,29,24.5,4.5,4.5,14.5,0,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hua qi Shao Lin",1994,111,NA,5.9,124,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Hua yan",2002,84,NA,7,10,24.5,0,0,0,0,0,14.5,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Hua yang de nian hua",2000,3,NA,7.9,44,0,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Huang Fei-hung zhi sei: Wang zhe zhi feng",1993,102,NA,4.4,73,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Huang jia shi jie zhi III: Ci xiong da dao",1988,90,NA,5.9,34,0,0,4.5,4.5,0,24.5,14.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Huang jia shi jie zhi IV: Zhi ji zheng ren",1989,90,NA,7,106,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Huang tu di",1984,91,NA,7.4,288,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Huang xin jia ni",2001,110,NA,6.9,29,0,0,0,0,24.5,4.5,34.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Huanghe juelian",1999,105,NA,5.6,25,4.5,4.5,0,24.5,4.5,24.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Huapango",2004,100,NA,5.7,6,14.5,0,0,0,34.5,0,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Hubal",1973,126,NA,6.7,11,0,0,0,0,4.5,24.5,34.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Hubert's Brain",2001,17,NA,6.5,6,14.5,0,0,14.5,0,14.5,45.5,0,0,0,"",0,1,0,0,0,0,1 -"Hubog",2001,100,NA,6.2,10,0,0,0,24.5,0,14.5,44.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Huck and the King of Hearts",1993,98,NA,5.2,35,14.5,4.5,4.5,0,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Huckleberry Finn",1931,80,NA,4.7,11,4.5,4.5,4.5,14.5,4.5,24.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Huckleberry Finn",1974,118,NA,4.9,43,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Huckleberry Finn",1995,108,NA,5.7,8,14.5,0,0,0,14.5,24.5,0,0,14.5,34.5,"PG",0,0,0,0,0,0,0 -"Hucksters, The",1947,115,2300000,6.4,189,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Hud",1963,112,2500000,7.9,2450,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Hud",1986,115,NA,4.4,57,45.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Huddle",1932,104,NA,5.2,29,0,14.5,4.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Hudodelci",1987,90,NA,6.2,5,24.5,0,0,24.5,0,24.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Hudson Hawk",1991,103,65000000,5.1,8904,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Hudson River Blues",1997,91,NA,4.3,21,14.5,0,4.5,0,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Hudson's Bay",1941,95,NA,6.2,52,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Hudsucker Proxy, The",1994,111,25000000,7.4,12903,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Hue and Cry",1947,82,NA,7.2,117,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Huelepega",1999,105,NA,6.2,24,4.5,0,0,4.5,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Huella de luz",1943,76,NA,5.1,8,0,0,0,0,45.5,0,0,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Huellas borradas, Las",1999,98,NA,5.8,57,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Huevos de oro",1993,95,NA,5.9,343,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Huey Long",1985,88,NA,7.6,47,0,0,0,0,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Huggetts Abroad, The",1949,89,NA,5.5,13,0,0,34.5,24.5,0,14.5,0,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hugh Hefner: Once Upon a Time",1992,91,NA,6.3,56,4.5,4.5,4.5,4.5,4.5,24.5,4.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Hughes and Harlow: Angels in Hell",1978,95,NA,2.3,9,44.5,24.5,14.5,0,14.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Hugo Pool",1997,92,NA,5.1,503,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Hugo och Josefin",1967,78,NA,6.8,39,4.5,0,4.5,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Hugs and Mugs",1950,16,NA,7.1,29,0,0,0,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Hui ba! Ja 'fit' yan bing tuen",1996,92,NA,6.9,10,0,0,0,0,14.5,24.5,34.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Hui nin yin fa dak bit doh",1998,128,NA,6.7,76,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Huidos",1992,107,NA,4.5,5,24.5,0,0,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Huis, Het",1961,30,NA,7,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Huk!",1956,84,NA,5.7,9,0,0,0,0,45.5,34.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Hukkle",2002,75,100000,7.1,433,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Hula",1927,64,NA,6.9,29,4.5,4.5,0,0,4.5,4.5,34.5,24.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Hula-La-La",1951,16,NA,6.9,38,4.5,0,0,0,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Huling birhen sa lupa, Ang",2003,99,NA,6.8,12,0,4.5,0,0,24.5,14.5,4.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Hulk",2003,138,120000000,6.1,20710,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Hull of a Mess, A",1942,6,NA,6.7,6,0,0,0,14.5,0,14.5,0,14.5,45.5,0,"",0,1,1,0,0,0,1 -"Hullabaloo",1940,78,NA,6.8,16,0,0,0,0,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hullumeelsus",1968,79,NA,7.6,16,0,0,0,0,4.5,0,4.5,34.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Hum",1991,170,NA,7.7,84,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Hum Aapke Hain Koun...!",1994,206,NA,6.9,272,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,1,0 -"Hum Dil De Chuke Sanam",1999,188,NA,7.5,309,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Hum Dono",1961,95,NA,6,11,0,0,0,0,14.5,0,24.5,44.5,4.5,0,"",0,0,0,1,0,0,0 -"Hum Hain Rahi Pyaar Ke",1993,163,NA,6.7,75,4.5,0,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Hum Kisi Se Kum Nahin",1977,169,NA,7.9,27,0,0,0,0,0,0,14.5,34.5,44.5,14.5,"",1,0,1,1,0,1,0 -"Hum Kisi Se Kum Nahin",2002,161,NA,5.1,55,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",1,0,1,1,0,1,0 -"Hum Paanch",1980,163,NA,7.1,13,4.5,0,0,0,0,0,24.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Hum Saath-Saath Hain: We Stand United",1999,177,NA,6.2,98,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Hum Tum",2004,142,NA,6.5,213,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,1,0,1,0 -"Hum Tumhare Hain Sanam",2002,172,NA,6.5,91,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Human Body, The",2001,43,NA,5.7,33,0,4.5,0,4.5,4.5,24.5,4.5,24.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Human Comedy, The",1943,118,NA,7.2,227,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Human Condition, The",1999,10,NA,5.9,12,0,0,4.5,4.5,0,4.5,0,4.5,0,64.5,"",0,0,1,0,0,0,1 -"Human Desire",1954,91,NA,6.9,213,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Human Duplicators, The",1965,80,NA,2.2,98,34.5,24.5,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Human Experiments",1980,82,NA,3.6,36,4.5,4.5,14.5,24.5,14.5,4.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Human Factor, The",1975,95,NA,4.8,50,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Human Factor, The",1979,115,NA,5.3,105,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Human Jungle, The",1954,82,NA,5.9,19,0,0,24.5,4.5,14.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Human Nature",2001,96,NA,6.1,3255,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Human Remains",1998,30,NA,8.2,84,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Human Shield, The",1991,88,NA,4.6,59,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Human Stain, The",2003,106,NA,6.4,4130,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Human Timebomb",1995,98,NA,3.4,39,34.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,0,14.5,"R",1,0,0,1,0,0,0 -"Human Tornado, The",1976,85,NA,5.8,164,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",1,0,1,0,0,0,0 -"Human Touch",2004,102,NA,5.9,32,4.5,0,0,14.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Human Traffic",1999,99,NA,6.6,3268,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Humanist, The",2001,95,NA,4.8,20,4.5,4.5,0,24.5,4.5,24.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Humanoids from Atlantis",1992,45,NA,3.2,10,44.5,0,24.5,0,14.5,0,0,0,0,34.5,"",1,0,1,0,0,0,0 -"Humanoids from the Deep",1980,80,NA,4.8,466,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Humdrum",1998,7,NA,7.2,69,4.5,0,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Hummer",2003,9,NA,6.1,9,0,0,0,14.5,14.5,14.5,14.5,24.5,0,34.5,"",0,0,1,0,0,0,1 -"Hummingbird",2004,48,50000,9.2,12,0,0,0,0,0,0,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Hummingbird Tree, The",1992,85,NA,4.6,11,4.5,0,0,0,14.5,0,4.5,0,4.5,45.5,"",0,0,0,1,0,0,0 -"Humongous",1982,97,NA,3,119,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Humoresque",1946,125,NA,7.2,312,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Humorous Phases of Funny Faces",1906,3,NA,5.7,51,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Humpty Dumpty",1935,7,NA,6,18,0,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Humraaz",2002,173,NA,7.1,75,4.5,4.5,0,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Hunchback of Notre Dame, The",1923,98,1250000,7.4,414,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hunchback of Notre Dame, The",1939,116,NA,7.7,1851,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hunchback of Notre Dame, The",1996,91,70000000,6.5,6093,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,1,1,0,0,0 -"Hund von Baskerville - 6. Teil: Das Haus ohne Fenster, Der",1920,157,NA,1.9,7,84.5,0,0,0,0,0,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Hund von Blackwood Castle, Der",1968,92,NA,5.9,51,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hunden som log",1989,50,NA,7.1,14,0,0,0,0,4.5,4.5,24.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Hundhotellet",2000,68,NA,5.7,41,4.5,0,0,14.5,14.5,14.5,24.5,4.5,14.5,4.5,"",0,1,0,0,0,0,0 -"Hundra",1983,90,NA,4.6,59,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Hundred Percent",1998,103,NA,6.1,26,4.5,14.5,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Hundstage",2001,127,NA,7,898,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Hundtricket - The movie",2002,106,NA,5.6,387,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Hung biu hyn sin ji daai tau gwaai ang",2001,89,NA,5.2,57,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hung wen tin san po pai lien chiao",1980,95,NA,8.3,87,0,0,0,0,0,4.5,14.5,24.5,14.5,44.5,"",1,0,0,1,0,0,0 -"Hungama",2003,153,NA,6.7,82,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",1,0,1,1,0,0,0 -"Hunger",1974,10,NA,7.1,30,0,0,4.5,0,24.5,4.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Hunger - Sehnsucht nach Liebe",1997,97,NA,6,36,4.5,4.5,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Hunger Artist, The",2002,16,NA,6,7,0,0,0,0,0,14.5,0,0,14.5,74.5,"",0,1,0,0,0,0,1 -"Hunger, The",1983,97,NA,6.1,2488,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Hungry Bachelors Club, The",1999,93,NA,5,11,4.5,4.5,14.5,0,0,14.5,14.5,0,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Hungry Goat, The",1943,7,NA,5.7,9,14.5,0,0,14.5,14.5,0,14.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Hungry Hearts",2002,82,NA,5.9,26,4.5,0,4.5,0,4.5,14.5,14.5,0,24.5,24.5,"",0,0,1,1,0,0,0 -"Hungry Hill",1947,92,NA,5.2,14,0,4.5,0,24.5,14.5,0,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Hungry Squid, The",2001,15,NA,7.3,11,0,0,4.5,0,0,14.5,4.5,24.5,24.5,4.5,"",0,1,0,0,0,0,1 -"Hungry Wives",1973,89,120000,4.6,202,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hungry Wolf, The",1942,9,NA,5.8,15,0,24.5,0,0,14.5,24.5,4.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Hungry for You",1996,92,NA,3.1,21,24.5,14.5,14.5,0,14.5,4.5,4.5,0,0,4.5,"R",0,0,0,0,0,0,0 -"Hunk",1987,102,NA,3.6,164,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Hunt for Red October, The",1990,134,30000000,7.6,26666,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Hunt the Man Down",1950,69,NA,6.8,50,0,0,0,4.5,14.5,24.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Hunted",1952,84,NA,6.8,62,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hunted, The",1948,88,NA,8.5,8,0,0,0,0,0,24.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hunted, The",1995,111,NA,5.3,750,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Hunted, The",1997,90,NA,3.1,32,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Hunted, The",2003,117,NA,5.5,5978,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Hunter's Blood",1987,101,NA,4.6,80,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Hunter's Crossing",1983,91,NA,2.2,10,34.5,14.5,24.5,0,0,0,0,14.5,0,34.5,"",1,0,0,0,0,0,0 -"Hunter's Moon, The",1999,98,NA,5.1,63,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"R",1,0,0,1,0,1,0 -"Hunter, The",1980,97,8000000,5.8,559,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Hunter, The",1995,10,NA,7.4,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Hunters, The",1958,105,NA,6.2,164,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Hunting",1991,97,NA,4.1,24,4.5,24.5,14.5,0,24.5,4.5,4.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Hunting Camp",2005,38,4000,8.1,13,4.5,0,0,0,0,0,4.5,44.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Hunting Party, The",1971,108,NA,4.7,141,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Hunting for Herschell",2003,90,30000,1.8,11,45.5,0,0,0,0,0,14.5,4.5,0,14.5,"",1,0,1,1,0,0,0 -"Hunting of the President, The",2004,93,NA,7.3,345,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Hunting of the Snark, The",1987,60,NA,7,6,0,0,0,0,14.5,14.5,0,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Huntress: Spirit of the Night",1995,86,NA,3.1,44,24.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Huntsman, The",1993,12,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",1,0,0,0,0,0,1 -"Huo Yuan-Jia",1982,89,NA,7.9,83,0,0,0,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Huo shao dao",1990,125,NA,5.3,418,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Huo shao hong lian si",1994,104,NA,6.7,137,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Huoshan Qingxie",1932,100,NA,7.7,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Huostaanotto",1980,5,NA,5.9,22,14.5,4.5,0,0,0,0,0,4.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Huozhe",1994,125,NA,7.9,2207,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Hurdes, Las",1933,30,NA,7.5,459,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,1,0,1 -"Hurdy-Gurdy Hare",1950,7,NA,7.4,27,0,0,0,4.5,0,4.5,44.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Hurensohn",2004,86,NA,7.4,21,0,0,4.5,4.5,4.5,24.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Hurlevent",1985,130,NA,5.5,29,14.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Hurlyburly",1998,122,NA,5.6,3487,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Hurmaava joukkoitsemurha",2000,118,NA,4.8,87,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hurra - Die Schwedinnen sind da",1978,84,NA,3.8,6,0,34.5,14.5,14.5,0,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Hurra for Andersens",1966,108,NA,6,20,0,0,4.5,0,34.5,34.5,24.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Hurra, die Schule brennt",1969,97,NA,3.3,77,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Hurra, ich bin Papa!",1939,80,NA,5.9,6,0,0,0,0,14.5,45.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Hurra, unsere Eltern sind nicht da",1970,94,NA,2.8,9,74.5,0,0,14.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Hurricane",1979,120,NA,4,133,14.5,4.5,14.5,24.5,4.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hurricane",1997,91,500000,6.6,424,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Hurricane Express, The",1932,79,NA,5,60,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hurricane Smith",1952,90,NA,4.9,24,4.5,4.5,0,24.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Hurricane Smith",1992,86,NA,4.1,66,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Hurricane, The",1937,103,2000000,7,232,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Hurricane, The",1999,145,38000000,7.3,12445,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Hurry Sundown",1967,146,NA,5,169,14.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hurry Up, or I'll Be 30",1973,88,NA,4.8,8,24.5,0,0,24.5,0,24.5,0,0,0,24.5,"",0,0,1,1,0,0,0 -"Hurt Penguins",1992,98,NA,4.6,15,14.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,0,0,"",0,0,1,0,0,1,0 -"Hus i helvete",2002,100,NA,6.7,61,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Husbands",1970,131,1000000,7,373,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Husbands Beware",1956,16,NA,7,37,4.5,4.5,4.5,14.5,4.5,4.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Husbands and Wives",1992,108,20000000,7.4,3622,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Hush",1998,96,NA,4.6,2043,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Hush My Mouse",1946,7,NA,6.2,17,0,0,0,14.5,14.5,14.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Hush!",2001,136,NA,6,152,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Hush-A-Bye-Baby",1990,72,NA,5.6,26,4.5,4.5,0,0,0,4.5,14.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Hush... Hush, Sweet Charlotte",1964,133,1900000,7.3,1293,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Husk",2005,27,7500,3.3,14,14.5,0,14.5,0,0,0,24.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Hussard sur le toit, Le",1995,118,NA,6.9,1383,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Hussy",1980,95,NA,4.2,23,4.5,4.5,14.5,14.5,14.5,0,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Hustlas",2002,90,1000000,5.2,5,44.5,0,0,0,0,0,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Hustle",1975,120,NA,5.8,177,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hustler Squad",1976,98,NA,3.7,10,14.5,24.5,24.5,0,14.5,0,14.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Hustler White",1996,79,NA,6,227,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Hustler, The",1961,134,2000000,8.2,8220,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Hustling for Health",1919,15,NA,5.2,29,0,0,14.5,14.5,24.5,34.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Hustruer",1975,84,NA,4.7,31,4.5,4.5,24.5,4.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Huutajat - Screaming Men",2003,76,NA,7.7,59,0,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Hvem har bestemt?",1978,83,NA,5.4,20,24.5,14.5,0,0,14.5,24.5,14.5,0,14.5,24.5,"",0,0,1,1,0,0,0 -"Hvis lille pige er du?",1963,94,NA,5.5,15,0,0,0,4.5,24.5,24.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Hvor er pengene, Peter",2002,6,NA,6,14,4.5,0,0,14.5,14.5,24.5,4.5,34.5,0,0,"",1,0,0,0,0,0,1 -"Hvor ligger Painful City?",1993,7,NA,5.7,6,0,14.5,0,0,0,0,34.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Hvor mindets blomster gror",1991,45,NA,5.2,8,0,0,0,24.5,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,0 -"Hwaiteu ballenta-in",1999,101,NA,5.7,61,4.5,4.5,0,14.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Hwajangshil eodieyo?",2002,102,NA,5,72,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Hwang Jin-yi",1986,125,NA,4,8,64.5,14.5,0,14.5,0,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Hwanyeo '82",1982,115,NA,7.1,7,0,0,0,14.5,0,24.5,14.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Hwaomkyung",1993,136,NA,6.9,12,0,14.5,0,0,4.5,14.5,0,4.5,0,45.5,"",0,0,0,0,0,0,0 -"Hwerow Hweg",2002,90,NA,7,11,0,0,0,4.5,4.5,44.5,34.5,0,0,0,"",0,0,0,1,0,1,0 -"Hybrid",1997,86,NA,3.1,52,14.5,4.5,4.5,14.5,14.5,0,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Hybrid",2000,92,NA,6.9,31,4.5,0,0,0,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Hyde and Go Tweet",1960,6,NA,7,64,4.5,0,0,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Hyde and Hare",1955,7,NA,6.9,103,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Hymens Parable, The",2000,80,NA,5.3,6,0,0,0,34.5,34.5,0,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Hyoten",1966,96,NA,6.7,7,0,0,0,0,14.5,24.5,0,45.5,0,0,"",0,0,0,1,0,0,0 -"Hype!",1996,87,NA,7.5,330,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Hyper",2002,6,NA,6.8,12,0,0,0,0,0,14.5,34.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Hyper Sapien: People from Another Star",1986,92,NA,4.4,18,14.5,0,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hyper Space",1989,81,NA,3.6,13,44.5,0,14.5,14.5,4.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Hyperspace",1984,90,NA,5.4,21,4.5,4.5,0,0,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Hypnotic Eye, The",1960,79,365000,5,47,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Hypnotic Sensations",1985,82,NA,6.9,10,0,0,0,14.5,0,24.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Hypo-Chondri-Cat, The",1950,7,NA,6.8,75,0,0,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Hypocrites",1915,49,NA,6,39,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Hypostatic Union, The",2003,4,NA,7.2,6,14.5,0,0,0,0,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Hysteria",1965,85,NA,5.2,57,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Hysterical",1983,87,NA,4.5,191,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Hytta",1996,22,NA,6.1,13,34.5,0,0,14.5,4.5,0,14.5,4.5,0,14.5,"",0,0,0,1,0,0,1 -"I Accuse My Parents",1944,68,NA,2.4,364,44.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Accuse!",1958,99,NA,6.9,53,4.5,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"I Ain't Got Nobody",1932,9,NA,6.8,7,0,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"I Am Ali",2002,18,NA,6.2,5,0,0,24.5,0,24.5,24.5,0,24.5,24.5,0,"",0,0,0,0,0,0,1 -"I Am Curious, Film",1995,54,NA,1.3,49,74.5,4.5,0,0,14.5,4.5,0,0,4.5,0,"",0,0,0,0,1,0,0 -"I Am David",2003,90,NA,6.5,462,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"PG",0,0,0,1,0,0,0 -"I Am Dina",2002,122,NA,6.4,951,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I Am Josh Polonski's Brother",2001,87,80000,5,46,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"I Am My Resume",2003,15,30000,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,0,0,1 -"I Am Not What You Want",2001,49,NA,7.7,7,0,0,0,0,14.5,24.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"I Am Sam",2001,132,22000000,7.2,9945,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"I Am Stamos",2004,18,NA,7,45,4.5,0,4.5,0,4.5,4.5,4.5,14.5,4.5,64.5,"",0,0,1,0,0,0,1 -"I Am Suzanne",1933,98,NA,7.4,5,0,0,0,0,24.5,0,0,0,44.5,44.5,"",0,0,0,0,0,1,0 -"I Am Trying to Break Your Heart",2002,92,NA,7.5,382,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"I Am a Boyband",2003,6,NA,6.5,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"I Am a Camera",1955,98,NA,6.5,72,4.5,0,0,4.5,24.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"I Am a Dancer",1972,92,NA,5.9,9,0,0,0,0,24.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"I Am a Fugitive from a Chain Gang",1932,93,195845,8.1,1198,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"I Am a Sex Addict",2005,90,NA,7.9,9,0,0,0,0,14.5,14.5,14.5,14.5,34.5,24.5,"",0,0,1,0,0,0,0 -"I Am the Cheese",1983,100,NA,5.7,43,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"I Am the Law",1938,83,NA,5.8,30,0,4.5,0,4.5,14.5,14.5,44.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"I Believe in You",1952,95,NA,6,11,0,0,0,4.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Bought a Vampire Motorcycle",1990,101,NA,4.9,88,14.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"I Bring You Frankincense",1996,33,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"I Bury the Living",1958,76,NA,6,191,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"I Can Get It for You Wholesale",1951,91,NA,7,44,0,4.5,0,0,4.5,14.5,44.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Can Hardly Wait",1943,19,NA,7.5,73,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"I Can't Get Started",1985,96,NA,7,6,0,0,0,0,0,0,45.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"I Capture the Castle",2003,111,8000000,7,947,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"I Come in Peace",1990,91,7000000,4.8,1033,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"I Confess",1953,95,NA,7,1538,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"I Could Go on Singing",1963,100,NA,6.7,187,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"I Could Never Have Sex with Any Man Who Has So Little Regard for My Husband",1973,86,NA,3.3,12,14.5,14.5,14.5,4.5,4.5,14.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"I Could Read the Sky",1999,86,NA,5,23,4.5,0,4.5,24.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"I Cover the War",1937,68,70000,3.4,22,34.5,4.5,4.5,4.5,4.5,4.5,34.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"I Cover the Waterfront",1933,75,NA,6.1,79,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"I Created Lancelot Link",1999,16,NA,5.6,16,4.5,0,0,0,14.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,0,1,0,1 -"I Didn't Do It",1945,97,NA,3,5,44.5,0,0,0,0,0,24.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"I Died",2004,108,15000,3,5,24.5,44.5,0,24.5,0,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"I Died a Thousand Times",1955,95,NA,6.5,68,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"I Dismember Mama",1974,81,NA,3,64,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Do",1921,25,NA,6,45,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"I Do Not Know What It Is I Am Like",1986,89,NA,5.5,7,14.5,14.5,0,0,0,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"I Don't Buy Kisses Anymore",1992,110,NA,5.5,97,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"I Don't Care Girl, The",1953,78,NA,7.8,12,0,0,0,4.5,0,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"I Don't Hate Las Vegas Anymore",1994,70,NA,4.3,16,4.5,4.5,4.5,0,4.5,14.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"I Don't Know Jack",2002,96,NA,6.6,50,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"I Don't Scare",1956,6,NA,5.3,17,0,0,0,4.5,34.5,34.5,4.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"I Don't Want to Be Born",1975,95,NA,2.8,117,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"I Dood It",1943,102,NA,6.5,52,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"I Dream Too Much",1935,97,NA,5.4,32,0,0,4.5,4.5,44.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"I Dream of Jeannie",1952,90,NA,5,23,4.5,0,14.5,14.5,24.5,4.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"I Dreamed of Africa",2000,114,34000000,5.2,1113,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"I Dreamt I Woke Up",1991,44,NA,7.5,12,0,0,0,0,14.5,0,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"I Drink Your Blood",1970,83,NA,4.2,165,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"I Eats My Spinach",1933,7,NA,6,10,0,0,0,14.5,14.5,14.5,64.5,0,0,14.5,"",0,1,1,0,0,0,1 -"I Escaped from Devil's Island",1973,105,NA,3.4,23,4.5,14.5,14.5,24.5,24.5,4.5,0,0,4.5,4.5,"",1,0,0,0,0,0,0 -"I Found Stella Parish",1935,85,NA,5.9,36,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Gopher You",1954,7,NA,7.1,30,0,0,0,0,4.5,4.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"I Got Plenty of Mutton",1944,8,NA,6.6,15,0,0,0,0,4.5,34.5,24.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"I Got the Hook Up",1998,93,3500000,3.2,412,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"I Haven't Got a Hat",1935,7,NA,6.5,19,4.5,0,4.5,0,24.5,24.5,24.5,4.5,14.5,4.5,"",0,1,1,0,0,0,1 -"I Heard",1933,7,NA,7,11,0,0,0,0,4.5,14.5,24.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"I Heart Huckabees",2004,106,22000000,7,7262,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"I Hired a Contract Killer",1990,79,NA,7.1,503,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"I Hope...",2001,17,NA,7.8,12,14.5,4.5,0,0,0,0,0,0,4.5,64.5,"",0,0,0,1,0,0,1 -"I Inside, The",2003,90,8800000,6,734,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"I Just Want to Kiss You",1998,11,NA,7.5,10,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,0,0,0,1 -"I Killed My Lesbian Wife, Hung Her on a Meat Hook, and Now I Have a Three-Picture Deal at Disney",1993,16,NA,3.9,101,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,1 -"I Killed Wild Bill Hickok",1956,63,NA,1.7,6,45.5,34.5,0,0,0,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"I Kina spiser de hunde",1999,91,NA,7.3,2740,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,1,0,0,0,0 -"I Know What I Want",1936,77,NA,6.1,11,0,0,0,0,0,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"I Know What You Did Last Summer",1997,99,17000000,5.3,15932,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"I Like It Like That",1994,104,NA,5.8,361,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"I Like Killing Flies",2004,80,NA,7.6,16,0,0,0,0,0,14.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"I Like Your Nerve",1931,62,NA,5.6,36,0,14.5,4.5,14.5,4.5,14.5,34.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"I Like to Be Watched",1984,84,NA,8.3,6,0,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,1,0,0,0,0 -"I Like to Hurt People",1985,83,NA,7.1,21,4.5,4.5,0,4.5,4.5,0,24.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"I Like to Play Games",1995,90,NA,5.5,247,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"I Like to Play Games Too",1999,96,NA,4,69,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Likes Babies and Infinks",1937,7,NA,6.5,20,0,0,4.5,14.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"I Live My Life",1935,97,NA,5.6,55,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"I Live for Love",1935,64,NA,4,13,4.5,4.5,4.5,34.5,34.5,14.5,0,0,0,0,"",0,0,1,0,0,1,0 -"I Live in Grosvenor Square",1945,106,NA,5.9,18,0,4.5,4.5,0,14.5,24.5,14.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"I Live in a Bush World",2002,7,NA,7.8,12,24.5,4.5,0,0,4.5,0,4.5,0,0,45.5,"",0,0,0,0,0,0,1 -"I Lived with You",1933,100,NA,6.8,7,0,0,0,0,0,14.5,44.5,0,0,44.5,"",0,0,1,0,0,1,0 -"I Love Budapest",2001,100,NA,6,77,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"I Love Melvin",1953,77,NA,6.2,107,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"I Love My Cat",2003,4,NA,7.7,6,0,0,0,14.5,0,0,34.5,14.5,0,34.5,"",0,0,1,0,0,0,1 -"I Love My Wife",1970,98,NA,4,30,14.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"I Love Trouble",1948,93,NA,7.2,7,0,0,0,0,14.5,0,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"I Love Trouble",1994,123,NA,5.1,2805,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"I Love Vienna",1991,104,NA,8.2,15,0,0,0,0,4.5,4.5,14.5,44.5,24.5,4.5,"",0,0,1,0,0,0,0 -"I Love You",1986,101,NA,5.2,66,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"I Love You",2001,90,NA,5.4,17,4.5,4.5,4.5,14.5,0,0,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"I Love You Again",1940,99,NA,7.4,276,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"I Love You Baby",2001,110,NA,5.7,68,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,4.5,"R",0,0,1,0,0,1,0 -"I Love You Came Too Late",2004,85,125000,8,7,0,0,14.5,0,0,0,0,44.5,14.5,24.5,"",0,0,0,1,0,1,0 -"I Love You to Death",1990,96,NA,6.1,2578,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"I Love You, Alice B. Toklas!",1968,92,NA,6.2,447,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"I Love You, Baby",2000,103,NA,5.2,53,4.5,14.5,4.5,4.5,14.5,4.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"I Love You, Don't Touch Me!",1997,86,NA,5.7,205,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"I Love You, I Love You Not",1996,88,NA,5.3,627,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"I Love Your Work",2003,104,NA,4.6,104,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"I Love a Man in Uniform",1993,99,NA,6.2,197,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I Love a Mystery",1945,69,NA,6.5,15,0,0,0,0,24.5,24.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"I Love a Parade",1932,7,NA,5.7,9,0,0,0,0,34.5,44.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"I Love a Soldier",1944,106,NA,5.9,7,0,0,0,14.5,14.5,0,44.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"I Love to Singa",1936,8,NA,7.8,120,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"I Loved You",2000,102,NA,7,7,0,0,14.5,0,0,14.5,14.5,44.5,14.5,0,"",0,0,0,0,1,0,0 -"I Loved a Woman",1933,90,NA,4.6,24,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"I Married a Communist",1949,73,NA,5.3,91,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"I Married a Doctor",1936,83,NA,6.4,11,0,4.5,4.5,0,0,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"I Married a Monster from Outer Space",1958,78,175000,6.3,287,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"I Married a Strange Person!",1997,74,250000,6.2,391,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,1,1,1,0,0,0 -"I Married a Vampire",1986,85,NA,4,25,34.5,4.5,24.5,4.5,24.5,4.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"I Married a Witch",1942,77,NA,7.1,511,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"I Married a Woman",1958,85,NA,4.7,44,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"I Married an Angel",1942,84,NA,4.8,66,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"I Met Him in Paris",1937,86,NA,7.3,9,0,0,0,0,14.5,14.5,24.5,34.5,0,24.5,"",0,0,1,0,0,1,0 -"I Met My Love Again",1938,77,NA,5,14,0,0,0,24.5,4.5,24.5,24.5,24.5,0,4.5,"",0,0,0,0,0,1,0 -"I Met a Murderer",1939,63,NA,8.5,8,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"I Miss You, Hugs and Kisses",1978,88,NA,3.7,14,14.5,4.5,14.5,24.5,4.5,0,4.5,24.5,0,0,"",0,0,0,1,0,0,0 -"I Mobster",1958,81,NA,5.2,34,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"I Never",2003,22,40000,3.4,5,44.5,24.5,0,24.5,0,0,0,0,24.5,0,"",0,0,1,0,0,0,1 -"I Never Changes My Altitude",1937,6,NA,6.8,17,0,0,0,14.5,4.5,34.5,14.5,4.5,0,24.5,"",0,1,1,0,0,0,1 -"I Never Promised You a Rose Garden",1977,96,NA,6.1,198,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"I Never Sang for My Father",1970,92,NA,6.9,237,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I Only Arsked!",1958,82,NA,3.5,8,0,0,14.5,14.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"I Only Have Eyes for You",1937,6,NA,6.7,14,0,4.5,0,0,4.5,24.5,14.5,44.5,4.5,0,"",0,1,1,0,0,0,1 -"I Ought to Be in Pictures",1982,108,NA,5.6,161,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"I Passed for White",1960,93,NA,7.9,11,0,0,0,0,0,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"I Remember Mama",1948,134,NA,7.7,416,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"I Remember Me",2000,74,NA,7.3,23,0,0,4.5,0,14.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"I Sailed to Tahiti with an All Girl Crew",1968,95,NA,3.7,23,24.5,0,0,14.5,14.5,4.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"I Saw Mommy Kissing Santa Claus",2002,100,NA,5.4,78,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"I Saw What You Did",1965,82,NA,6.5,284,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"I See a Dark Stranger",1946,112,NA,7.5,99,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I Shot Andy Warhol",1996,103,NA,6.5,1584,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"I Shot Billy the Kid",1950,57,NA,5.4,5,0,0,0,0,44.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"I Shot Jesse James",1949,81,NA,6.8,70,0,4.5,0,4.5,4.5,24.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"I Shot a Man in Vegas",1995,86,NA,3.8,45,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"I Shout Love",2001,38,NA,7.5,72,4.5,4.5,4.5,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"I Spit on Your Corpse!",1974,92,NA,3.3,46,24.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"I Spy",2002,97,70000000,5.3,5521,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"I Still Know What You Did Last Summer",1998,100,24000000,4,9524,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"I Still Miss Someone",1999,18,NA,6,26,0,4.5,0,4.5,14.5,0,0,14.5,4.5,45.5,"",0,0,0,0,0,0,1 -"I Stole a Million",1939,80,NA,6.7,5,24.5,0,0,0,0,24.5,0,24.5,0,44.5,"",0,0,0,1,0,0,0 -"I Surrender Dear",1934,21,NA,6.1,7,0,0,0,14.5,14.5,14.5,45.5,0,0,0,"",0,0,1,0,0,0,1 -"I Take This Woman",1931,72,NA,6.2,11,0,0,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"I Take This Woman",1940,98,700000,5.1,52,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"I Taw a Putty Tat",1948,7,NA,7,47,4.5,0,0,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"I Thank You",1941,83,NA,6.1,13,0,0,0,4.5,4.5,24.5,24.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"I Thank a Fool",1962,100,NA,5.4,23,4.5,0,0,24.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"I Think I Cannes",1997,97,NA,6.2,35,45.5,4.5,0,0,0,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"I Think I Do",1997,90,NA,6.5,534,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"I Tremble Waiting",2002,20,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"I Used to Be a Filmmaker",2003,10,NA,8.1,8,0,0,0,14.5,0,0,0,34.5,45.5,0,"",0,0,0,0,0,0,1 -"I Wake Up Screaming",1941,82,NA,7.5,209,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"I Walk Alone",1948,97,NA,7.1,118,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Walk the Line",1970,95,4000000,6,211,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"I Walked with a Zombie",1943,69,NA,7.5,724,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I Wanna Be a Beauty Queen",1985,81,NA,4.6,17,14.5,4.5,14.5,0,0,14.5,14.5,4.5,0,34.5,"",0,0,0,0,1,0,0 -"I Wanna Be a Porn Star!",2002,45,NA,2,11,45.5,0,0,0,4.5,4.5,0,4.5,0,14.5,"",0,0,0,0,1,0,0 -"I Wanna Be a Sailor",1937,7,NA,6.3,11,4.5,0,0,0,14.5,0,14.5,44.5,0,4.5,"",0,1,1,0,0,0,1 -"I Wanna Hold Your Hand",1978,104,2700000,6.7,530,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"I Wanna Play House",1936,7,NA,5.7,5,0,0,0,0,24.5,64.5,0,0,0,24.5,"",0,1,1,0,0,0,1 -"I Want What I Want",1972,91,NA,5.4,32,0,4.5,4.5,14.5,24.5,14.5,14.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"I Want You",1951,102,NA,6.4,50,4.5,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I Want to Go Home",1989,100,NA,5.4,80,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"I Want to Live!",1958,120,NA,7.5,790,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I Wanted Wings",1941,131,NA,5.9,41,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Was Framed",1942,61,NA,4.6,10,0,0,24.5,14.5,64.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"I Was Happy Here",1965,91,NA,6.7,18,0,0,0,0,4.5,34.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"I Was Monty's Double",1958,99,NA,6.8,130,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"I Was Possessed by God",2000,30,NA,6.4,7,14.5,0,0,14.5,14.5,0,0,0,14.5,44.5,"",0,0,0,0,0,0,1 -"I Was a Communist for the FBI",1951,83,NA,5.7,55,14.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Was a Criminal",1945,71,NA,8,8,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,0,1,0,0,0 -"I Was a Jewish Sex Worker",1996,72,NA,4.1,16,24.5,0,0,4.5,0,14.5,0,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"I Was a Male War Bride",1949,103,NA,7.1,1156,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"I Was a Shoplifter",1950,82,NA,5.6,21,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I Was a Teenage Frankenstein",1957,74,NA,4.4,167,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"I Was a Teenage Intellectual",1999,16,NA,5.6,43,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"I Was a Teenage Serial Killer",1993,27,NA,4.6,15,34.5,0,0,14.5,0,34.5,0,0,4.5,14.5,"",0,0,1,0,0,0,1 -"I Was a Teenage Thumb",1963,7,NA,7.6,14,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"I Was a Teenage Werewolf",1957,76,82000,4.6,380,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"I Was a Teenage Zombie",1987,90,NA,3.1,99,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"I Was a Zombie for the F.B.I.",1982,105,NA,5.7,17,4.5,0,0,4.5,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"I Was an Adventuress",1940,81,NA,6.1,15,0,4.5,0,0,24.5,4.5,34.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"I Was an American Spy",1951,85,NA,5.2,14,4.5,4.5,0,4.5,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I Was on Mars",1992,87,NA,5.3,50,24.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"I Went Down",1997,107,NA,6.7,509,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"I Will, I Will... for Now",1976,107,NA,4.2,50,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"I Wish My Beer Was as Cold as Your Heart",2003,10,NA,9.2,6,0,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,1,0,0,0,1 -"I Wish You Love",1973,50,NA,9.4,8,0,0,0,0,0,0,24.5,24.5,0,45.5,"",0,0,0,0,0,0,0 -"I Witness",2003,95,NA,5.7,170,14.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"I Woke Up Early the Day I Died",1998,90,NA,4.9,162,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"I Won't Play",1944,18,NA,7.2,64,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,1 -"I Wonder Who's Killing Her Now",1975,87,NA,3.7,9,45.5,0,14.5,0,14.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"I Wonder Who's Kissing Her Now",1947,104,NA,6.7,31,0,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"I Wouldn't Be in Your Shoes",1948,70,NA,7.3,10,0,0,0,0,24.5,0,44.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"I Yam Lovesick",1938,8,NA,6.1,9,0,0,0,14.5,14.5,34.5,24.5,0,14.5,14.5,"",0,1,1,0,0,0,1 -"I Yam What I Yam",1933,6,NA,6.2,16,0,0,4.5,4.5,14.5,4.5,14.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"I dashur armik",2004,90,NA,8.6,8,0,0,0,14.5,0,0,0,24.5,14.5,45.5,"",0,0,0,1,0,0,0 -"I de gini na fovite ton andra",1965,105,NA,8.6,56,0,0,0,0,0,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"I doyde denyat",1973,86,NA,7,7,0,0,0,0,0,0,44.5,0,0,45.5,"",0,0,0,1,0,0,0 -"I dur och skur",1953,87,NA,4,7,0,0,44.5,24.5,24.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"I earini synaxis ton agrofylakon",1999,178,NA,5.9,54,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"I jomfruens tegn",1973,87,NA,5.3,31,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"I lagens namn",1986,87,NA,6.2,94,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"I morgen, min elskede",1971,101,NA,5.1,5,0,0,0,44.5,0,44.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"I na kamnyakh rastut derevya",1985,116,NA,4.7,17,4.5,0,4.5,14.5,4.5,0,4.5,44.5,4.5,14.5,"",0,0,0,1,0,0,0 -"I natt - eller aldrig",1941,85,NA,4.7,7,14.5,14.5,14.5,0,14.5,24.5,0,0,14.5,0,"",0,0,1,0,0,0,0 -"I nichego bolshe",1987,70,NA,8.3,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,0,0,0,0,0 -"I rollerna tre",1996,75,NA,4.9,7,14.5,0,0,14.5,14.5,14.5,14.5,0,0,24.5,"",0,0,0,0,1,0,0 -"I skuggan av solen",1996,58,NA,2.2,15,44.5,4.5,4.5,0,14.5,0,14.5,4.5,0,14.5,"",0,0,0,0,1,0,0 -"I slik en natt",1958,98,NA,6.4,17,14.5,4.5,4.5,14.5,4.5,0,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"I tvillingernes tegn",1975,97,NA,4.4,31,4.5,14.5,4.5,14.5,14.5,24.5,4.5,0,4.5,0,"",0,0,1,0,0,1,0 -"I tyrens tegn",1974,99,NA,4.6,58,4.5,14.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"I ungdommens makt",1980,101,NA,5.4,6,34.5,14.5,34.5,0,0,0,0,0,14.5,0,"",0,0,0,1,0,0,0 -"I zhizn, i slyozy, i lyubov...",1984,103,NA,7,6,0,0,0,14.5,0,0,0,45.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I'd Climb the Highest Mountain",1951,88,NA,6.5,61,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"I'd Love to Take Orders from You",1936,8,NA,6.7,7,0,0,0,0,24.5,14.5,24.5,0,0,24.5,"",0,1,1,0,0,0,1 -"I'd Rather Be Rich",1964,96,NA,6.1,92,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"I'll Be Glad When You're Dead You Rascal You",1932,7,NA,6.6,26,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"I'll Be Home for Christmas",1998,86,NA,4.8,675,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"I'll Be Seeing You",1945,85,3250000,6.8,130,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I'll Be Skiing Ya",1947,7,NA,5,5,0,0,0,24.5,24.5,0,24.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"I'll Be There",2003,109,NA,5.2,190,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,1,0,0,1,0 -"I'll Be Your Mirror",1996,50,NA,6.5,8,0,0,0,14.5,0,0,14.5,0,24.5,45.5,"",0,0,0,0,0,0,0 -"I'll Be Yours",1947,93,NA,5.9,27,4.5,0,0,14.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"I'll Bury You Tomorrow",2002,119,980000,6.7,41,14.5,4.5,4.5,4.5,0,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"I'll Cry Tomorrow",1955,117,NA,7.3,220,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"I'll Do Anything",1994,115,44000000,5.5,558,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"I'll Get By",1950,83,NA,6.8,11,0,0,0,4.5,4.5,4.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"I'll Love You Forever... Tonight",1992,88,NA,6,17,0,0,24.5,0,4.5,34.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"I'll Name the Murderer",1936,66,NA,6.2,8,0,0,14.5,14.5,0,14.5,45.5,0,0,14.5,"",0,0,0,1,0,0,0 -"I'll Never Crow Again",1941,7,NA,5.9,9,0,0,14.5,0,0,34.5,45.5,0,0,0,"",0,1,1,0,0,0,1 -"I'll Never Forget What's'isname",1967,97,NA,6.3,107,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"I'll Never Get Out of This World Alive",1993,89,NA,8.6,5,0,0,0,0,0,0,0,64.5,24.5,24.5,"",0,0,0,0,1,0,0 -"I'll Never Heil Again",1941,18,NA,8.2,76,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"I'll Remember April",1999,90,1800000,6.2,222,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"I'll See You in My Dreams",1951,110,NA,6.3,120,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"I'll See You in My Dreams",2003,20,NA,6.8,150,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"I'll Sleep When I'm Dead",2003,103,NA,5.8,761,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"I'll Take Romance",1937,90,NA,6.4,5,0,0,0,0,0,24.5,24.5,44.5,0,24.5,"",0,0,0,0,0,1,0 -"I'll Take Sweden",1965,97,NA,4.6,84,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"I'll Take You There",1999,93,NA,5.8,125,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"I'll Wait for You",1941,73,NA,5.4,14,4.5,0,4.5,0,24.5,14.5,24.5,0,4.5,14.5,"",0,0,0,1,0,1,0 -"I'm All Right Jack",1959,105,NA,7.5,441,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"I'm Almost Not Crazy: John Cassavetes - the Man and His Work",1984,60,NA,8.1,8,0,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"I'm Bobby",2004,32,NA,7.7,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,0,0,0,1 -"I'm Dancing as Fast as I Can",1982,107,NA,6.3,93,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I'm From Hollywood",1992,60,NA,7.2,144,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"I'm From the City",1938,66,NA,3.5,8,24.5,0,0,34.5,14.5,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"I'm Going to Be Famous",1983,96,NA,5.8,5,24.5,0,0,0,0,0,84.5,0,0,0,"",0,0,0,0,0,0,0 -"I'm Gonna Git You Sucka",1988,88,NA,6.2,2184,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"I'm Insured",1916,3,NA,6.2,22,0,0,4.5,4.5,4.5,34.5,24.5,14.5,0,4.5,"",0,1,0,0,0,0,1 -"I'm Just Wild About Jerry",1965,6,NA,4.5,21,4.5,0,4.5,24.5,24.5,0,24.5,0,0,4.5,"",0,1,1,0,0,0,1 -"I'm Losing You",1998,100,NA,5.2,124,4.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"I'm Mad",1994,5,NA,5.7,45,4.5,0,4.5,4.5,4.5,4.5,0,4.5,4.5,64.5,"",0,1,1,0,0,0,1 -"I'm Much Obliged",1936,22,NA,4.5,8,24.5,24.5,0,0,0,14.5,0,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"I'm No Angel",1933,87,225000,7.1,306,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"I'm No Fool Having Fun",1956,8,NA,6,9,24.5,0,0,24.5,14.5,0,24.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"I'm No Fool as a Pedestrian",1956,8,NA,6.6,9,0,0,0,0,14.5,34.5,34.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"I'm No Fool in Water",1956,8,NA,6.8,11,4.5,0,0,0,4.5,14.5,44.5,4.5,0,4.5,"",0,1,0,0,0,0,1 -"I'm No Fool with Electricity",1970,10,NA,7.3,11,4.5,0,0,4.5,0,24.5,24.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"I'm No Fool with Fire",1955,8,NA,6.3,11,0,0,0,14.5,14.5,4.5,34.5,4.5,0,4.5,"",0,1,0,0,0,0,1 -"I'm No Fool with a Bicycle",1955,8,NA,6.8,7,0,0,0,0,14.5,14.5,24.5,14.5,0,24.5,"",0,1,0,0,0,0,1 -"I'm Not Feeling Myself Tonight",1976,84,NA,3.2,5,24.5,0,44.5,24.5,24.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"I'm Not Rappaport",1996,135,NA,6.4,356,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"I'm Still Alive",1940,72,NA,5.6,13,0,0,0,14.5,44.5,34.5,4.5,0,0,0,"",0,0,0,1,0,1,0 -"I'm Watching You",1997,92,NA,5.4,50,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"I'm Your Man",1996,5,NA,8.4,10,0,0,24.5,0,14.5,0,24.5,24.5,0,34.5,"",0,1,0,0,0,0,1 -"I'm a Big Shot Now",1936,7,NA,5.3,7,0,0,0,0,45.5,14.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"I'm a Monkey's Uncle",1948,16,NA,7.1,43,0,0,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"I'm a Stranger Here Myself",1974,60,NA,8.2,9,14.5,0,0,0,0,24.5,14.5,0,14.5,44.5,"",0,0,0,0,1,0,0 -"I'm in the Army Now",1936,6,NA,5.5,18,0,0,14.5,24.5,4.5,24.5,14.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"I'm on Fire",1999,4,NA,5.1,13,0,0,0,14.5,24.5,14.5,0,0,4.5,34.5,"",0,0,0,0,0,0,1 -"I'm the One That I Want",2000,96,NA,7.2,493,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"I'm with Lucy",2002,90,15000000,6.2,646,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"I've Always Loved You",1946,117,NA,5.5,24,0,14.5,4.5,0,14.5,4.5,0,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"I've Got Your Number",1934,69,NA,6.1,30,0,4.5,4.5,14.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"I've Gotta Horse",1965,92,NA,3.1,7,14.5,14.5,14.5,0,0,14.5,0,14.5,0,24.5,"",0,0,1,0,0,0,0 -"I've Heard the Mermaids Singing",1987,81,NA,6.9,394,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"I've Lived Before",1956,82,NA,4.8,15,0,0,4.5,24.5,14.5,24.5,4.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"I, Claudia",2004,75,NA,6.9,12,0,0,0,14.5,0,14.5,34.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"I, Madman",1989,89,NA,6,234,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"I, Monster",1971,75,NA,5.2,104,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"I, Robot",2004,115,105000000,7,22330,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",1,0,0,0,0,0,0 -"I, Zombie: A Chronicle of Pain",1998,79,NA,4.9,120,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"I, a Man",1967,99,NA,5.3,11,4.5,0,0,4.5,4.5,14.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"I, an Actress",1977,10,NA,4.2,6,0,0,34.5,0,34.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"I, the Jury",1953,87,NA,5.8,27,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"I, the Jury",1982,111,NA,5.5,226,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"I-Ski Love-Ski You-Ski",1936,6,NA,7.1,13,0,0,0,14.5,0,24.5,14.5,4.5,0,34.5,"",0,1,1,0,0,0,1 -"I...",1995,35,NA,8.8,5,24.5,0,0,0,0,0,0,0,64.5,24.5,"",0,0,0,0,0,0,1 -"I... Dreaming",1988,8,NA,6.1,42,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"I... Proud to Be an Indian",2004,129,NA,6.6,24,14.5,0,0,0,4.5,14.5,24.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"I... comme Icare",1979,120,NA,8.4,461,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"I.D.",1995,107,NA,7.1,598,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"I.F. Stone's Weekly",1973,62,NA,8.9,9,0,0,0,14.5,0,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"I.K.U.",2000,73,NA,4.2,90,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"I.Q.",1994,100,NA,6,4987,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"I.T. - Immatriculation temporaire",2001,78,NA,6.3,5,0,0,0,24.5,0,44.5,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"ID Swiss",1999,91,NA,5.8,13,0,0,0,0,24.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"IJssalon, De",1985,92,NA,6.9,26,0,0,4.5,0,4.5,34.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"IMAX Nutcracker, The",1997,37,NA,5.6,19,34.5,4.5,4.5,4.5,0,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"IXE-13",1972,115,NA,6.1,52,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Iacob",1988,117,NA,7.4,19,4.5,0,0,0,0,4.5,0,14.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Iarna bobocilor",1977,91,NA,9.5,8,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Ibis rouge, L'",1975,90,NA,6.3,23,0,0,4.5,4.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Ibun sarutobi sasuke",1965,99,NA,6.6,33,0,0,4.5,4.5,4.5,14.5,44.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Icarus Descending",1998,80,NA,9.3,12,0,0,0,0,0,0,4.5,4.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Icarus of Pittsburgh",2002,10,NA,7.6,5,0,0,0,0,0,24.5,0,64.5,24.5,0,"",0,0,1,0,1,0,1 -"Ice",1970,130,NA,4.8,24,0,14.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ice",1994,91,NA,3.7,96,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ice Age",2002,81,60000000,7.3,22302,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,1,1,0,0,0,0 -"Ice Castles",1978,108,NA,5.6,511,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ice Cold",2002,26,NA,4.3,8,24.5,0,0,0,14.5,14.5,34.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Ice Cream Man",1995,84,2000000,4.2,349,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Ice Cream Sundae",2001,12,NA,8,5,24.5,0,0,0,0,0,0,44.5,44.5,0,"",0,0,0,0,0,0,1 -"Ice Follies of 1939, The",1939,82,NA,5.1,73,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ice From the Sun",1999,120,NA,4.5,75,14.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ice Palace",1960,143,NA,5.6,66,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ice Pawn",1989,102,NA,1.6,11,45.5,14.5,4.5,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Ice Pirates, The",1984,91,9000000,4.9,1426,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Ice Planet",2001,83,NA,3.6,174,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ice Princess",2005,92,NA,5.7,449,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Ice Runner, The",1993,110,NA,4.4,54,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ice Station Zebra",1968,148,NA,6.3,1246,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ice Storm, The",1997,112,18000000,7.5,13115,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Ice cream fi Glim",1992,120,NA,4,15,4.5,24.5,4.5,4.5,4.5,4.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Ice-Capades Revue",1942,67,NA,6.9,5,0,0,0,0,0,64.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Ice-Cold in Alex",1958,124,NA,7.7,494,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"IceMaker",2003,92,NA,5.8,74,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,44.5,"R",1,0,1,0,0,0,0 -"Icebreaker",1999,90,NA,4.2,240,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Iced",1988,86,NA,3.8,24,24.5,24.5,4.5,24.5,14.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Iceland",1942,79,NA,5.6,32,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Iceman",1984,100,NA,6,880,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Iceman Cometh, The",1973,239,NA,7.5,203,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Iceman Ducketh, The",1964,7,NA,6.7,30,0,4.5,4.5,0,24.5,14.5,24.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Ich Chef, Du Turnschuh",1998,92,NA,4.8,19,14.5,14.5,0,14.5,0,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ich begehre dich",1994,91,NA,2.4,6,45.5,0,0,14.5,0,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Ich bin ein Elefant, Madame",1969,100,NA,8.1,13,4.5,0,0,0,0,0,4.5,44.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Ich bin meine eigene Frau",1992,90,NA,8.5,48,4.5,0,0,0,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,1,1,0,0 -"Ich denk', mich tritt ein Pferd",1975,91,NA,1.8,10,74.5,34.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Ich denke oft an Piroschka",1955,92,NA,6.9,94,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Ich gelobe",1994,115,NA,6,44,4.5,4.5,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ich hiess Sabina Spielrein",2002,90,NA,5.5,24,0,0,14.5,4.5,4.5,34.5,14.5,14.5,14.5,0,"",0,0,0,0,1,0,0 -"Ich kenn keinen - Allein unter Heteros",2003,100,NA,8.3,53,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Ich klage an",1941,110,NA,6,16,4.5,0,0,0,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ich sehe was, was Du nicht siehst...",2005,15,NA,3.8,6,34.5,34.5,0,0,0,0,14.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Ich und Christine",1993,90,NA,3,20,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,0,24.5,"",0,0,0,0,0,1,0 -"Ich und Er",1988,93,NA,4,129,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ich und das Universum",2003,14,NA,7.4,10,0,0,0,0,0,14.5,44.5,44.5,14.5,0,"",0,0,0,0,0,0,1 -"Ich und die Kaiserin",1933,82,NA,7.1,15,4.5,4.5,0,4.5,0,24.5,34.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Ich vertraue Dir meine Frau an",1943,86,NA,4.9,16,0,0,14.5,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ichiban utsukushiku",1944,85,NA,5.5,56,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ici et ailleurs",1976,60,NA,6.8,26,4.5,0,0,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Ico, el caballito valiente",1981,85,NA,6.3,14,0,0,0,4.5,0,14.5,4.5,24.5,4.5,44.5,"",0,1,1,0,0,0,0 -"Idade Maior, A",1991,118,NA,4.1,18,4.5,4.5,4.5,0,24.5,4.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Idade da Terra, A",1980,140,NA,4.3,21,14.5,0,0,14.5,0,4.5,14.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Idaho",1943,70,NA,5.8,10,0,0,0,14.5,44.5,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Idaho Kid, The",1936,59,NA,5.3,5,0,0,0,24.5,0,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Idaho Transfer",1973,86,NA,5.3,64,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ideaalmaastik",1980,91,NA,4.4,9,0,0,24.5,0,0,0,0,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Ideal Husband, An",1947,96,NA,6.4,36,4.5,0,4.5,0,4.5,34.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ideal Husband, An",1998,90,NA,7.3,51,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Ideal Husband, An",1999,97,14000000,7,4584,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Idealist",1976,122,NA,9.2,30,4.5,0,0,4.5,4.5,0,4.5,4.5,4.5,84.5,"",0,0,0,1,0,0,0 -"Idealnyy muzh",1980,93,NA,8.7,6,0,0,0,0,0,14.5,14.5,0,14.5,45.5,"",0,0,1,0,0,0,0 -"Idemo dalje",1982,98,NA,6.1,15,14.5,0,0,4.5,0,4.5,24.5,24.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Ident",1989,5,NA,6.3,43,0,4.5,0,14.5,14.5,14.5,4.5,24.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Identificazione di una donna",1982,128,NA,7.4,175,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Identikit",1974,105,NA,3.9,47,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Identity",2003,90,30000000,7.3,18747,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Identity Crisis",1989,90,NA,2.2,115,84.5,4.5,4.5,4.5,4.5,0,0,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Identity Kills",2003,81,NA,5.2,28,4.5,0,0,14.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Identity Unknown",1945,71,NA,7.4,5,0,0,0,24.5,24.5,0,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Idi Amin Dada",1974,90,NA,7.4,125,0,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Idi i smotri",1985,140,NA,7.9,1121,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Idi mi, dodji mi",1983,92,NA,4.7,11,0,14.5,0,0,24.5,0,0,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Idiot",1958,122,NA,8.4,34,0,0,0,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Idiot Box",1996,83,NA,6,229,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Idiot's Delight",1939,107,NA,6.2,181,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Idiot, L'",1946,98,NA,7.1,28,0,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Idioterne",1998,117,NA,6.6,4409,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Idiots Deluxe",1945,18,NA,7.8,56,0,0,4.5,0,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Idle Class, The",1921,29,NA,7.3,316,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Idle Hands",1999,92,20000000,5.4,5892,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Idle Rich, The",1929,80,NA,7.2,7,0,0,0,0,44.5,0,14.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Idle Roomers",1944,17,NA,7.3,56,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Idle on Parade",1959,88,NA,8.5,8,0,0,0,0,0,24.5,14.5,0,14.5,45.5,"",0,0,1,0,0,0,0 -"Ido zero daisakusen",1969,99,NA,5,50,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Idol Dancer, The",1920,104,NA,4,6,0,0,34.5,34.5,34.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Idol Eyes",1990,65,NA,6.9,23,4.5,0,4.5,4.5,0,0,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Idol of the Crowds",1937,60,NA,3.7,23,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Idol, The",1966,109,NA,4.5,14,0,0,4.5,24.5,14.5,24.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Idole, L'",2002,110,NA,5.6,129,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Idoles, Les",1968,105,NA,5.7,10,0,0,14.5,0,24.5,24.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Idolmaker, The",1980,119,NA,6,239,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Iedereen beroemd!",2000,97,NA,7.1,1120,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Iena, La",1997,91,NA,3.4,8,0,34.5,14.5,0,24.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Ieri, oggi, domani",1963,119,NA,7.3,284,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"If",2003,88,NA,9.2,15,4.5,4.5,0,14.5,14.5,4.5,0,0,14.5,44.5,"",0,0,0,0,0,0,0 -"If Ever I See You Again",1978,105,NA,3.4,56,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"If Every Girl Had a Diary",1990,6,NA,6.7,12,4.5,4.5,0,0,4.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"If He Hollers, Let Him Go!",1968,106,NA,5.3,17,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"If I Die Before I Wake",1998,87,NA,4.6,101,14.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"If I Forget You",1940,3,NA,7.8,13,0,4.5,0,0,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"If I Had My Way",1940,82,NA,6.6,7,0,0,0,0,0,44.5,14.5,0,24.5,14.5,"",0,0,1,0,0,0,0 -"If I Had a Million",1932,88,NA,7.4,244,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"If I Should Fall From Grace: The Shane MacGowan Story",2001,91,NA,7.4,62,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,0,1,0,0 -"If I Were Free",1933,66,NA,6.3,26,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"If I Were King",1938,101,NA,7.3,127,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"If I'm Lucky",1946,78,NA,7.1,13,0,0,4.5,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"If It's Tuesday, This Must Be Belgium",1969,99,NA,5.8,243,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"If Looks Could Kill",1991,88,NA,5.2,1013,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"If Lucy Fell",1996,93,NA,5,1053,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"If My Mother Only Knew",1985,82,NA,5.6,11,0,4.5,4.5,0,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"If On a Winter's Night",1999,13,NA,4.6,16,4.5,14.5,0,4.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"If Only",2004,93,NA,6.2,339,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,1,1,0,1,0 -"If Winter Comes",1947,97,NA,5.3,41,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"If You Could Only Cook",1935,75,NA,6.2,23,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"If You Could See What I Hear",1982,103,NA,6,251,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"If You Don't Stop It... You'll Go Blind!!!",1975,80,NA,3.6,27,14.5,4.5,14.5,4.5,14.5,14.5,14.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"If You Knew Susie",1948,90,NA,6,45,4.5,0,0,4.5,24.5,24.5,4.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"If You Love This Planet",1982,26,NA,7.2,21,4.5,4.5,0,4.5,0,0,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,1 -"If You Loved Me...",1997,14,NA,4.5,10,0,0,14.5,34.5,44.5,14.5,0,0,14.5,0,"",0,0,1,0,0,0,1 -"If You Only Knew",2000,107,NA,5.4,265,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"If a Body Meets a Body",1945,18,NA,7.5,62,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"If a Man Answers",1962,102,NA,5.8,140,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"If... Dog... Rabbit...",1999,108,NA,5.4,180,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"If....",1968,111,NA,7.6,1828,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Iga ninpoucho",1982,95,NA,5.1,57,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",1,0,0,1,0,1,0 -"Igazi Mao, Az",1994,55,NA,9.6,16,0,0,0,0,0,0,0,14.5,4.5,74.5,"",0,0,0,0,1,0,0 -"Igby Goes Down",2002,99,9000000,7.1,7958,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Igla",1988,83,NA,7.7,72,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Igmanski mars",1983,97,NA,5.3,11,14.5,0,4.5,0,14.5,4.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Ignace",1937,102,NA,5.8,10,0,0,14.5,14.5,24.5,14.5,44.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Ignition",2001,96,NA,5,226,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"R",1,0,0,1,0,0,0 -"Igor and the Lunatics",1985,82,NA,1.9,65,34.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Igra na milliony",1991,96,NA,8.8,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Igra voobrazheniya",1995,90,NA,2.3,5,44.5,0,0,0,0,24.5,0,44.5,0,0,"",0,0,1,0,0,1,0 -"Igry motylkov",2004,105,1200000,7.3,23,14.5,0,0,4.5,0,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Iguana",1988,97,NA,3.5,31,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Ihmemies",1979,103,NA,5,6,14.5,0,14.5,34.5,0,0,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Ihmiselon ihanuus ja kurjuus",1988,96,NA,6.2,11,0,0,0,4.5,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Ihr 106. Geburtstag",1958,98,NA,5,11,4.5,0,0,4.5,4.5,44.5,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Ihre Hoheit befiehlt",1931,96,NA,8.9,5,0,24.5,0,0,0,24.5,0,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Ijintachi tono natsu",1988,115,NA,8,19,0,0,0,4.5,0,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Ik ben Joep Meloen",1981,95,NA,4.9,104,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ik beweeg, dus ik besta",1998,8,NA,6.4,8,14.5,0,24.5,0,14.5,0,14.5,24.5,14.5,0,"",0,1,0,0,0,0,1 -"Ik ga naar Tahiti",1992,59,NA,8,7,0,0,0,0,0,14.5,0,45.5,24.5,0,"",0,0,0,1,0,0,0 -"Ik kom wat later naar Madra",1965,26,NA,7.1,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,1 -"Ik ook van jou",2001,99,NA,5.9,550,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Ikarie XB 1",1963,81,NA,5.9,41,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ikaw lang",1993,105,NA,6.9,6,0,0,0,0,14.5,0,14.5,14.5,0,45.5,"",1,0,0,1,0,0,0 -"Ikenie fujin",1974,71,NA,6.5,18,0,0,0,4.5,24.5,24.5,14.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Iki Kadin",1992,132,NA,5.6,77,4.5,0,4.5,4.5,34.5,34.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ikimono no kiroku",1955,103,NA,7,233,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ikinai",1998,101,NA,7.1,102,0,0,4.5,4.5,4.5,14.5,14.5,44.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Ikiru",1952,140,NA,8.4,4113,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Ikke naken",2004,94,NA,4.9,59,24.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Iko shashvi mgalobeli",1970,85,NA,7.3,53,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Il est plus facile pour un chameau...",2003,116,NA,5.1,235,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Il faut tuer Birgit Haas",1981,105,NA,6.5,41,0,0,4.5,0,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Il faut vivre dangereusement",1975,105,NA,4.7,12,0,4.5,4.5,34.5,44.5,0,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Il pleut sur Santiago",1976,112,NA,4.9,31,0,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Il suffit d'aimer",1960,90,NA,5.4,7,14.5,0,14.5,0,24.5,24.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Il y a des jours... et des lunes",1990,117,NA,5.4,121,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Il y a maldonne",1988,82,NA,3.7,5,0,24.5,24.5,44.5,24.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Ilaaka",1989,161,NA,7.8,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",1,0,0,0,0,0,0 -"Ilegal",2003,107,NA,5.6,11,14.5,0,4.5,14.5,0,4.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Ilegal, La",1979,102,NA,5.6,16,14.5,4.5,0,4.5,4.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ilha das Flores",1989,13,NA,8.9,328,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,1,0,1 -"Ilha dos Amores, A",1982,100,NA,8,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Ilha dos Paqueras, A",1966,105,NA,5.6,13,14.5,4.5,0,4.5,0,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ilha dos Prazeres Proibidos, A",1979,85,NA,4.1,9,14.5,24.5,0,0,0,24.5,0,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Ilias tou 16ou, O",1959,84,NA,9,49,0,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Iligos, O",1969,84,NA,7.8,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Ill Fated",2004,96,NA,5.3,27,0,0,4.5,4.5,0,4.5,4.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Ill Gotten Gains",1997,101,NA,2.3,31,44.5,4.5,4.5,4.5,4.5,4.5,4.5,0,0,24.5,"R",0,0,0,1,0,0,0 -"Ill Met by Moonlight",1957,93,NA,6.7,152,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Illegal",1932,71,NA,5.2,13,0,0,4.5,34.5,24.5,4.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Illegal",1955,88,NA,6.8,35,4.5,0,0,4.5,4.5,34.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Illegal Entry",1949,84,NA,7.7,7,0,0,0,0,0,0,24.5,74.5,0,0,"",1,0,0,1,0,0,0 -"Illegal in Blue",1995,91,NA,3.9,173,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Illegally Yours",1988,102,NA,3.9,168,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Illicit",1931,79,NA,5.4,48,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Illicit Behavior",1992,101,NA,4.6,68,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Illicit Dreams",1995,93,NA,3.5,115,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Illicit Dreams 2",1998,85,NA,3.1,39,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Illicit Lovers",2000,93,NA,2.8,78,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,1,1,0,0,0 -"Illtown",1996,103,NA,4.9,172,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Illuminata",1998,119,NA,5.7,552,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Illumination",2004,135,NA,7.2,19,0,4.5,0,4.5,0,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Illusion",1975,12,NA,6.9,6,0,0,0,0,0,14.5,0,34.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Illusion",2004,106,NA,4.9,22,4.5,0,4.5,0,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Illusioner",1994,94,NA,5.4,20,0,4.5,4.5,14.5,24.5,44.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Illusionist, De",1984,90,NA,7.2,112,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Illusions",1982,34,NA,7.5,23,0,0,4.5,0,4.5,4.5,24.5,4.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Illusions of Sin",1997,88,NA,1.3,19,34.5,34.5,4.5,14.5,0,0,0,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Illustrated Man, The",1969,103,NA,5.5,438,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ils sont fous ces sorciers",1978,100,NA,4.5,26,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Ils sont grands, ces petits",1979,95,NA,3.4,12,4.5,4.5,24.5,4.5,0,14.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Ilsa, Harem Keeper of the Oil Sheiks",1976,93,NA,5.2,248,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ilsa, She Wolf of the SS",1975,96,NA,4.6,583,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Iluminacja",1973,87,NA,7.5,44,0,0,0,0,0,14.5,4.5,4.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Iluzija",2004,107,NA,7.6,27,0,0,0,0,0,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Ilya Muromets",1956,83,NA,3.9,100,14.5,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Im Anfang war der Blick",2002,45,NA,6.3,6,0,14.5,14.5,0,0,0,14.5,14.5,34.5,0,"",0,1,0,1,0,0,0 -"Im Banne des Unheimlichen",1968,90,NA,5.3,32,0,0,0,24.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Im Dschungel ist der Teufel los",1982,90,NA,4.7,10,44.5,0,0,14.5,0,34.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Im Hukim",1998,29,NA,4,5,0,0,0,64.5,0,0,0,24.5,0,24.5,"",0,0,0,1,0,0,1 -"Im Innern des Wals",1985,97,NA,6,9,0,0,0,14.5,24.5,14.5,34.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Im Juli.",2000,98,NA,7.8,1508,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Im Lauf der Zeit",1976,176,NA,8.2,341,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Im Namen der Unschuld",1997,93,NA,4.9,13,14.5,0,0,0,0,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Im Nordwind",2004,95,NA,7.4,7,0,0,0,14.5,0,14.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Im Schallplattenladen",1934,19,NA,8.2,12,0,0,0,0,0,0,14.5,44.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Im Spiegel der Maya Deren",2002,103,NA,7.7,41,0,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Im Stahlnetz des Dr. Mabuse",1961,89,NA,3.4,52,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Im Westen alles nach Plan",1990,105,NA,9,11,0,0,0,0,0,0,4.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Ima, ai ni yukimasu",2004,119,NA,8.6,40,4.5,0,0,4.5,4.5,0,0,4.5,14.5,74.5,"",0,0,0,1,0,1,0 -"Image of Bruce Lee",1978,91,NA,4.6,29,4.5,0,4.5,24.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Imagemaker, The",1986,93,NA,4.8,17,0,4.5,4.5,34.5,14.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Imagen latente",1988,92,NA,1.8,10,34.5,0,0,0,0,24.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Images From the Ghajar Dynasty",1993,18,NA,7.1,9,0,0,0,0,24.5,0,14.5,34.5,34.5,0,"",0,0,0,0,0,0,1 -"Images noires",1982,20,NA,5.2,6,0,0,0,14.5,14.5,14.5,45.5,0,0,0,"",0,0,0,0,0,0,1 -"Images of a Dictatorship",1999,56,NA,8.4,7,0,0,0,0,0,0,0,24.5,45.5,14.5,"",0,0,0,0,1,0,0 -"Images pour vivre",1991,10,NA,8.1,6,0,0,0,0,14.5,0,34.5,34.5,14.5,0,"",0,0,0,0,0,0,1 -"Imaginary Crimes",1994,107,NA,6,442,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Imaginary Girls",2004,30,8000,7.6,7,14.5,14.5,0,0,0,0,0,0,0,74.5,"",0,0,0,1,0,0,1 -"Imaginary Heroes",2004,112,10000000,7,411,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Imaginary Lovers",1986,75,NA,6.1,5,64.5,0,24.5,0,0,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Imaginary Witness: Hollywood and the Holocaust",2004,92,NA,7.2,66,4.5,0,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Imagine",1973,70,NA,6.9,53,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Imagine the Sound",1981,91,NA,7.2,13,4.5,0,4.5,0,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Imagine: John Lennon",1988,100,NA,7.6,592,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Imagining Argentina",2003,107,NA,5.9,281,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Imago",2001,105,NA,4.7,8,0,14.5,14.5,14.5,0,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Imam dvije mame i dva tate",1968,89,NA,8.7,13,0,0,0,0,0,14.5,0,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Imbalsamatore, L'",2002,104,NA,6.7,232,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Imbarco a mezzanotte",1951,82,NA,5.5,7,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Imbroglioni, Gli",1963,98,NA,6.2,6,14.5,0,0,14.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Imelda",2003,103,NA,7.3,65,4.5,0,0,0,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Imi Hageneralit",1979,100,NA,4.6,6,0,34.5,14.5,0,0,14.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Imitation General",1958,88,NA,6.1,86,0,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Imitation of Christ",1967,480,NA,4.4,5,44.5,0,0,0,44.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Imitation of Life",1934,111,NA,7.5,346,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Imitation of Life",1959,125,2000000,7.4,1483,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Imitations of Life",2003,75,NA,7.1,9,0,0,0,0,0,0,34.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Imma youjo II",1995,47,NA,6.4,6,0,0,0,14.5,0,34.5,34.5,14.5,0,0,"",0,1,0,1,0,0,0 -"Immacolata e concetta - l'altra gelosia",1979,95,NA,6.7,13,0,0,0,0,4.5,34.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Immaculate Conception",1992,120,NA,4.2,18,14.5,4.5,0,4.5,14.5,0,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Immagini di un convento",1979,82,NA,5.4,18,0,0,0,14.5,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Immediate Family",1989,95,NA,5.8,315,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Immensee",1943,89,NA,5.2,24,14.5,4.5,4.5,4.5,14.5,0,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Immer die Radfahrer",1958,97,NA,5.2,57,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Immigrant Garden, The",2001,104,NA,8.2,27,4.5,4.5,0,4.5,0,0,4.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Immigrant, The",1915,60,NA,8,9,14.5,0,0,0,0,0,24.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Immigrant, The",1917,30,NA,7.9,522,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Immoral Mr. Teas, The",1959,63,24000,3.7,89,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Immorale, L'",1967,97,NA,4.1,10,0,14.5,34.5,0,14.5,14.5,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Immorale, L'",1980,85,NA,6.2,7,0,24.5,0,0,14.5,14.5,24.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Immortal Beloved",1994,120,NA,7.1,3932,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Immortal Combat",1994,109,NA,3.7,66,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Immortal Sergeant",1943,91,NA,6.6,48,0,0,0,4.5,14.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Immortal Story, The",1968,58,NA,6.9,186,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Immortals, The",1995,98,NA,5.8,321,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Immortel (ad vitam)",2004,102,NA,5.9,1651,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Imortais, Os",2003,130,NA,7.8,196,4.5,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Impact",1949,111,NA,7.1,181,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Impatient Maiden",1932,72,NA,6.3,12,0,0,0,4.5,0,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Impatient Patient, The",1942,8,NA,7,25,0,4.5,0,4.5,4.5,14.5,34.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Impatient Years, The",1944,91,600000,6.8,8,0,0,0,0,34.5,0,34.5,24.5,0,0,"",0,0,1,1,0,1,0 -"Impatto mortale",1984,77,NA,4,18,4.5,0,24.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Imperativ",1982,96,NA,6,22,0,0,0,0,14.5,24.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Imperatore di Capri, L'",1949,90,NA,8,20,0,0,0,0,14.5,14.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Imperfect Lady, The",1947,97,NA,6,5,0,0,24.5,0,0,24.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Imperio de la fortuna, El",1986,130,NA,7.4,40,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Impiegati",1984,98,NA,6,20,0,0,0,14.5,24.5,24.5,24.5,4.5,14.5,0,"",0,0,1,1,0,0,0 -"Impiegato, L'",1960,95,NA,7,9,0,0,0,0,0,14.5,45.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Implicated",1998,91,NA,4,114,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Imploding Self: A Journey Through the Life of Fergus McLafferty, The",1995,14,NA,5.3,6,14.5,0,0,0,34.5,0,45.5,0,0,0,"",0,0,0,0,0,0,1 -"Impolite",1992,98,NA,5.3,13,14.5,0,0,4.5,14.5,0,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Importance of Being Earnest, The",1952,95,NA,7.4,885,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Importance of Being Earnest, The",2002,97,15000000,6.8,3598,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,1,0,1,0 -"Importance of Being Icelandic, The",1998,42,NA,4.8,5,44.5,0,0,24.5,0,0,0,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Important Business",1944,11,NA,4.3,9,0,0,14.5,24.5,45.5,0,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Important News",1936,10,NA,6.3,46,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Important c'est d'aimer, L'",1975,105,NA,6.9,218,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Impossible Elephant, The",2001,95,NA,5.1,35,4.5,4.5,4.5,14.5,14.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Impossible Kid, The",1982,81,NA,7.8,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",1,0,0,0,0,0,0 -"Impossible Monsieur Pipelet, L'",1955,87,NA,5.7,12,0,4.5,0,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Impossible Possum, The",1954,6,NA,5.5,7,0,0,0,24.5,0,24.5,0,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Impossible Years, The",1968,92,NA,4.8,99,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Impostor",2002,102,40000000,5.8,3292,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Impostor, The",1944,92,NA,6.1,16,0,0,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Impostors",1980,110,NA,4.3,5,0,0,0,24.5,0,24.5,24.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Impostors, The",1998,101,NA,6.1,1645,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Impotent",2001,75,NA,1.8,16,44.5,14.5,14.5,4.5,4.5,0,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Impractical Joker, The",1937,7,NA,5.6,25,0,0,0,34.5,4.5,34.5,4.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Impressionen unter Wasser",2002,45,NA,4.7,56,14.5,0,0,0,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Impressions de France",1982,18,NA,8.4,33,4.5,0,4.5,0,0,0,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Impressions de la haute Mongolie",1976,70,NA,6.6,5,24.5,0,0,0,0,0,24.5,44.5,24.5,0,"",0,0,0,0,1,0,0 -"Impromptu",1991,107,NA,7.1,1007,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Improper Channels",1981,92,NA,5.3,27,0,0,14.5,14.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Improper Conduct",1994,93,NA,3.6,43,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Impulse",1974,82,NA,3.9,47,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Impulse",1984,91,NA,5,179,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Impulse",1990,109,NA,5.6,296,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Impulsos",2002,91,NA,5,24,0,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Impure Thoughts",1985,87,NA,5.5,21,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"In & Out",1997,92,35000000,6.2,10352,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"In Absentia",2000,20,NA,7.3,41,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"In Advance of the Landing",1993,90,NA,5.2,12,0,14.5,4.5,4.5,0,0,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"In America",2002,105,NA,8.1,8371,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,1,0 -"In Caliente",1935,84,NA,6,24,0,0,0,4.5,24.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"In Camera",2001,86,NA,4.8,7,24.5,14.5,0,0,0,0,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"In Celebration",1975,131,NA,6.6,52,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"In Cold Blood",1967,129,3500000,8,2406,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"In Country",1989,120,NA,5.6,544,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"In Crowd, The",1988,95,NA,5.1,176,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"In Crowd, The",2000,104,15000000,4,1342,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"In Custody",1993,126,NA,6.5,52,4.5,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"In Dangerous Company",1988,92,NA,4,13,24.5,4.5,4.5,24.5,24.5,4.5,0,0,4.5,0,"",0,0,0,1,0,0,0 -"In Dreams",1999,98,30000000,5.3,3652,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"In Dutch",1946,7,NA,7.4,13,0,0,0,0,24.5,24.5,14.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"In Enemy Country",1968,107,NA,6,17,0,0,0,4.5,24.5,14.5,34.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"In Enemy Hands",2004,94,NA,6.2,345,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"In Fading Light",1989,103,NA,8.6,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"In Fast Company",1946,63,NA,6.7,28,4.5,0,0,0,14.5,14.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"In Flagrante",2000,71,NA,8.9,9,0,0,0,0,0,0,0,45.5,0,44.5,"",0,0,0,0,0,0,0 -"In Gay Madrid",1930,82,NA,3.6,18,14.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,14.5,0,"",0,0,0,1,0,1,0 -"In God We Tru$t",1980,97,NA,4.6,166,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"In God We Trust",2000,17,NA,8.1,142,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,34.5,"",0,0,1,0,0,0,1 -"In God's Hands",1998,96,NA,4.4,354,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"PG-13",1,0,0,1,0,0,0 -"In Gold We Trust",1991,89,NA,4.1,16,14.5,0,24.5,14.5,14.5,14.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"In Good Company",2004,109,NA,7.1,4404,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"In Good Conscience: Sister Jeannine Gramick's Journey of Faith",2004,82,NA,9,9,0,0,0,0,14.5,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"In Harm's Way",1965,165,NA,7,1198,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"In Heaven",1998,102,NA,5.8,12,0,0,0,14.5,4.5,34.5,0,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"In Heaven There Is No Beer?",1984,50,NA,6.3,12,0,0,0,0,14.5,0,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"In Her Defense",1998,94,NA,4.6,84,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"In Justice",2004,77,NA,8.8,5,0,0,0,0,24.5,0,0,0,24.5,64.5,"",0,0,0,1,0,0,0 -"In Like Flint",1967,114,NA,5.9,935,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"In Love",1983,96,NA,4,14,0,14.5,4.5,14.5,0,14.5,4.5,0,4.5,34.5,"",0,0,0,0,0,1,0 -"In Love and War",1958,111,NA,5.9,60,0,0,0,14.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"In Love and War",1996,113,NA,5.6,1792,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"In My Father's Den",2004,126,NA,8.2,350,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"In My Merry Oldsmobile",1931,7,NA,4.9,8,0,14.5,0,0,14.5,14.5,34.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"In Name Only",1939,94,NA,6.8,305,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"In Old Amarillo",1951,67,184686,5.9,6,0,0,0,0,14.5,34.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"In Old Arizona",1928,95,NA,6.8,19,4.5,0,0,4.5,14.5,24.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"In Old Caliente",1939,55,NA,5.7,14,0,0,0,14.5,24.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"In Old California",1942,88,NA,5.4,144,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"In Old Chicago",1937,96,1800000,6.8,157,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"In Old Colorado",1941,66,NA,7.3,18,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"In Old Kentucky",1935,86,NA,6.5,9,0,14.5,0,0,14.5,24.5,0,0,14.5,44.5,"",0,0,1,0,0,0,0 -"In Old Mexico",1938,67,NA,7.5,15,0,0,0,0,4.5,14.5,4.5,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"In Old Monterey",1939,74,NA,6.4,10,0,0,14.5,0,34.5,14.5,0,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"In Old Oklahoma",1943,102,NA,5.7,108,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"In Old Sacramento",1946,60,NA,5.8,7,0,0,0,0,14.5,44.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"In Old Santa Fe",1934,64,NA,5.9,13,0,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"In Oranje",2004,90,NA,6.6,110,4.5,4.5,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"In Order Not to Be Here",2003,30,NA,7.7,9,0,0,0,0,14.5,24.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"In Our Hands",1984,90,NA,5.8,19,14.5,0,0,4.5,24.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"In Our Own Hands",1998,85,NA,6.7,13,0,0,0,0,14.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"In Our Time",1944,110,NA,6.1,40,0,0,0,14.5,14.5,34.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"In Person",1935,87,493000,6.1,47,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"In Plain Sight",2004,86,50000,7.2,5,0,0,0,0,24.5,24.5,24.5,0,44.5,0,"",0,0,1,0,0,0,0 -"In Praise of Older Women",1978,110,NA,5.7,143,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"In Quiet Night",1998,95,NA,5,69,34.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"In Rwanda We Say... The Family That Does Not Speak Dies",2004,52,NA,6.8,5,0,0,0,0,0,24.5,64.5,0,0,24.5,"",0,0,0,0,1,0,0 -"In Satmar Custody",2003,70,NA,6.7,16,0,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,1,0,0 -"In Search of Anna",1978,91,NA,5.7,16,4.5,0,0,14.5,14.5,34.5,0,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"In Search of Bigfoot",1976,75,NA,3.2,9,14.5,14.5,14.5,0,14.5,24.5,14.5,0,0,24.5,"",0,0,0,0,1,0,0 -"In Search of Gregory",1969,90,NA,4.9,27,4.5,4.5,4.5,14.5,14.5,24.5,0,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"In Search of Historic Jesus",1979,91,NA,5.1,25,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"In Search of Mike",2000,8,NA,5.6,5,0,0,0,0,24.5,24.5,0,24.5,24.5,24.5,"",0,0,1,1,0,0,1 -"In Search of Noah's Ark",1976,95,NA,4.3,55,14.5,0,4.5,24.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,1,0,0 -"In Search of Peace",2001,105,NA,4.8,15,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"In Search of the Castaways",1962,89,NA,6.1,305,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"In Search of the Golden Bone",1986,87,NA,6.5,8,0,0,0,0,0,14.5,14.5,0,0,74.5,"",0,0,0,0,0,0,0 -"In Search of the Obelisk",1993,4,NA,5.8,8,0,0,14.5,24.5,34.5,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"In Search of the Perfect 10",1986,57,NA,5.5,6,14.5,0,0,14.5,14.5,34.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"In Service to the Dream",2001,128,NA,8.3,12,0,4.5,0,0,0,0,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"In Shadow",2003,20,NA,6,10,14.5,24.5,0,24.5,0,0,0,0,34.5,24.5,"",0,0,0,0,0,0,1 -"In Shifting Sands: The Truth About Unscom and the Disarming of Iraq",2001,92,NA,7.4,9,14.5,0,0,0,0,0,14.5,45.5,14.5,14.5,"",0,0,0,0,1,0,0 -"In Smog and Thunder",2003,46,NA,7.1,8,0,0,0,0,24.5,0,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"In Society",1944,75,NA,5.8,198,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"In Their Absence",2003,8,3500,9.6,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,1,0,0,1 -"In This Our Life",1942,97,NA,7.2,400,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"In This World",2002,88,1900000,7.8,815,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"In Timbuktu",2001,18,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,0,0,0,0,1 -"In Too Deep",1999,95,7000000,5.8,978,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"In Transit",1996,5,NA,6.2,9,24.5,0,14.5,14.5,0,0,45.5,0,0,0,"",0,0,0,0,0,0,1 -"In Which We Serve",1942,115,NA,7.7,426,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"In Your Face",2002,105,NA,7.4,16,0,4.5,14.5,4.5,4.5,14.5,14.5,0,14.5,14.5,"PG-13",1,0,0,0,0,0,0 -"In Your Wildest Dreams",1991,85,NA,4.9,28,4.5,4.5,4.5,24.5,24.5,24.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"In a Lonely Place",1950,94,NA,7.7,1456,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"In a Moment of Passion",1993,100,NA,1.7,21,64.5,4.5,4.5,4.5,4.5,0,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"In a Savage Land",1999,115,NA,6.1,110,4.5,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"In a Shallow Grave",1988,92,NA,5.6,75,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"In and Out",1989,9,NA,3.8,14,4.5,0,24.5,4.5,4.5,4.5,4.5,24.5,0,14.5,"",0,1,0,0,0,0,1 -"In barca a vela contromano",1997,100,NA,6.7,26,0,0,0,0,4.5,14.5,45.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"In contextus",1976,28,NA,5.4,6,0,0,0,14.5,0,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"In den Tag hinein",2001,120,NA,7.6,124,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"In der Apotheke",1941,4,NA,6.4,8,0,0,0,0,24.5,0,14.5,34.5,0,24.5,"",0,0,1,0,0,0,1 -"In der Arche ist der Wurm drin",1988,81,NA,4.9,9,0,0,24.5,14.5,14.5,44.5,0,14.5,0,0,"",0,1,0,0,0,0,0 -"In der Fremde",1968,77,NA,9.4,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,0,1,0,0 -"In einem Jahr mit 13 Monden",1978,124,NA,8,302,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"In extremis",1988,90,NA,5.1,7,14.5,0,0,0,44.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,1,0 -"In extremis",2000,110,NA,5.2,30,14.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"In girum imus nocte et consumimur igni",1978,100,NA,9.2,12,0,0,0,4.5,0,0,0,4.5,4.5,74.5,"",0,0,0,0,1,0,0 -"In het huis van mijn vader",1998,68,NA,8.5,10,0,0,0,0,0,0,14.5,64.5,14.5,24.5,"",0,0,0,0,1,0,0 -"In jenen Tagen",1947,111,NA,6.9,20,0,0,0,4.5,4.5,0,14.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"In nome del papa re",1977,105,NA,7,35,0,0,4.5,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"In nome del popolo italiano",1971,115,NA,7.5,70,4.5,4.5,0,0,0,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"In nome del popolo sovrano",1990,110,NA,6.6,26,0,0,0,0,4.5,24.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"In nome della legge",1949,101,NA,7.5,19,14.5,0,0,0,0,0,34.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"In principio erano le mutande",1999,90,NA,7,31,0,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"In questo mondo di ladri",2004,91,NA,4.6,5,24.5,0,24.5,0,24.5,24.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"In the Aftermath",1988,85,NA,5.4,24,14.5,0,4.5,14.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,1,0,0,0,0,0 -"In the Army Now",1994,91,NA,4.1,1802,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"In the Bag",1956,7,NA,7.7,30,4.5,4.5,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,1,1,0,0,0,1 -"In the Bedroom",2001,130,1700000,7.4,10177,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"In the Belly of the Beast",2001,74,NA,6.2,13,4.5,0,4.5,0,0,24.5,4.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"In the Bleak Midwinter",1995,99,NA,6.8,811,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"R",0,0,1,0,0,0,0 -"In the Blood",1989,90,NA,4.6,19,14.5,0,4.5,4.5,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"In the Border States",1910,17,NA,6.2,41,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,1 -"In the Cold Light of Day",1994,101,NA,6.3,124,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"In the Cold of the Night",1991,112,NA,4,85,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"In the Company of Men",1997,97,25000,7.3,3618,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"In the Cool of the Day",1963,89,NA,4.5,47,24.5,4.5,4.5,14.5,24.5,14.5,4.5,0,0,4.5,"",0,0,0,1,0,1,0 -"In the Cut",2003,119,12000000,5.1,4525,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"In the Doghouse",1961,95,NA,5,11,0,0,14.5,0,34.5,14.5,14.5,4.5,0,0,"PG",0,0,0,0,0,0,0 -"In the Dough",1932,22,NA,7,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,1 -"In the Eye of the Snake",1994,90,NA,4.9,19,14.5,0,14.5,14.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"In the French Style",1963,105,750000,5.2,10,0,0,0,14.5,34.5,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"In the Ghetto",1999,23,NA,8,5,0,24.5,0,0,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,1 -"In the Good Old Summertime",1949,102,NA,6.9,380,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"In the Heat of Passion",1992,102,NA,4.8,41,4.5,14.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"In the Heat of Passion II: Unfaithful",1994,88,NA,3.6,53,14.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"In the Heat of the Night",1967,109,2000000,8,6752,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"In the Hood",1998,90,NA,7.5,8,24.5,0,0,0,0,0,0,0,24.5,45.5,"",1,0,0,0,0,0,0 -"In the Kingdom of the Blind, the Man with One Eye Is King",1995,99,NA,4.8,77,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"In the Land of Milk and Money",2004,89,150000,5.6,7,0,24.5,0,0,14.5,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"In the Land of the Head Hunters",1914,47,NA,6,23,4.5,0,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,1,0,0 -"In the Light of the Moon",2000,89,NA,5.5,919,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"In the Line of Fire",1993,138,40000000,7.3,12923,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"In the Line of Fire",2002,45,NA,2.8,5,44.5,44.5,0,0,0,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"In the Living Years",1994,97,NA,5.1,20,64.5,0,0,24.5,14.5,0,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"In the Meantime, Darling",1944,72,NA,4.7,14,0,4.5,0,24.5,45.5,14.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"In the Money",1958,61,NA,5.3,16,0,0,0,24.5,34.5,14.5,14.5,0,4.5,0,"",0,0,1,0,0,0,0 -"In the Mood",1987,98,NA,5.4,217,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"In the Mouth of Madness",1994,95,14000000,6.5,4835,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"In the Name of the Emperor",1998,50,NA,8.6,8,0,14.5,0,0,0,0,0,34.5,0,45.5,"",0,0,0,0,1,0,0 -"In the Name of the Father",1993,133,NA,7.8,10611,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"In the Navy",1941,90,NA,6.5,308,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"In the Park",1915,15,NA,6.3,96,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"In the Pink",1967,6,NA,5.7,6,0,0,0,0,34.5,64.5,0,0,0,0,"",0,1,0,0,0,0,1 -"In the Pink of the Night",1969,6,NA,6.4,20,0,0,14.5,0,0,44.5,34.5,0,14.5,0,"",0,1,0,0,0,0,1 -"In the Realms of the Unreal",2004,81,NA,7.8,129,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"In the Red",1999,89,NA,3.9,34,34.5,4.5,4.5,0,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"In the Refrigerator: Spirit of a Haunted Dancer",2000,42,NA,5.7,14,34.5,4.5,0,4.5,4.5,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,1 -"In the Rough",2004,5,NA,7.8,15,0,0,0,0,0,4.5,24.5,34.5,0,44.5,"",0,1,1,0,0,0,1 -"In the Shadow of Hollywood",2000,112,NA,7.2,53,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"In the Shadow of Kilimanjaro",1986,97,NA,4.1,53,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"In the Shadow of the Reich: Nazi Medicine",1997,54,NA,6,7,0,0,0,14.5,0,24.5,24.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"In the Shadow of the Stars",1991,93,NA,6.9,25,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"In the Shadow of the Sun",1980,51,NA,6.2,20,4.5,0,0,0,14.5,14.5,14.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"In the Shadows",2001,105,10000000,4.8,268,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"In the Soup",1992,93,NA,6.4,407,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"In the Spirit",1990,94,NA,4.1,91,4.5,0,4.5,14.5,4.5,14.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"In the Street",1948,16,NA,7.1,7,0,0,0,0,14.5,0,24.5,24.5,0,24.5,"",0,0,0,0,1,0,1 -"In the Sweet Pie and Pie",1941,18,NA,8.5,69,0,0,0,0,0,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"In the Wake of the Bounty",1933,66,NA,5.5,29,4.5,4.5,4.5,4.5,44.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"In the Weeds",2000,91,NA,5.7,65,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,1,0 -"In the Winter Dark",1998,92,NA,5.7,66,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"In the Woods",1999,90,252000,1.9,256,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"In the Year of the Pig",1968,103,NA,8.1,63,4.5,0,0,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"In una notte di chiaro di luna",1989,109,NA,5.8,55,0,4.5,0,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"In viaggio con Che Guevara",2004,121,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"In weiter Ferne, so nah!",1993,140,NA,6.8,1450,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"In-Laws, The",1979,103,NA,7.2,1413,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"InHumanoids: The Movie",1986,85,NA,5.2,27,4.5,4.5,0,0,4.5,14.5,0,14.5,14.5,44.5,"",1,1,0,0,0,0,0 -"Ina, kapatid, anak",1979,93,NA,9.8,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Inadmissible Evidence",1968,94,NA,6.4,12,0,4.5,0,0,34.5,4.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Inafferrabile invincibile Mr. Invisibile, L'",1973,91,NA,3.2,15,14.5,14.5,34.5,14.5,4.5,4.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Inaffidabili, Gli",1997,95,NA,2.4,17,24.5,24.5,0,24.5,0,4.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Inagaw mo ang lahat sa akin",1995,103,NA,5.6,15,4.5,0,4.5,0,14.5,4.5,0,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Inamorata",2004,112,5000,7.8,6,0,14.5,0,0,0,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Inamura Jane",1990,120,NA,4.7,5,24.5,0,0,24.5,44.5,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Inas Geburtstag",2001,14,NA,5.7,8,0,0,0,0,34.5,24.5,24.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Inat hikayeleri",2003,90,NA,6,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,0,1,0,0 -"Inauguration of the Pleasure Dome",1954,38,NA,6.5,77,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Inazuma",1952,87,NA,6.2,22,0,4.5,4.5,4.5,0,4.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Inbetweeners, The",2001,86,NA,3.7,58,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Inbred Rednecks",2001,135,NA,4.3,33,24.5,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Inbreker, De",1972,105,NA,6.9,20,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Incantesimo napoletano",1998,82,NA,6.4,47,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Incautos",2004,112,NA,6.5,39,4.5,0,0,0,4.5,34.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Incendiary Blonde",1945,113,NA,7.2,39,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Incendio di Roma, L'",1963,94,NA,4.2,7,0,14.5,0,24.5,14.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Incense for the Damned",1972,87,NA,3.4,82,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Incest",2002,19,NA,6.6,13,24.5,0,4.5,0,4.5,14.5,4.5,0,4.5,34.5,"",0,0,1,1,0,0,1 -"Inceste, lorsque l'enfant parle, L'",1992,30,NA,8.8,5,0,0,0,0,0,0,0,44.5,64.5,0,"",0,0,0,0,1,0,1 -"Inch by Inch",1985,64,NA,8.1,14,0,0,0,0,0,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Inch'Allah dimanche",2001,98,NA,6.5,88,4.5,0,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Inchiesta, L'",1987,107,NA,6,47,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Inchon",1981,140,46000000,3.3,131,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Incident Near Falaise, An",1997,7,NA,5.2,7,14.5,0,0,0,0,24.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Incident at Loch Ness",2004,94,1400000,6.4,251,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Incident at Phantom Hill",1966,88,NA,5,19,4.5,0,0,24.5,34.5,0,34.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Incident in an Alley",1962,83,NA,4.7,9,0,14.5,0,24.5,0,24.5,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Incident, The",1967,107,NA,7.4,354,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Incognito",1997,108,NA,6.3,534,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Income Tax Sappy",1954,17,NA,6.6,49,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Incoming Freshmen",1979,84,NA,4.1,22,14.5,4.5,14.5,4.5,0,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Incomparable mademoiselle C., L'",2004,103,NA,6,20,4.5,4.5,4.5,4.5,4.5,34.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Incompreso",1966,105,NA,7.7,72,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Inconceivable",1998,90,NA,4.2,33,4.5,4.5,4.5,34.5,4.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Inconfidentes, Os",1972,100,NA,6.9,8,0,0,0,14.5,0,24.5,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Inconnu dans la maison, L'",1992,104,NA,6.2,126,4.5,4.5,4.5,4.5,4.5,14.5,45.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Inconnu de Strasbourg, L'",1998,100,NA,6.1,17,4.5,14.5,0,14.5,0,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Inconnus dans la maison, Les",1942,90,NA,6.9,38,0,4.5,4.5,4.5,0,4.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Inconscientes",2004,100,NA,8.3,105,0,4.5,0,4.5,0,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Incontri proibiti",1998,112,NA,4.8,25,14.5,14.5,14.5,0,4.5,14.5,24.5,0,4.5,4.5,"",0,0,1,1,0,0,0 -"Incorporated, The",1997,86,NA,4.5,33,14.5,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Incorrigible, L'",1975,95,NA,5.7,167,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Incredible 2-Headed Transplant, The",1971,87,NA,2.4,282,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Incredible Adventures of Marco Polo, The",1998,97,NA,3.7,44,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"PG-13",0,0,0,0,0,0,0 -"Incredible Genie, The",1997,90,NA,3.4,14,14.5,14.5,0,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Incredible Invasion, The",1971,90,NA,2.7,30,34.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Incredible Journey, The",1963,80,NA,7,425,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Incredible Manitoba Animation",1989,50,NA,9.5,6,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,1,1,0,0,0,0 -"Incredible Melting Man, The",1977,84,NA,3.1,372,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Incredible Mr. Limpet, The",1964,102,NA,5.7,544,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Incredible Petrified World, The",1957,70,NA,3.1,57,14.5,14.5,24.5,24.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Incredible Sarah, The",1976,106,NA,5.2,25,4.5,0,0,24.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Incredible Shrinking Man, The",1957,81,750000,7.6,1544,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Incredible Shrinking Woman, The",1981,88,NA,4.8,742,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Incredible Stranger, The",1942,11,NA,5.7,6,0,0,0,0,34.5,0,45.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Incredibles, The",2004,121,92000000,8.3,30749,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"PG",1,1,1,0,0,0,0 -"Incredibly Strange Creatures Who Stopped Living and Became Mixed-Up Zombies!!?, The",1964,82,38000,2.2,695,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Incredibly True Adventure of Two Girls in Love, The",1995,94,250000,6.5,795,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Incubus",1965,78,NA,5.4,296,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Incubus",1985,6,NA,4.3,14,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,1,0,0,0,0,1 -"Incubus",2002,88,NA,4.4,18,34.5,0,0,14.5,4.5,4.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Incubus, The",1981,93,NA,4,226,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Indagine su un cittadino al di sopra di ogni sospetto",1970,115,NA,7.6,322,0,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Indagine su un delitto perfetto",1978,90,NA,3.9,11,0,0,44.5,14.5,24.5,0,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Indecent Behavior",1993,91,NA,3.4,125,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Indecent Behavior II",1994,89,NA,3.7,106,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Indecent Behavior III",1995,92,NA,3,78,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Indecent Desires",1967,75,NA,4,16,14.5,0,0,4.5,0,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Indecent Obsession, An",1985,100,NA,5.6,21,0,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Indecent Proposal",1993,117,38000000,5.3,7397,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Indecent Proposal",2001,1,NA,8.8,15,0,0,0,0,4.5,0,4.5,24.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Indecision",2004,3,NA,6.6,6,0,0,0,0,0,45.5,14.5,0,34.5,0,"",0,0,0,0,0,0,1 -"Indefinitely",2001,19,NA,7.6,31,0,0,4.5,0,0,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,1 -"Indeks",1978,81,NA,8.2,7,14.5,0,0,0,14.5,0,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Independence",1976,30,NA,5.7,18,0,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Independence Day",1983,110,NA,6.5,121,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Independence Day",1994,20,NA,6.1,232,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Independence Day",1996,153,75000000,6.1,61831,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Independent, The",2000,95,NA,6.3,333,24.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Indescribable Nth, The",2000,9,NA,6.5,26,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Indestructible Man",1956,70,NA,3.3,194,14.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"India",1959,90,NA,6,29,4.5,0,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,1,0,0 -"India Song",1975,120,NA,6,131,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,1,0 -"India on Parade",1937,10,NA,6.3,6,0,0,0,0,0,64.5,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"India pravile",2003,102,NA,6.3,7,24.5,0,14.5,14.5,0,0,24.5,0,14.5,0,"",0,0,1,1,0,0,0 -"India: Kingdom of the Tiger",2002,42,NA,5.6,35,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Indian Agent",1948,65,NA,5.5,15,0,0,4.5,4.5,44.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Indian Fighter, The",1955,88,NA,6.3,142,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Indian Paint",1965,91,NA,6.4,28,0,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Indian Runner, The",1991,127,NA,7,1246,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Indian Summer",1987,97,NA,5.4,5,44.5,0,0,0,24.5,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Indian Summer",1993,97,NA,6.2,1193,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Indian Summer",1996,98,NA,6.5,247,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Indian Summer",2001,104,NA,7.2,27,0,0,0,0,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Indian Territory",1950,70,NA,6.2,12,0,0,14.5,4.5,14.5,34.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Indian Uprising",1952,75,NA,6,12,0,0,4.5,0,4.5,14.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Indian in the Cupboard, The",1995,96,45000000,5.8,1430,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Indiana Jones and the Last Crusade",1989,127,48000000,8.1,61583,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Indiana Jones and the Temple of Doom",1984,118,28000000,7.2,34880,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Indianapolis Speedway",1939,85,NA,5.6,23,0,0,4.5,4.5,14.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Indianski igri",1990,95,NA,6.6,7,0,0,0,0,0,14.5,24.5,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Indien",1993,90,NA,6.9,537,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Indien",1999,28,NA,6.6,5,0,0,0,44.5,24.5,0,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Indiens sont encore loin, Les",1977,95,NA,4.7,8,0,14.5,0,14.5,0,0,0,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Indifferenti, Gli",1964,84,NA,5.7,23,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Indigo Hearts",2005,92,NA,8.5,15,4.5,0,0,0,0,0,4.5,24.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Indio Black, sai che ti dico: Sei un gran figlio di...",1971,104,NA,4.9,101,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Indira (Priyanka)",1996,143,NA,8.6,5,0,0,0,0,24.5,0,0,0,44.5,44.5,"",0,0,0,1,0,0,0 -"Indira Gandhi",1975,180,NA,5.3,13,14.5,4.5,0,14.5,4.5,14.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Indische Grabmal, Das",1938,95,NA,7.2,10,0,0,14.5,0,24.5,0,34.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Indische Grabmal, Das",1959,97,NA,6.7,168,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Indische Grabmal: Der Tiger von Eschnapur, Das",1921,93,NA,7.3,72,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Indische Grabmal: Die Sendung des Yoghi, Das",1921,118,NA,7.2,42,4.5,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Indische Tuch, Das",1963,93,NA,6.3,84,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Indiscreet",1931,92,NA,4.8,37,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Indiscreet",1958,100,NA,6.8,1137,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Indochine",1992,153,NA,6.9,1940,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Indomitable Teddy Roosevelt, The",1986,93,NA,6.7,15,0,0,0,0,4.5,4.5,34.5,24.5,24.5,14.5,"",0,0,0,1,1,0,0 -"Indonesia Calling",1946,15,NA,4.9,18,14.5,14.5,0,4.5,14.5,14.5,4.5,14.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Indoor Fireworks",2003,12,NA,8.8,10,0,0,0,0,14.5,0,24.5,0,14.5,64.5,"",0,0,1,0,0,0,1 -"Indulgence",1996,3,NA,4.1,15,4.5,0,0,0,4.5,0,4.5,24.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Industrial Britain",1933,21,NA,5.2,15,0,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Ineo gongju",2004,110,NA,6.9,39,0,0,0,0,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Inertia",2001,92,NA,4.7,76,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Inevitable Grace",1994,100,NA,3.1,30,64.5,0,0,0,0,4.5,0,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Inexplicable",2004,7,NA,9.2,6,0,0,0,0,14.5,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Infanzia, vocazione e prime esperienze di Giacomo Casanova, veneziano",1969,123,NA,6.4,24,0,0,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Infection",2000,8,NA,6.5,56,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,1,0,0,0,0,1 -"Infekcija",2003,105,NA,7.5,6,0,0,14.5,14.5,0,0,0,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Infelici e contenti",1992,101,NA,4.3,21,4.5,0,4.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Inferior Decorator",1948,6,NA,6.7,20,0,0,0,4.5,4.5,24.5,24.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Infermiera di campagna, L'",1978,90,NA,3.6,22,14.5,14.5,14.5,14.5,4.5,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Infermiera nella corsia dei militari, L'",1980,89,NA,5.9,19,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Infermiera, L'",1975,105,NA,4.5,80,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Inferno",1953,83,NA,6.7,123,4.5,0,4.5,0,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Inferno",1980,102,3000000,6.2,1245,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Inferno",1995,90,NA,4.1,7,0,0,14.5,0,14.5,24.5,14.5,0,0,24.5,"R",0,0,0,0,0,0,0 -"Inferno",1997,82,NA,3.5,52,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Inferno Carnal",1977,85,NA,3.9,11,4.5,24.5,0,0,0,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Inferno in diretta",1985,87,NA,5.4,161,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Inferno, L'",1911,71,NA,3.9,16,4.5,0,0,0,0,14.5,24.5,4.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Infested",2002,84,NA,2.9,282,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Infierno de todos tan temido, El",1981,108,NA,7.2,8,0,0,0,0,0,0,24.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Infierno tan temido, El",1980,110,NA,6.9,11,0,0,0,0,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Infinitas",1992,220,NA,8.7,9,0,0,0,0,24.5,0,0,0,24.5,45.5,"",0,0,0,1,0,0,0 -"Infinity",1996,119,NA,6,454,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Inflation",1927,3,NA,8.3,10,0,0,14.5,0,0,0,24.5,45.5,24.5,0,"",0,0,0,0,1,0,1 -"Inflation",1933,11,NA,4.4,8,0,14.5,24.5,0,0,24.5,0,24.5,0,14.5,"",0,0,0,0,1,0,1 -"Inflation",1942,17,NA,6.6,24,0,4.5,0,4.5,4.5,34.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Info Wars",2004,90,NA,9.3,9,0,0,0,0,0,0,0,14.5,44.5,44.5,"",0,0,0,0,1,0,0 -"Informant, The",1997,105,NA,6.2,191,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Informer, The",1912,18,NA,5.8,8,0,0,0,0,24.5,14.5,24.5,0,14.5,24.5,"",0,0,0,1,0,0,1 -"Informer, The",1929,83,NA,7.8,6,0,0,0,14.5,0,34.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Informer, The",1935,91,243000,7.3,599,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Informers, The",1964,105,NA,6.8,16,0,0,0,14.5,4.5,14.5,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Infraction",2002,10,NA,6.2,5,24.5,0,0,0,0,24.5,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Ingeborg Holm",1913,74,NA,6,36,4.5,0,4.5,4.5,14.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Ingmar Bergman: Intermezzo",2002,40,NA,8.5,8,0,0,0,0,14.5,14.5,24.5,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Ingmar Bergmanin maailma",1976,92,NA,9.1,10,34.5,0,0,0,0,0,0,0,34.5,44.5,"",0,0,0,0,1,0,0 -"Ingorgo - Una storia impossibile, L'",1979,118,NA,5.8,58,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ingrid",1984,59,NA,7.8,14,0,0,14.5,0,0,0,24.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Inherit the Wind",1960,128,NA,8,3666,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Inheritance",2004,89,NA,5.4,50,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Inheritance, The",1992,44,NA,8.4,13,0,0,0,0,14.5,14.5,34.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Inheritance: A Fisherman's Story",2003,75,NA,8,5,0,0,0,0,44.5,0,0,0,0,64.5,"",0,0,0,0,1,0,0 -"Inheritor, The",1990,83,NA,1.8,12,45.5,4.5,4.5,4.5,0,0,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Inhumaine, L'",1924,135,NA,8.5,38,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Inibizione",1976,101,NA,4.6,16,0,14.5,4.5,0,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Inimene, keda polnud",1989,90,NA,6.2,8,0,0,0,14.5,0,14.5,14.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Initial D: Third Stage",2001,100,NA,8.3,42,4.5,0,0,0,0,0,4.5,14.5,24.5,45.5,"",1,1,0,0,0,1,0 -"Initiation",1987,92,NA,4.6,24,14.5,14.5,4.5,0,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Initiation, L'",1970,94,NA,5.1,32,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Initiation, The",1984,97,NA,5.4,97,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Inja",2001,17,NA,7.2,83,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,1 -"Injamun salsu",1982,95,NA,5.4,27,14.5,14.5,0,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Injeong sajeong bol geot eobtda",1999,97,NA,6.5,526,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Injun Trouble",1938,7,NA,6.7,12,14.5,0,0,0,0,14.5,4.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Injury to One, An",2002,53,NA,5.9,37,4.5,0,0,0,14.5,14.5,4.5,4.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Injustice",2001,100,NA,7.5,6,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Inki and the Lion",1941,7,NA,6.5,10,0,0,0,14.5,0,34.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Inki and the Minah Bird",1943,7,NA,7.6,16,0,0,4.5,0,14.5,0,14.5,4.5,44.5,14.5,"",0,1,1,0,0,0,1 -"Inki at the Circus",1947,7,NA,6.4,6,0,0,0,14.5,14.5,0,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Inkognito iz Peterburga",1977,91,NA,5.6,9,0,0,0,14.5,0,24.5,0,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Inkwell, The",1994,110,NA,5.2,229,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Inn Trouble",1996,91,NA,8.4,6,0,0,0,0,0,14.5,0,14.5,0,64.5,"",0,0,1,0,0,0,0 -"Inn for Trouble",1960,90,NA,4.8,10,0,24.5,0,0,34.5,14.5,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Inn of the Damned",1974,118,NA,4.5,26,14.5,0,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Inn of the Sixth Happiness, The",1958,158,NA,6.9,586,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Innamorati, Gli",1955,90,NA,6.1,8,0,0,0,24.5,14.5,0,24.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Inner Circle, The",1946,57,NA,6.4,5,0,0,0,0,24.5,0,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Inner Circle, The",1991,137,NA,6.8,381,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Inner Circle, The",2003,88,NA,9.2,30,4.5,0,0,0,0,4.5,0,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Inner Sanctum",1948,62,NA,6.7,20,0,0,0,0,24.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Inner Sanctum",1991,90,NA,3.3,98,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Inner Sanctum II",1994,82,NA,2.7,33,14.5,34.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Inner Tour, The",2001,97,NA,7.2,41,0,4.5,0,0,0,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Innere Sicherheit, Die",2000,106,NA,6.8,370,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Innerspace",1987,120,NA,6.4,7354,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Innertube Antics",1944,7,NA,5.6,7,0,0,0,0,24.5,45.5,0,14.5,0,0,"",0,1,1,0,0,0,1 -"Innisfree",1990,110,NA,7.5,23,4.5,0,0,0,4.5,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Innocence",2000,94,NA,7.1,696,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Innocence Lost",1987,75,NA,6.8,14,0,0,0,4.5,4.5,0,0,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Innocence Project, The",2004,26,1000,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,1,0,1 -"Innocent",2001,16,25000,7,8,14.5,0,0,0,14.5,0,24.5,14.5,0,34.5,"",0,0,0,1,0,0,1 -"Innocent Blood",1992,115,NA,5.7,1533,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Innocent Bystanders",1972,111,NA,6.1,23,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,0,24.5,"",1,0,0,0,0,0,0 -"Innocent Lies",1995,88,NA,4.6,134,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Innocent Man, An",1989,113,NA,6.1,838,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Innocent Sinners",1958,95,NA,6,15,0,0,0,4.5,4.5,24.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Innocent Sleep, The",1996,110,NA,5.7,103,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Innocent Taboo",1986,86,NA,7.2,5,0,0,0,0,0,0,24.5,64.5,24.5,0,"",0,0,0,0,0,0,0 -"Innocent, The",1985,101,NA,5.8,13,4.5,0,4.5,4.5,0,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Innocent, The",1993,119,NA,5.6,318,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Innocente, L'",1976,112,NA,7.2,348,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Innocents Abroad",1991,84,NA,7.1,10,0,0,34.5,0,0,0,44.5,14.5,24.5,0,"",0,0,0,0,1,0,0 -"Innocents aux mains sales, Les",1975,121,NA,6.2,159,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Innocents in Paris",1952,102,NA,6.8,35,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Innocents, Les",1987,96,NA,6.3,29,0,4.5,0,14.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Innocents, The",1961,100,NA,7.8,1548,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Innsmouth Legacy",2004,10,1000,6.4,8,24.5,0,14.5,0,0,0,0,24.5,0,34.5,"",0,0,0,1,0,0,1 -"Innuendo",1990,118,NA,5.4,14,14.5,0,0,4.5,0,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Inocente, El",1956,105,NA,7.3,20,0,0,0,0,4.5,0,14.5,44.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Inocentes, Los",1963,105,NA,6.2,6,0,0,14.5,0,14.5,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Inochi",2002,111,NA,6.4,6,0,0,0,0,0,34.5,34.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Inquietude",1998,112,NA,5.9,62,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Insaat",2003,113,NA,8.3,88,4.5,4.5,4.5,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Insaciable",1976,86,NA,9,7,0,0,0,0,0,0,14.5,24.5,0,45.5,"",0,0,0,0,0,0,0 -"Insaf Ka Tarazu",1980,146,NA,8.7,23,0,0,0,0,0,0,4.5,14.5,34.5,45.5,"",0,0,0,1,0,0,0 -"Insaisissables, Les",2000,95,NA,3.6,21,4.5,0,4.5,34.5,4.5,14.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Insan avcisi",1979,85,NA,6.5,10,0,0,0,0,14.5,14.5,14.5,0,0,74.5,"",1,0,0,1,0,0,0 -"Insatiable",1980,87,NA,6.5,157,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Insatiable II",1984,79,NA,5.3,45,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Insatiable Mrs. Kirsch, The",1993,29,NA,4.2,16,4.5,4.5,24.5,14.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Insatisfaite, L'",1972,90,NA,4.1,6,14.5,34.5,0,0,34.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Insect to Injury",1956,6,NA,6.2,22,0,0,0,4.5,4.5,34.5,4.5,4.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Insegnante balla... con tutta la classe, L'",1978,83,NA,3,18,14.5,14.5,14.5,4.5,0,14.5,4.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Insegnante va in collegio, L'",1978,90,NA,3.2,15,24.5,14.5,0,14.5,0,14.5,4.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Insegnante viene a casa, L'",1979,90,NA,4.2,15,4.5,14.5,4.5,14.5,4.5,14.5,0,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Inseguito",2002,97,NA,9.2,13,4.5,0,0,0,0,0,0,4.5,0,84.5,"",0,0,0,0,0,0,0 -"Insel der blutigen Plantage, Die",1983,88,NA,4.5,14,4.5,4.5,4.5,24.5,14.5,14.5,0,4.5,0,24.5,"",1,0,0,0,0,0,0 -"Inseminoid",1981,93,2000000,2.8,248,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Inserts",1975,99,NA,5.7,180,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"NC-17",0,0,0,1,0,0,0 -"Inshalla",1997,107,NA,1.9,8,45.5,24.5,0,0,14.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Insiang",1976,95,NA,7.9,26,14.5,4.5,0,4.5,0,0,0,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Inside",2002,8,5000,7.4,36,4.5,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Inside Amy",1975,100,NA,2.1,7,24.5,0,14.5,14.5,14.5,0,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Inside Candy Samples",1984,79,NA,5.7,8,0,14.5,0,14.5,24.5,0,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Inside Daisy Clover",1965,128,4500000,6.1,340,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Inside Deep Throat",2005,92,NA,6.7,244,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"NC-17",0,0,0,0,1,0,0 -"Inside Desiree Cousteau",1979,90,NA,4.9,29,14.5,0,0,4.5,4.5,24.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Inside Georgina Spelvin",1975,60,NA,6.4,7,14.5,0,0,0,14.5,24.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Inside I'm Dancing",2004,104,NA,6.7,307,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Inside Little Oral Annie",1984,81,NA,6.5,20,4.5,0,0,0,0,14.5,44.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Inside Marilyn Chambers",1975,75,NA,5,30,4.5,0,14.5,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Inside Monkey Zetterland",1992,93,NA,4.6,112,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Inside Moves",1980,113,NA,7.3,279,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Inside Out",1975,97,NA,5.8,63,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Inside Out",1987,87,NA,6.2,29,4.5,0,0,0,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Inside Out",2000,98,NA,6.4,23,0,0,0,4.5,4.5,24.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Inside Outside Lydia's Head",2003,89,NA,7,9,14.5,14.5,0,0,0,0,34.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Inside Rooms: 26 Bathrooms, London & Oxfordshire, 1985",1985,26,NA,7.6,74,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Inside Seka",1980,95,NA,2.6,14,14.5,14.5,4.5,4.5,0,4.5,0,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Inside Story, The",1948,60,NA,5.5,7,0,0,0,0,44.5,44.5,0,14.5,0,0,"",0,0,1,1,0,0,0 -"Inside Story, The",2002,85,NA,6.3,40,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Inside Straight",1951,87,NA,6,19,4.5,0,0,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Inside the Goldmine",1994,92,NA,3.2,29,14.5,14.5,0,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Inside the Lines",1930,72,NA,4.3,5,0,0,24.5,24.5,24.5,44.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Inside the Mafia",1959,72,NA,4.8,23,0,0,24.5,24.5,14.5,14.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Inside the Walls of Folsom Prison",1951,87,NA,7.1,7,0,0,0,0,0,24.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Insider, The",1999,157,68000000,8,28780,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Insight of Evil",2003,80,120000,5.1,11,34.5,34.5,0,0,0,0,0,0,14.5,4.5,"R",0,0,0,0,0,0,0 -"Insignificance",1985,110,NA,6.5,495,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Insignificant Other",2002,93,NA,6,13,4.5,4.5,4.5,0,0,24.5,4.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Insolent, L'",1973,90,NA,6.4,8,0,14.5,14.5,0,0,0,45.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Insoliti sospetti",2003,9,NA,8,16,0,0,0,0,4.5,0,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Insomnia",1994,85,NA,8,8,0,0,14.5,0,0,14.5,0,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Insomnia",1997,97,NA,7.2,2309,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Insomnia",1998,13,NA,6.8,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,1,0,0,1,1 -"Insomnia",2001,6,0,7.1,13,4.5,4.5,0,4.5,0,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Insomnia",2002,118,46000000,7.3,22235,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Insomnia Is Good for You",1957,26,NA,9.4,7,0,0,0,0,0,14.5,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Insomniac's Nightmare, An",2003,31,20000,7,57,4.5,4.5,0,0,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Insomnio",1998,102,NA,7.6,75,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Insoumis, L'",1964,115,NA,6.9,92,4.5,0,0,4.5,4.5,4.5,45.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Inspecteur Lavardin",1986,100,NA,6.6,114,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Inspecteur la Bavure",1980,100,NA,6.2,180,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Inspector Calls, An",1954,80,NA,7.8,173,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Inspector Clouseau",1968,96,NA,4.9,211,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Inspector Gadget",1999,78,75000000,4,5288,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Inspector General, The",1949,102,NA,6.8,532,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Inspector Hornleigh",1939,75,NA,8.3,21,0,0,0,0,0,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Inspector Hornleigh Goes to It",1941,87,NA,8.7,17,0,0,0,0,0,0,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Inspector Hornleigh on Holiday",1939,90,NA,8,18,0,0,0,0,0,0,24.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Inspektor GAI",1982,79,NA,4.8,5,0,24.5,44.5,0,0,24.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Inspektor Perrak greift ein",1970,84,NA,5.4,7,0,0,0,0,44.5,44.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Inspiration",1931,74,438000,6,65,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Inspirations",1997,100,NA,6.8,14,0,0,0,0,4.5,24.5,24.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Instant Justice",1986,101,NA,4.2,81,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Instante en la vida ajena, Un",2003,80,NA,6.1,8,0,0,0,0,14.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Instinct",1999,126,55000000,6.1,6298,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Instinct de l'ange, L'",1993,113,NA,6.6,9,0,0,0,0,0,24.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Instinct to Kill",2001,90,NA,4.4,136,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Institute Benjamenta, or This Dream People Call Human Life",1995,104,NA,7,283,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Instrument",1998,115,NA,7.9,138,4.5,0,4.5,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Insurance",1930,9,NA,7.2,9,0,0,0,0,14.5,14.5,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Insutooru",2004,94,2000000,6.1,7,14.5,0,14.5,14.5,0,0,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Intacto",2001,104,NA,6.8,2383,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Integreren kun je leren!",2002,6,NA,8.1,8,0,14.5,0,0,0,0,0,14.5,64.5,14.5,"",0,0,1,0,0,0,1 -"Inteha",1998,165,NA,7,14,4.5,14.5,0,0,0,0,4.5,0,4.5,64.5,"",0,0,0,1,0,1,0 -"Intelligence Men, The",1965,103,NA,5.3,54,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Intended, The",2002,110,3800000,6.8,40,4.5,4.5,4.5,4.5,0,24.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Intensive Care",1991,91,NA,1.7,105,64.5,14.5,4.5,4.5,4.5,0,4.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Intent to Kill",1958,88,NA,7.1,7,0,0,0,0,0,24.5,14.5,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Intentions",2003,96,NA,7,8,14.5,0,0,0,24.5,0,14.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Inter-View",1999,45,NA,6.9,7,0,14.5,0,0,0,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Interceptor",1992,92,NA,4.3,123,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Interceptors",1999,97,NA,3.5,243,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Interdevochka",1989,151,NA,7.1,53,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Interesting Story, An",1904,4,NA,7.5,35,4.5,0,0,0,4.5,4.5,14.5,44.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Interior Bathroom",2003,4,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Interiors",1978,93,10000000,7.1,1736,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Interlude",1968,113,NA,7.2,93,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Intermezzo: A Love Story",1939,70,800000,6.7,305,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Intermission",2003,102,5000000,6.4,1971,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Intermission",2004,14,30000,7.6,16,0,0,4.5,4.5,0,14.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Intermittenze del cuore, Le",2003,110,NA,6.7,6,14.5,0,14.5,0,0,0,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Intern Academy",2004,90,NA,5.9,135,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Intern, The",2000,90,NA,4.7,225,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Internal Affairs",1990,115,NA,6.4,2474,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"International Crime",1938,62,NA,5.9,19,0,0,0,4.5,34.5,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"International House",1933,70,NA,7.1,218,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"International Khiladi",1999,175,NA,4.5,21,14.5,4.5,0,14.5,4.5,4.5,4.5,14.5,0,14.5,"",1,0,0,1,0,1,0 -"International Lady",1941,102,NA,6.3,13,0,4.5,0,0,0,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"International Squadron",1941,85,NA,4,25,24.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"International Velvet",1978,116,NA,5.2,239,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Internecine Project, The",1974,89,NA,5.8,73,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Internes Can't Take Money",1937,78,NA,6.6,30,0,0,0,4.5,14.5,14.5,44.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Internet Love",2000,110,NA,1.8,18,74.5,14.5,0,0,4.5,4.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Interno di un convento",1977,95,NA,5.9,58,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Interns, The",1962,120,NA,6.6,39,0,0,0,0,14.5,24.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Interpol",1957,92,NA,5.6,16,4.5,0,4.5,4.5,14.5,44.5,14.5,4.5,0,0,"",1,0,0,1,0,0,0 -"Interpreter, The",2005,128,80000000,6.6,4678,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Interrupted Journey, The",1949,80,NA,6.5,17,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Interrupted Melody",1955,106,NA,7,133,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Interruption, The",2004,25,70000,5.5,14,0,0,24.5,0,0,4.5,14.5,0,0,45.5,"",0,0,0,1,0,0,1 -"Intersection",1994,98,NA,4.9,1534,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Interstate 60",2002,116,7000000,7.7,2495,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Interstate 84",2000,99,NA,4.3,75,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Interstella 5555: The 5tory of the 5ecret 5tar 5ystem",2003,68,NA,7.5,546,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,1,0,0,0,0,0 -"Interval",1973,84,NA,5.7,6,0,0,0,34.5,34.5,0,14.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Intervals",1969,7,NA,6.9,32,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Interview",1971,101,NA,7,8,0,0,0,0,0,0,64.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Interview",2000,107,NA,6.2,74,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Interview",2003,90,NA,7,263,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Interview with the Assassin",2002,88,750000,6.7,409,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Interview with the Vampire: The Vampire Chronicles",1994,123,50000000,7.2,26698,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Interview, L'",1998,25,NA,6.7,13,0,0,0,0,14.5,14.5,14.5,44.5,4.5,0,"",0,0,0,0,0,0,1 -"Interview, The",1998,103,NA,7.4,875,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Interviews with My Lai Veterans",1971,20,NA,8.8,14,0,0,0,0,4.5,0,0,34.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Interviews with My Next Girlfriend",2002,13,NA,6.5,23,0,4.5,0,4.5,0,0,24.5,24.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Intervista",1987,108,NA,6.8,331,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Interzone",1987,97,NA,4.5,29,14.5,4.5,14.5,4.5,0,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Intimacy",2001,115,NA,6.6,1955,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Intimate Friendship, An",2000,85,NA,3.5,31,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Intimate Games",1976,90,NA,5.2,31,4.5,4.5,0,4.5,24.5,34.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Intimate Lessons",1982,80,NA,5.6,6,14.5,14.5,0,0,0,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Intimate Nights",1998,98,NA,1.8,26,24.5,44.5,4.5,14.5,4.5,0,4.5,0,0,0,"R",0,0,0,0,0,0,0 -"Intimate Obsession",1992,91,NA,3,56,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Intimate Relations",1996,105,NA,6.3,238,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Intimate Stranger, The",1956,84,NA,5.9,30,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Intimations",2004,20,39000,8,9,0,14.5,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Intimidad",1989,100,NA,7,7,0,0,0,0,0,0,44.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Intimidades de una cualquiera",1974,90,NA,5.9,7,0,0,14.5,0,0,44.5,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Intimisto",2001,23,NA,7.7,6,14.5,0,0,34.5,0,0,0,34.5,14.5,0,"",0,0,0,0,0,0,1 -"Intimni osvetleni",1966,71,NA,6.6,57,0,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Into My Arms",2000,14,NA,4.6,21,4.5,0,0,0,0,4.5,0,4.5,34.5,45.5,"",0,0,0,1,0,0,1 -"Into My Heart",1998,97,NA,6,95,4.5,4.5,4.5,14.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Into the Arms of Strangers: Stories of the Kindertransport",2000,122,NA,7.9,396,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,0,1,0,0 -"Into the Blue",1950,83,NA,6.5,10,14.5,0,0,0,14.5,34.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Into the Dark",2001,6,NA,6.1,9,0,0,0,14.5,14.5,34.5,24.5,0,0,24.5,"",0,1,0,1,0,0,1 -"Into the Deep",1994,35,NA,6,81,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Into the Fire",1988,88,NA,4.1,55,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Into the Night",1985,115,NA,6.3,1651,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",1,0,1,1,0,0,0 -"Into the Sun",1992,101,NA,4.6,118,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Into the Sun",2005,97,16000000,4,481,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Into the West",1992,97,NA,6.2,572,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Intoccabili, Gli",1968,94,NA,5.9,46,4.5,0,0,14.5,14.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Intohimon vallassa",1947,90,NA,8.6,10,0,0,0,14.5,0,24.5,34.5,0,44.5,0,"",0,0,0,1,0,0,0 -"Intolerable Cruelty",2003,100,60000000,6.6,11967,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Intolerance",1996,94,NA,6,8,24.5,0,0,14.5,0,0,0,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Intolerance",2000,11,NA,7.8,12,4.5,0,0,0,0,4.5,0,74.5,0,4.5,"",0,1,1,0,0,0,1 -"Intolerance II: The Invasion",2001,15,NA,8.3,11,0,0,0,0,4.5,14.5,14.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Intolerance: Love's Struggle Through the Ages",1916,197,385907,7.8,1493,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Intramuros",1964,88,NA,4.6,11,0,34.5,0,0,14.5,4.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Intransit",2000,5,NA,4.1,12,24.5,4.5,14.5,4.5,14.5,24.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Intrepid",2000,90,NA,3.2,86,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Intrigantes, Les",1954,96,NA,6.5,7,0,0,0,0,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Intrigo, L'",1964,97,NA,6,6,0,0,0,0,14.5,45.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Intrigue",1947,90,NA,6.3,18,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Introducing Barbii",1987,88,NA,7.9,5,0,0,0,0,24.5,64.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Introducing... Janet",1983,48,NA,2.4,171,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Intruder",1989,83,100000,5.4,264,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Intruder in the Dust",1949,87,NA,7.7,206,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Intruder, The",1933,66,NA,4.6,7,0,0,14.5,24.5,14.5,24.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Intruder, The",1962,84,80000,8,163,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Intruder, The",1986,88,NA,3.1,20,14.5,14.5,14.5,14.5,0,4.5,4.5,4.5,0,34.5,"",1,0,0,0,0,0,0 -"Intrus, L'",2004,130,NA,5.9,70,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Intrusa, A",1979,100,NA,6.3,35,24.5,4.5,0,4.5,0,4.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Intrusion Cambodia",1981,90,NA,1.6,11,24.5,44.5,0,4.5,0,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Intruso",1993,86,NA,7.1,74,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Inugami",2001,106,NA,6.1,172,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Inugamike no ichizoku",1976,146,NA,7.4,17,0,0,0,0,0,14.5,14.5,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Inujini sesi mono",1986,103,NA,4,5,24.5,24.5,0,24.5,0,0,44.5,0,0,0,"",1,0,0,1,0,0,0 -"Inundados, Los",1961,87,NA,6.4,8,0,0,14.5,24.5,0,0,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Invader",1996,90,NA,4.3,143,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Invader, The",1997,93,NA,3.6,134,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Invaders from Mars",1953,78,NA,6.4,708,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Invaders from Mars",1986,99,12000000,4.6,675,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Invaders, The",1912,41,NA,5.4,20,14.5,4.5,4.5,0,0,24.5,34.5,24.5,4.5,0,"",0,0,0,0,0,0,1 -"Invasion",1966,82,NA,6.3,40,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Invasion Earth: The Aliens Are Here",1988,82,NA,2.5,39,24.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Invasion Quartet",1961,87,NA,4.6,23,4.5,0,0,24.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Invasion U.S.A.",1985,107,10000000,3.9,692,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Invasion USA",1952,73,127000,2.8,130,34.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Invasion for Flesh and Blood",1996,90,NA,4.7,17,45.5,14.5,0,0,4.5,4.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Invasion from Inner Earth",1974,94,NA,2.5,46,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Invasion of Privacy",1996,91,NA,4.1,109,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Invasion of the Bee Girls",1973,85,NA,4.7,252,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Invasion of the Blood Farmers",1972,84,40000,3.1,93,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Invasion of the Body Snatchers",1956,80,417000,7.8,5286,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Invasion of the Body Snatchers",1978,115,NA,7.1,4278,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Invasion of the Bunny Snatchers",1992,12,NA,6.5,27,4.5,14.5,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Invasion of the Saucer Men",1957,69,NA,4.2,165,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Invasion of the Space Preachers",1990,100,100000,4.7,26,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Invasion of the Star Creatures",1963,81,NA,2.4,50,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Invasion: UFO",1972,97,NA,5,27,14.5,4.5,4.5,0,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Invasions barbares, Les",2003,112,5000000,7.9,4900,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Invasor, O",2002,96,NA,7.4,342,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Invasori, Gli",1961,81,NA,5.5,23,4.5,0,14.5,4.5,24.5,4.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Inventing Grace, Touching Glory",2003,84,NA,7.3,11,4.5,0,0,0,4.5,0,14.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Inventing the Abbotts",1997,110,NA,6.2,2464,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Invention de l'amour, L'",2000,87,NA,6.2,28,0,4.5,4.5,0,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Invention of Writing and Destruction, The",1994,9,NA,8,7,0,0,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Investigating Sex",2001,108,NA,4.9,184,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Invierno de las anjanas, El",2000,90,NA,8.1,47,0,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,"",0,0,0,1,0,1,0 -"Invierno mala vida",1997,84,NA,3.6,12,14.5,0,0,0,0,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Invincibili dieci gladiatori, Gli",1964,99,NA,2.3,13,44.5,14.5,14.5,4.5,4.5,0,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Invincibili fratelli Maciste, Gli",1964,92,NA,4.3,7,0,14.5,0,24.5,14.5,14.5,0,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Invincible Kung Fu Guy, The",1994,23,3000,8.3,6,0,0,0,0,0,0,34.5,14.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Invincible Six, The",1968,103,NA,4.7,7,14.5,14.5,14.5,14.5,14.5,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Invincible Super Chan",1972,90,NA,3.9,26,34.5,4.5,4.5,4.5,14.5,0,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Invisible Agent",1942,81,322000,6,78,4.5,0,4.5,4.5,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Invisible Avenger, The",1958,70,NA,5.9,24,4.5,0,4.5,4.5,14.5,14.5,4.5,0,14.5,34.5,"",1,0,0,1,0,0,0 -"Invisible Boy, The",1957,90,NA,4.9,112,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Invisible Circus, The",2001,92,NA,5.3,734,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Invisible Ghost, The",1941,64,NA,4.6,158,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Invisible Girl, The",1989,79,NA,6.6,5,0,0,0,0,44.5,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Invisible Invaders",1959,67,NA,3.9,139,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Invisible Kid, The",1988,95,NA,3.9,97,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Invisible Killer, The",1939,63,NA,5.6,7,0,24.5,14.5,14.5,24.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Invisible Man Returns, The",1940,81,NA,6.2,210,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Invisible Man's Revenge, The",1944,78,NA,5.3,126,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Invisible Man, The",1933,71,NA,7.7,2568,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Invisible Maniac, The",1990,86,NA,3.4,132,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Invisible Menace, The",1938,55,NA,5.2,48,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Invisible Monster, The",1950,167,NA,3.5,9,0,14.5,14.5,24.5,24.5,24.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Invisible Mouse, The",1947,7,NA,6.9,47,0,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Invisible Ray, The",1936,80,NA,6.7,99,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Invisible Strangler",1976,85,NA,4,41,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Invisible Stripes",1939,81,500000,6.8,111,4.5,4.5,4.5,0,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Invisible Temptation",1996,85,NA,3.8,22,14.5,4.5,0,14.5,0,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Invisible Terrorists",1976,77,NA,5.7,6,0,0,0,14.5,14.5,45.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Invisible Woman, The",1940,72,NA,6.4,118,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Invisible: The Chronicles of Benjamin Knight",1994,83,NA,3.5,60,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Invisibles, The",1999,86,NA,3.5,85,44.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Invitation",1952,84,NA,6.5,45,0,0,0,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Invitation au voyage",1982,93,NA,6.4,26,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Invitation to Happiness",1939,97,NA,7.3,16,0,0,0,0,4.5,0,34.5,14.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Invitation to Hell",1982,74,NA,2.2,9,34.5,0,24.5,0,14.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Invitation to Monte Carlo",1959,46,NA,6,5,24.5,0,0,24.5,24.5,0,0,0,0,44.5,"",0,0,0,0,1,0,0 -"Invitation to a Gunfighter",1964,92,NA,6.4,126,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Invitation to the Dance",1956,93,1500000,6.4,86,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,1,0,0,0,0,0 -"Invitation to the Wedding",1985,90,8000000,4.3,7,14.5,0,0,24.5,14.5,0,0,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Invitation, L'",1973,100,NA,7.6,53,4.5,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Invited Guest, An",1999,116,NA,4.2,95,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Invocation of My Demon Brother",1969,12,NA,6.6,116,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Inyaah (Jungle Goddess)",1934,70,NA,7.2,5,0,24.5,0,24.5,0,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Io Semiramide",1962,101,NA,4.3,10,0,14.5,0,24.5,34.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Io amo Andrea",2000,109,NA,5.2,56,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Io e mia sorella",1987,110,NA,6.3,71,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Io ho paura",1977,120,NA,7.4,31,0,0,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Io la conoscevo bene",1965,99,NA,7.9,47,0,4.5,0,0,0,0,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Io monaca... per tre carogne e sette peccatrici",1972,92,NA,3.5,23,14.5,0,14.5,14.5,24.5,4.5,4.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Io no",2003,96,NA,5,21,14.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,0,"",0,0,1,0,0,1,0 -"Io non ho paura",2003,107,NA,7.7,1741,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Io sono mia",1978,95,NA,4.8,6,14.5,14.5,0,14.5,0,0,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Io sono un autarchico",1976,95,NA,7.2,81,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Io speriamo che me la cavo",1992,97,NA,6.4,153,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Io sto con gli ippopotami",1979,98,NA,5.7,362,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Io tigro, tu tigri, egli tigra",1978,120,NA,5.5,19,4.5,0,0,4.5,4.5,24.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Io, Chiara e lo scuro",1982,103,NA,6.4,49,0,0,4.5,4.5,4.5,34.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Io, Emmanuelle",1969,96,NA,5.1,8,0,0,0,14.5,45.5,0,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Io, io, io... e gli altri",1965,95,NA,5.8,14,4.5,0,0,4.5,4.5,24.5,4.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Iodo",1977,110,NA,8.9,11,0,0,0,0,0,0,14.5,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Iowa",2005,104,NA,5.8,20,4.5,0,0,0,4.5,4.5,14.5,24.5,0,45.5,"",0,0,0,1,0,0,0 -"Iparhi kai filotimo",1965,89,NA,9.2,39,4.5,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Ipcress File, The",1965,109,NA,7.3,1464,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Iphigenia",1977,123,NA,7.7,115,0,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Ipolohagos Natassa",1970,124,NA,5.1,38,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ipovrihio Papanikolis",1971,91,NA,5.9,5,0,0,24.5,0,0,24.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Ippotis tis lakouvas, O",1985,93,NA,7.7,9,0,0,14.5,0,14.5,14.5,14.5,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Ira Madiyama",2003,108,NA,7.3,14,0,0,0,4.5,0,4.5,34.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Ira di Achille, L'",1962,92,NA,4.6,19,4.5,0,0,24.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Iran - sous le voile des apparences",2003,94,NA,6.7,30,0,24.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Ireland, a Nation",1914,50,NA,1,9,100,0,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Ireland: 'The Emerald Isle'",1934,8,NA,2.8,15,24.5,24.5,24.5,4.5,0,4.5,4.5,0,4.5,0,"",0,0,0,0,1,0,1 -"Irene",1940,101,NA,6.8,56,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Irezumi",1966,86,NA,6.7,27,0,0,4.5,4.5,4.5,24.5,14.5,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Irezumi",1982,109,NA,6.8,46,4.5,0,4.5,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Irezumi ichidai",1965,87,NA,7.7,74,0,0,4.5,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Irgendwas ist immer",2003,93,NA,6.2,12,4.5,0,0,24.5,4.5,4.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Irhab wal kabab, al-",1993,105,NA,6.3,59,4.5,0,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",1,0,1,1,0,0,0 -"Irhabi, al-",1994,130,NA,6,28,4.5,4.5,0,4.5,14.5,24.5,14.5,0,14.5,14.5,"",0,0,1,1,0,1,0 -"Iris",2004,99,NA,4.2,6,14.5,0,0,14.5,14.5,0,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Irises, The",1991,4,NA,6.8,6,0,0,0,0,0,14.5,34.5,34.5,14.5,0,"",0,1,0,0,0,0,1 -"Irish Cinema: Ourselves Alone?",1997,51,NA,3,16,14.5,14.5,4.5,14.5,4.5,14.5,0,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Irish Destiny",1926,73,NA,1,9,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Irish Evening: Live at the Grand Opera House, Belfast, An",1991,60,NA,2.4,17,14.5,14.5,14.5,4.5,0,0,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Irish Eyes Are Smiling",1944,90,NA,4.5,31,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Irish Gringo, The",1936,54,NA,1.4,9,64.5,14.5,14.5,14.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Irish Hearts",1934,69,NA,3.3,9,24.5,24.5,14.5,14.5,0,0,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Irish Luck",1939,58,NA,2,13,34.5,14.5,0,0,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Irish Whiskey",1997,91,NA,1.1,18,34.5,4.5,4.5,0,0,0,0,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Irish Whiskey Rebellion",1972,93,NA,2.2,10,45.5,14.5,14.5,14.5,14.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Irish and Proud of It",1938,78,NA,1,14,64.5,0,0,0,0,14.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Irish for Luck",1936,68,NA,2.2,6,34.5,34.5,14.5,14.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Irish in Us, The",1935,84,NA,4.6,64,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Irishman, The",1978,108,NA,5.1,24,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Irlanda, la Isla Esmeralda",1969,12,NA,1.6,6,45.5,34.5,14.5,0,0,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Irma & Floyd",1994,27,NA,8.6,7,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,1,1,0,0,1 -"Irma Vep",1996,97,NA,6.7,959,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Irma la Douce",1963,135,5000000,7.2,1964,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Iron & Silk",1990,92,NA,6.6,217,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,4.5,45.5,"",0,0,1,1,0,0,0 -"Iron Curtain, The",1948,87,NA,6,35,4.5,4.5,0,4.5,24.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Iron Duke, The",1934,88,NA,6.6,14,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Iron Eagle",1986,117,NA,4.8,2166,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Iron Eagle II",1988,105,NA,3.2,1242,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Iron Eagle IV",1995,96,NA,2.8,218,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Iron Giant, The",1999,86,48000000,7.9,15151,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG",0,1,0,0,0,0,0 -"Iron Girl, The",1994,80,NA,2.2,23,64.5,4.5,4.5,0,0,0,0,4.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Iron Glove, The",1954,77,NA,4.7,5,0,0,0,24.5,64.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Iron Horse, The",1924,133,NA,6.6,142,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Iron Horsemen",1995,84,NA,5.5,18,14.5,4.5,4.5,4.5,0,0,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Iron Maiden, The",1962,98,NA,5.3,32,0,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Iron Major, The",1943,85,NA,6.2,37,0,0,4.5,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Iron Man",1951,81,NA,5.3,25,0,0,4.5,14.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Iron Mask, The",1929,103,NA,6.9,109,0,4.5,0,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Iron Maze",1991,104,NA,4.1,176,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Iron Mistress, The",1952,110,NA,5.9,80,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Iron Mountain Trail",1953,54,NA,6.6,6,0,0,0,0,34.5,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Iron Mule, The",1925,13,NA,6.2,20,0,0,4.5,0,24.5,44.5,34.5,4.5,0,0,"",0,0,1,0,0,0,1 -"Iron Petticoat, The",1956,87,NA,5.5,90,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Iron Triangle, The",1989,91,NA,6.4,78,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Iron Warrior",1987,82,NA,2.2,111,44.5,24.5,4.5,4.5,4.5,0,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Iron Will",1994,108,NA,6.1,1048,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ironheart",1992,92,NA,2.8,57,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Ironweed",1987,143,NA,6.4,1053,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Iroquois Trail, The",1950,85,NA,4.7,9,0,0,14.5,14.5,44.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Irreconcilable Differences",1984,113,NA,5.5,624,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Irrefutable Truth About Demons, The",2000,90,500000,5.3,340,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Irresistible",1982,104,NA,7,7,14.5,14.5,0,0,14.5,0,0,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Irresistible Silvie",1997,82,NA,7.4,5,24.5,0,0,0,24.5,0,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Irrompibles, Los",1975,90,NA,3.8,15,24.5,0,0,14.5,0,44.5,0,4.5,0,14.5,"",0,0,0,0,0,1,0 -"Iruvar",1997,113,NA,7.2,94,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Is It Always Right to Be Right?",1970,8,NA,8.2,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Is It True What They Say About Ann?",2004,40,5000,7.3,25,34.5,4.5,0,0,0,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Is My Face Red?",1932,66,NA,4.8,5,0,24.5,0,0,44.5,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Is My Palm Read",1933,5,NA,6.3,27,4.5,4.5,4.5,4.5,14.5,24.5,24.5,0,4.5,14.5,"",0,1,1,0,0,0,1 -"Is Raat Ki Subah Nahin",1996,131,NA,8,8,0,0,0,0,0,0,14.5,45.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Is There Sex After Death?",1971,97,NA,3,39,34.5,4.5,4.5,4.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Is There a Doctor in the Mouse?",1964,7,NA,6,29,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Is This Love?",1957,14,NA,3.4,25,24.5,24.5,14.5,4.5,24.5,0,0,4.5,0,4.5,"",0,0,0,1,0,0,1 -"Is the Crown at War with Us?",2002,96,NA,6.8,7,0,0,0,0,0,14.5,0,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Is-slottet",1987,78,NA,6.7,59,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Isaac Littlefeathers",1984,100,NA,6.1,11,0,0,0,14.5,4.5,0,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Isabel",1968,108,NA,5,17,4.5,0,0,14.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Isabelle",2001,28,NA,6.4,13,0,4.5,0,0,0,44.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Isabelle Eberhardt",1992,113,NA,4.7,23,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Isadora",1968,131,NA,6.5,232,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Isaia mi horevis",1969,84,NA,7.1,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Isaskar Keturin ihmeelliset seikkailut",1960,84,NA,5.7,9,0,0,14.5,24.5,34.5,0,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Isfugle",1983,102,NA,6.9,15,0,0,0,14.5,4.5,0,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ish HaHashmal",2003,90,900000,4.5,6,0,0,0,34.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Ishi: The Last Yahi",1992,57,NA,7.6,15,0,0,0,0,0,14.5,44.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Ishq",1997,161,NA,6.5,78,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,1,1,0,1,0 -"Ishq Vishk",2003,134,NA,6.3,42,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Ishtar",1987,107,40000000,3.7,3479,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Isi Ka Naam Zindagi",1992,140,NA,5.9,7,24.5,0,0,14.5,0,0,0,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Isi/Disi - Amor a lo bestia",2004,95,NA,3.7,119,24.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Iskanderija, kaman oue kaman",1990,100,NA,6.3,35,4.5,0,4.5,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Iskanderija... lih?",1978,133,NA,6.6,68,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Iskusavanje djavola",1989,117,NA,4.9,13,14.5,0,0,0,14.5,0,4.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Iskusheniye B.",1990,84,NA,8.7,6,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Isla de la muerte, La",1967,88,NA,3.6,20,4.5,4.5,14.5,14.5,0,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Isla del cangrejo, La",2000,64,NA,5.7,9,0,0,0,14.5,0,34.5,14.5,14.5,24.5,14.5,"",0,1,1,0,0,0,0 -"Isla, La",1979,106,NA,4.9,7,0,0,14.5,14.5,14.5,0,0,14.5,44.5,0,"",0,0,0,1,0,0,0 -"Island",1989,93,NA,5,20,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Island Claws",1980,82,NA,2.7,14,34.5,14.5,24.5,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Island at the Top of the World, The",1974,93,NA,5.7,265,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Island in the Sky",1953,109,967000,5.5,100,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Island in the Sun",1957,119,2250000,5.8,102,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Island of Blood",1982,82,NA,3.9,22,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Island of Doomed Men",1940,68,NA,5.9,22,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Island of Dr. Moreau, The",1977,99,6000000,5.4,620,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Island of Dr. Moreau, The",1996,99,40000000,4,5983,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Island of Lost Men",1939,63,NA,8.6,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Island of Lost Souls",1933,71,NA,7.9,375,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Island of Lost Women",1959,71,NA,4.6,9,24.5,14.5,14.5,0,14.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Island of Love",1963,101,NA,6,17,0,0,0,14.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Island of Terror",1966,89,NA,5.8,215,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Island of the Blue Dolphins",1964,93,NA,5.6,78,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Island of the Dead",2000,91,NA,2.4,149,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Island of the Lost",1967,92,NA,5.6,11,14.5,24.5,0,0,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Island of the Sharks",1999,40,NA,7.3,31,0,0,0,0,4.5,14.5,4.5,44.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Island on Bird Street, The",1997,107,NA,6.8,225,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Island, The",1952,25,NA,8.6,7,0,0,0,0,0,14.5,0,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Island, The",1980,114,22000000,4.7,434,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Island, The",1998,95,NA,5.2,8,0,14.5,34.5,14.5,0,0,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Island, The",2000,4,30000,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,0,0,1 -"Islands in the Stream",1977,104,NA,6.1,229,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Isle of Forgotten Sins",1943,74,NA,3.6,33,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Isle of Fury",1936,60,NA,5.1,47,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Isle of Lesbos",1997,98,NA,6.2,32,14.5,4.5,0,0,0,0,4.5,14.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Isle of Pingo Pongo, The",1938,6,NA,6.4,14,0,0,0,0,24.5,0,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Isle of the Dead",1945,71,NA,6.4,269,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Isle of the Snake People",1971,90,NA,2.1,66,34.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Islet",2003,7,NA,7.5,12,0,0,0,0,0,4.5,24.5,45.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Ismeri a szandi mandit?",1969,88,NA,5.5,8,0,0,0,24.5,14.5,14.5,0,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Isn't It Obvious?",2003,8,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,0,0,1,0,1 -"Isn't Life Wonderful!",1953,83,NA,5,5,0,0,24.5,0,24.5,0,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Isn't She Great",2000,95,36000000,4.8,688,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Iso vaalee",1983,91,NA,5.7,12,4.5,0,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Isola degli uomini pesce, L'",1979,81,NA,4,99,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Isola del gabbiano, L'",1980,102,NA,4.1,32,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Isola di Arturo, L'",1962,90,NA,5.4,32,0,0,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Isola, L'",2003,103,NA,5.4,30,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Isolde",1989,92,NA,4.8,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Isotta",1996,85,NA,7.6,6,0,0,14.5,0,0,0,45.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Isovia",1988,85,NA,3.2,8,24.5,14.5,14.5,0,14.5,0,0,0,14.5,24.5,"",1,0,0,1,0,0,0 -"Ispanska muha",1998,100,NA,5,8,0,14.5,0,14.5,24.5,0,0,0,0,45.5,"",1,0,1,0,0,0,0 -"Ispod crte",2003,105,NA,4,10,34.5,34.5,0,0,0,0,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Ispoved neznakomtsu",1994,92,NA,5.4,19,0,14.5,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Isprani",1995,87,NA,7.2,59,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Ispravi se, Delfina",1977,91,NA,6.4,7,14.5,0,0,14.5,0,0,24.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Issues",2004,88,NA,8.2,19,14.5,0,0,0,4.5,0,0,0,14.5,64.5,"",0,0,1,0,0,0,0 -"Issues 101",2002,90,75000,3.6,74,44.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Istanbul",1957,84,NA,5.5,54,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Istanbul",1985,90,NA,5.2,26,4.5,4.5,0,4.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Istanbul",1989,84,NA,3,18,34.5,14.5,4.5,14.5,14.5,0,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Ister, The",2004,189,NA,9.5,10,0,14.5,14.5,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Istgah-Matrouk",2002,88,NA,6.3,27,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Istoriya Asi Klyachinoy, kotoraya lyubila, da ne vyshla zamuzh",1966,99,NA,6.8,26,0,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,1,0 -"It",1927,72,NA,7.7,289,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"It Ain't Hay",1943,80,NA,5.7,45,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"It All Came True",1940,97,NA,6.3,104,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"It Always Rains on Sunday",1948,92,NA,8.1,78,0,4.5,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"It Came from Beneath the Sea",1955,79,NA,5.7,342,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"It Came from Hollywood",1982,80,5000000,5.5,240,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,1,0,0 -"It Came from Outer Space",1953,81,800000,6.4,798,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"It Came from Outer Space... and Stuff",1999,40,NA,6.2,15,4.5,4.5,4.5,4.5,0,4.5,14.5,24.5,0,34.5,"",0,0,1,0,0,0,1 -"It Conquered the World",1956,71,NA,4.2,367,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"It Could Happen to You",1994,101,NA,6.2,5005,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"It Couldn't Happen Here",1987,87,NA,5.5,133,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"It Grows on Trees",1952,84,NA,6,60,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"It Had to Be You",1947,98,NA,6,48,0,0,0,4.5,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"It Happened Here",1966,97,20000,6.5,160,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"It Happened One Day",1934,19,NA,6.1,5,0,0,0,24.5,0,0,0,84.5,0,0,"",0,0,0,0,0,0,1 -"It Happened One Night",1934,105,325000,8.3,7924,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,1,0 -"It Happened Tomorrow",1944,85,NA,7.3,171,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"It Happened at the World's Fair",1963,105,NA,5.3,257,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"It Happened in Athens",1962,100,NA,4.9,34,4.5,0,14.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"It Happened in Brooklyn",1947,104,NA,5.9,82,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"It Happened in Flatbush",1942,80,NA,5.4,17,0,0,14.5,4.5,14.5,44.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"It Happened in Hollywood",1937,67,NA,7,5,0,0,0,44.5,0,24.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"It Happened in Hollywood",1973,74,NA,3.2,11,24.5,0,0,4.5,0,0,4.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"It Happened in Paris",1935,68,NA,4.1,7,0,24.5,14.5,0,0,44.5,0,0,0,14.5,"",0,0,1,0,0,1,0 -"It Happened on 5th Avenue",1947,116,1700000,7.6,69,0,0,0,0,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"It Happened to Jane",1959,97,NA,6.6,175,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"It Happens Every Spring",1949,87,NA,7.3,311,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,14.5,"",0,0,1,0,0,0,0 -"It Happens Every Thursday",1953,80,NA,4.9,34,4.5,4.5,4.5,4.5,14.5,14.5,34.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"It Isn't Done",1936,90,NA,6.6,8,0,0,0,0,14.5,14.5,24.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"It Lives Again",1978,68,NA,4.3,192,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"It Might Be Worse",1931,18,NA,4.1,6,14.5,34.5,0,14.5,0,34.5,0,0,0,0,"",0,0,1,0,0,0,1 -"It Pays to Advertise",1931,63,NA,5.9,5,0,24.5,0,24.5,0,0,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"It Rained All Night the Day I Left",1980,100,NA,4.3,16,14.5,0,0,44.5,14.5,14.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"It Runs in the Family",1994,85,NA,5.4,202,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"It Runs in the Family",2003,109,NA,5.4,891,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"It Seemed Like a Good Idea at the Time",1975,90,NA,5.1,43,4.5,14.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"It Should Happen to You",1954,86,NA,7,319,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"It Shouldn't Happen to a Dog",1946,70,NA,7.5,5,0,0,0,0,0,24.5,24.5,44.5,24.5,0,"",0,0,1,0,0,0,0 -"It Shouldn't Happen to a Vet",1975,94,NA,6.4,40,0,0,0,4.5,24.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"It Started in Naples",1960,100,NA,5.6,209,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"It Started in Paradise",1952,88,NA,4.6,8,0,0,14.5,14.5,34.5,0,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"It Started with Eve",1941,90,1166000,7.4,136,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"It Started with a Kiss",1959,104,NA,5.6,93,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"It Takes All Kinds",1969,97,NA,4.2,5,0,44.5,24.5,0,0,0,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"It Takes Two",1995,101,NA,4.9,1233,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"It Took Guts",1979,7,NA,4.3,18,4.5,0,0,4.5,0,0,0,4.5,14.5,74.5,"",0,0,1,0,0,0,1 -"It Was a Wonderful Life",1993,82,NA,6.3,44,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"It Was an Accident",2000,96,NA,5.8,62,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"It Wasn't Love",1992,20,NA,6.7,27,14.5,0,14.5,4.5,0,14.5,0,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"It!",1966,97,NA,4.4,125,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"It! The Terror from Beyond Space",1958,69,NA,5.6,434,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"It's Alive III: Island of the Alive",1987,91,NA,3.3,189,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"It's All About Love",2003,105,NA,5.7,1295,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"It's All Gone Pete Tong",2004,90,NA,8,108,4.5,4.5,0,0,4.5,0,14.5,14.5,14.5,44.5,"R",0,0,1,1,0,0,0 -"It's Always Fair Weather",1955,102,2062256,7,324,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"It's Called Murder, Baby",1982,94,NA,5.3,30,0,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"It's Elementary: Talking About Gay Issues in School",1996,80,NA,8,29,4.5,4.5,0,0,4.5,0,0,4.5,4.5,74.5,"",0,0,0,0,1,0,0 -"It's Good to Talk",1997,14,NA,3.3,16,14.5,0,0,4.5,4.5,4.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"It's Got Me Again!",1932,7,NA,5.7,12,0,4.5,0,14.5,14.5,24.5,4.5,24.5,0,0,"",0,1,1,0,0,0,1 -"It's Great to Be Young!",1956,94,NA,6.2,52,4.5,0,0,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"It's Greek to Me-ow!",1961,7,NA,2.8,27,34.5,14.5,4.5,4.5,14.5,0,4.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"It's Hard",2000,13,15000,4.8,5,0,0,0,44.5,0,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"It's Hard to Be Good",1948,93,NA,5.8,6,0,0,0,14.5,14.5,45.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"It's Hummer Time",1950,7,NA,6.6,12,0,0,0,0,4.5,24.5,44.5,24.5,0,0,"",0,1,1,0,0,0,1 -"It's Impossible to Learn to Plow by Reading Books",1988,85,3000,5.2,58,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"It's Just Coffee",2003,18,NA,8.7,7,0,0,14.5,0,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,1 -"It's Love Again",1936,83,NA,6.6,26,0,0,0,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"It's Love I'm After",1937,90,NA,7.4,204,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"It's Murphy's Fault",1988,102,NA,4,5,0,0,24.5,24.5,24.5,0,0,0,24.5,24.5,"",0,0,1,0,0,0,0 -"It's My Party",1996,110,NA,6.9,823,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"It's My Turn",1980,91,NA,5.4,164,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"It's Never Too Late",1956,91,NA,6,6,0,14.5,0,0,34.5,14.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"It's Never Too Late to Mend",1937,70,NA,8,7,0,0,0,0,0,14.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"It's Nice to Have a Mouse Around the House",1965,7,NA,6,17,0,0,0,4.5,24.5,44.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"It's Not Cricket",1949,71,NA,6.7,20,0,4.5,0,0,24.5,14.5,24.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"It's Not Easy Being Greek",1998,24,NA,9,12,4.5,0,0,0,0,0,4.5,0,0,84.5,"",0,0,1,0,0,0,1 -"It's Not Just You, Murray!",1964,15,NA,6.2,96,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"It's Now or Never",1996,44,NA,6.1,9,0,0,0,0,0,64.5,0,24.5,14.5,0,"",0,0,1,0,1,0,1 -"It's Okay to Drink Whiskey",2002,10,NA,8.7,6,0,0,0,0,0,14.5,0,34.5,0,45.5,"",0,0,0,0,0,0,1 -"It's Only Money",1962,83,NA,5.8,111,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"It's Pat",1994,77,NA,2.5,2624,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"It's Showtime",1976,85,NA,5.8,17,14.5,0,0,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,1,0,0 -"It's That Man Again",1943,84,NA,5.2,9,0,14.5,0,0,44.5,0,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"It's Tough to Be Famous",1932,79,NA,5.6,14,0,0,0,4.5,14.5,44.5,34.5,0,0,0,"",0,0,1,1,0,0,0 -"It's Tough to Be a Bird",1969,21,NA,7.1,30,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,34.5,"",0,1,1,0,1,0,1 -"It's Trad, Dad!",1962,78,NA,6.5,24,0,4.5,0,4.5,4.5,14.5,34.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"It's Wonderful Being a Girl",1968,17,NA,6.5,6,0,14.5,0,0,0,45.5,0,0,0,34.5,"",0,0,0,0,1,0,1 -"It's Your Move",1945,17,NA,6.3,5,0,0,0,24.5,0,64.5,0,0,0,24.5,"",0,0,1,0,0,0,1 -"It's a Big Country",1951,89,NA,5.7,47,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"It's a Bikini World",1967,86,NA,4,15,24.5,0,4.5,14.5,4.5,4.5,4.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"It's a Bird",1930,14,NA,9.1,12,4.5,0,0,0,0,0,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"It's a Boy",1933,80,NA,4.7,12,0,0,0,24.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"It's a Date",1940,103,NA,6.5,49,0,0,4.5,0,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"It's a Dog's Life",1955,88,NA,6.4,63,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"It's a Gift",1923,10,NA,7.5,22,0,0,0,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"It's a Gift",1934,73,NA,7.7,728,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"It's a Grand Life",1953,102,NA,6,7,0,0,14.5,14.5,14.5,0,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"It's a Great Feeling",1949,85,NA,6.1,163,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"It's a Great Life",1943,72,NA,6.2,25,4.5,0,0,4.5,24.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"It's a Hap-Hap-Happy Day",1941,7,NA,4.5,10,0,14.5,0,24.5,14.5,34.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"It's a Joke, Son",1947,63,NA,6,20,0,0,4.5,14.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"It's a Mad Mad Mad Mad World",1963,192,9400000,7.2,5891,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"It's a Shame About Ray",2000,38,NA,7.5,31,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"It's a Small World",1935,70,NA,4.4,8,0,0,14.5,24.5,24.5,14.5,14.5,0,14.5,0,"",0,0,1,0,0,1,0 -"It's a Small World",1950,74,NA,6,6,0,0,0,0,34.5,34.5,0,0,14.5,14.5,"",0,0,1,0,0,0,0 -"It's a Wonderful Life",1946,118,3180000,8.6,41199,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"It's a Wonderful World",1939,86,NA,7,324,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"It's a Wonderful World",1956,89,NA,5.7,7,0,0,14.5,0,14.5,44.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"It's an Ill Wind",1939,7,NA,6.6,8,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,1,1,0,0,0,1 -"It's in the Air",1938,74,NA,5.8,21,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"It's in the Bag!",1945,87,NA,6.9,47,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"It's in the Stars",1938,20,NA,6.9,10,0,0,14.5,0,0,34.5,44.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"It's in the Water",1997,100,NA,6.6,275,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"It's the Cat",2004,3,NA,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,1,0,0,0,0,1 -"It's the Natural Thing to Do",1939,7,NA,6.8,11,0,0,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"It's the Old Army Game",1926,70,NA,7.7,19,0,0,0,0,0,24.5,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Itaewon bamhaneule migugdali deuneunga",1991,93,NA,1.8,6,84.5,14.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Italia-Germania 4-3",1990,84,NA,5.9,26,0,0,0,4.5,34.5,34.5,14.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"Italian Flair",2000,140,NA,5.4,16,0,4.5,0,4.5,0,4.5,14.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Italian Job, The",1969,99,NA,7.2,4459,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Italian Job, The",2003,111,60000000,6.9,18496,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Italian Secret Service",1968,108,NA,7.7,15,4.5,0,0,4.5,0,14.5,34.5,14.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Italian fast food",1986,89,NA,2.6,14,44.5,4.5,0,4.5,0,0,0,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Italian, The",1915,78,NA,6.5,34,4.5,4.5,4.5,4.5,0,4.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Italianamerican",1974,45,NA,7.8,173,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Italiani",1996,99,NA,6.9,16,4.5,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Italiani brava gente",1965,104,NA,6.6,44,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Italiano, L'",2002,90,NA,6.5,11,4.5,0,4.5,4.5,4.5,14.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Italiencele",2004,82,NA,6.1,47,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Italienreise - Liebe inbegriffen",1958,97,NA,3,8,0,14.5,74.5,0,14.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Italiensk for begyndere",2000,97,NA,7.2,3776,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Italkim Ba'im, Ha-",1996,100,NA,5.2,5,24.5,0,24.5,0,0,44.5,0,0,0,24.5,"",0,0,0,1,0,1,0 -"Itan axios",1982,82,NA,7.9,16,14.5,4.5,0,0,4.5,0,4.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Itch in Time, An",1943,8,NA,7.5,39,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Item, The",1999,97,NA,3.5,261,44.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Itim",1976,105,NA,9.7,9,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,1,0,0,0 -"Itiraf",2002,91,NA,7.1,61,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Itsuka 'A' torein ni notte",2003,103,NA,8.5,6,0,0,0,0,14.5,14.5,0,0,0,64.5,"",0,0,0,1,0,0,0 -"Itsuka giragirasuruhi",1992,108,NA,6.4,68,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Itsuwareru seiso",1951,103,NA,7.2,5,0,0,0,0,44.5,0,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Ittefaq",1969,104,NA,8.3,15,0,0,0,0,0,0,4.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Ivan",1932,83,NA,6.6,11,4.5,0,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Ivan Groznyy I",1945,95,NA,7.7,812,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Ivan Groznyy III",1988,4,NA,9.9,26,4.5,0,0,0,0,0,0,4.5,14.5,84.5,"",0,0,0,1,0,0,0 -"Ivan Vasilyevich menyayet professiyu",1973,93,NA,8,311,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Ivan da Mariya",1975,88,NA,5.9,5,0,0,0,0,24.5,0,84.5,0,0,0,"",0,0,0,0,0,0,0 -"Ivanhoe",1952,106,NA,6.8,1011,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Ivanna",1970,94,NA,4,32,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Ivanovo detstvo",1962,84,NA,7.6,1077,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Ivansxtc",2000,92,NA,6.6,266,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ivo il tardivo",1995,110,NA,5.2,38,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Ivory Tower",1998,96,NA,5.4,42,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ivy",1947,99,NA,6.9,57,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Iwashigumo",1958,128,NA,5.2,12,0,0,0,14.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ixe",1980,48,NA,9.8,9,0,14.5,0,0,0,0,0,0,34.5,45.5,"",0,0,0,1,0,0,0 -"Iyulskiy dozhd",1966,109,NA,8.4,18,0,0,0,4.5,0,0,14.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Iz",1994,116,NA,5.6,11,0,0,4.5,0,4.5,24.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Iz zhizni otdykhayushchikh",1980,84,NA,5.7,10,0,0,0,0,34.5,14.5,14.5,24.5,0,34.5,"",0,0,0,1,0,1,0 -"Izakaya yurei",1994,110,NA,6.3,12,0,4.5,0,0,4.5,14.5,14.5,34.5,14.5,0,"",0,0,1,1,0,0,0 -"Izbavitelj",1976,80,NA,7.2,53,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Izbrannye",1983,140,NA,7.8,5,0,0,0,24.5,0,0,0,44.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Iznogoud",2005,95,NA,3.5,43,24.5,4.5,14.5,14.5,14.5,14.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Izo",2004,128,NA,5.7,284,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Izpepelyavane",2004,90,NA,4.9,7,24.5,14.5,0,14.5,0,14.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Izpit",1971,52,NA,9.1,11,0,0,0,0,0,0,0,4.5,14.5,74.5,"",0,0,0,1,0,0,0 -"Izpiti po nikoe vreme",1974,80,NA,7.3,8,0,0,0,0,0,0,24.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Izu no odoriko",1974,82,NA,7.1,11,0,0,0,0,0,24.5,4.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Izzatdaar",1990,172,NA,6.1,7,0,0,14.5,0,0,44.5,24.5,0,0,14.5,"",1,0,0,1,0,0,0 -"J'accuse!",1938,95,NA,8,52,0,0,0,0,0,24.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"J'ai faim!!!",2001,97,NA,4.6,108,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"J'ai horreur de l'amour",1997,130,NA,7.4,74,0,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"J'ai mon voyage!",1973,89,NA,5,40,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"J'ai pas sommeil",1994,112,NA,6.4,181,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"J'aimerais pas crever un dimanche",1998,91,NA,4.8,147,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"J'attendrai le suivant...",2002,4,NA,7.5,137,4.5,4.5,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,"",0,0,1,0,0,1,1 -"J'embrasse pas",1991,115,NA,6.5,238,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"J'en suis!",1997,104,NA,6.3,152,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"J'entends plus la guitare",1991,98,NA,7.5,23,0,0,0,0,4.5,4.5,34.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"J'irai au paradis car l'enfer est ici",1997,115,NA,6.7,43,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"J'irai comme un cheval fou",1973,100,NA,5.7,49,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"J'irai cracher sur vos tombes",1959,100,NA,7,24,4.5,4.5,4.5,0,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"J'me sens pas belle",2004,85,NA,7,96,0,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"J'peux pas dormir...",2000,10,NA,7.3,8,14.5,0,0,0,0,24.5,0,64.5,0,0,"",0,0,1,0,0,0,1 -"J-K Conspiracy, The",2004,89,44000,9.2,20,0,0,4.5,0,0,0,0,24.5,4.5,74.5,"",0,0,1,0,0,0,0 -"J-Men Forever",1979,73,NA,6.3,147,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"J. and S. - storia criminale del far west",1972,90,NA,5.6,20,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"J.A. Martin photographe",1977,100,NA,7.8,47,0,4.5,0,0,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"J.C.",1972,101,NA,7.2,15,34.5,0,0,0,24.5,4.5,4.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"J.D.'s Revenge",1976,92,NA,4.6,61,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"J.W. Coop",1972,112,NA,6.1,67,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"JAG",1966,83,NA,8.2,8,0,0,24.5,0,0,0,0,0,0,74.5,"",0,0,0,0,0,0,0 -"JFK",1991,206,40000000,7.8,26456,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"JFK Assassination: The Jim Garrison Tapes, The",1992,96,NA,4.6,33,14.5,4.5,0,0,0,4.5,4.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Ja zuster, nee zuster",2002,100,NA,6.8,328,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Jaal",1952,165,NA,6.5,7,0,0,0,0,0,24.5,44.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Jaanam Samjha Karo",1999,153,NA,4.3,26,14.5,0,14.5,4.5,0,4.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Jaane Bhi Do Yaaro",1983,143,NA,8.7,165,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Jaani Dushman: Ek Anokhi Kahani",2002,170,NA,4.3,40,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Jabberwocky",1977,105,500000,6,2109,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Jack",1976,119,NA,5.8,64,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Jack",1996,113,45000000,5.2,5256,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Jack & Ella",2002,97,NA,3,22,24.5,0,4.5,4.5,4.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Jack & Jill",1998,84,NA,4.8,26,4.5,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Jack Ahoy",1934,70,NA,4.8,5,0,24.5,0,24.5,64.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Jack Armstrong",1947,279,NA,7.3,8,0,14.5,0,0,34.5,0,34.5,14.5,0,0,"",1,0,0,1,0,0,0 -"Jack Be Nimble",1993,92,750000,5.8,123,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jack Brown Genius",1994,85,NA,4.1,60,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jack Frost",1934,9,NA,5.4,31,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Jack Frost",1997,89,NA,3.9,1277,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Jack Frost",1998,101,50000000,4.5,2130,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"Jack Frost 2: Revenge of the Mutant Killer Snowman",2000,91,NA,2.7,460,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Jack Johnson, the Big Fights",1970,90,NA,7.8,6,0,0,0,0,0,34.5,0,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Jack Kerouac's Road: A Franco-American Odyssey",1989,55,NA,6.5,6,0,0,0,0,0,45.5,45.5,0,0,0,"",0,0,0,0,1,0,0 -"Jack London",1943,82,NA,5.5,26,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jack McCall Desperado",1953,76,NA,5.3,17,4.5,4.5,0,24.5,4.5,34.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Jack Pot",1940,20,NA,6.6,7,0,0,0,14.5,0,14.5,74.5,0,0,0,"",0,0,0,1,0,0,1 -"Jack Slade",1953,90,NA,5.7,35,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jack and Jill",2000,15,NA,6.2,5,24.5,0,0,0,0,0,64.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Jack and Sarah",1995,110,NA,6.4,1007,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,0,0,1,0 -"Jack and the Beanstalk",1902,10,NA,5.8,33,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Jack and the Beanstalk",1931,7,NA,5.7,10,0,0,0,14.5,14.5,44.5,44.5,0,0,0,"",0,1,0,0,0,0,1 -"Jack and the Beanstalk",1952,78,683000,5.2,268,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Jack and the Beanstalk",1970,62,NA,6.5,6,14.5,0,14.5,14.5,0,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Jack o kavalaris",1979,111,NA,4.1,5,0,0,24.5,0,24.5,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Jack of Diamonds",1967,108,NA,5,26,0,14.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jack of Diamonds",2001,84,1500000,1.7,6,14.5,0,0,0,0,34.5,0,14.5,0,34.5,"",1,0,0,0,0,0,0 -"Jack of Hearts",1993,90,NA,8.9,9,0,0,0,0,14.5,0,14.5,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Jack of Hearts",2000,93,NA,4.2,8,24.5,0,0,24.5,14.5,0,24.5,0,0,14.5,"R",0,0,0,0,0,0,0 -"Jack the Bear",1993,99,NA,6.1,779,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Jack the Dog",2001,85,NA,5.2,52,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Jack the Giant Killer",1962,91,NA,6.3,214,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Jack the Ripper",1959,84,NA,5.6,49,4.5,0,0,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jack the Ripper",1976,82,NA,5.1,227,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jack's Back",1988,97,NA,5.8,346,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jack-Knife Man, The",1920,60,NA,7.5,13,14.5,0,0,4.5,0,4.5,0,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Jack-O",1995,88,NA,2.3,203,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Jack-Wabbit and the Beanstalk",1943,7,NA,7.4,37,0,0,0,4.5,4.5,0,34.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Jackal, The",1997,124,60000000,5.7,12753,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Jackals",1986,97,NA,4.8,31,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Jackals, The",1967,96,NA,5.7,28,4.5,0,14.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jackass Mail",1942,79,NA,6.2,21,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jackass: The Movie",2002,87,5000000,6.1,8893,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,1,0,0 -"Jacked",2001,120,NA,4.8,51,14.5,4.5,0,4.5,14.5,4.5,4.5,14.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Jacket, The",2005,102,19000000,6.4,1564,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Jackhammer",2004,89,NA,3.3,46,44.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Jackie Brown",1997,154,12000000,7.5,28891,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Jackie Robinson Story, The",1950,76,NA,6.5,154,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jacknife",1989,102,NA,6.2,819,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jackpot",1992,108,NA,3.2,14,24.5,4.5,24.5,4.5,4.5,0,0,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Jackpot",2001,97,400000,5.2,213,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Jackpot 2",1982,35,NA,5.6,18,0,0,0,14.5,34.5,24.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,1 -"Jackpot, The",1950,85,NA,6.3,100,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Jacks or Better",2000,76,NA,4.1,11,24.5,4.5,0,14.5,24.5,0,0,0,0,14.5,"",0,0,1,1,0,0,0 -"Jackson County Jail",1976,89,NA,5.1,118,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jackson: My Life... Your Fault",1995,41,NA,1.6,42,84.5,4.5,0,0,0,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Jacktown",1962,62,NA,5.9,12,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Jacky",2000,80,NA,4.9,39,14.5,0,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jacob Two Two Meets the Hooded Fang",1999,96,NA,3.6,79,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Jacob Two-Two Meets the Hooded Fang",1978,81,NA,5.5,44,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Jacob's Ladder",1990,115,25000000,7.3,8901,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Jacobs stege",1942,104,NA,6.6,7,0,0,0,0,14.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Jacqueline",1956,89,NA,6.5,26,4.5,0,0,4.5,14.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Jacqueline Susann's Once Is Not Enough",1975,121,NA,4,92,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jacqueline dans ma vitrine",2000,76,NA,5.2,5,0,0,0,0,44.5,24.5,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Jacques Brel Is Alive and Well and Living in Paris",1975,98,NA,6,60,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Jacques et novembre",1984,72,NA,7.2,8,0,0,0,0,0,24.5,24.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Jacquot de Nantes",1991,118,NA,7.2,115,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Jade",1995,107,50000000,4.8,2380,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Jade Mask, The",1945,66,75000,5.7,64,4.5,4.5,4.5,4.5,4.5,34.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jaded",1996,95,NA,5.1,194,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Jadzia",1936,92,NA,7.6,5,0,0,0,0,0,0,44.5,64.5,0,0,"",0,0,0,0,0,1,0 -"Jag - en kvinna",1965,95,NA,4.2,29,14.5,4.5,0,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jag - en oskuld",1968,81,NA,5.7,35,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jag rodnar",1981,105,NA,7.8,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Jagadeka Veerudu Attilokasundari",1990,153,NA,5.6,12,0,0,0,14.5,0,14.5,0,4.5,24.5,34.5,"",1,0,1,1,0,1,0 -"Jagadeka Veeruni Katha",1961,187,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,0,0,0 -"Jagdrevier der scharfen Gemsen",1975,76,NA,2.5,10,45.5,14.5,14.5,14.5,0,14.5,0,0,14.5,0,"",0,0,1,0,0,0,0 -"Jagdszenen aus Niederbayern",1969,88,NA,7,38,0,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Jagged Edge",1985,108,NA,6.5,2247,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Jagoda u supermarketu",2003,83,NA,6,101,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,1,0 -"Jagode u grlu",1985,84,NA,7.5,28,0,4.5,0,0,4.5,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Jagte Raho",1956,153,NA,7.9,34,0,0,0,0,4.5,0,0,14.5,4.5,74.5,"",0,0,0,0,0,0,0 -"Jaguar",1956,66,NA,6.1,6,0,0,0,14.5,14.5,14.5,0,34.5,0,14.5,"",0,0,0,1,0,1,0 -"Jaguar",1979,100,NA,8.3,16,0,0,0,0,0,14.5,14.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Jaguar Lives!",1979,90,NA,3.4,42,14.5,4.5,24.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Jaguar, Le",1996,100,NA,5.8,430,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jaguarov skok",1984,99,NA,6.5,8,14.5,0,14.5,0,0,24.5,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Jaguimo",1998,91,NA,5,50,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Jahrgang '45",1965,100,NA,7.3,6,0,0,0,14.5,0,14.5,0,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Jail Bait",1937,18,NA,6.3,18,4.5,0,4.5,0,14.5,14.5,14.5,34.5,14.5,0,"",0,0,1,0,0,0,1 -"Jail Bait",1954,72,NA,2.9,219,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jail Busters",1955,61,NA,6.3,25,0,0,4.5,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Jailbait",1994,102,NA,2.2,287,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Jailbait Babysitter",1978,89,NA,3.1,15,24.5,14.5,0,4.5,4.5,24.5,4.5,0,0,24.5,"",0,0,0,1,0,1,0 -"Jailbird Rock",1988,90,NA,5.2,7,0,14.5,0,14.5,14.5,14.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Jailbirds of Paradise",1934,18,NA,4.9,6,0,0,14.5,14.5,0,0,14.5,0,0,45.5,"",0,0,1,0,0,0,1 -"Jailbreakers, The",1960,64,NA,4.7,6,0,0,0,64.5,14.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Jailhouse Girls",1984,84,NA,5.5,5,0,0,0,0,24.5,24.5,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Jailhouse Rock",1957,96,NA,6.2,951,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jails, Hospitals & Hip-Hop",2000,90,NA,6.9,29,4.5,4.5,4.5,4.5,4.5,0,0,4.5,14.5,45.5,"R",0,0,1,1,1,0,0 -"Jaime",1999,111,NA,7.1,107,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Jak byc kochana",1963,97,NA,5.5,14,0,0,0,14.5,14.5,14.5,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Jak daleko stad, jak blisko",1972,95,NA,7.7,16,0,0,0,4.5,0,14.5,24.5,0,4.5,45.5,"",0,0,0,1,0,0,0 -"Jak narkotyk",1999,135,NA,5,7,0,0,0,0,44.5,0,0,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Jak rozpetalem druga wojne swiatowa",1970,224,NA,7.5,97,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Jak se budi princezny",1977,83,NA,7.1,39,0,0,0,4.5,0,24.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Jak si zaslouzit princeznu",1995,72,NA,5.2,6,0,14.5,0,34.5,0,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Jak to sie robi",1974,78,NA,7.1,13,0,4.5,0,0,4.5,0,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Jak to sie robi z dziewczynami",2002,90,NA,4.2,12,0,0,34.5,14.5,4.5,14.5,4.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Jak vytrhnout velrybe stolicku",1977,80,NA,8.5,33,0,0,0,0,0,4.5,4.5,34.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Jak zyc",1978,85,NA,8,6,0,0,14.5,0,0,0,14.5,0,34.5,34.5,"",0,0,0,0,0,0,0 -"Jaka Sembung & Bergola Ijo",1985,94,NA,4.7,11,4.5,4.5,0,24.5,0,4.5,4.5,24.5,0,4.5,"",1,0,0,0,0,0,0 -"Jakarta",1988,91,NA,4.7,44,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Jakarta",2000,92,NA,7,35,4.5,0,4.5,0,4.5,4.5,24.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Jakarta Project",2001,93,NA,5.5,8,34.5,14.5,0,0,24.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Jake Speed",1986,93,NA,4.3,180,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Jake's Booty Call",2003,77,50000,7,10,34.5,0,0,0,0,0,0,14.5,14.5,45.5,"R",0,0,1,0,0,0,0 -"Jako jed",1985,76,NA,6.3,17,4.5,0,0,0,14.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Jakob the Liar",1999,120,15000000,5.9,2544,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Jakobine",1978,105,NA,6.9,5,0,0,0,0,0,24.5,24.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Jakoman to Tetsu",1949,91,NA,8.4,6,0,0,0,0,0,0,45.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Jakoman to Tetsu",1964,100,NA,8.8,6,14.5,0,0,0,0,0,45.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Jakten",1959,94,NA,6.4,37,34.5,14.5,4.5,0,0,0,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Jalla! Jalla!",2000,88,NA,7.1,2881,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Jalna",1935,78,NA,6.2,17,4.5,4.5,0,4.5,0,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Jalopy",1953,62,NA,6.4,43,0,0,0,4.5,14.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Jalousie",1991,90,NA,4.7,5,24.5,24.5,24.5,0,44.5,0,0,0,0,0,"",0,0,1,0,0,1,0 -"Jalsaghar",1958,95,NA,8.1,238,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Jam session - Kikujiro no natsu koshiki kaizokuban",1999,93,NA,7,19,4.5,4.5,0,0,0,24.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Jamaica Inn",1939,98,NA,6.3,906,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jambon d'Ardenne",1977,86,NA,6.2,5,0,0,0,24.5,0,44.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"James Brothers of Missouri, The",1949,167,NA,6.9,5,0,0,0,0,44.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"James Dean Story, The",1957,81,35000,5.7,109,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"James Ellroy Presents Bazaar Bizarre",2004,79,NA,7,8,24.5,0,0,0,0,0,0,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"James Ellroy: Demon Dog of American Crime Fiction",1993,91,NA,4.7,22,4.5,0,14.5,0,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"James Gang, The",1997,95,NA,5.2,47,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,0,14.5,"R",0,0,1,0,0,0,0 -"James Joyce's Women",1985,88,NA,6.5,30,4.5,4.5,4.5,4.5,0,0,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"James and the Giant Peach",1996,79,38000000,6.6,3144,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG",0,1,0,0,0,0,0 -"Jamila",1994,90,NA,8.9,13,0,0,0,0,0,0,24.5,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Jammin' the Blues",1944,10,NA,8.3,36,0,0,4.5,0,4.5,4.5,4.5,14.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Jan Dara",2001,120,NA,7.2,237,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Jan Hus",1954,125,NA,5.4,16,0,14.5,0,14.5,0,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Jan Rap en z'n maat",1989,118,NA,6.5,41,0,4.5,4.5,14.5,4.5,24.5,34.5,4.5,14.5,0,"",0,0,1,1,0,0,0 -"Jan zonder vrees",1984,78,NA,6.5,42,4.5,0,0,0,4.5,14.5,24.5,34.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Jan-Gel, the Beast from the East",1999,53,NA,4.8,19,14.5,4.5,0,14.5,0,14.5,14.5,4.5,0,44.5,"",1,0,0,1,0,0,0 -"Jana Aranya",1976,131,NA,8.2,75,0,0,0,4.5,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Jancio Wodnik",1993,101,NA,6.9,69,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Jandek on Corwood",2003,88,NA,8.1,39,0,0,4.5,4.5,0,4.5,14.5,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Jane Austen in Manhattan",1980,108,NA,4.8,37,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Jane Austen's Mafia!",1998,83,10000000,4.8,2999,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Jane Eyre",1934,62,NA,5.6,28,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Jane Eyre",1944,97,NA,7.5,1081,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Jane Eyre",1970,110,NA,6.8,183,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Jane Eyre",1996,116,NA,6.5,1381,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Jane White Is Sick & Twisted",2002,84,NA,5.3,171,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"R",0,0,1,1,0,1,0 -"Janela (Maryalva Mix), A",2001,87,NA,4.3,26,14.5,0,0,0,4.5,14.5,4.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Janela Aberta, A",2002,10,NA,8.1,24,0,0,4.5,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Janela da Alma",2001,73,NA,8.8,82,4.5,0,0,0,4.5,0,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Jang Aur Aman",2001,148,NA,7.8,33,0,0,0,0,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Janggunui adeul",1990,108,NA,7.5,36,0,0,4.5,0,4.5,4.5,44.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Janggunui adeul II",1991,103,NA,7,17,0,0,0,14.5,4.5,24.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Janggunui adeul III",1992,110,NA,3.7,13,34.5,0,0,4.5,24.5,4.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Janghwa, Hongryeon",2003,115,NA,7.5,1674,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Jango",1984,115,NA,6.2,8,0,0,0,0,24.5,0,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Janguru taitei",1997,100,NA,6.7,23,4.5,0,0,0,14.5,4.5,14.5,4.5,14.5,34.5,"PG",0,0,0,0,0,0,0 -"Janice Beard: 45 Words Per Minute",1999,81,NA,6.2,118,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Janie",1944,102,NA,6.3,32,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Janie Gets Married",1946,89,NA,5.7,13,0,4.5,0,0,4.5,34.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Janika",1949,80,NA,5.2,11,0,0,0,0,24.5,4.5,4.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Janis",1974,96,NA,7.3,123,0,0,0,4.5,4.5,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Janis et John",2003,105,NA,5.9,166,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Janitor, The",1993,4,NA,6,14,14.5,0,0,14.5,4.5,0,0,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Janji Joni",2005,83,NA,8.4,10,0,0,0,0,0,14.5,24.5,14.5,44.5,24.5,"",0,0,1,0,0,1,0 -"Janku fudo",1997,82,NA,4.3,41,14.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Janosik",1974,119,NA,6.6,33,4.5,0,0,0,4.5,4.5,24.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Jantjes, De",1934,99,NA,9.2,7,0,0,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"January Man",1989,97,NA,5.3,1368,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Januskopf, Der",1920,77,NA,8.5,7,14.5,0,0,0,14.5,0,0,0,44.5,24.5,"",0,0,0,0,0,0,0 -"Jap Zero",1943,20,NA,3.1,28,24.5,14.5,4.5,4.5,4.5,24.5,4.5,0,4.5,14.5,"",0,0,0,0,1,0,1 -"Japaner sind die besseren Liebhaber",1995,82,NA,5.6,50,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Japanese American Communities",1932,6,NA,5.1,8,0,0,14.5,14.5,34.5,14.5,24.5,0,0,0,"",0,0,0,0,1,0,1 -"Japanese Story",2003,105,5740000,7,1330,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Japanese Village",1901,3,NA,4.1,5,0,0,24.5,44.5,44.5,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Japanese War Bride",1952,91,NA,5.8,20,4.5,0,0,14.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Japoteurs",1942,9,NA,6.2,48,4.5,0,14.5,4.5,4.5,34.5,14.5,14.5,4.5,14.5,"",1,1,0,1,0,0,1 -"Jar, The",1984,90,NA,3.1,29,64.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Jardin de Celibidache, Le",1997,147,NA,2.6,12,14.5,4.5,0,0,4.5,0,0,44.5,0,24.5,"",0,0,0,0,1,0,0 -"Jardin de papa, Le",2004,75,NA,4.3,8,14.5,0,0,14.5,0,24.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Jardin des supplices, Le",1976,90,NA,2.4,9,14.5,14.5,24.5,34.5,0,0,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Jardines colgantes",1993,116,NA,4.5,5,64.5,0,0,0,0,24.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Jardinier d'Argenteuil, Le",1966,86,NA,5.5,19,0,14.5,4.5,0,14.5,24.5,14.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Jarrapellejos",1988,90,NA,7.6,15,0,4.5,0,0,4.5,14.5,24.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Jason Goes to Hell: The Final Friday",1993,91,2500000,3.9,2651,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Jason X",2001,85,14000000,4.6,5975,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Jason and the Argonauts",1963,104,1000000,7.2,2408,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Jason's Lyric",1994,119,7000000,6,445,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jasper in a Jam",1946,7,NA,8.3,13,0,0,0,4.5,0,0,14.5,14.5,0,64.5,"",0,1,1,0,0,0,1 -"Jassy",1947,96,NA,6,31,0,0,0,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Jaundiced Eye, The",1999,89,NA,6.2,53,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Jaune le soleil",1972,100,NA,5.2,5,24.5,0,0,0,0,0,0,24.5,64.5,0,"",0,0,0,0,0,0,0 -"Jaune revolver",1987,90,NA,4.9,6,0,14.5,0,14.5,14.5,0,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Java Burn",1988,85,NA,4.7,6,14.5,0,0,34.5,14.5,14.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Java Head",1934,70,NA,4.2,7,0,0,14.5,14.5,0,0,24.5,0,0,44.5,"",0,0,0,0,0,1,0 -"Jawbreaker",1999,96,NA,4.6,4016,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Jaws",1975,130,12000000,8.2,46978,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Jaws",1978,3,NA,7.6,24,4.5,4.5,0,0,0,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Jaws 2",1978,116,NA,5.3,6221,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jaws 3-D",1983,99,20500000,3.2,5028,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Jaws of Satan",1981,92,NA,3.3,67,24.5,14.5,14.5,14.5,14.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Jaws of the Dragon",1976,95,NA,6.2,5,0,0,0,0,24.5,24.5,0,0,0,64.5,"",1,0,0,1,0,0,0 -"Jaws: The Revenge",1987,91,23000000,2.6,5365,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jay Silverheels: The Man Behind the Mask",2000,47,NA,7.3,6,0,0,0,0,0,0,64.5,34.5,0,0,"",0,0,0,0,1,0,0 -"Jay and Silent Bob Strike Back",2001,104,22000000,6.9,24211,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Jaya Ganga",1998,85,NA,6.1,15,0,0,0,4.5,24.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Jayhawkers!, The",1959,100,NA,6.2,45,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jazz '34",1996,72,NA,5.8,31,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Jazz Daimyo",1986,85,NA,6.8,12,0,0,0,0,0,14.5,14.5,14.5,44.5,4.5,"",0,0,1,1,0,0,0 -"Jazz Fool, The",1929,6,NA,6.6,16,0,0,0,14.5,0,24.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Jazz Seen: The Life and Times of William Claxton",2001,81,NA,7,19,0,0,0,0,0,24.5,34.5,34.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Jazz Singer, The",1927,88,NA,6.3,666,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Jazz Singer, The",1953,107,NA,5.1,37,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jazz Singer, The",1980,115,NA,4.7,584,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jazz on a Summer's Day",1960,85,NA,7.4,146,0,0,4.5,0,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Jazzgossen",1958,104,NA,6.3,26,0,0,0,4.5,14.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Je chanterai pour toi",2001,76,NA,7.8,14,0,0,14.5,0,4.5,0,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Je hais les acteurs",1986,90,NA,5.6,37,0,14.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Je li jasno prijatelju?",2000,97,NA,7.2,12,4.5,0,0,4.5,0,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Je n'aime que toi",2004,105,NA,3.5,17,14.5,14.5,14.5,0,4.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,1,0 -"Je ne vois pas ce qu'on me trouve",1997,99,NA,6.1,30,0,0,4.5,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Je reste!",2003,102,NA,5.2,113,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Je sais rien, mais je dirai tout",1973,78,NA,5.3,51,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Je suis loin de toi mignonne",1976,110,NA,2.5,9,14.5,14.5,14.5,0,14.5,14.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Je suis timide... mais je me soigne",1978,85,NA,5.8,121,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Je suis un assassin",2004,107,NA,5.6,51,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Je suis un sentimental",1955,95,NA,4.9,5,0,0,0,24.5,0,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Je suis une nymphomane",1970,103,NA,4.5,20,4.5,24.5,0,4.5,24.5,24.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Je suis vivante et je vous aime",1998,95,NA,7.3,33,0,4.5,34.5,4.5,4.5,0,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Je suis votre homme",2004,106,NA,6.7,28,14.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Je t'aime John Wayne",2000,10,NA,5.7,90,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Je t'aime moi non plus",1976,90,NA,6,131,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Je t'aime, je t'adore",2003,95,NA,6.1,6,0,0,14.5,0,0,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Je t'aime, je t'aime",1968,91,NA,7.1,88,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Je taim",1998,11,NA,6.7,5,24.5,0,0,0,24.5,24.5,24.5,0,24.5,0,"",0,0,0,1,0,0,1 -"Je te tiens, tu me tiens par la barbichette",1979,98,NA,5.5,19,14.5,0,4.5,14.5,14.5,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Je vais craquer!!!",1980,89,NA,5.8,24,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Je veux tout",1999,100,NA,4.3,20,4.5,14.5,4.5,24.5,14.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Je vous aime",1980,100,NA,5.7,47,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,"",0,0,1,1,0,1,0 -"Je vous salue, mafia!",1965,90,NA,7.5,13,0,0,0,0,0,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Je, tu, il, elle",1974,90,NA,6.3,49,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Jealousy",1934,66,NA,3.2,5,0,24.5,44.5,0,0,24.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Jealousy",1945,71,NA,6.1,5,0,0,0,0,24.5,64.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Jean Cocteau, auto-portrait",1985,66,NA,6.9,21,0,0,0,0,0,24.5,44.5,4.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Jean Seberg: American Actress",1995,82,NA,6.3,6,0,0,0,0,14.5,14.5,14.5,34.5,14.5,0,"",0,0,0,0,1,0,0 -"Jean de Florette",1986,120,NA,8,5826,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Jeanne Dielman, 23 Quai du Commerce, 1080 Bruxelles",1976,201,NA,7.8,135,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Jeanne Eagels",1957,108,NA,5.9,45,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Jeanne d'Arc",1899,10,NA,5.3,14,4.5,0,0,14.5,0,4.5,0,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Jeanne la Pucelle I - Les batailles",1994,160,NA,7.3,88,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Jeanne la Pucelle II - Les prisons",1994,176,NA,8,74,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Jeans",1998,175,NA,4.5,56,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Jeans e una maglietta, Un",1983,81,NA,5.8,6,34.5,0,0,0,14.5,0,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Jebiga",2000,90,NA,6.9,58,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Jede Menge Kohle",1981,100,NA,7.1,34,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Jedermanns Fest",2002,173,NA,4.5,22,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Jedi Hunter, The",2002,9,NA,6.2,46,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Jedna kocka za druhou",1993,90,NA,4.9,9,24.5,0,0,14.5,0,14.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Jeep, The",1938,7,NA,7,19,0,0,0,0,14.5,14.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Jeepers Creepers",2001,90,10000000,5.4,10973,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Jeepers Creepers II",2003,104,25000000,5.2,4069,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Jefe, El",1958,90,NA,4.2,11,0,4.5,0,0,4.5,0,44.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Jeff",1969,92,NA,6.5,91,4.5,4.5,4.5,0,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jefferson in Paris",1995,139,14000000,5.6,665,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Jeffrey",1995,92,NA,6.5,2076,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Jeffrey's Hollywood Screen Trick",2001,11,NA,7.6,18,0,0,14.5,0,0,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Jefftowne",1998,59,NA,3.9,30,24.5,4.5,0,4.5,0,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Jeg - en marki",1967,90,NA,1.3,6,34.5,14.5,0,14.5,0,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Jeg er sgu min egen",1967,100,NA,5.8,7,0,0,0,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Jehovah's Witnesses: The Organization Behind the Name",1990,55,NA,7.8,47,4.5,0,0,4.5,0,0,0,4.5,4.5,84.5,"",0,0,0,0,0,0,0 -"Jekyll Island",1998,91,NA,5.4,57,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jekyll and Hyde... Together Again",1982,87,NA,5.3,173,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Jelangkung",2001,102,NA,4.8,57,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jell-Ohh Lady",1999,22,NA,8.7,10,14.5,0,0,0,0,0,0,14.5,24.5,64.5,"",0,0,1,0,0,0,1 -"Jelly Dolly",2004,94,NA,3.6,5,24.5,44.5,0,24.5,0,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Jelly Pilgrim",2004,4,60000,2,6,14.5,34.5,0,0,0,0,0,0,14.5,34.5,"",0,1,0,0,0,0,1 -"Jemima: Dating Is Murder",2003,9,NA,5.9,8,14.5,0,0,0,0,0,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Jenaro el de los 14",1974,85,NA,3.8,8,0,14.5,14.5,14.5,24.5,14.5,0,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Jenatsch",1987,97,NA,6.4,22,0,0,0,4.5,0,4.5,24.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Jeni - Jeni",1966,103,NA,8.5,39,0,0,0,0,0,4.5,4.5,44.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Jeniec Europy",1989,124,NA,4.9,5,0,24.5,0,0,0,24.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Jenin Yoman Miluim",2002,62,NA,7.6,11,4.5,0,0,0,14.5,4.5,0,4.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Jenin, Jenin",2002,54,NA,4.3,70,45.5,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Jenipapo",1995,100,NA,7.1,37,0,4.5,0,0,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jenna Ink",1996,73,NA,5.6,28,4.5,14.5,0,4.5,4.5,4.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Jenna's Built for Speed",1997,85,NA,7,77,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Jennie Gerhardt",1933,85,NA,6,5,0,0,0,0,44.5,0,0,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Jennie: Wife/Child",1968,83,NA,5.1,6,0,0,14.5,14.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Jennifer",1953,73,NA,6.9,17,0,0,0,0,4.5,24.5,24.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Jennifer",1978,90,NA,4.3,55,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jennifer Eight",1992,125,NA,6,2764,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jennifer Is Dead",2002,24,NA,4.9,14,14.5,0,0,0,14.5,0,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Jennifer on My Mind",1971,90,NA,3.9,50,24.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Jennifer's Shadow",2004,96,1000000,5.1,17,14.5,0,4.5,0,14.5,4.5,4.5,24.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Jenny",1970,86,NA,4.2,29,24.5,14.5,14.5,4.5,24.5,0,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jenny",1986,44,NA,8.9,8,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Jenny Kissed Me",1986,98,NA,6.4,5,0,0,0,44.5,0,24.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Jenseits der Stille",1996,109,NA,7.4,1199,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Jenseits des Krieges",1996,117,NA,1.6,7,24.5,0,0,0,0,0,0,14.5,44.5,14.5,"",0,0,0,0,1,0,0 -"Jentespranget",1973,101,NA,3.7,20,24.5,24.5,14.5,14.5,24.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Jeolmeun nalui chosang",1991,95,NA,5.2,9,24.5,0,24.5,0,14.5,0,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Jeolmeun namja",1994,116,NA,4.6,17,4.5,0,4.5,34.5,0,0,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Jeon tae-il",1996,92,NA,5,40,14.5,0,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Jeong",2000,115,NA,7.1,36,0,0,4.5,0,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Jeopardy",1953,69,NA,6.5,124,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jeremiah Johnson",1972,116,NA,7.3,2207,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Jeremiah Strong",2002,22,NA,7.2,5,0,0,24.5,0,24.5,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,1 -"Jeremy",1973,90,NA,6.4,126,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Jeremy Hardy Vs. the Israeli Army",2003,75,NA,4.2,12,0,0,4.5,14.5,0,14.5,14.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Jericho",1937,77,NA,6,25,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Jericho",1946,139,NA,5.4,11,0,0,14.5,0,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jericho",2000,101,NA,6,52,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"PG-13",0,0,0,0,0,0,0 -"Jericho Mansions",2003,98,NA,5,139,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Jerk, The",1979,94,NA,6.8,6715,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Jerker",1991,90,NA,8.1,7,0,14.5,14.5,0,0,14.5,0,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Jerky Boys, The",1995,82,NA,3.4,641,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Jerky Turkey",1945,8,NA,7.2,44,0,0,0,4.5,4.5,24.5,24.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Jerome",1998,91,NA,6.9,61,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Jerry Maguire",1996,139,50000000,7.3,34623,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Jerry and Jumbo",1953,7,NA,7.3,33,4.5,4.5,0,0,4.5,4.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Jerry and Tom",1998,106,5000000,6.7,447,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Jerry and the Goldfish",1951,7,NA,7.1,30,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Jerry and the Lion",1950,7,NA,6.7,35,0,0,0,4.5,0,24.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Jerry's Cousin",1950,7,NA,7.4,62,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Jerry's Diary",1949,7,NA,6,28,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Jerry, Jerry, Quite Contrary",1966,7,NA,6,26,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Jerry-Go-Round",1965,6,NA,5.1,19,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Jersey Girl",1992,95,NA,5.1,276,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Jersey Girl",2004,102,35000000,6.4,6853,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Jersey Guy",2003,90,NA,1,9,45.5,0,0,0,0,0,0,14.5,0,34.5,"R",0,0,1,1,0,0,0 -"Jerusalem",1996,168,NA,7.1,465,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Jerusalem File, The",1972,86,NA,5.1,8,14.5,0,14.5,14.5,0,0,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Jerusalem, min elskede",2004,73,NA,4.6,7,0,14.5,14.5,0,0,0,14.5,14.5,0,44.5,"",0,0,0,0,1,0,0 -"Jerusalemski sindrom",2004,86,NA,4.2,28,14.5,4.5,4.5,4.5,4.5,0,0,4.5,0,64.5,"",0,0,0,1,0,0,0 -"Jesen stize, dunjo moja",2004,94,NA,6.6,16,14.5,0,0,4.5,14.5,0,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jesse 'The Body' Ventura: The Man, the Myth, the Legend",1999,60,NA,4.4,29,24.5,14.5,0,4.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,1,0,0 -"Jesse James",1939,106,1600000,7.1,373,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jesse James Meets Frankenstein's Daughter",1966,88,NA,2.2,194,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jesse James Rides Again",1947,180,NA,6.9,12,0,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jesse James at Bay",1941,56,NA,6.9,15,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jesse James vs. the Daltons",1954,65,NA,4.4,17,24.5,14.5,14.5,24.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Jesse James' Women",1954,83,NA,5.4,10,14.5,14.5,24.5,0,24.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Jessi's Girls",1975,86,NA,2.9,27,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jessica",1962,112,NA,5.9,23,0,0,0,4.5,14.5,34.5,14.5,4.5,24.5,4.5,"",0,0,1,1,0,1,0 -"Jessica: A Ghost Story",1992,94,NA,5.2,17,24.5,14.5,0,0,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jester, The",1937,90,NA,6.6,9,14.5,0,0,0,24.5,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Jesuit Joe",1991,100,NA,5.5,8,0,0,0,14.5,14.5,0,34.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Jesus",1979,117,6000000,5.9,316,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Jesus 2000",1998,30,NA,8.7,8,0,0,14.5,0,0,0,0,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Jesus Christ Superstar",1973,108,NA,6.7,4102,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Jesus Christ Vampire Hunter",2001,85,NA,5.5,539,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Jesus Henry Christ",2001,18,NA,5.3,7,24.5,0,14.5,0,14.5,0,0,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Jesus Trip, The",1971,84,NA,4.6,11,0,4.5,0,4.5,4.5,4.5,24.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Jesus the Driver",2004,94,NA,9.3,7,0,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,1,0,0,1,0 -"Jesus vender tilbage",1992,104,NA,2.3,23,44.5,4.5,14.5,0,4.5,4.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Jesus' Son",1999,107,2500000,6.9,2291,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Jesus, Du weisst",2003,87,NA,6.4,39,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Jeszcze tylko ten las",1991,86,NA,7.6,11,0,0,0,0,0,0,24.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Jet Attack",1958,68,100000,3.4,32,14.5,14.5,14.5,24.5,14.5,4.5,0,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Jet Boy",2001,99,NA,7.3,58,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Jet Cage, The",1962,6,NA,6.2,32,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Jet Over the Atlantic",1960,95,NA,5.4,29,0,4.5,14.5,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Jet Pink",1967,6,NA,5.6,28,0,0,0,4.5,24.5,34.5,4.5,14.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Jet Set",2000,106,NA,4.9,256,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Jet Storm",1959,88,NA,6.8,12,0,0,0,4.5,0,4.5,45.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Jetpiloter",1961,78,NA,2.9,6,34.5,0,34.5,14.5,0,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Jetsons: The Movie",1990,82,NA,4.6,445,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Jetzt oder nie - Zeit ist Geld",2000,90,NA,6.3,186,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Jeu avec le feu, Le",1975,112,NA,5.9,32,0,0,4.5,4.5,14.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Jeu de cons",2001,77,NA,4,13,14.5,14.5,4.5,14.5,0,4.5,0,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Jeu de massacre",1967,90,NA,6,21,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Jeune Werther, Le",1993,94,NA,5.8,34,4.5,0,4.5,14.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Jeune fille et la tortue, La",1999,14,NA,9,5,0,0,0,0,24.5,0,0,0,0,84.5,"",0,0,0,0,0,1,1 -"Jeune fille et les nuages, La",2001,7,NA,7.1,13,0,0,4.5,0,0,34.5,0,45.5,4.5,0,"",0,1,0,1,0,0,1 -"Jeune fille libre le soir",1975,112,NA,4,28,14.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jeux d'artifices",1987,99,NA,6.4,14,0,0,4.5,4.5,0,24.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Jeux d'enfants",2003,93,NA,7,1605,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Jeux dangereux, Les",1958,95,NA,6,5,0,0,0,0,0,64.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Jeux de l'amour, Les",1960,86,NA,7.8,11,0,0,0,4.5,4.5,0,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Jeux de la Comtesse Dolingen de Gratz, Les",1980,114,NA,7.4,7,14.5,0,0,0,0,0,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Jeux de plage",1995,28,NA,7.6,8,0,0,0,0,0,14.5,14.5,45.5,0,24.5,"",0,0,0,0,0,0,1 -"Jeux des anges, Les",1964,13,NA,8.4,7,0,14.5,0,0,0,0,0,0,44.5,44.5,"",0,1,0,0,0,0,1 -"Jeux interdits",1952,84,NA,7.4,808,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Jeux sont faits, Les",1947,105,NA,6.5,47,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Jew in the Lotus, The",1998,58,NA,6,14,24.5,4.5,0,0,0,4.5,24.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Jewel Robbery",1932,70,NA,7.3,128,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Jewel Thief",1967,186,NA,6,26,0,0,0,14.5,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Jewel of the Gods",1989,86,NA,4.9,9,14.5,14.5,0,34.5,14.5,24.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Jewel of the Nile, The",1985,106,NA,5.7,6662,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Jezebel",1938,104,1250000,7.4,1163,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Jezebel's Kiss",1990,96,NA,3.1,47,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Jezioro Bodenskie",1986,82,NA,6.5,7,0,0,14.5,0,0,24.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Jezus is een Palestijn",1999,92,NA,6.2,199,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ji de... xiang jiao cheng shu shi",1993,100,NA,6.6,19,0,0,0,0,4.5,14.5,24.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Ji dong ji xia",1989,114,NA,6.9,115,0,4.5,0,4.5,14.5,14.5,34.5,24.5,14.5,4.5,"",1,0,1,0,0,1,0 -"Ji dou shou xing",1997,89,NA,2.8,19,24.5,4.5,24.5,4.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Ji sang man ga",1997,91,NA,3.9,7,44.5,0,14.5,0,0,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Ji sor",1997,117,NA,7.2,40,0,0,4.5,4.5,0,4.5,24.5,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Ji zhao",1979,84,NA,7.3,12,0,0,0,0,0,24.5,4.5,44.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Jia wu feng yun",1962,95,NA,8.3,9,0,0,0,0,24.5,0,0,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Jia zhuang mei gan jue",2002,94,NA,7.1,6,0,0,0,0,0,45.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Jian gui",2002,94,NA,6.9,4114,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Jian gui 2",2004,90,NA,5.5,322,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jian hua yan yu jiang nan",1977,106,NA,4.7,158,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Jian nu",1993,79,NA,3.6,11,14.5,14.5,4.5,4.5,34.5,0,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Jiang jian zhong ji pian zhi zui hou gao yang",1999,81,NA,4.3,21,14.5,0,0,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Jiang shan mei ren",1959,100,NA,6.6,18,0,0,0,0,4.5,14.5,24.5,34.5,24.5,0,"",0,0,0,1,0,0,0 -"Jiang shi fan sheng",1987,84,NA,6.1,10,0,0,0,14.5,34.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Jib-Borha Be Behesht Nemiravand",1993,94,NA,8.1,15,0,14.5,4.5,0,4.5,0,0,0,0,74.5,"",0,0,1,1,0,0,0 -"Jibeuro",2002,88,NA,7.5,576,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Jidokhan sarang",1996,106,NA,3.7,20,14.5,0,0,24.5,0,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Jidu hanleng",1996,97,NA,6.8,70,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jidu zhongfan",1998,104,NA,5.8,58,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Jie Quan ying zhao gong",1977,104,NA,6.1,63,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Jigoku",1960,100,NA,7.2,35,4.5,0,4.5,4.5,4.5,0,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Jigoku no banken: akai megane",1987,116,NA,6.9,57,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Jigokuhen",1969,91,NA,6.4,18,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Jigokumon",1953,86,NA,7.1,226,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Jigsaw",1949,70,NA,6,38,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jigsaw",1962,107,NA,6.5,20,0,0,4.5,0,4.5,14.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Jigsaw",1968,97,NA,6.1,26,4.5,0,14.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Jigsaw",2003,8,NA,6.8,6,0,14.5,0,0,0,34.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Jigsaw Man, The",1983,94,NA,5.2,215,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jigsaw Murders, The",1988,98,NA,3.6,17,24.5,0,0,14.5,34.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Jigureul jikyeora!",2003,118,NA,7.6,601,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Jiken",1978,138,NA,6,12,0,4.5,0,0,4.5,14.5,0,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Jilao sishi",1996,112,NA,6.6,35,4.5,0,0,4.5,4.5,4.5,24.5,44.5,14.5,0,"",0,0,1,0,0,0,0 -"Jill the Ripper",2000,90,NA,3.3,208,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Jilting Joe",1997,77,NA,5.8,79,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Jiltuneun naui him",2002,124,NA,5.8,71,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Jim & piraterna Blom",1987,92,NA,6.2,48,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jim Brown All American",2002,140,NA,5.2,83,24.5,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Jim Loves Jack",1996,53,NA,6.7,6,0,14.5,0,14.5,0,14.5,0,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Jim Shvante (marili svanets)",1930,55,NA,6.9,53,0,0,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Jim Thorpe -- All-American",1951,107,NA,6.7,288,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jim il primo",1964,98,NA,4.7,9,0,0,14.5,44.5,34.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Jim in Bold",2003,78,NA,8,9,0,14.5,0,0,0,0,24.5,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Jim the World's Greatest",1976,94,100000,5,13,4.5,0,0,4.5,0,0,4.5,0,24.5,45.5,"",0,0,0,1,0,0,0 -"Jimi Hendrix",1973,98,NA,7.6,167,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Jimi Hendrix at the Isle of Wight",1992,56,NA,6.8,60,4.5,4.5,0,0,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Jimi Plays Berkeley",1971,55,NA,7.2,26,0,0,4.5,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Jimi Plays Monterey",1986,48,NA,8.1,69,4.5,0,0,4.5,4.5,4.5,4.5,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Jiminy Glick in La La Wood",2004,90,NA,6.3,71,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Jimmy Dorsey and His Orchestra",1938,9,NA,5.9,13,0,0,4.5,4.5,14.5,34.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Jimmy Hollywood",1994,112,20000000,5.3,749,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Jimmy Neutron's Nicktoon Blast",2003,5,NA,7.1,8,0,14.5,0,0,0,24.5,24.5,0,14.5,24.5,"",0,1,1,0,0,0,1 -"Jimmy Neutron: Boy Genius",2001,84,25000000,6,2280,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Jimmy Ritz",2000,16,NA,7.3,5,0,0,0,0,24.5,24.5,0,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Jimmy Scott: If You Only Knew",2002,79,NA,7.1,20,0,0,0,0,0,0,34.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Jimmy Show, The",2001,99,1000000,4.6,145,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Jimmy Walks Away",1997,7,NA,6.1,12,14.5,0,0,0,0,0,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Jimmy Zip",1999,112,NA,5.1,50,14.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Jimmy the Gent",1934,67,NA,6.5,175,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Jimmy the Kid",1983,85,NA,3.9,60,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Jimmy the Kid",1999,86,NA,5.6,24,14.5,0,4.5,14.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Jimmywork",2004,81,NA,4.8,9,14.5,0,0,0,0,24.5,14.5,14.5,0,44.5,"",0,0,0,1,1,0,0 -"Jin",1987,90,NA,8.1,6,0,0,14.5,0,0,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Jin nian xia tian",2001,96,NA,4.4,51,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jin pai shi jie",1990,87,NA,4.2,8,14.5,0,0,0,34.5,24.5,14.5,0,14.5,0,"",1,0,0,0,0,0,0 -"Jin ping shuang yan",1974,112,NA,6.3,17,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Jin tian bu hui jia",1996,110,NA,7.5,24,0,0,4.5,0,0,4.5,24.5,14.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Jin yu man tang",1995,100,NA,7,120,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Jincha sanai",1996,107,NA,4.9,11,0,0,14.5,4.5,34.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,1,0 -"Jing Gai'er",2004,108,700000,8.9,14,0,0,0,0,0,0,4.5,34.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Jing cha gu shi III: Chao ji jing cha",1992,95,900000,6.7,2024,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,1,0,0,0,0 -"Jing cha gu shi IV: Jian dan ren wu",1996,88,NA,6.2,2917,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Jing ke ci qin wang",1999,163,NA,7.3,1862,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Jing sheng jian jiao",2001,85,NA,5.4,11,4.5,4.5,0,14.5,4.5,24.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Jing tian shi er xiao shi",1990,90,NA,6,69,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Jing wang shuang xiong",1978,95,NA,3.7,12,34.5,0,14.5,24.5,4.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Jing wu men",1972,107,100000,6.7,1667,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Jing wu ying xiong",1994,103,NA,7.4,2871,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"R",1,0,0,1,0,0,0 -"Jing zhuang nan xiong nan di",1997,103,NA,7.6,12,4.5,0,0,0,0,34.5,4.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Jingi naki tatakai",1973,100,NA,7.2,187,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Jingi naki tatakai: Chojo sakusen",1974,118,NA,7.7,18,0,0,0,0,0,4.5,34.5,24.5,4.5,24.5,"",1,0,1,1,0,0,0 -"Jingi naki tatakai: Dairi senso",1973,119,NA,6.9,31,4.5,0,0,0,14.5,14.5,14.5,24.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Jingi naki tatakai: Hiroshima shito hen",1973,100,NA,7.1,44,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Jingi naki tatakai: Kanketsu-hen",1974,100,NA,7.1,19,0,4.5,0,0,0,14.5,34.5,14.5,14.5,24.5,"",1,0,1,1,0,0,0 -"Jingi no hakaba",1975,94,NA,6.8,138,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Jingle All the Way",1996,88,60000000,4.7,6246,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Jingtian dongdi",1999,90,NA,5.3,12,4.5,0,0,14.5,44.5,14.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Jinji pojiang",2000,114,NA,4.2,8,14.5,24.5,14.5,0,0,24.5,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Jinnah",1998,110,NA,7.2,159,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Jinruigaku nyumon: Erogotshi yori",1966,120,NA,7.4,203,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Jinshil game",2000,106,NA,6.6,13,0,0,0,0,0,34.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Jinx",1996,85,NA,3.4,16,4.5,14.5,14.5,4.5,0,14.5,4.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Jinx Money",1948,68,NA,6.7,19,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Jinxed!",1982,103,NA,4.1,160,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Jipangu",1990,95,NA,5.4,52,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Jis Desh Mein Ganga Rehta Hain",2000,141,NA,5.1,20,14.5,14.5,0,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Jis Desh Men Ganga Behti Hai",1960,167,NA,6.9,33,0,0,0,4.5,4.5,4.5,14.5,4.5,34.5,34.5,"",0,0,0,1,0,1,0 -"Jisatsu manyuaru",2003,86,NA,4.4,7,24.5,0,14.5,14.5,0,14.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Jisatsu saakuru",2002,99,250000,6.8,1311,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Jishin retto",1980,102,NA,4.5,25,24.5,0,4.5,4.5,4.5,24.5,4.5,4.5,0,24.5,"",1,0,0,1,0,0,0 -"Jit",1990,92,NA,6.7,16,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Jitney Elopement, A",1915,33,NA,6,102,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Jitsuroku Abe Sada",1975,85,NA,5.7,31,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jitterbug Follies",1939,9,NA,7.5,18,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Jitterbugs",1943,75,310600,5.7,74,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Jitters, The",1989,95,475000,2.5,27,44.5,4.5,4.5,14.5,4.5,14.5,0,4.5,4.5,0,"",1,0,0,0,0,0,0 -"Jivaro",1954,92,NA,5.3,30,0,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Jive Junction",1943,62,NA,4,16,14.5,4.5,4.5,4.5,34.5,14.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Jiyan",2002,102,NA,6.2,29,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jiyuan qiaohe",2000,100,NA,6.3,78,14.5,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Jizda",1994,90,30000,7.5,196,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Jo",1971,85,NA,6.8,304,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Jo Jeeta Wohi Sikandar",1992,174,NA,7.6,156,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",1,0,1,1,0,1,0 -"Jo Jo Dancer, Your Life Is Calling",1986,97,NA,5.2,217,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Joan of Arc",1948,145,NA,6.4,268,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Joan of Paris",1942,91,NA,6.6,81,0,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Joan the Woman",1917,138,302976,7.2,56,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Joana e Marcelo, Amor (Quase) Perfeito",2002,103,NA,8.6,10,0,0,0,0,0,0,14.5,44.5,34.5,24.5,"",0,0,1,0,0,1,0 -"Joanna",1968,108,NA,5.6,68,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Joanna Francesa",1973,110,NA,6.4,17,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Joaquin Murrieta",1938,10,NA,6.3,6,0,0,0,0,14.5,34.5,14.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Job, The",1996,10,NA,5.3,17,0,0,4.5,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Jobman",1990,97,NA,5.1,15,4.5,24.5,0,0,4.5,0,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Jock of the Bushveld",1992,94,NA,6.6,46,4.5,0,0,0,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Jockey",2004,85,NA,5.5,30,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Jocks",1987,91,NA,3.3,46,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Jodi No.1",2001,140,NA,6.2,39,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Joe",1970,102,106000,6.6,361,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Joe",1997,10,NA,4.6,28,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Joe",2003,9,NA,6.9,8,0,0,0,0,0,14.5,14.5,0,34.5,34.5,"",0,1,0,0,0,0,1 -"Joe & Joe",1996,80,NA,6.4,19,0,4.5,0,0,14.5,0,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Joe Butterfly",1957,90,NA,6.5,18,0,0,0,4.5,14.5,34.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Joe D'Amato Totally Uncut",1999,101,NA,7.3,26,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Joe Dakota",1957,79,NA,5.6,23,0,4.5,0,4.5,24.5,4.5,14.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Joe Dirt",2001,91,16000000,5.1,5514,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Joe Glow the Firefly",1941,7,NA,6.3,10,24.5,0,0,14.5,14.5,24.5,0,34.5,14.5,0,"",0,1,1,0,0,0,1 -"Joe Gould's Secret",2000,108,NA,6.4,563,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Joe Hill",1971,114,NA,6.7,62,4.5,0,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Joe Kidd",1972,88,NA,6,958,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Joe Louis Story, The",1953,88,NA,5.5,32,0,4.5,4.5,4.5,34.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Joe MacBeth",1955,90,NA,6,19,0,4.5,0,0,4.5,64.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Joe Navidad",1967,90,NA,5.3,9,0,24.5,14.5,0,34.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Joe Palooka Meets Humphrey",1950,65,NA,5.1,5,0,0,24.5,24.5,24.5,0,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Joe Palooka in Humphrey Takes a Chance",1950,62,NA,6.5,5,0,24.5,0,0,0,44.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Joe Palooka, Champ",1946,70,NA,6,6,0,0,34.5,0,14.5,14.5,14.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Joe Panther",1976,110,NA,5.5,23,0,0,4.5,4.5,24.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Joe Smith, American",1942,63,NA,5.5,23,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Joe Somebody",2001,98,38000000,5.5,1937,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,1,0,1,0 -"Joe Versus the Volcano",1990,102,NA,5.3,8136,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Joe the King",1999,93,NA,6.2,681,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Joe's Apartment",1996,80,13000000,5,2169,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Joe's Bed-Stuy Barbershop: We Cut Heads",1983,60,NA,5.8,81,24.5,4.5,0,0,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Joe's So Mean to Josephine",1996,89,NA,6.3,137,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Joe's Wedding",1997,99,NA,3.3,28,4.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Joe... cercati un posto per morire!",1968,89,NA,4.1,19,14.5,4.5,0,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Joey",1985,79,NA,3.5,151,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Joey",1986,97,NA,5.6,26,4.5,4.5,0,4.5,14.5,4.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Joey",1997,96,NA,4.4,72,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"Joey Boy",1965,91,NA,4.1,9,24.5,0,14.5,0,44.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Joey Breaker",1993,92,NA,4.1,49,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,1,1,0,1,0 -"Joey's Christmas",1994,15,NA,1.2,6,64.5,34.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,1 -"Jofroi",1933,52,NA,7,9,0,0,0,0,34.5,24.5,0,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Jogo Duro",1985,110,NA,8.2,6,0,0,0,0,0,14.5,0,45.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Johan",1921,110,NA,6.1,28,0,4.5,4.5,0,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Johan Cruijff - En un momento dado",2004,92,NA,7,129,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Johann Mouse",1952,8,NA,7.6,53,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Johann Sebastian Bach: Fantasia G-moll",1965,10,NA,6,31,0,4.5,0,14.5,4.5,14.5,4.5,24.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Johanna D'Arc of Mongolia",1989,165,NA,8.5,30,4.5,4.5,0,0,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"John",1998,21,NA,9,17,4.5,0,4.5,0,0,0,0,14.5,24.5,44.5,"",0,0,0,0,0,0,1 -"John Baker's Last Race",1976,28,NA,8.5,10,0,14.5,0,0,0,0,14.5,24.5,14.5,45.5,"",0,0,0,1,0,0,1 -"John Boorman Stole My Screenplay",2004,3,2000,2.8,5,84.5,0,0,0,0,0,0,0,0,24.5,"",0,0,1,0,0,0,1 -"John F. Kennedy: Years of Lightning, Day of Drums",1966,85,NA,7.4,27,0,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"John Ford Goes to War",2002,56,NA,2.9,26,44.5,0,0,0,4.5,4.5,4.5,4.5,0,34.5,"",0,0,0,0,1,0,0 -"John Goldfarb, Please Come Home",1965,96,4000000,4.8,170,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"John Henrik Clarke: A Great and Mighty Walk",1996,90,NA,7.9,34,4.5,4.5,4.5,0,4.5,0,4.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"John Henry",2000,10,NA,5.1,21,0,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,"",0,1,0,1,0,0,1 -"John Henry and the Inky-Poo",1946,7,NA,9.2,21,14.5,0,0,0,4.5,0,4.5,4.5,14.5,45.5,"",0,1,0,0,0,0,1 -"John Holmes and the All Star Sex Queens",1980,88,NA,5.3,7,14.5,0,0,14.5,0,14.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"John Huston and the Dubliners",1988,60,NA,5.7,17,14.5,4.5,0,4.5,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"John Huston: The Man, the Movies, the Maverick",1989,119,NA,7.5,31,0,0,4.5,0,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"John John In the Sky",2000,105,NA,4.1,35,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"John Johnson's Shadowhunters",2004,92,2000,6,5,24.5,0,0,0,24.5,44.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"John Loves Mary",1949,96,NA,4,42,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"John Lurie and the Lounge Lizards Live in Berlin",1992,105,NA,2.5,13,4.5,0,0,4.5,0,0,14.5,4.5,4.5,45.5,"",0,0,0,0,1,0,0 -"John Paul Jones",1959,126,NA,6.1,142,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",1,0,0,0,0,0,0 -"John Q",2002,116,36000000,6.4,8952,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"John Travolto... da un insolito destino",1979,87,NA,6.8,8,24.5,0,0,14.5,14.5,14.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"John Wayne: Bigger Than Life",1990,55,NA,1,6,84.5,0,0,0,0,0,14.5,0,0,0,"",0,0,0,0,1,0,0 -"John and Julie",1955,82,NA,5.6,17,14.5,0,0,0,14.5,14.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"John and Mary",1969,92,NA,5.9,255,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"John and the Missus",1987,100,NA,8.4,33,4.5,4.5,4.5,0,0,4.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"John og Irene",1949,81,NA,6.4,8,0,0,0,0,0,24.5,45.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"John og Mia",2002,25,NA,5.5,12,0,0,4.5,24.5,4.5,34.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Johnny",1999,84,NA,5.9,33,0,4.5,4.5,14.5,0,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Johnny Allegro",1949,81,NA,5.6,18,0,4.5,0,4.5,34.5,24.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Johnny Angel",1945,79,NA,6.7,83,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Johnny Apollo",1940,94,NA,6.5,81,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Johnny Appleseed",1948,19,NA,6.6,121,4.5,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Johnny B Good",1998,110,NA,4.2,6,34.5,0,14.5,0,0,14.5,14.5,14.5,0,0,"R",0,0,0,0,0,0,0 -"Johnny Bagpipes",1998,13,NA,8,12,0,0,0,0,0,4.5,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Johnny Be Good",1988,91,NA,4,969,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Johnny Belinda",1948,102,NA,7.8,422,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Johnny Cash! The Man, His World, His Music",1969,94,NA,7,25,0,0,0,4.5,14.5,4.5,24.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Johnny Come Lately",1943,97,NA,6.2,52,4.5,0,0,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Johnny Concho",1956,84,NA,5.7,45,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Johnny Cool",1963,103,NA,6.6,65,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Johnny Dangerously",1984,90,NA,5.7,2505,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Johnny Dark",1954,85,NA,5.3,52,0,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Johnny Doesn't Live Here Any More",1944,79,NA,5.7,10,0,0,0,0,34.5,24.5,24.5,14.5,0,24.5,"",0,0,1,0,0,1,0 -"Johnny Eager",1942,107,NA,7,235,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Johnny English",2003,87,35000000,5.6,8125,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Johnny Famous",2000,80,NA,2.5,17,14.5,14.5,4.5,14.5,0,4.5,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Johnny Firecloud",1975,94,200000,5.1,34,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Johnny Flash",1986,77,NA,5.9,111,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Johnny Flynton",2002,37,NA,7.6,22,4.5,4.5,0,0,14.5,0,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,1 -"Johnny Frenchman",1945,112,NA,6.3,12,0,0,0,0,14.5,14.5,34.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Johnny Got His Gun",1971,111,NA,7.4,1052,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Johnny Greyeyes",2000,75,NA,5.6,26,0,0,4.5,4.5,34.5,14.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Johnny Guitar",1954,110,NA,7.5,1475,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Johnny Handsome",1989,94,NA,5.6,1038,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Johnny Holiday",1949,92,NA,6.3,19,0,0,0,0,4.5,24.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Johnny Larsen",1979,100,NA,6.7,38,4.5,0,4.5,4.5,0,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Johnny Lingo",1969,25,NA,8.8,37,4.5,0,0,0,4.5,0,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,1 -"Johnny Mnemonic",1995,96,26000000,4.7,8258,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Johnny Mysto: Boy Wizard",1996,87,NA,7.2,26,14.5,0,4.5,4.5,4.5,4.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Johnny Nobody",1961,88,NA,5,13,0,0,0,14.5,4.5,4.5,14.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Johnny O'Clock",1947,96,NA,7,70,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Johnny One-Eye",1950,78,NA,2.4,6,14.5,0,14.5,0,14.5,14.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Johnny Oro",1966,87,NA,4.5,56,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Johnny Ostrich and His American Songbag",2002,13,NA,8.8,11,4.5,0,0,0,0,0,4.5,0,4.5,74.5,"",0,0,1,1,0,0,1 -"Johnny Reno",1966,83,NA,4.8,25,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Johnny Rocco",1958,84,NA,5.7,6,0,0,0,14.5,0,34.5,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Johnny Skidmarks",1998,96,NA,5.4,233,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Johnny Smith and Poker-Huntas",1938,8,NA,6.3,7,0,0,0,0,14.5,14.5,24.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Johnny Stecchino",1991,121,NA,6.8,1332,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Johnny Stool Pigeon",1949,76,NA,6.4,35,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Johnny Suede",1991,97,500000,5.8,594,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Johnny Tiger",1966,102,NA,5.2,16,0,0,4.5,14.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Johnny Tolengo, el majestuoso",1987,90,NA,1.9,10,34.5,0,0,14.5,24.5,0,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Johnny Tough",1974,87,NA,7.3,6,0,0,0,0,34.5,0,34.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Johnny Tremain",1957,80,NA,6.4,200,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Johnny Trouble",1957,80,NA,5.8,15,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Johnny Wong 2: Wong Again!",1990,114,NA,7.6,5,0,0,0,0,0,0,44.5,64.5,0,0,"",0,0,0,0,0,0,0 -"Johnny Wong: Hewo of the 21st Century",1989,54,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Johnny Yuma",1967,100,NA,6.4,17,14.5,0,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Johnny cien pesos",1993,90,NA,6.7,111,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Johns",1996,96,NA,6,553,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Johnson Family Vacation",2004,97,12000000,3.6,955,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Johnsons, De",1992,103,NA,5.8,204,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Johny",2003,180,NA,3,5,0,0,44.5,0,0,0,44.5,0,0,24.5,"",1,0,0,1,0,1,0 -"Johny Mera Naam",1970,159,NA,4.8,10,0,0,14.5,0,0,14.5,34.5,34.5,0,24.5,"",1,0,0,1,0,0,0 -"Johtaja Uuno Turhapuro - pisnismies",1998,102,NA,4.4,117,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Joi Baba Felunath",1978,112,NA,6.4,42,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Joi gin a long",1999,90,NA,6.6,105,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Jojo in the Stars",2003,13,NA,9.4,28,4.5,4.5,0,0,0,4.5,14.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Jojo la frite",2002,86,NA,5.1,7,14.5,0,0,14.5,14.5,44.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Jokbo",1979,110,NA,6.8,5,0,0,0,24.5,24.5,0,0,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Joker",1991,108,NA,4.6,127,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Joker Is Wild, The",1957,126,NA,7.1,169,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Joker, Der",1987,97,NA,4.4,35,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jokers, The",1967,94,NA,6.4,120,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Jokes My Folks Never Told Me",1978,82,NA,3.7,23,24.5,0,0,24.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Joki",2001,104,NA,6.9,288,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Joko invoca Dio... e muori",1968,81,NA,5.5,38,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jokyo",1960,100,NA,5.5,10,0,0,0,24.5,0,24.5,14.5,24.5,34.5,0,"",0,0,0,1,0,1,0 -"Jol",2001,90,NA,6,32,4.5,4.5,4.5,0,14.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Joli coeur, Le",1984,91,NA,4.8,6,0,0,14.5,34.5,14.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Joli mai, Le",1963,165,NA,7.7,21,0,0,0,0,4.5,0,14.5,4.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Jolies choses, Les",2001,105,NA,6,122,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jollies",1990,11,NA,5.9,18,4.5,4.5,4.5,0,4.5,24.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,1 -"Jolly Bad Fellow, A",1964,94,NA,5.1,10,0,0,14.5,0,0,34.5,14.5,14.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Jolly Blu",1998,90,NA,4.1,34,44.5,4.5,0,4.5,4.5,14.5,0,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Jolly Boys' Last Stand, The",2000,88,NA,7.8,6,0,0,0,0,14.5,0,14.5,14.5,45.5,0,"",0,0,0,1,0,0,0 -"Jolly Good Furlough, A",1943,7,NA,5.1,8,0,0,14.5,24.5,14.5,24.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Jolly Roger",1998,12,NA,6.6,13,4.5,0,0,0,14.5,14.5,0,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Jolly Roger",2001,95,NA,4.2,38,24.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Jologs",2002,110,NA,8.8,12,0,0,4.5,0,0,0,4.5,0,44.5,44.5,"",0,0,1,1,0,1,0 -"Jolson Sings Again",1949,96,NA,6.6,117,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Jolson Story, The",1946,124,NA,7.4,254,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Jomfruene i Riga",1996,98,NA,4,15,44.5,4.5,0,24.5,4.5,4.5,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Jon E. Edwards Is in Love",2003,85,NA,7.2,13,0,0,0,0,0,14.5,14.5,34.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Jona che visse nella balena",1994,100,NA,5.9,72,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Jonah: A VeggieTales Movie",2002,82,15000000,6.2,810,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Jonas",1957,81,NA,9.2,8,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,0,1,0,0,0 -"Jonas in the Desert",1994,130,NA,4.6,30,14.5,14.5,4.5,0,14.5,4.5,24.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Jonas qui aura 25 ans en l'an 2000",1976,116,NA,7.3,204,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Jonathan",1970,97,NA,4.9,26,14.5,0,4.5,14.5,14.5,14.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Jonathan Livingston Seagull",1973,120,1500000,4.6,250,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Jonathan degli orsi",1993,115,NA,6.5,24,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Jongen die niet meer praatte, De",1995,121,NA,6.7,10,14.5,0,0,14.5,0,14.5,34.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Joni",1980,75,NA,4.7,45,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Jonker Diamond, The",1936,10,NA,6.2,9,0,0,0,0,14.5,44.5,34.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Jonny Vang",2003,85,NA,6.4,243,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Jordan's Dance",1977,12,NA,7.4,7,0,0,0,0,0,14.5,14.5,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Jorden runt med Fanny Hill",1974,94,NA,3.7,11,4.5,0,24.5,0,4.5,24.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Jorge",1998,30,NA,8.6,47,0,0,0,4.5,4.5,4.5,4.5,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Jorge, um Brasileiro",1988,113,NA,5.1,12,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Jornaleros, Los",2003,88,NA,6.9,8,14.5,0,14.5,0,0,0,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Jorobado de la Morgue, El",1973,82,NA,4.7,48,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jory",1973,97,NA,5.2,25,0,0,4.5,4.5,34.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jos ovaj put",1983,97,NA,6.9,6,0,0,0,0,0,14.5,34.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Jose Rizal",1998,178,NA,7.7,53,4.5,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Josefine Mutzenbacher",1970,89,NA,6.2,27,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Joseph Andrews",1977,99,NA,5,76,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Joseph Smith: The Man",1980,9,NA,6.1,6,0,0,14.5,0,14.5,0,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Josepha",1982,114,NA,5.6,13,0,4.5,4.5,4.5,24.5,24.5,4.5,0,14.5,4.5,"",0,0,0,1,0,0,0 -"Josephine and Men",1955,98,NA,5.8,7,0,0,14.5,14.5,0,14.5,0,45.5,0,0,"",0,0,1,0,0,0,0 -"Josette",1936,90,NA,7,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Josette",1938,73,NA,5.6,5,0,0,0,24.5,0,64.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Josh",2000,162,NA,5.4,85,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Josh Jarman",2004,96,1300000,5.4,21,14.5,4.5,0,0,0,4.5,14.5,4.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Josh and S.A.M.",1993,89,18000000,5.2,281,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Joshua",1976,75,NA,4,20,4.5,24.5,24.5,14.5,14.5,24.5,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Joshua Oh Joshua",2001,90,NA,5,9,24.5,24.5,0,0,14.5,34.5,0,0,0,14.5,"",0,0,1,1,0,0,0 -"Joshua Then and Now",1985,119,NA,6.2,155,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Joshua Tree",1993,108,NA,4.4,497,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Joshua Tree",2002,23,NA,5.5,6,14.5,14.5,0,0,0,14.5,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Joshuu sasori: Kemono-beya",1973,87,NA,8.2,34,0,0,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Josie and the Pussycats",2001,98,22000000,5.2,4508,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Jossain on railo",1949,99,NA,4.9,5,0,0,24.5,0,0,0,64.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Jotai",1969,95,NA,6.6,8,0,0,0,0,0,24.5,45.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Jouer sa vie",1982,80,NA,6.4,12,0,0,0,4.5,0,24.5,24.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Jouet, Le",1976,95,NA,6.8,249,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Joueur de violon, Le",1994,94,NA,5.4,28,4.5,4.5,0,0,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Joueur, Le",1958,102,NA,7,12,0,0,0,0,24.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jouisseur, Le",1975,90,NA,5.4,5,24.5,24.5,0,0,0,0,0,64.5,0,0,"",0,0,0,0,0,0,0 -"Joulupukki ja noitarumpu",1996,50,NA,3.9,7,0,0,14.5,14.5,24.5,0,14.5,14.5,0,14.5,"",0,1,0,0,0,0,0 -"Jour de gloire, Le",1976,94,NA,4.4,17,14.5,4.5,4.5,14.5,14.5,4.5,4.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Jour et l'heure, Le",1963,110,NA,7,23,4.5,0,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Jour et la nuit, Le",1997,108,NA,2.5,110,45.5,4.5,4.5,4.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Journal d'une femme de chambre, Le",1964,94,NA,7.5,733,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Journal de Lady M, Le",1993,112,NA,5.4,39,24.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Journal intime d'une nymphomane, Le",1973,87,NA,4.5,24,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Journal of a Crime",1934,65,NA,6.4,25,0,4.5,0,0,14.5,34.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Journal/annales, 1000 et 1 heures, 1991-2001",2001,105,NA,8.4,5,0,0,0,0,0,0,0,64.5,0,44.5,"",0,0,0,0,1,0,0 -"Journalist, The",1979,95,NA,3.9,10,0,14.5,14.5,24.5,24.5,14.5,14.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Journey Among Women",1977,93,NA,4.8,15,4.5,0,0,24.5,14.5,4.5,4.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Journey Into Amazing Caves",2001,38,NA,7.2,86,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Journey Into Fear",1943,68,NA,6.8,360,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Journey Into Fear",1975,100,NA,5.5,33,4.5,0,4.5,4.5,44.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Journey Into Light",1951,87,NA,6.2,11,4.5,0,0,4.5,4.5,0,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Journey Into Midnight",1968,100,NA,5.9,15,0,0,4.5,14.5,14.5,24.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Journey Into Night",2002,28,NA,6.1,8,34.5,0,0,0,0,14.5,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Journey Into the Beyond",1977,95,NA,5.1,6,14.5,14.5,0,14.5,34.5,0,0,14.5,0,0,"",0,0,0,0,1,0,0 -"Journey Through Rosebud",1972,93,NA,5.8,7,0,0,14.5,14.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Journey Through the Night",2003,10,NA,5.4,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,0,1,0,0,1 -"Journey Through the Past",1974,79,NA,7.4,22,4.5,0,0,0,0,0,14.5,4.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Journey Together",1946,80,NA,7,6,0,0,0,14.5,14.5,14.5,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Journey for Margaret",1942,81,NA,7.4,70,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Journey of August King, The",1995,91,NA,6.3,228,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Journey of Jared Price, The",2000,96,30000,5.8,155,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Journey of Natty Gann, The",1985,101,NA,6.7,903,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Journey of the Blob",1989,10,NA,6.2,6,0,14.5,14.5,0,0,0,14.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Journey to Avebury, A",1971,10,NA,5.4,13,4.5,4.5,0,14.5,4.5,24.5,0,24.5,0,14.5,"",0,0,0,0,0,0,1 -"Journey to Freedom",1957,60,NA,1.5,6,34.5,34.5,0,34.5,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Journey to Lasta",2004,125,NA,7.4,7,14.5,0,0,14.5,0,0,0,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Journey to Shiloh",1968,101,NA,5.4,117,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Journey to Spirit Island",1988,93,NA,5.2,14,0,4.5,4.5,0,24.5,0,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Journey to the Center of Time",1967,82,NA,3.4,127,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Journey to the Center of the Earth",1959,132,NA,6.8,1669,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Journey to the Center of the Earth",1989,100,NA,3.1,88,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Journey to the Lost City",1959,94,NA,6.2,19,4.5,4.5,0,0,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Journey to the Seventh Planet",1962,83,74600,4.2,124,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Journey's End",1930,120,NA,8.4,22,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Journey, The",1959,126,NA,6.4,180,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Journeyman, The",2001,93,NA,5.5,59,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Journeys with George",2002,79,NA,6.5,184,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Journiac, la philosophie dans le boudin",1994,26,NA,7.1,6,0,0,0,0,14.5,34.5,34.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Jours de plaine",1990,6,NA,6.3,7,0,0,0,0,0,44.5,24.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Jousiampuja",1982,106,NA,6.2,12,0,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Joutilaat",2001,82,NA,6.6,56,4.5,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Joven casada, La",1975,99,NA,2.5,5,24.5,24.5,0,0,64.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Joven, La",1960,96,NA,7.3,128,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Joves",2004,105,NA,5.2,11,14.5,4.5,0,0,0,14.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Jowita",1967,91,NA,5.2,8,0,0,14.5,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Joy",1983,102,2000000,5,49,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Joy",2000,10,NA,6.2,21,4.5,4.5,0,0,4.5,34.5,4.5,34.5,0,4.5,"",0,0,0,0,0,0,1 -"Joy Luck Club, The",1993,139,NA,7.3,4306,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Joy Ride",2001,97,23000000,6.6,8132,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Joy Scouts",1939,11,NA,6.5,5,0,0,24.5,24.5,0,24.5,0,24.5,24.5,0,"",0,0,1,0,0,0,1 -"Joy Street",1995,24,NA,5.3,13,0,0,0,24.5,14.5,4.5,24.5,4.5,0,24.5,"",0,1,0,0,0,0,1 -"Joy et Joan",1985,94,NA,5.2,28,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Joy of Living",1938,90,NA,6.8,68,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Joy of Sex",1984,93,NA,2.8,130,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Joyce Story, A",2003,85,NA,9.2,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,0,1,0,0,0,0 -"Joyful Partaking",2002,120,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Joyride",1977,92,NA,4.3,45,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Joyride",1996,93,NA,5.3,341,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Joyriders",1989,96,NA,5.7,8,0,0,0,24.5,14.5,0,34.5,24.5,0,0,"",1,0,0,1,0,1,0 -"Joys of Smoking, The",1999,86,NA,5.9,15,14.5,0,14.5,4.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Joysticks",1983,88,NA,3.4,157,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Joze to tora to sakana tachi",2003,116,NA,7.7,60,0,0,0,0,0,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Ju Dou",1990,95,NA,7.5,1385,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Ju No-myeong Bakery",2000,104,NA,7.3,24,0,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Ju-on 2",2000,76,NA,5.9,201,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ju-on: The Grudge",2003,92,NA,6.5,2541,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Ju-on: The Grudge 2",2003,95,NA,6.4,473,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Juan Moreira",1973,102,NA,7.4,27,0,0,0,0,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Juana Gallo",1961,91,NA,9,8,0,14.5,0,0,0,0,0,45.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Juana la Loca",2001,115,NA,6.5,591,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Juana la loca... de vez en cuando",1983,87,NA,3.3,15,34.5,4.5,4.5,0,24.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Juarez",1939,121,NA,6.9,277,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Jubal",1956,100,NA,6.9,196,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Jubilee",1977,100,NA,5.7,253,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jubilee Trail",1954,103,NA,6,31,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Jubunairu",2000,100,NA,6.1,34,4.5,0,0,4.5,14.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Judas Kiss",1998,98,NA,6.4,1111,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Judas, El",1952,102,NA,5.2,6,14.5,0,0,0,0,14.5,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Jude",1996,123,NA,7,2238,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Judeu, O",1996,91,NA,7.5,47,4.5,0,0,4.5,4.5,14.5,4.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Judex",1916,300,NA,8.5,54,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Judex",1963,104,NA,7.3,54,0,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Judge Dredd",1995,96,90000000,4.6,9979,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Judge Hardy and Son",1939,90,NA,6.1,33,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Judge Hardy's Children",1938,78,NA,6.2,36,0,0,0,4.5,14.5,34.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Judge Priest",1934,81,NA,6.5,148,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Judge Steps Out, The",1949,91,NA,6.9,21,0,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Judge and Jury",1996,98,NA,2.7,57,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Judge for a Day",1935,8,NA,5.9,10,0,0,0,14.5,14.5,44.5,14.5,14.5,24.5,0,"",0,1,1,0,0,0,1 -"Judgement",1989,85,NA,4,33,14.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Judgement",1995,31,NA,7.2,41,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Judgement Day",1988,93,NA,4.1,30,24.5,4.5,14.5,4.5,24.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Judgment",2001,105,11000000,4.6,106,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Judgment Night",1993,110,NA,6,2552,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Judgment at Nuremberg",1961,186,3000000,8.2,3336,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Judgment in Berlin",1988,92,NA,5.6,102,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Judgment in Stone, A",1986,102,NA,4.5,32,4.5,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Judicial Consent",1994,100,NA,5.7,104,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Judith",1966,109,NA,4.7,28,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Judith Therpauve",1978,125,NA,7.1,11,0,0,0,4.5,14.5,4.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Judith of Bethulia",1914,61,36000,6.9,47,0,0,4.5,0,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Judy Berlin",1999,93,NA,6.8,448,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Judy Garland in Concert",1964,60,NA,9.7,17,0,0,0,0,4.5,4.5,4.5,14.5,0,74.5,"",0,0,0,0,0,0,0 -"Judy Spots, The",1995,12,NA,6.6,7,14.5,0,0,0,14.5,0,14.5,44.5,14.5,0,"",0,0,0,0,0,0,1 -"Judy's Time",2000,40,NA,9.1,7,0,0,0,0,0,0,24.5,0,0,74.5,"",0,0,0,0,1,0,1 -"Jue lai yip yue leung saan ang",2000,89,NA,7.4,55,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Jue qiao zhi duo xing",1990,106,NA,5.3,7,24.5,0,0,0,14.5,14.5,14.5,0,14.5,14.5,"",1,0,0,0,0,0,0 -"Juego de Arcibel, El",2003,115,NA,6.1,39,14.5,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Juego de Cuba, El",2001,93,NA,7,9,0,0,0,0,0,24.5,34.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Juego de Luna",2001,96,NA,6.8,54,0,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Juego de amor prohibido",1975,85,NA,5.8,8,0,14.5,0,0,24.5,0,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Juego de la silla, El",2002,93,NA,6,28,4.5,4.5,4.5,14.5,0,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Juego de la verdad, El",2004,95,NA,6,38,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,0,4.5,"",0,0,1,0,0,1,0 -"Juego peligroso",1967,94,NA,7.9,7,0,0,0,14.5,0,0,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Juego sucio en Casablanca",1985,102,NA,6.3,6,34.5,0,0,0,0,0,14.5,0,0,45.5,"",1,0,0,0,0,0,0 -"Juen diu daai ngok",1989,104,NA,5.5,5,24.5,0,0,24.5,24.5,24.5,24.5,0,0,0,"",1,0,1,0,0,0,0 -"Juet sai ho bun",2004,103,NA,5.8,18,0,0,0,4.5,24.5,24.5,34.5,0,14.5,0,"",0,0,1,0,0,1,0 -"Jueves, milagro, Los",1957,85,NA,7.2,66,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Jugando con la muerte",1982,100,NA,4.5,22,4.5,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Juge et l'assassin, Le",1976,128,NA,7.3,141,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Jugendrichter, Der",1960,94,NA,6,19,0,0,0,0,14.5,45.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Jugendstreiche des Knaben Karl, Die",1977,88,NA,4.2,5,0,24.5,0,24.5,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Jugeulrae salrae",2003,91,NA,2,5,44.5,64.5,0,0,0,0,0,0,0,0,"",1,0,1,0,0,0,0 -"Juggernaut",1936,64,NA,4.9,16,0,4.5,24.5,34.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Juggernaut",1974,109,NA,6.3,602,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Juggler of Our Lady, The",1958,9,NA,9.2,7,0,0,0,0,0,0,24.5,0,14.5,45.5,"",0,1,0,0,0,0,1 -"Juggler, The",1953,84,NA,5.6,30,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Jugofilm",1996,88,NA,7.7,23,0,0,0,0,0,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Juguetes rotos",1966,80,NA,6,10,0,0,0,14.5,14.5,0,14.5,74.5,0,0,"",0,0,0,1,0,0,0 -"Jugular Wine: A Vampire Odyssey",1994,95,NA,3.6,37,34.5,14.5,14.5,4.5,4.5,0,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Juha",1937,101,NA,7.8,20,0,0,0,0,4.5,4.5,44.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Juha",1956,103,NA,6.7,7,0,0,0,0,0,14.5,45.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Juha",1999,78,NA,7,427,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Juhannustarinoita",1996,47,NA,3.4,8,0,14.5,0,14.5,0,0,14.5,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Juhong geulshi",2004,115,NA,6.4,75,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jui hung 20 nin",1998,88,NA,5,12,0,0,24.5,14.5,4.5,4.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Jui kuen",1978,107,NA,7.4,1861,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"PG-13",1,0,1,0,0,0,0 -"Jui kuen II",1994,99,2000000,7.5,4628,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,1,0,0,0,0 -"Juice",1992,95,NA,6.3,1428,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Juke Box Jamboree",1942,7,NA,7,7,0,0,0,14.5,0,0,14.5,44.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Juke Girl",1942,90,NA,4.6,48,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Juke Joint",1947,68,NA,4.9,21,0,0,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Juke-Bar",1989,10,NA,6.4,30,0,0,4.5,14.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Jukeodo joha",2002,67,NA,7.3,23,0,0,4.5,0,14.5,0,24.5,4.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Jukgeona hokeun nabbeugeona",2000,95,NA,7.1,69,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Jukti, Takko Aar Gappo",1974,120,NA,5.8,19,0,4.5,4.5,4.5,14.5,0,14.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Julefrokosten",1976,87,NA,5.8,32,4.5,0,0,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Jules et Jim",1962,105,NA,7.7,3651,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Julia",1977,118,NA,7.3,1058,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Julia Has Two Lovers",1991,86,NA,4.6,152,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Julia Julia",1981,99,NA,3.9,10,34.5,14.5,0,0,34.5,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Julia Misbehaves",1948,99,NA,6.8,96,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Julia, Du bist zauberhaft",1962,94,NA,7.2,23,0,0,0,0,0,24.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Julian Po",1997,84,NA,5.9,471,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Juliana",1988,97,NA,6.3,16,4.5,0,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Juliana in zeventig bewogen jaren",1979,104,NA,7.7,5,0,0,0,0,0,0,24.5,64.5,24.5,0,"",0,0,0,0,1,0,0 -"Juliane",2000,100,NA,5,25,0,4.5,0,44.5,4.5,14.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Julie",1956,99,NA,5.8,156,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Julie",1975,145,NA,7.4,9,14.5,0,0,0,14.5,0,24.5,44.5,0,14.5,"",0,0,0,1,0,1,0 -"Julie Darling",1982,100,NA,5.2,16,4.5,4.5,0,14.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Julie Johnson",2001,94,NA,5.5,71,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Julie Walking Home",2002,118,5000000,7.3,190,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Julie and the Cadillacs",1999,102,NA,2.2,20,24.5,14.5,4.5,0,14.5,14.5,0,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Julie pot de colle",1977,90,NA,4.8,17,4.5,0,14.5,4.5,14.5,14.5,24.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Julien Donkey-Boy",1999,101,NA,5.3,1037,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Julietta",2001,100,NA,6.8,118,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Juliette et Juliette",1974,90,NA,5.8,6,0,0,0,34.5,14.5,14.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Juliette ou La clef des songes",1950,100,NA,7.2,26,0,4.5,4.5,0,4.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Julio comienza en julio",1977,120,NA,8.7,27,14.5,4.5,0,4.5,0,0,4.5,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Julius Caesar",1950,106,NA,7.1,86,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Julius Caesar",1953,120,NA,7.5,1094,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Julius Caesar",1970,117,NA,6.2,194,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Juloratoriet",1996,124,NA,5.5,148,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Jumalan morsian",2004,85,NA,6.2,9,14.5,0,0,0,0,34.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Jumanji",1995,104,65000000,6,14874,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Jument vapeur, La",1978,99,NA,6.1,12,0,0,4.5,4.5,0,4.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jument verte, La",1959,90,NA,6.2,28,0,4.5,4.5,14.5,14.5,14.5,34.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Jump Boy",1999,11,NA,4.2,15,0,0,4.5,24.5,0,4.5,14.5,14.5,0,44.5,"",0,0,0,1,0,0,1 -"Jump Into Hell",1955,77,NA,5.6,14,0,4.5,0,14.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Jump Tomorrow",2001,97,NA,6.8,364,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"PG",0,0,1,1,0,1,0 -"Jump for Glory",1937,85,NA,6,11,0,0,0,4.5,14.5,4.5,14.5,34.5,4.5,0,"",0,0,1,1,0,0,0 -"Jump the Gun",1997,124,NA,8.3,33,4.5,0,0,4.5,0,4.5,14.5,4.5,34.5,34.5,"",0,0,1,0,0,0,0 -"Jumpin' Jack Flash",1986,100,NA,5.3,4125,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Jumpin' Jupiter",1955,7,NA,6.6,45,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Jumpin' at the Boneyard",1992,107,NA,4.9,139,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Jumping",1984,7,NA,8,36,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Jumping Jacks",1952,96,NA,5.8,138,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Jumping for Joy",1955,91,NA,5.6,20,0,4.5,0,4.5,14.5,34.5,4.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Jumping for Joy",2002,94,NA,3.5,8,14.5,14.5,0,0,0,14.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Junction",1996,25,NA,8.7,6,0,0,0,14.5,0,0,0,0,34.5,45.5,"",0,0,0,0,0,0,1 -"Junction 88",1947,60,NA,6.8,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"June Bride",1948,96,NA,7,225,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Junebug and Hurricane",2004,9,26000,6.5,18,14.5,4.5,0,0,4.5,4.5,0,4.5,4.5,45.5,"",0,0,0,1,0,0,1 -"Jung (War) in the Land of the Mujaheddin",2001,114,275000,8,27,0,4.5,4.5,0,0,4.5,4.5,24.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Jung sa",1998,107,NA,7.4,65,0,0,0,4.5,0,4.5,24.5,44.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Jung-Gwok chiu-yan",1975,90,NA,5.8,181,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Jungen Tiger von Hongkong, Die",1969,95,NA,1.2,10,44.5,24.5,14.5,14.5,0,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Jungfrau, Die",1999,90,NA,2.7,16,34.5,14.5,0,0,0,0,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jungfrauen von Bumshausen, Die",1970,95,NA,4.5,12,24.5,4.5,0,0,14.5,0,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Jungfrauen-Report",1971,62,NA,4.1,33,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Jungfrauenmaschine, Die",1988,84,NA,6.2,56,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Jungfruresan",1988,106,NA,2.9,9,64.5,0,14.5,14.5,0,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Jungle",2000,146,NA,7.4,44,4.5,0,4.5,0,4.5,4.5,24.5,4.5,24.5,24.5,"",1,0,0,0,0,1,0 -"Jungle 2 Jungle",1997,105,NA,4.7,2203,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Jungle Assault",1989,85,NA,4.1,10,34.5,0,0,14.5,24.5,14.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Jungle Book",1942,108,NA,6.7,293,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Jungle Book 2, The",2003,72,20000000,5.2,764,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Jungle Book, The",1967,78,NA,7.5,9027,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Jungle Book, The",1994,111,27000000,5.9,1692,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Jungle Boy",1998,89,NA,4.4,26,14.5,4.5,14.5,0,14.5,14.5,14.5,14.5,0,0,"PG",0,0,0,0,0,0,0 -"Jungle Bride",1933,63,NA,6,9,14.5,0,0,0,24.5,14.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Jungle Captive, The",1945,63,NA,4.7,20,4.5,4.5,14.5,24.5,14.5,14.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Jungle Cat",1960,67,NA,5.9,20,0,0,4.5,4.5,4.5,14.5,44.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Jungle Drums",1943,8,NA,6.4,44,4.5,4.5,4.5,0,4.5,24.5,24.5,14.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Jungle Drums of Africa",1953,167,NA,6.3,8,0,0,24.5,0,24.5,34.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Jungle Fever",1991,132,14000000,6.4,2829,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Jungle Gents",1954,64,NA,5.6,27,0,0,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Jungle Goddess",1948,62,NA,2.1,54,34.5,34.5,14.5,4.5,0,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Jungle Jim",1936,232,NA,7.5,13,0,0,0,14.5,0,4.5,34.5,34.5,0,4.5,"",0,0,0,0,0,0,0 -"Jungle Jim",1948,71,NA,4.6,46,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jungle Jim In the Forbidden Land",1952,65,NA,5.2,31,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Jungle Jim in Pygmy Island",1950,69,NA,3.9,28,4.5,0,14.5,24.5,14.5,0,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Jungle Jitters",1938,8,NA,5.2,20,0,0,4.5,14.5,34.5,14.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Jungle Man",1941,63,NA,4.6,8,14.5,0,0,34.5,24.5,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Jungle Man-Eaters",1954,68,NA,4.1,19,4.5,14.5,14.5,0,4.5,0,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Jungle Manhunt",1951,66,NA,5.3,29,4.5,0,4.5,14.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Jungle Moon Men",1955,70,NA,3.7,22,14.5,0,14.5,0,14.5,0,4.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Jungle Patrol",1948,71,NA,4.3,5,0,0,0,44.5,0,24.5,24.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Jungle Princess, The",1936,85,300000,7.2,22,0,0,0,0,0,24.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Jungle Queen",1945,219,NA,7.6,5,0,0,0,0,24.5,24.5,0,44.5,24.5,0,"",1,0,0,1,0,0,0 -"Jungle Rhythm",1929,7,NA,6.3,8,0,14.5,0,14.5,0,14.5,14.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Jungle, The",1952,73,NA,4.8,19,4.5,0,4.5,24.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Jungledyret",1993,73,NA,4.8,117,24.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Jungledyret 2 - den store filmhelt",1996,72,NA,4.7,81,34.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Junglee",1961,139,NA,6.8,31,0,0,0,0,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Jungleground",1995,90,NA,4.6,49,14.5,0,14.5,24.5,14.5,4.5,14.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Junimond",2002,92,NA,8.7,39,4.5,4.5,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Juninatten",1940,88,NA,6.3,57,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Juninin no yasashii nihonjin",1991,116,NA,8.1,25,0,0,0,0,0,4.5,24.5,24.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Junior",1985,80,350000,4.1,57,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Junior",1994,109,NA,4.6,6293,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Junior Bonner",1972,100,NA,6.7,481,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Junior G-Men",1940,240,NA,5.8,16,4.5,0,0,0,14.5,14.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Junior G-Men of the Air",1942,225,NA,6.4,8,14.5,0,0,0,14.5,24.5,24.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Junior High School",1978,37,NA,3.4,36,24.5,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Junior Miss",1945,94,NA,7.8,43,0,0,0,0,4.5,0,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Junior Pilot",2004,92,NA,7.7,57,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Junior Rodeo Daredevils",1949,9,NA,2.6,40,34.5,34.5,14.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Juniper Tree",1990,78,NA,6.8,108,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Junkers Come Here",1995,105,NA,6.7,19,4.5,0,0,0,14.5,0,0,24.5,24.5,34.5,"",0,1,0,0,0,0,0 -"Junkies, The",2000,23,NA,8.5,6,0,0,0,0,0,0,0,45.5,45.5,0,"",0,0,1,0,0,0,1 -"Junky",1997,4,NA,2.3,9,24.5,0,0,14.5,0,14.5,0,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Junky Punky Girlz",1996,12,NA,7.8,14,4.5,0,0,4.5,0,14.5,14.5,4.5,0,45.5,"",0,0,0,0,0,0,1 -"Junky's Christmas, The",1993,21,NA,4,51,24.5,0,0,0,4.5,0,14.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Juno and the Paycock",1930,85,NA,4.6,212,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Junoon",1978,141,NA,7.3,45,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Juntos, in any way",1996,18,NA,9.2,6,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Juoksuhaudantie",2004,111,NA,6.5,101,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Jupiter Menace, The",1984,79,NA,3.8,24,14.5,14.5,14.5,0,4.5,4.5,4.5,4.5,0,34.5,"",0,0,0,0,1,0,0 -"Jupiter's Darling",1955,95,NA,5.5,78,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Jupiter's Wife",1995,87,NA,7.5,49,4.5,4.5,0,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Jupon rouge, Le",1987,90,NA,7.2,5,0,0,0,24.5,0,0,24.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Jurassic Fart",1996,3,NA,5.3,16,4.5,4.5,0,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Jurassic Park",1993,127,63000000,7.4,57473,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Jurassic Park III",2001,92,93000000,5.6,20690,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Jurij",2001,83,NA,7.3,6,0,0,0,0,0,34.5,0,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Jurk, De",1996,95,2650000,6.8,274,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Juror, The",1996,118,44000000,5.3,2920,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Jury Duty",1995,88,NA,3.5,1978,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Jury of Her Peers, A",1980,30,NA,5.3,9,14.5,0,0,0,14.5,14.5,0,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Jushi shengun",1995,107,NA,5.7,11,0,4.5,0,0,24.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Jusqu'au coeur",1969,93,NA,5.7,5,0,0,0,24.5,24.5,0,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Just Across the Street",1952,79,NA,6.7,7,0,0,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Just Add Pepper",2002,90,75000,5.1,6,14.5,0,0,0,34.5,0,14.5,0,0,34.5,"",0,0,1,0,0,1,0 -"Just Another Girl on the I.R.T.",1992,92,NA,5.1,130,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Just Around the Corner",1938,70,NA,5.9,60,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Just Ask for Diamond",1988,83,NA,5.3,45,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Just Before Dawn",1981,90,NA,5.5,144,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Just Between Friends",1986,110,NA,5.7,158,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Just Can't Get Enough",2001,95,NA,5,52,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Just Cause",1995,102,NA,6.1,3743,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Just Dogs",1932,7,NA,6.6,44,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Just Ducky",1953,7,NA,6,24,0,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Just Friends",1994,95,NA,6.5,21,0,0,14.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Just Friends",1996,99,NA,5.8,36,4.5,4.5,0,4.5,4.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Just Imagine",1930,109,250000,5.6,94,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Just Indian",2004,92,NA,3.7,11,4.5,4.5,4.5,14.5,0,4.5,0,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Just Killers",1999,9,NA,4.7,23,4.5,0,14.5,0,4.5,14.5,14.5,4.5,14.5,14.5,"",1,0,0,0,0,0,1 -"Just Like Golf",2002,26,NA,5.8,5,0,0,0,0,84.5,0,0,0,24.5,0,"",0,0,0,0,1,0,1 -"Just Like a Woman",1992,105,NA,5.9,107,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Just Looking",1995,84,NA,4.8,55,4.5,0,4.5,24.5,14.5,34.5,4.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Just Looking",1999,97,3000000,6.2,436,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Just Married",1998,80,NA,6.5,15,4.5,0,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Just Married",2003,95,NA,5,5954,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Just Mickey",1930,7,NA,6.1,7,0,0,0,14.5,14.5,24.5,14.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Just My Luck",1957,86,NA,5.4,38,4.5,0,0,14.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Just Neighbors",1919,13,NA,5.7,11,0,0,0,4.5,4.5,44.5,34.5,0,0,0,"",0,0,1,0,0,0,1 -"Just One More Time",1974,9,NA,6.1,11,0,4.5,14.5,0,14.5,4.5,34.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Just One Night",2000,88,NA,5.7,73,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Just One Time",1998,8,NA,6.1,41,14.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Just One Time",1999,111,NA,6.5,242,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Just One of the Guys",1985,100,NA,5.7,1560,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Just Plane Beep",1965,7,NA,4.8,17,4.5,4.5,4.5,24.5,14.5,34.5,4.5,0,0,0,"",0,1,1,0,0,0,1 -"Just Say No",2000,8,NA,4.7,10,14.5,14.5,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,1 -"Just Tell Me What You Want",1980,112,NA,5.4,87,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Just This Once",1952,90,NA,6.3,21,4.5,0,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Just Visiting",2001,93,40000000,5.6,2212,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Just Watch Me: Trudeau and the 70's Generation",1999,76,NA,6.5,21,0,0,0,4.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Just William",1940,72,NA,5.9,8,0,0,0,0,34.5,24.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Just Write",1997,102,NA,6.1,363,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Just You and Me, Kid",1979,93,NA,5,149,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Just a Clown",2004,20,NA,5.6,31,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Just a Dream",2002,97,NA,6.3,79,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Just a Gigolo",1931,66,NA,5.7,22,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Just a Gigolo",1932,8,NA,4.8,12,0,4.5,4.5,14.5,14.5,34.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Just a Kiss",2002,89,NA,5.2,400,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Just a Little Harmless Sex",1999,102,NA,5,280,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Just an American Boy",2003,95,NA,7.7,7,0,0,0,0,0,24.5,24.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Just for Fun",1963,72,NA,4.4,9,0,0,14.5,14.5,24.5,0,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Just for You",1952,104,NA,5.7,58,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Just for the Hell of It",1968,81,NA,3.2,51,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Just in Time",1996,16,NA,5.4,6,0,0,0,0,14.5,34.5,0,34.5,0,14.5,"",0,0,0,1,0,0,1 -"Just in Time",1997,95,NA,5.7,28,0,0,0,14.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Just the Ticket",1999,115,12000000,5.5,610,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Just the Way You Are",1984,94,NA,5.6,135,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Juste avant la nuit",1971,100,NA,7.9,47,0,0,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Justice",2003,80,NA,5.4,27,4.5,0,0,4.5,14.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Justice Denied",1989,98,NA,5.6,8,0,0,24.5,14.5,14.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Justice est faite",1950,95,NA,8.7,20,0,0,0,0,4.5,14.5,14.5,14.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Justicero, El",1967,90,NA,9.1,10,0,0,0,0,0,14.5,0,34.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Justin Morgan Had a Horse",1972,120,NA,5.6,19,0,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Justin de Marseille",1935,95,NA,6.4,5,0,0,0,0,0,64.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Justine",1975,95,NA,5.5,14,0,4.5,0,14.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Justine",1992,101,NA,7.7,47,4.5,0,0,0,0,4.5,4.5,4.5,34.5,45.5,"",0,0,0,0,0,0,0 -"Justine de Sade",1972,104,NA,5.1,26,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Justine och Juliette",1975,91,NA,2.8,12,14.5,4.5,0,14.5,4.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Justine: A Matter of Innocence",1980,84,NA,2.7,5,44.5,0,0,0,0,44.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Justine: Exotic Liaisons",1995,89,NA,3.3,25,24.5,4.5,14.5,0,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Justine: In the Heat of Passion",1996,89,NA,4.7,16,0,0,24.5,14.5,4.5,0,4.5,4.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Justine: Seduction of Innocence",1996,94,NA,1.9,39,24.5,24.5,4.5,14.5,4.5,0,0,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Justine: Wild Nights",1995,113,NA,3.4,17,14.5,14.5,4.5,4.5,14.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Justino, un asesino de la tercera edad",1994,96,NA,6.9,80,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Justiz",1993,106,NA,7,55,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Jutai",1991,108,NA,6.3,19,4.5,0,0,4.5,14.5,24.5,4.5,44.5,14.5,0,"",0,0,1,0,0,0,0 -"Jutro",1967,84,NA,8.9,8,0,0,0,0,0,14.5,0,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Jutro bedzie niebo",2002,77,NA,6.2,27,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Juurakon Hulda",1937,82,NA,6.7,18,0,0,0,4.5,4.5,34.5,14.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Juusan-nin no shikaku",1963,125,NA,6.8,13,0,4.5,0,0,0,0,34.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Juvenile Court",1973,144,NA,8.3,6,0,0,0,0,0,0,34.5,0,34.5,34.5,"",0,0,0,0,0,0,0 -"Juvenile Jungle",1958,69,NA,5.5,9,0,0,14.5,0,14.5,34.5,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Juventud sin ley",1966,90,NA,7.8,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Juvies",2004,66,NA,8.7,6,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Juwanna Mann",2002,91,15600000,3.9,885,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Juyuso seubgyuksageun",1999,113,NA,6.9,530,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Jydekompagniet",1988,90,NA,5.6,59,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Jydekompagniet 3",1989,100,NA,4.7,51,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Jyu-hassai, umi e",1979,110,NA,8.5,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"K",1997,135,NA,6.4,151,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"K",2002,85,NA,4.1,13,4.5,0,4.5,14.5,0,14.5,0,0,24.5,34.5,"",0,0,0,1,0,0,0 -"K-19: The Widowmaker",2002,140,100000000,6.6,8292,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"K-9",1989,101,NA,5.2,2227,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"K-PAX",2001,120,48000000,7.2,17235,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"K2",1992,102,NA,5.9,889,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"K3 en het magische medaillon",2004,65,NA,4.5,37,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"KOEKOEK!",1995,14,NA,8.7,19,4.5,4.5,0,0,0,0,0,44.5,24.5,14.5,"",0,0,1,0,0,0,1 -"KOM",2003,25,NA,8.7,9,0,0,0,0,0,0,14.5,24.5,45.5,14.5,"",0,0,0,1,0,0,1 -"KT",2002,138,NA,5.2,31,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"KZ9 - Lager di Sterminio",1977,105,NA,5.1,35,4.5,14.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ka la shi tiao gou",2003,100,NA,6.8,65,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Ka lok bang dai sha, ka lok na dai korn",1991,110,NA,8.2,9,0,0,0,0,0,0,0,44.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Kaagaz Ke Phool",1959,148,NA,8.2,86,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,1,0 -"Kaaka Kaaka",2003,300,NA,7.6,26,4.5,0,0,0,0,14.5,4.5,14.5,24.5,34.5,"",1,0,0,1,0,1,0 -"Kaal",2005,126,NA,4.2,33,34.5,4.5,4.5,0,14.5,0,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Kaante",2002,150,NA,5.2,213,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Kaasua, komisario Palmu!",1961,94,NA,8.4,217,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Kaaterskill Falls",2001,86,NA,5.1,117,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kabala",2002,112,NA,6.3,5,0,0,0,24.5,0,24.5,24.5,0,0,44.5,"",0,0,0,1,0,1,0 -"Kabale und Liebe",1959,111,NA,7,5,0,0,24.5,0,0,24.5,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Kabel und Liebe",1995,86,NA,7.7,20,0,0,0,0,0,0,44.5,44.5,14.5,0,"",0,0,1,0,0,0,0 -"Kabhi Haan Kabhi Naa",1993,158,NA,7.1,91,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Kabhi Kabhie",1976,177,NA,7.7,119,4.5,0,4.5,0,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Kabhi Khushi Kabhie Gham...",2001,210,NA,7.3,808,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Kabinett des Doktor Caligari, Das",1920,67,NA,8.1,3599,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Kabit ni Mrs. Montero, Ang",1999,96,NA,7,6,0,0,0,14.5,0,34.5,0,34.5,0,14.5,"",0,0,0,1,0,1,0 -"Kabloonak",1995,103,NA,6.9,26,4.5,0,0,0,0,4.5,34.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kabouter Plop en de toverstaf",2003,50,NA,4.4,5,24.5,24.5,0,24.5,0,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Kabouterschat, De",1999,94,NA,3.9,54,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kacenka a strasidla",1992,84,NA,7.9,5,0,0,0,0,24.5,0,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Kacenka a zase ta strasidla",1992,91,NA,7.6,6,0,0,0,0,14.5,34.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Kad budem mrtav i beo",1967,79,NA,8.7,55,4.5,0,0,0,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Kad cujes zvona",1969,92,NA,7.1,18,0,0,0,0,0,4.5,14.5,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Kad mrtvi zapjevaju",1999,99,NA,6.5,39,14.5,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Kadaicha",1988,88,NA,4.6,18,14.5,0,4.5,34.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Kadhal Konden",2003,150,NA,8.5,6,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,0,0,1,0,0,0 -"Kadhalan",1994,168,NA,7.3,22,0,4.5,0,0,0,24.5,0,24.5,14.5,34.5,"",1,0,0,1,0,1,0 -"Kadosh",1999,110,NA,6.9,497,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kadunlakaisijat",1991,80,NA,4.2,54,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kaette kita yopparai",1968,80,NA,7.2,6,0,0,0,14.5,14.5,0,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Kafejou, I",1956,89,NA,8.1,21,0,0,0,0,4.5,4.5,4.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Kafka",1991,92,11000000,6.9,1751,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kagami no onnatachi",2002,129,NA,7.1,25,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kagemusha",1980,162,6000000,7.9,3536,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Kageroza",1981,139,NA,7.3,12,0,0,4.5,0,0,24.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,1,0 -"Kagi",1959,107,NA,7.5,79,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kah-chan",2001,96,NA,6.8,9,0,0,0,14.5,0,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kahapon, may dalawang bata",1999,90,NA,5.4,12,0,0,0,14.5,4.5,34.5,0,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kahdeksan surmanluotia",1972,316,NA,8.7,125,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Kahini",1997,105,NA,1.4,10,64.5,34.5,14.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Kahlekuningas",2002,94,NA,6.3,146,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Kaho Naa... Pyaar Hai",2000,177,NA,5.9,225,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,1,0 -"Kai Rabe gegen die Vatikankiller",1998,92,NA,5.8,171,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kai aus der Kiste",1988,93,NA,6.3,8,0,0,14.5,0,14.5,34.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Kai doh maru",2001,45,NA,6.7,6,0,0,14.5,14.5,0,0,14.5,34.5,0,14.5,"",0,1,0,0,0,0,1 -"Kai... o protos matakias",1982,90,NA,5.8,6,14.5,14.5,0,0,0,14.5,0,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Kaidan",1964,125,NA,7.7,896,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Kaidan Kasane-ga-fuchi",1957,66,NA,6.1,9,0,0,0,14.5,0,34.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kaidan Oiwa no borei",1961,94,NA,9.2,5,0,0,0,0,0,0,0,0,84.5,24.5,"",0,0,0,0,0,0,0 -"Kaidan nobori ryu",1970,85,NA,7.9,13,4.5,0,0,0,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Kaikenlaisia karkulaisia",1981,83,NA,3.3,8,24.5,14.5,24.5,0,14.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Kaikki rakastavat",1935,80,NA,7.4,9,0,0,0,0,0,24.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kailangan kita",2002,105,NA,6.2,11,0,0,0,0,0,34.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Kailangan ko'y ikaw",2000,130,NA,7.7,7,14.5,0,0,0,0,14.5,0,14.5,14.5,44.5,"",1,0,1,0,0,1,0 -"Kairat",1992,72,NA,6,23,4.5,0,4.5,0,4.5,4.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kairyu daikessen",1966,86,NA,5.4,20,4.5,4.5,0,0,14.5,14.5,14.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Kaiser von Kalifornien, Der",1936,97,NA,5.3,14,14.5,0,0,4.5,24.5,4.5,4.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Kaiserball",1956,95,NA,6.2,9,0,0,0,24.5,24.5,0,34.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Kaiserin von China, Die",1953,85,NA,6.2,5,0,0,24.5,0,0,44.5,0,0,44.5,0,"",0,0,0,0,0,0,0 -"Kaitei daisenso",1966,90,NA,5.9,10,14.5,14.5,24.5,0,34.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Kaitei gunkan",1963,89,NA,5.1,69,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Kaivo",1992,109,NA,5.1,23,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Kaivopuiston kaunis Regina",1941,103,NA,6.4,16,0,0,0,0,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Kaiwang chuntian de ditie",2002,93,NA,6.3,45,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Kajsa Kavat",1989,30,NA,5.4,16,4.5,4.5,0,0,34.5,14.5,0,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Kak stat zvezdoy",1986,172,NA,7,6,0,0,14.5,14.5,0,0,0,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kakabakaba ka ba?",1980,104,NA,9.2,9,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Kakashi",2001,86,NA,5.4,181,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kakav deda takav unuk",1983,92,NA,6.7,7,0,24.5,0,0,0,14.5,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kakaya chudnaya igra",1995,93,NA,8,15,0,0,0,0,4.5,14.5,4.5,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Kaki bakar",1995,70,NA,7.4,17,14.5,4.5,0,0,0,0,0,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Kako je poceo rat na mom otoku",1996,97,NA,7.5,172,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kako je propao rokenrol",1989,106,NA,8.6,86,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Kako los son",2002,91,NA,4,11,4.5,0,4.5,0,4.5,4.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Kako sam sistematski unisten od idiota",1983,98,NA,7.7,21,0,4.5,0,4.5,0,14.5,0,14.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Kako ubiv svetec",2004,82,NA,8.8,45,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kakushi toride no san akunin",1958,126,NA,8,3281,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Kakushi-ken: oni no tsume",2004,132,NA,7.3,42,0,4.5,0,0,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Kakuto",2003,108,NA,5.3,28,0,0,0,14.5,4.5,4.5,24.5,4.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Kal Ho Naa Ho",2003,186,NA,7.7,628,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Kala",2002,11,NA,5.2,9,0,0,14.5,14.5,0,0,64.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Kala Bazaar",1989,160,NA,6.9,7,0,0,14.5,0,0,14.5,44.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Kala Bazar",1960,163,NA,5.7,9,14.5,0,0,0,0,14.5,34.5,24.5,24.5,0,"",0,0,0,1,0,1,0 -"Kala Patthar",1979,176,NA,6.9,70,4.5,0,0,0,0,4.5,4.5,4.5,14.5,64.5,"",1,0,0,1,0,0,0 -"Kala, Ha-",1985,95,NA,4.8,5,44.5,24.5,0,0,0,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Kalaa, El",1988,96,NA,5.6,7,0,0,0,14.5,0,0,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kalabaliken i Bender",1983,97,NA,3,41,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kalamazoo",1995,29,NA,5.4,16,14.5,0,0,24.5,4.5,0,24.5,0,4.5,24.5,"",0,0,0,0,0,0,1 -"Kalapani",1958,164,NA,6.5,13,0,0,0,0,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Kald mig bare Aksel",2002,82,NA,5.4,28,4.5,0,0,14.5,24.5,34.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Kalde spor",1962,96,NA,5.9,12,24.5,0,4.5,0,14.5,4.5,14.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Kaleidoscope",1966,107,NA,5.3,92,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kaleidoscope Jazz Chair",1960,7,NA,6.1,8,0,0,14.5,0,14.5,45.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Kali Yug, la dea della vendetta",1963,105,NA,4.7,17,0,4.5,14.5,4.5,14.5,44.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Kali tapa karfitsa",2000,26,NA,7.8,5,0,0,24.5,0,0,0,0,44.5,0,44.5,"",0,0,1,1,0,1,1 -"Kali's Vibe",2002,93,NA,5.8,6,14.5,0,0,0,14.5,14.5,0,34.5,14.5,0,"",0,0,1,0,0,1,0 -"Kaliber Deluxe",2000,107,NA,7.1,127,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kalibre 35",2000,105,NA,6.9,20,4.5,0,0,14.5,0,14.5,14.5,34.5,24.5,0,"",0,0,0,0,0,0,0 -"Kalifornia",1993,118,9000000,6.6,8113,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kalina krasnaya",1973,110,NA,8.4,71,0,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Kalla khrung nueng... muea chao nee",1994,140,NA,7.7,24,0,0,0,0,0,4.5,24.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Kallafiorr",2000,70,NA,6.7,15,0,0,0,4.5,14.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Kalle Blomkvist och Rasmus",1997,78,NA,6.5,26,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kalos ilthe to dollario",1967,94,NA,7.4,15,0,0,0,4.5,0,14.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Kalpiki lira",1955,127,NA,8.9,140,0,0,4.5,4.5,0,4.5,4.5,4.5,24.5,64.5,"",0,0,1,1,0,0,0 -"Kalt ist der Abendhauch",2000,124,NA,7.6,105,4.5,0,4.5,4.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Kalt wie Eis",1981,87,NA,5.5,7,0,0,0,24.5,24.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Kalte Finger, Der",1996,94,NA,4.8,42,14.5,0,4.5,0,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kalte Heimat",1995,157,NA,7.6,5,0,0,0,0,0,24.5,24.5,44.5,24.5,0,"",0,0,0,0,1,0,0 -"Kalte Herz, Das",1950,106,NA,7.8,59,0,0,0,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Kalte Schatten",2003,15,NA,6.8,7,0,0,0,0,0,44.5,45.5,0,0,0,"",0,0,0,1,0,0,1 -"Kaltfront",2003,87,NA,6.1,9,0,0,24.5,14.5,34.5,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Kalyteros mou filos, O",2001,104,NA,6.4,73,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kalyug",1980,152,NA,8.2,31,0,0,4.5,0,0,4.5,4.5,14.5,44.5,34.5,"",0,0,0,1,0,0,0 -"Kama Sutra Rides Again",1972,9,NA,7.4,6,0,0,0,0,0,0,14.5,34.5,0,45.5,"",0,1,0,0,0,0,1 -"Kama Sutra: A Tale of Love",1996,114,3000000,5.5,1491,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Kamakia, Ta",1981,93,NA,2.6,5,24.5,24.5,24.5,0,0,0,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Kamarad do deste",1988,72,NA,6.3,13,0,0,14.5,4.5,4.5,24.5,14.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Kamasutra - Vollendung der Liebe",1969,90,NA,2.1,9,44.5,0,24.5,0,0,0,0,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Kamata koshin-kyoku",1982,109,NA,7.2,37,0,4.5,0,4.5,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kamchatka",2002,105,NA,7.5,442,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kameleon",2001,110,NA,2.5,7,24.5,14.5,45.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Kameleon sjocht yn it waar, De",2002,35,NA,8,6,0,0,0,14.5,0,0,34.5,0,0,45.5,"",0,0,1,0,0,0,1 -"Kamen",1992,73,NA,8.4,19,0,14.5,0,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Kamen gakuen",2000,90,NA,5.6,14,4.5,4.5,0,0,24.5,14.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Kamennyy tsvetok",1946,70,NA,7.3,36,0,0,0,4.5,4.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Kameradschaft",1931,93,NA,7.9,52,0,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Kamienne tablice",1984,135,NA,4.3,5,0,0,24.5,24.5,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Kamigami no Fukaki Yokubo",1968,172,NA,8,42,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Kamikaze",1986,90,NA,4.9,76,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kamikaze 1989",1982,106,NA,5.6,78,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kamikaze Hearts",1986,85,NA,6,7,0,0,0,0,0,14.5,0,24.5,0,45.5,"",0,0,0,0,1,0,0 -"Kamikazen ultima notte a Milano",1987,92,NA,5.7,45,14.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kamikazi, agapi mou",1983,98,NA,5.3,21,14.5,4.5,14.5,4.5,0,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Kamilla og tyven",1988,106,NA,5.3,44,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kamilla og tyven II",1989,97,NA,3.8,19,14.5,0,4.5,0,4.5,0,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Kamillions",1989,121,NA,4.1,15,44.5,0,4.5,0,0,4.5,0,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Kaminsky - Ein Bulle dreht durch",1985,86,NA,7.6,9,24.5,14.5,0,0,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Kamiondzije opet voze",1984,88,NA,9.7,16,0,0,0,0,4.5,0,14.5,0,0,74.5,"",0,0,1,0,0,0,0 -"Kamla",1984,120,NA,7.5,14,0,0,0,0,4.5,4.5,24.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Kammerflimmern",2004,100,NA,7.3,70,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Kammesjukker",2003,35,NA,4.7,13,14.5,0,4.5,24.5,14.5,4.5,34.5,0,0,0,"",0,0,1,1,0,0,1 -"Kamouraska",1973,124,NA,6.2,59,4.5,0,0,14.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kampen mod uretten",1949,110,NA,7.4,7,0,0,0,0,14.5,24.5,0,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Kampen om tungtvannet",1948,98,NA,6.9,61,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Kampf um Rom I",1968,93,NA,5.6,38,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kampf um Rom II - Der Verrat",1969,84,NA,6.4,21,4.5,0,0,0,34.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kampvuur",1999,21,NA,7.2,118,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Kamu onna",1988,102,NA,6.8,5,0,0,24.5,0,24.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Kamui no ken",1985,132,NA,7.1,89,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,1,0,0,0,0,0 -"Kan Zeh Lo Sham",1997,25,NA,9.7,20,0,0,0,0,4.5,0,4.5,4.5,24.5,64.5,"",0,0,0,1,0,0,1 -"Kan-Kin",2001,20,NA,6.8,10,0,0,0,0,14.5,14.5,44.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Kanadiana",2002,85,NA,6.8,14,14.5,4.5,4.5,0,0,4.5,24.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Kanak Attack",2000,86,NA,6.4,167,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kanal",1957,95,NA,8.5,357,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Kanalschwimmer",2004,93,NA,7.2,5,0,0,0,24.5,0,0,24.5,24.5,44.5,0,"",0,0,0,0,1,0,0 -"Kanarifuglen",1973,86,NA,4.3,10,0,0,0,45.5,44.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Kanchana Sita",1977,90,NA,8.2,10,14.5,0,0,0,14.5,14.5,0,0,0,74.5,"",0,0,0,0,0,0,0 -"Kanchenjungha",1962,102,NA,8.7,43,0,0,0,0,0,4.5,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Kandidat, Der",1980,129,NA,7.5,10,0,0,0,0,0,14.5,44.5,14.5,0,44.5,"",0,0,0,0,1,0,0 -"Kandukondain Kandukondain",2000,151,NA,6.3,125,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Kandyland",1987,93,NA,2.6,24,4.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kanehsatake: 270 Years of Resistance",1993,119,NA,7.9,28,14.5,0,0,0,4.5,0,14.5,24.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Kangaroo",1952,84,NA,5.5,19,0,14.5,0,4.5,14.5,34.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Kangaroo",1986,108,NA,7,43,0,4.5,0,14.5,4.5,14.5,4.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Kangaroo Jack",2003,89,60000000,3.9,3661,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Kangwon-do ui him",1998,110,NA,6.6,92,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kaninchen bin ich, Das",1965,110,NA,7.5,21,4.5,0,0,4.5,4.5,4.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Kaninmannen",1990,97,NA,5.2,40,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Kanketsu Sasaki Kojiro - Ganryu-to Ketto",1951,98,NA,6,5,0,0,0,0,24.5,44.5,0,0,0,44.5,"",1,0,0,1,0,0,0 -"Kankkulan kaivolla",1960,97,NA,5,11,0,4.5,14.5,14.5,4.5,24.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Kannathil Muthamittal",2002,123,NA,7.5,130,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Kanojo to kare",1963,110,NA,7.6,9,0,0,0,0,14.5,0,0,34.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Kanoon",1960,150,NA,6.6,11,0,0,0,0,0,14.5,4.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Kanoon Apna Apna",1989,162,NA,6.4,5,0,0,0,44.5,0,0,44.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Kansan, The",1943,79,NA,5.7,26,0,4.5,0,14.5,24.5,14.5,34.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Kansas",1988,108,NA,4.9,153,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kansas",1998,6,NA,5.6,10,0,14.5,14.5,14.5,0,0,44.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Kansas City",1996,116,19000000,5.8,1077,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Kansas City Bomber",1972,99,NA,5.1,195,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kansas City Confidential",1952,99,NA,7.4,273,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kansas City Princess",1934,64,NA,6.5,27,0,0,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kansas Pacific",1953,73,NA,5.6,53,4.5,0,0,4.5,34.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Kansas Raiders",1950,80,NA,6.4,61,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kansas Terrors, The",1939,57,NA,5.6,9,0,14.5,0,14.5,34.5,14.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Kansen",2004,98,NA,5.4,21,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Kanske en diktare",1933,78,NA,3.2,6,14.5,0,34.5,14.5,34.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Kanske en gentleman",1951,90,NA,8.7,7,14.5,0,0,24.5,0,14.5,14.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Kanya Ya Ma Kan, Beyrouth",1995,104,NA,2.9,17,14.5,4.5,0,14.5,4.5,0,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Kanzen naru shiiku: onna rihatsushi no koi",2003,103,NA,5.6,17,4.5,0,14.5,0,14.5,4.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Kanzen-naru shiiku - Ai no 40-nichi",2001,89,NA,5.4,21,4.5,0,4.5,4.5,14.5,24.5,4.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Kanzo sensei",1998,129,NA,7.4,346,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kao",2000,123,NA,7.5,56,0,4.5,0,0,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kaos",1984,188,NA,8,360,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Kaosu",1999,90,NA,6.6,320,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Kapelusz pana Anatola",1957,88,NA,6.7,6,0,0,0,0,0,34.5,34.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Kapetan Fandis Bastounis",1968,95,NA,7.4,13,0,0,0,0,4.5,24.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kapetan Mikula Mali",1974,95,NA,6.2,8,0,0,0,0,0,34.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Kapital, czyli jak zrobic pieniadze w Polsce",1989,105,NA,6.6,5,0,0,0,0,0,64.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Kapitano Enriko pulksteinis",1968,80,NA,6.4,5,0,0,0,0,24.5,64.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Kappert 1: Die Briefmarke",1993,33,NA,1,5,44.5,0,0,0,0,0,44.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Kappert 1: Die Briefmarke - Das Remake",1995,35,NA,1,5,44.5,0,0,0,24.5,0,24.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Kappert 2: Die Photos",1994,53,NA,1,5,44.5,0,24.5,0,24.5,0,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Kappert 3: Willkommen Europa",1995,56,NA,1,5,44.5,0,0,0,0,24.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Kappert 4: Irish Brass",1996,35,NA,1,7,44.5,0,0,0,0,0,14.5,0,44.5,0,"",1,0,1,0,0,0,1 -"Kapriolen",1937,86,NA,5.4,10,0,0,0,14.5,14.5,0,34.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Kapsapea",1993,29,NA,8.6,14,4.5,0,0,0,0,4.5,0,24.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Kaptajn Klyde og hans venner vender tilbage",1980,82,NA,1.5,48,74.5,0,0,4.5,0,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Kaptein Sabeltann",2003,75,NA,6,13,0,4.5,0,4.5,4.5,24.5,14.5,0,24.5,14.5,"",0,1,0,0,0,0,0 -"Kapurush",1965,74,NA,8.3,23,0,0,0,0,4.5,4.5,4.5,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Kaput lager - gli ultimi giorni delle SS",1977,83,NA,3,24,14.5,14.5,24.5,0,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Karachi",1989,95,NA,3.2,13,34.5,0,24.5,0,0,4.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Karakter",1997,122,4500000,7.7,2687,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Karamuk",2002,97,NA,5.3,16,0,0,4.5,4.5,0,14.5,4.5,44.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Karan Arjun",1995,175,NA,6.3,115,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,1,1,0,1,0 -"Karaoke Fever",2001,90,NA,8.2,12,4.5,0,0,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,1,0,0 -"Karate Cop",1991,90,NA,2.2,31,34.5,14.5,14.5,4.5,4.5,0,4.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Karate Kiba",1976,87,NA,5,67,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Karate Kid, Part II, The",1986,113,NA,5.1,6130,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Karate Kid, Part III, The",1989,112,NA,3.9,4141,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Karate Kid, The",1984,126,NA,6.6,10783,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Karate, the Hand of Death",1961,80,NA,4.1,10,0,24.5,24.5,24.5,24.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Karaul",1989,96,NA,7,5,0,0,0,0,24.5,0,64.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Karavan Sarai",1986,115,NA,5.9,7,14.5,0,0,0,0,14.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Karbid und Sauerampfer",1963,85,NA,7.6,28,0,0,0,0,4.5,0,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kardiogramma",1995,75,NA,6.5,12,0,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kare no ootobai, kanojo no shima",1986,90,NA,6.5,6,0,0,0,0,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Karen Black Like Me",1997,15,NA,6.7,16,0,14.5,0,4.5,0,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Karen Black: Actress at Work",1999,55,NA,5.5,13,4.5,0,0,14.5,14.5,24.5,34.5,0,0,4.5,"",0,0,0,0,1,0,0 -"Karen Blixen - storyteller",1995,90,NA,6.6,11,0,0,0,0,0,34.5,0,0,14.5,44.5,"",0,0,0,0,1,0,0 -"Karins ansikte",1984,14,NA,6.2,33,14.5,4.5,0,4.5,0,4.5,4.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Karisuma",1999,104,NA,6.4,178,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Karius og Baktus",1954,15,NA,8.2,155,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Karl May",1974,187,NA,9.6,10,14.5,0,0,14.5,0,14.5,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Karl Valentins Hochzeit",1913,10,NA,7.6,6,0,0,0,0,14.5,14.5,14.5,45.5,0,0,"",0,0,1,0,0,0,1 -"Karl ja Marilyn",2003,24,NA,7.6,10,0,0,14.5,0,0,14.5,24.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Karla",1965,128,NA,4.3,6,0,0,14.5,0,0,14.5,0,45.5,0,14.5,"",0,0,0,1,0,0,0 -"Karlik nos",2003,82,NA,6,23,0,0,14.5,4.5,4.5,34.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Karlsvognen",1992,102,NA,5.1,11,0,0,4.5,24.5,14.5,34.5,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Karma",1986,193,NA,6.6,38,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",1,0,1,1,0,0,0 -"Karmen",2003,113,NA,5.8,25,4.5,0,4.5,4.5,0,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Karmina",1996,110,NA,6.3,202,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Karmina 2",2001,97,NA,5.6,117,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Karnaval",1999,88,NA,6.9,142,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Karnavalnaya noch",1956,78,NA,7.6,95,0,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Karnevolucija",1997,3,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,1 -"Karniggels",1991,94,NA,7.7,160,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Karnival Kid, The",1929,8,NA,6.8,40,0,0,0,4.5,4.5,44.5,24.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Karoshi",2004,29,NA,7.3,10,34.5,0,0,0,0,0,0,0,0,74.5,"",0,0,0,1,0,0,1 -"Karpuz kabugundan gemiler yapmak",2004,97,NA,8.3,185,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Karsilasma",2002,127,NA,6.5,23,4.5,0,0,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kart Racer",2003,94,NA,5.7,74,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"PG",0,0,1,1,0,0,0 -"Karumen kokyo ni kaeru",1951,86,NA,6.9,16,0,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Karura no yume",1994,60,NA,4.5,13,4.5,0,4.5,14.5,14.5,4.5,14.5,4.5,24.5,0,"",0,0,0,0,0,0,0 -"Karz",1980,159,NA,8.3,29,0,0,4.5,0,4.5,4.5,14.5,14.5,34.5,24.5,"",1,0,0,0,0,0,0 -"Karzan, il favoloso uomo della giungla",1972,92,NA,2.3,11,44.5,14.5,14.5,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Kasaba",1998,85,NA,7.1,93,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kasbah",2000,99,NA,5.8,34,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Kascha & Friends",1988,82,NA,6.2,5,0,0,0,0,0,44.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Kasei no kanon",2002,121,NA,7.8,21,0,0,0,0,0,14.5,44.5,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Kaseki",1975,200,NA,6.2,7,14.5,0,0,0,0,0,14.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Kashmir Ki Kali",1964,168,NA,7.3,14,0,0,0,0,4.5,0,44.5,4.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Kashtee-ye Angelica",1989,110,NA,5.2,5,0,0,24.5,0,44.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Kaspar Hauser",1993,175,NA,6.9,144,4.5,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Kasr El Shawk",1967,130,NA,4.5,9,0,14.5,0,14.5,0,24.5,14.5,34.5,0,14.5,"",0,0,0,0,0,1,0 -"Kassablanka",2002,100,NA,6.3,97,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Kassen stemmer",1976,105,NA,5.6,15,0,0,0,4.5,14.5,34.5,14.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Kastrullresan",1950,81,NA,4.5,9,0,0,0,34.5,34.5,14.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Kat",2001,85,NA,4.4,111,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kataku no hito",1986,133,NA,6,6,0,0,0,0,14.5,34.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Katala",1989,80,NA,7.6,8,0,14.5,0,14.5,0,24.5,24.5,0,0,24.5,"",0,0,0,0,0,1,0 -"Katariina ja Munkkiniemen kreivi",1943,110,NA,6.4,22,4.5,0,0,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Kataskopos Nelli",1981,116,NA,5.8,6,14.5,14.5,0,14.5,34.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Kate & Leopold",2001,123,48000000,6.3,8060,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Kate and the Indians",1980,83,NA,7.6,7,0,0,14.5,0,0,0,14.5,44.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kate's Addiction",1999,90,NA,3.7,203,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Kate's New Job",2004,11,NA,4.7,10,44.5,0,0,0,0,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Katedra",2002,7,NA,7.9,392,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,1,0,1,0,0,1 -"Katha",1983,141,NA,7.8,32,4.5,0,0,0,4.5,0,0,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Kathapurushan",1996,107,NA,7.5,11,4.5,0,0,0,14.5,0,14.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Katharmata, Ta",1984,90,NA,6,5,0,0,0,0,0,24.5,0,0,0,84.5,"",1,0,0,1,0,0,0 -"Kathleen",1941,88,NA,6.1,24,0,0,4.5,0,24.5,34.5,14.5,4.5,0,14.5,"",0,0,1,1,0,1,0 -"Kathleen Mavourneen",1930,55,NA,1.2,5,84.5,24.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,1,0 -"Kathy O'",1958,99,NA,6.2,24,0,0,0,0,14.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Kati kourasmena palikaria",1967,96,NA,7.4,19,0,0,0,0,0,4.5,44.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kati na kaiei",1963,110,NA,6.9,16,0,0,0,4.5,14.5,14.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Katia",1938,89,NA,5,6,0,14.5,0,0,34.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Katia",1959,91,NA,5.6,33,4.5,4.5,0,14.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Katiforos, O",1961,104,NA,7.4,12,0,0,0,4.5,0,24.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Katka-bumazhny ranyet",1926,75,NA,8.4,6,0,0,0,0,0,0,14.5,14.5,45.5,14.5,"",0,0,0,0,0,0,0 -"Katnip Kollege",1938,7,NA,5.6,44,4.5,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Kato apo ta asteria",2001,87,NA,6.3,38,4.5,4.5,0,0,14.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Katok i skripka",1960,45,NA,6.9,215,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Katryn's Place",2002,86,NA,3.1,11,14.5,0,14.5,0,0,0,0,4.5,0,45.5,"",0,0,0,1,0,0,0 -"Kattbreven",2001,90,NA,5.8,18,14.5,14.5,14.5,14.5,14.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Kattorna",1965,91,NA,3,12,14.5,0,4.5,14.5,14.5,14.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Katy",1984,86,NA,4,25,4.5,0,0,4.5,4.5,4.5,24.5,14.5,0,34.5,"",0,1,0,0,0,0,0 -"Katya Ismailova",1994,96,NA,6,38,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Katyi",1942,89,NA,8.7,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Katz V'Carasso",1971,110,NA,6.3,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Katz und Maus",1967,88,NA,7.2,17,4.5,4.5,0,0,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Katze im Sack",2005,87,NA,6.9,15,0,0,0,4.5,4.5,4.5,34.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Katze von Altona, Die",2002,30,NA,6.5,9,0,0,0,0,34.5,0,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Katze, Die",1988,118,NA,6.7,136,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Katzelmacher",1969,88,NA,7.1,182,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Katzendiebe",1996,85,NA,5.6,61,14.5,0,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kau luen kei",1997,91,NA,3,6,14.5,0,0,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,1,0 -"Kauas pilvet karkaavat",1996,96,NA,7.7,1027,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Kavafis",1996,90,NA,7,40,4.5,4.5,0,0,14.5,14.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Kavalaris ton FM Stereo, O",1986,90,NA,5.3,10,24.5,0,0,0,14.5,34.5,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Kavkazskaya plennitsa, ili Novye priklyucheniya Shurika",1966,82,NA,8.8,348,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Kavkazskaya ruletka",2002,83,NA,6.5,9,0,0,0,0,24.5,24.5,44.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Kavkazskiy plennik",1996,98,NA,7.5,888,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Kawachi Karumen",1966,89,NA,6.5,9,14.5,0,0,0,14.5,0,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kawaita hana",1964,96,NA,7.3,53,4.5,0,4.5,0,4.5,14.5,14.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Kawao tee Bangpleng",1994,120,NA,4.2,19,24.5,0,0,0,24.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Kayikci",1999,88,NA,4.2,20,24.5,4.5,4.5,24.5,4.5,14.5,4.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Kayitz Shel Aviya, Ha-",1988,95,350000,7.3,57,4.5,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kayla",1999,96,NA,5.8,26,4.5,4.5,0,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kaza-hana",2000,116,NA,7,41,0,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kazaam",1996,93,NA,2.3,3500,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"Kazablan",1974,122,NA,5.8,34,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Kazdy den odvahu",1964,85,NA,6.3,8,0,0,0,14.5,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kaze no naka no kodomo",1937,88,NA,7.9,6,0,0,0,0,0,0,45.5,14.5,34.5,0,"",0,0,0,0,0,0,0 -"Kaze no naka no mendori",1948,84,NA,7.9,41,4.5,0,4.5,0,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kaze no tani no Naushika",1984,84,NA,8,3314,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG",0,1,0,1,0,0,0 -"Kaze, Ghost Warrior",2004,23,5000,7.4,14,4.5,4.5,4.5,4.5,0,0,4.5,4.5,14.5,44.5,"",1,1,0,1,0,0,1 -"Kazhdyy desyatyy",1983,70,NA,7.2,5,0,0,0,0,0,0,84.5,24.5,0,0,"",1,0,0,0,0,0,0 -"Kazi zasto me ostavi",1993,90,NA,7.7,18,0,4.5,4.5,0,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kazoku",1970,106,NA,7.8,8,0,14.5,0,0,14.5,0,0,0,0,74.5,"",0,0,0,1,0,0,0 -"Kdyz rozvod, tak rozvod",1982,79,NA,7.3,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Keane",2004,100,850000,6.3,34,0,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,45.5,"R",0,0,0,1,0,0,0 -"Keaton's Cop",1988,100,NA,5.2,27,14.5,4.5,4.5,14.5,0,0,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Kebab Connection",2005,96,NA,7.1,140,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kedamono no ken",1965,85,NA,5.6,6,0,0,0,0,14.5,0,14.5,0,64.5,0,"",1,0,0,1,0,0,0 -"Kedma",2002,100,NA,7,179,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Keduldo urichurum",1990,100,NA,6.7,21,0,0,0,4.5,0,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Keep 'Em Flying",1941,86,NA,6,138,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Keep 'Em Rolling",1934,69,NA,7.3,14,0,0,0,0,24.5,24.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Keep Breathing",2000,95,NA,5.1,9,14.5,0,0,24.5,14.5,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Keep Fit",1937,82,NA,5.3,7,24.5,0,0,0,14.5,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Keep It Up Downstairs",1976,94,NA,3.7,18,24.5,4.5,14.5,24.5,4.5,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Keep It Up, Jack",1973,84,NA,2.5,12,44.5,4.5,4.5,14.5,4.5,4.5,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Keep It in the Family",1973,91,NA,5.7,6,14.5,14.5,0,0,14.5,0,34.5,0,14.5,0,"",0,0,1,0,0,1,0 -"Keep Punching",1939,81,NA,5.6,5,0,0,0,24.5,24.5,44.5,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Keep Your Powder Dry",1945,93,NA,5.5,40,0,0,0,4.5,34.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Keep Your Seats, Please",1936,82,NA,5.1,5,44.5,0,0,0,0,0,64.5,0,0,0,"",0,0,1,0,0,0,0 -"Keep in Style",1934,6,NA,4.8,7,0,0,14.5,14.5,24.5,24.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Keep on 'Rockin",1969,26,NA,6.2,14,0,0,4.5,0,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Keep the Aspidistra Flying",1997,101,NA,6.1,443,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Keep the River on Your Right: A Modern Cannibal Tale",2000,93,NA,7.2,245,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Keep, The",1983,96,6000000,5.4,1217,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Keeper of the Flame",1942,100,NA,6.9,256,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Keeper of the Past",2005,18,30000,9.9,7,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,1 -"Keeper, The",1976,88,NA,4.8,19,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Keeper, The",1995,92,NA,7.7,98,45.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Keeper, The",2004,95,4000000,4.5,151,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Keepers of the Frame",1999,70,NA,7,20,0,4.5,0,4.5,0,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Keeping Clean and Neat",1956,10,NA,2.8,29,44.5,24.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Keeping Company",1940,80,NA,5.5,25,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Keeping Track",1985,102,NA,5.1,17,4.5,0,24.5,14.5,14.5,14.5,0,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Keeping Up with the Joneses",1915,3,NA,5.8,5,0,0,0,0,44.5,64.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Keeping the Faith",2000,128,30000000,6.8,11351,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Kees de jongen",2003,96,NA,5.2,74,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Keetje Tippel",1975,109,NA,6.5,292,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kegless",1998,88,NA,3.1,44,64.5,14.5,0,0,0,0,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Kehraus",1983,88,NA,7.8,98,0,0,4.5,4.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kehrwoche",2000,10,NA,9.1,18,0,0,0,0,0,0,14.5,14.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Kehtaa Hai Dil Baar Baar",2002,119,NA,6.4,16,4.5,14.5,0,4.5,14.5,4.5,34.5,0,4.5,14.5,"",0,0,1,0,0,1,0 -"Kei Wong",1991,110,NA,7.4,44,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Keiko",1979,119,NA,6.6,13,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Keiko en peligro",1990,90,NA,4.7,8,24.5,0,14.5,14.5,0,14.5,14.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Keimusho no naka",2002,93,NA,7,46,4.5,0,4.5,4.5,0,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Kein Pardon",1993,97,NA,6.4,242,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Keiner liebt mich",1994,104,NA,7.4,342,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Keizoku - The Movie",2000,119,NA,4.4,18,0,4.5,14.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kejar Amerika",2004,86,100000,6.7,19,24.5,0,0,0,0,14.5,4.5,14.5,14.5,34.5,"PG-13",0,0,0,0,0,0,0 -"Kejarlah daku kau kutangkap",1986,95,NA,8.2,5,0,0,0,0,0,0,0,84.5,24.5,0,"",0,0,1,1,0,0,0 -"Kejsaren",1979,97,NA,4.9,9,14.5,0,0,34.5,14.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Kejsarn av Portugallien",1944,109,NA,6,12,4.5,0,0,4.5,4.5,34.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Kekexili",2004,85,NA,7.8,184,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Kelid",1987,85,NA,7,33,4.5,0,0,0,4.5,14.5,14.5,34.5,24.5,0,"",0,0,0,1,0,0,0 -"Kelly",1981,94,NA,4.3,10,0,0,14.5,34.5,44.5,0,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Kelly Loves Tony",1998,60,NA,7.5,6,0,0,14.5,0,0,0,0,45.5,34.5,0,"",0,0,0,0,1,0,0 -"Kelly and Me",1957,86,NA,5.1,19,0,4.5,0,4.5,24.5,14.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kelly's Heroes",1970,144,NA,7.3,5325,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Kemek",1970,90,NA,2.9,11,24.5,4.5,14.5,14.5,0,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Ken",1964,94,NA,8.1,6,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ken Park",2002,97,NA,6,2955,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ken ki",1965,83,NA,8,9,0,0,0,0,0,24.5,0,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Kenar-e roodkhaneh",2004,81,NA,6.2,7,0,14.5,0,0,0,44.5,0,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Kenguru, A",1975,95,NA,6.8,5,0,0,24.5,0,0,24.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Kenka erejii",1966,86,NA,7.7,87,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Kenka karate kyokushinken",1975,85,NA,5.3,25,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Kenkei tai soshiki boryoku",1975,100,NA,7.2,50,0,0,0,4.5,0,14.5,14.5,34.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Kennedy et moi",1999,86,NA,6.8,219,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Kennel Murder Case, The",1933,73,NA,7,284,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Kenner",1969,92,NA,5.1,7,0,14.5,0,14.5,0,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Kennwort... Reiher",1964,95,NA,6.1,6,0,0,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Kenny & Company",1976,90,NA,6.7,80,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Kenoma",1998,112,NA,8.8,58,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Kentuckian, The",1955,104,NA,6.1,243,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Kentucky",1938,95,NA,7.1,50,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Kentucky Fried Movie, The",1977,90,600000,6.4,3756,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kentucky Kernels",1934,75,NA,6.2,42,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Kentucky Moonshine",1938,87,NA,5.6,8,0,0,0,0,34.5,14.5,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Kentucky Rifle",1956,84,NA,4.1,16,0,14.5,45.5,14.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Keoma",1976,105,NA,7,273,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Kept",2001,98,NA,4.3,58,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,"R",0,0,0,1,0,0,0 -"Kept Husbands",1931,76,NA,6.2,41,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Kerl liebt mich - und das soll ich glauben?, Der",1969,89,NA,1.1,8,84.5,14.5,0,0,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Kerouac, the Movie",1985,78,NA,6.3,27,4.5,14.5,0,4.5,4.5,24.5,24.5,14.5,0,14.5,"",0,0,0,1,1,0,0 -"Kersenpluk, De",1996,96,NA,6.4,32,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Kes",1969,90,NA,7.5,1009,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Kesher Ir",1999,103,NA,5.4,36,0,4.5,0,4.5,0,34.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ketchup",1998,11,NA,5.3,5,0,0,0,0,44.5,24.5,24.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Ketchup and Mustard Man, The",1994,35,NA,9.7,24,24.5,0,4.5,0,0,0,4.5,0,4.5,64.5,"",0,0,0,0,0,0,1 -"Kettles in the Ozarks, The",1956,81,NA,5.9,27,0,0,4.5,4.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Kettles on Old MacDonald's Farm, The",1957,81,NA,5.2,24,0,4.5,0,4.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Keufs, Les",1987,93,NA,4.4,39,14.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Keum-honga Keum-honga",1995,97,NA,5.3,7,0,0,14.5,0,24.5,24.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Keung gaan 2 chai fook yau waak",1998,89,NA,4.3,14,0,4.5,24.5,4.5,0,34.5,0,4.5,14.5,4.5,"",1,0,1,0,0,1,0 -"Kevade",1969,84,NA,8.6,103,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Kevin & Perry Go Large",2000,83,NA,4.6,1284,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Kevin of the North",2001,100,NA,4.4,272,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Kewaishi",2001,113,NA,6.4,7,14.5,0,0,0,24.5,0,14.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Key Exchange",1985,97,NA,4.7,73,4.5,14.5,4.5,14.5,34.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Key Largo",1948,101,NA,7.8,5085,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Key West: City of Colors",2004,64,90000,8.4,5,0,0,0,0,0,24.5,0,24.5,44.5,24.5,"",0,0,0,0,1,0,0 -"Key Witness",1960,82,NA,6.3,76,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Key to Sex, The",1998,86,NA,3.8,62,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Key to the City",1950,101,NA,6.4,80,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Key, The",1934,71,NA,5.5,35,4.5,4.5,4.5,4.5,14.5,44.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Key, The",1958,134,NA,6.1,68,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Keyhole, The",1933,69,169000,6.3,50,0,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Keyholes Are for Peeping",1972,70,NA,1.3,9,34.5,24.5,0,0,0,14.5,14.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Keyman, The",2002,90,NA,4.8,41,14.5,14.5,0,4.5,4.5,4.5,0,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Keys of the Kingdom, The",1944,137,3000000,6.8,197,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Keys to Tulsa",1997,116,NA,5.1,531,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Keystone 'Patrician', The",1928,6,NA,5.4,9,0,0,0,0,44.5,34.5,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Khab-e khak",2003,82,NA,3.3,6,0,34.5,0,14.5,0,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Khab-e sefid",2002,90,NA,7,7,0,0,0,0,0,14.5,45.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Khab-e talkh",2004,87,NA,7.2,25,0,0,0,4.5,0,14.5,24.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Khaidi",1983,157,NA,7.2,5,24.5,0,0,0,0,24.5,0,0,24.5,44.5,"",1,0,0,0,0,0,0 -"Khakee",2004,174,NA,7.3,207,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Khakestar-o-khak",2004,102,NA,7.2,15,0,0,0,0,0,4.5,44.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Khal Nayak",1993,190,NA,6,88,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Khaled",2001,85,NA,7.3,66,0,4.5,0,0,4.5,14.5,24.5,44.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Khamosh Pani: Silent Waters",2003,105,NA,6.9,111,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Khamoshi",1969,127,NA,9.4,24,0,0,0,0,0,0,4.5,14.5,34.5,45.5,"",0,0,0,0,0,1,0 -"Khamushiye darya",2003,82,NA,5.9,8,0,0,0,14.5,0,24.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Khandhar",1984,106,NA,7.1,17,0,0,0,0,14.5,0,14.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Khane-ye doust kodjast?",1987,87,NA,7.8,337,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Khaneh siah ast",1963,20,NA,9.4,22,0,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,0,0,1,0,1 -"Khang lang phap",2001,110,NA,6.2,21,0,0,4.5,0,4.5,34.5,4.5,4.5,24.5,4.5,"",0,0,0,0,0,1,0 -"Kharij",1982,99,NA,7.1,8,0,0,0,0,0,0,24.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Khartoum",1966,128,NA,6.6,629,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Khochu v tyurmu",1999,98,NA,4.4,20,14.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Khoda miad",1995,42,NA,7.7,13,4.5,0,0,0,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Kholodnoye leto pyatdesyat tretyego",1987,102,NA,7.6,97,0,0,4.5,0,4.5,4.5,4.5,24.5,24.5,44.5,"",1,0,0,1,0,0,0 -"Khomreh",1992,86,NA,6.6,61,4.5,0,4.5,0,4.5,4.5,4.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Khoobsurat",1999,153,NA,5.2,28,4.5,0,4.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Khoon Pasina",1977,210,NA,7.1,13,0,0,0,0,4.5,4.5,34.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Khozyain taygi",1968,83,NA,6.7,8,0,0,0,0,14.5,14.5,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Khrani menya, moy talisman",1986,74,NA,7.8,8,0,0,0,14.5,0,14.5,0,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Khrustalyov, mashinu!",1998,137,NA,7.4,115,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Khu gam",1996,135,NA,6.4,22,4.5,0,0,0,4.5,14.5,14.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Khuda Gawah",1992,193,NA,7,96,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Khunsuk",2003,125,NA,7.4,22,4.5,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Khwaab",2004,86,75000,8,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Khwahish",2003,152,NA,2.6,12,14.5,45.5,0,0,0,4.5,0,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Khyber Patrol",1954,71,NA,5.9,10,0,0,0,14.5,24.5,24.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ki lo sa?",1985,90,NA,4.5,8,0,14.5,0,14.5,14.5,0,14.5,14.5,0,34.5,"",0,0,1,1,0,1,0 -"Kichiku",1978,110,NA,7.3,22,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Kichiku dai enkai",1997,100,NA,5.5,94,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kick",1999,92,NA,5,77,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kick In",1931,75,NA,7.3,12,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Kickboxer 2: The Road Back",1991,89,NA,3.4,401,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Kickboxer 3: The Art of War",1992,92,NA,2.9,225,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Kickboxer 4: The Aggressor",1994,86,NA,3.3,194,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Kickboxing Academy",1997,84,NA,2,190,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Kicked in the Head",1997,87,4000000,4.2,271,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Kickin'",2003,9,NA,8,8,0,0,0,0,24.5,0,0,14.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Kickin' the Conga Round",1942,7,NA,4.8,6,0,0,34.5,14.5,14.5,14.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Kickin' the Crown Around",1933,19,NA,5.2,5,0,0,0,24.5,0,64.5,0,0,24.5,0,"",0,0,1,0,0,0,1 -"Kicking & Screaming",2005,95,NA,6.3,87,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"PG",0,0,1,0,0,0,0 -"Kicking and Screaming",1995,96,NA,6.7,1363,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,1,1,0,0,0 -"Kid",1984,33,NA,5.4,6,34.5,0,0,0,0,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Kid Auto Races at Venice",1914,11,NA,6.1,110,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Kid Blue",1973,100,NA,5.6,80,4.5,4.5,0,4.5,24.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Kid Brother, The",1927,84,NA,8.3,285,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,1,0,0,1,0 -"Kid Called Danger, A",1999,78,NA,4.7,51,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Kid Colter",1984,101,NA,6.6,22,4.5,0,0,14.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Kid Comes Back, The",1938,60,NA,6.4,9,0,0,0,24.5,24.5,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Kid Dynamite",1943,66,NA,5.6,78,4.5,0,4.5,14.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kid From Broken Gun, The",1952,55,NA,6.5,6,0,0,0,0,14.5,0,14.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Kid From Kokomo, The",1939,93,NA,6.2,13,0,0,4.5,0,14.5,14.5,34.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"Kid From Texas, The",1939,71,NA,5.3,30,4.5,4.5,0,24.5,14.5,24.5,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Kid Galahad",1937,102,NA,7.2,293,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kid Galahad",1962,95,NA,5.1,311,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kid Glove Killer",1942,74,NA,7.5,101,0,0,4.5,4.5,4.5,14.5,14.5,44.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kid Millions",1934,90,NA,6.3,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kid Monk Baroni",1952,79,NA,5.7,5,0,0,0,0,44.5,24.5,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Kid Nightingale",1939,57,NA,5.2,21,0,4.5,0,14.5,24.5,34.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Kid Quick",2000,15,NA,8.9,10,0,0,0,0,0,14.5,14.5,14.5,24.5,45.5,"",0,0,1,0,0,0,1 -"Kid Rodelo",1966,91,NA,4.4,9,14.5,14.5,14.5,24.5,14.5,0,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Kid Sentiment",1968,87,NA,5.9,6,0,0,0,0,34.5,0,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Kid Speed",1924,18,NA,5.7,25,0,0,0,4.5,24.5,44.5,24.5,0,0,4.5,"",1,0,1,0,0,1,1 -"Kid Stays In the Picture, The",2002,93,NA,7.5,1532,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Kid Vengeance",1977,94,NA,3.3,26,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Kid Who Couldn't Miss, The",1983,79,NA,4.8,11,24.5,0,0,14.5,4.5,14.5,4.5,14.5,0,0,"",0,0,0,1,1,0,0 -"Kid for Two Farthings, A",1955,96,NA,7.3,82,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Kid from Borneo, The",1933,18,21500,8,65,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Kid from Brooklyn, The",1946,113,NA,6.5,159,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kid from Cleveland, The",1949,89,NA,5.5,28,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Kid from Left Field, The",1953,80,NA,5.9,82,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kid from Spain, The",1932,96,NA,6.3,52,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kid from Texas, The",1950,78,NA,7.1,34,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kid in Aladdin's Palace, A",1998,89,NA,4.3,91,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Kid in Hollywood",1932,10,NA,3.7,18,4.5,24.5,4.5,14.5,14.5,24.5,4.5,0,0,4.5,"",0,0,1,0,0,0,1 -"Kid in King Arthur's Court, A",1995,89,NA,4.7,519,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Kid's Story",2003,15,NA,7,650,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Kid, The",1921,54,250000,8.2,2687,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Kid, The",1997,90,NA,5.4,44,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kid, The",2000,104,65000000,6.1,5418,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"Kidco",1984,105,NA,5.1,127,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kiddie Revue",1930,15,NA,6.2,5,0,0,0,24.5,24.5,0,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Kiddies Kitty, A",1955,6,NA,5.3,20,0,14.5,14.5,4.5,14.5,24.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Kiddin' the Kitten",1952,7,NA,6.3,18,0,0,0,14.5,4.5,34.5,44.5,0,0,0,"",0,1,1,0,0,0,1 -"Kidnap",2000,1,NA,5.6,19,4.5,0,0,14.5,0,14.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Kidnapning",1982,70,NA,5.9,29,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kidnapped",1938,85,NA,7,21,0,0,0,4.5,0,14.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kidnapped",1948,81,NA,5.5,21,0,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Kidnapped",1960,97,NA,6.3,171,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kidnapped",1971,100,NA,5.4,103,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kidnappers, The",1953,93,NA,7.4,85,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Kidnappeurs, Les",1998,102,NA,5.2,70,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kidnapping of the President, The",1980,114,NA,5.2,81,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Kids",1995,91,1500000,6.6,9099,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kids Are Alright, The",1979,101,2000000,7.6,753,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Kids World",2001,93,NA,4.6,36,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Kids in the Hall: Brain Candy",1996,89,NA,6.4,2720,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kids in the Hall: Same Guys, New Dresses",2001,93,NA,8.2,140,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,1,0,0 -"Kids of Shaolin",1977,90,NA,5.7,13,4.5,0,24.5,14.5,14.5,24.5,4.5,0,0,4.5,"",1,0,1,1,0,0,0 -"Kids of the Round Table",1995,89,NA,4.5,78,14.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kidzu ritan",1996,107,NA,7.5,716,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Kiemas",1999,90,NA,5.3,17,14.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kiez",1983,106,NA,1.5,5,44.5,24.5,0,24.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Kiga kaikyo",1965,183,NA,9.5,34,0,0,4.5,0,4.5,4.5,4.5,4.5,44.5,34.5,"",0,0,0,1,0,1,0 -"Kika",1993,114,NA,6.2,1568,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Kikar Ha-Halomot",2001,98,NA,7.3,32,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kiki",1926,108,NA,2.9,5,0,24.5,0,0,0,44.5,24.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Kiki",1931,87,810568,6.8,6,0,0,0,14.5,0,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kiklop",1982,138,NA,8.2,33,0,4.5,0,4.5,0,0,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Kiks",1991,95,NA,7.6,5,0,0,0,24.5,0,0,44.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Kikuchi",1991,68,NA,7,6,0,0,14.5,0,0,0,0,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Kikujiro no natsu",1999,121,NA,7.5,2837,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Kilas, o Mau da Fita",1981,120,NA,7.3,15,14.5,0,0,0,0,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kiler",1997,104,NA,6.9,338,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,1,0,0,0,0 -"Kilichundan Mampazham",2003,154,NA,5.4,5,0,24.5,24.5,0,24.5,0,24.5,0,0,24.5,"",0,0,1,0,0,1,0 -"Kilimanjaro",2000,100,NA,7.1,23,0,4.5,0,0,4.5,14.5,44.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Kill Alex Kill",1976,89,NA,2.3,6,34.5,34.5,14.5,0,0,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Kill Bill: Vol. 1",2003,111,55000000,8.3,65026,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",1,0,0,1,0,0,0 -"Kill Bill: Vol. 2",2004,136,30000000,8.3,44189,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",1,0,0,1,0,0,0 -"Kill Line",1992,93,NA,3.6,5,24.5,0,24.5,44.5,0,0,0,24.5,0,0,"",1,0,0,0,0,0,0 -"Kill Me Again",1989,94,4000000,6.2,643,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kill Me Later",2001,89,NA,5.9,565,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Kill Me Tomorrow",1957,80,NA,5,9,0,0,14.5,24.5,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kill Me Tomorrow",2000,80,NA,3.8,17,45.5,0,4.5,0,14.5,0,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Kill Squad",1981,85,NA,3.7,47,24.5,14.5,4.5,4.5,14.5,14.5,0,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Kill Zone",1993,81,NA,4.3,28,14.5,0,14.5,14.5,4.5,14.5,4.5,4.5,0,34.5,"",1,0,0,0,0,0,0 -"Kill a Dragon",1967,91,NA,4.6,10,0,14.5,24.5,14.5,0,24.5,24.5,0,14.5,14.5,"",1,0,0,1,0,0,0 -"Kill and Kill Again",1981,100,NA,4.7,94,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Kill by Inches",1999,80,NA,4.9,111,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Kill or Be Killed",1950,67,NA,6.7,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Kill or Be Killed",1980,90,NA,4,59,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Kill or Cure",1923,11,NA,5.6,8,0,0,0,24.5,14.5,24.5,24.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Kill or Cure",1962,88,NA,5.1,29,0,0,14.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kill the Golden Goose",1979,90,NA,3.1,12,14.5,14.5,4.5,0,0,4.5,14.5,4.5,0,24.5,"",1,0,0,1,0,0,0 -"Kill the Man",1999,86,NA,4.8,189,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Kill the Scream Queen",2004,74,5000,1.3,5,44.5,44.5,0,0,0,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Kill the Umpire",1950,78,NA,6.5,115,4.5,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kill!",1971,90,NA,4.2,35,24.5,4.5,4.5,14.5,4.5,14.5,4.5,0,4.5,24.5,"",1,0,0,1,0,0,0 -"Kill-Off, The",1989,97,NA,5.3,35,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kille och en tjej, En",1975,94,NA,5.6,49,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Killer",1994,95,NA,5.9,211,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Killer Ape",1953,68,NA,3.4,34,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Killer Barbys",1996,87,NA,3.5,120,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Killer Barbys vs. Dracula",2002,86,NA,3.8,57,24.5,24.5,4.5,4.5,4.5,4.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Killer Bean 2: The Party",2000,7,2800,7,110,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,1,1,0,0,0,1 -"Killer Bud",2001,92,NA,3.7,115,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Killer Dill",1947,75,NA,5.5,8,14.5,0,14.5,0,24.5,14.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Killer Diller",2004,95,NA,7.6,30,0,4.5,4.5,0,0,14.5,24.5,14.5,14.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Killer Elite, The",1975,122,NA,5.8,492,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Killer Eye, The",1999,72,400000,2.2,210,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Killer Fish",1979,101,NA,3.8,137,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Killer Flick",1998,93,NA,4.1,33,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Killer Image",1992,94,NA,4.1,41,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Killer Inside Me, The",1976,99,NA,6,47,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Killer Inside, The",1996,92,NA,3.1,6,14.5,0,14.5,0,34.5,0,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Killer Instinct",1987,88,NA,5.8,18,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Killer Instinct",1991,92,NA,4.2,65,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Killer Is Loose, The",1956,73,NA,7,81,4.5,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Killer Kid",1994,90,NA,7.1,35,14.5,0,4.5,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Killer Klowns from Outer Space",1988,88,2000000,5.3,2702,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Killer Leopard",1954,70,NA,4.4,7,0,0,14.5,14.5,0,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Killer Looks",1994,97,NA,5.2,98,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Killer McCoy",1947,104,NA,6.7,60,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Killer Me",2001,80,NA,7,187,14.5,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Killer Nerd",1991,90,NA,3.4,78,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Killer Party",1986,91,NA,4,117,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Killer Shark",1950,76,NA,4,5,24.5,0,24.5,44.5,0,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Killer Shrews, The",1959,69,123000,3.3,403,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Killer Tattoo",2001,111,NA,6,103,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Killer That Stalked New York, The",1950,76,NA,5.8,30,0,4.5,0,4.5,24.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Killer Tomatoes Eat France!",1991,94,NA,2.8,188,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Killer Tomatoes Strike Back!",1990,87,NA,2.6,176,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",1,0,1,0,0,0,0 -"Killer Within, A",2004,110,NA,5,130,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Killer Workout",1986,85,NA,3,79,24.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Killer of Sheep",1977,83,100000,7.5,100,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Killer per caso",1997,110,NA,4.9,62,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Killer's Edge, The",1990,90,NA,3.1,20,34.5,14.5,24.5,14.5,14.5,0,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Killer's Kiss",1955,67,75000,6.6,1871,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Killer's Moon",1978,90,NA,2.8,23,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Killer-Dog",1936,10,NA,6.9,11,0,0,0,0,34.5,0,0,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Killer: A Journal of Murder",1996,91,NA,6.2,446,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Killers",1996,90,100000,6.3,219,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Killers",1997,86,100000,2.8,127,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Killers Three",1968,88,NA,4.5,32,4.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Killers from Space",1954,71,NA,2.9,134,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Killers of Kilimanjaro",1959,91,NA,5.3,29,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Killers, The",1946,96,NA,7.8,1593,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Killers, The",1964,93,NA,6.7,743,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Killing 'em Softly",1982,81,NA,4.1,9,34.5,0,0,24.5,0,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Killing Affair, A",1986,100,NA,5.2,34,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Killing Blue",1988,95,NA,3.8,32,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Killing Box, The",1993,80,1200000,4,127,14.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Killing Cars",1986,104,NA,4.4,27,14.5,14.5,14.5,24.5,14.5,14.5,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Killing Dad",1989,93,NA,3.5,37,14.5,14.5,24.5,4.5,0,0,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Killing Fields, The",1984,141,NA,7.9,9575,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Killing Grounds, The",1997,93,NA,4.1,68,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Killing Heinz",1996,3,NA,8.7,24,0,0,4.5,0,4.5,4.5,0,4.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Killing Jar, The",1994,98,NA,2.7,13,24.5,4.5,14.5,4.5,14.5,0,0,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Killing Jar, The",1996,101,NA,4.2,64,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Killing Joe",1999,41,NA,4.5,16,14.5,0,4.5,14.5,4.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Killing Kevin",2004,22,20000,8,6,0,0,14.5,0,0,0,0,34.5,14.5,34.5,"",0,0,1,1,0,0,1 -"Killing Kind, The",1973,88,NA,5.9,56,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Killing Machine, The",1994,100,NA,4,67,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Killing Me Softly",2002,104,25000000,5.4,1771,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Killing Midnight",1997,90,NA,2.8,9,14.5,34.5,0,34.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Killing Off",1999,23,NA,3.4,32,24.5,4.5,4.5,4.5,0,0,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Killing Spree",1987,90,75000,3.6,53,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Killing Streets",1991,106,NA,4.3,64,14.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Killing Time",2002,81,NA,5.3,24,14.5,24.5,4.5,4.5,0,0,4.5,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Killing Time at Home",2003,3,NA,7.2,7,0,0,0,0,0,14.5,14.5,0,45.5,14.5,"",0,1,0,0,0,0,1 -"Killing Zoe",1994,99,1500000,6.2,4834,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Killing Zone, The",1999,92,NA,5.8,106,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Killing for Love",1995,90,NA,3.3,46,14.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Killing of America, The",1982,90,NA,6.5,88,0,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Killing of Angel Street, The",1981,96,NA,6,11,0,0,4.5,4.5,14.5,14.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Killing of Candice Klein, The",2002,7,NA,4.5,11,44.5,4.5,0,0,0,4.5,4.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Killing of Kings, The",2004,30,NA,4.2,21,44.5,0,4.5,4.5,0,0,0,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Killing of Sister George, The",1968,138,NA,6.6,279,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Killing of a Chinese Bookie, The",1976,108,NA,6.9,590,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Killing, The",1956,85,320000,8.1,6980,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Killings at Outpost Zeta, The",1980,92,NA,3.8,22,24.5,4.5,14.5,14.5,4.5,14.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Killpoint",1984,80,NA,3.2,20,24.5,24.5,14.5,0,14.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Kilma, reina de las amazonas",1975,88,NA,3.4,13,14.5,4.5,0,4.5,44.5,4.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Kim",1950,113,NA,6.5,264,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kimberley Jim",1965,81,NA,5.8,11,0,0,0,0,14.5,0,4.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Kimberly",1999,106,2000000,5.3,231,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Kimen",1974,93,NA,5.7,16,0,14.5,0,4.5,24.5,34.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Kimi to wakarete",1933,61,NA,6,5,0,0,0,0,0,64.5,0,0,44.5,0,"",0,0,0,0,0,0,0 -"Kimi yo funme no kawa o watare",1976,151,NA,6.9,12,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kimia",1995,92,NA,7.6,7,0,0,0,0,0,0,44.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Kimono",2000,28,NA,6.1,31,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Kimui jeonjaeng",1992,117,NA,6.9,10,34.5,0,24.5,14.5,0,0,14.5,24.5,14.5,0,"",1,0,0,1,0,0,0 -"Kimurake no hitobito",1988,113,NA,7,25,4.5,0,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kin",2000,89,NA,5.2,31,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Kind Hearts and Coronets",1949,106,NA,8.2,3489,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Kind Lady",1935,76,NA,6.5,18,0,0,0,0,14.5,4.5,34.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Kind Lady",1951,78,NA,7.2,89,0,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kind der Donau",1950,78,NA,5.3,8,24.5,0,0,14.5,0,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Kind of Hush, A",1999,96,NA,5.7,26,4.5,4.5,0,4.5,14.5,14.5,4.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Kind of Loving, A",1962,112,NA,7.2,148,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Kindan no mokushiroku Crystal Triangle",1987,87,NA,6.7,8,14.5,14.5,14.5,0,0,24.5,14.5,24.5,0,0,"",1,1,0,1,0,0,0 -"Kinder aus Nr. 67, Die",1980,103,NA,6.9,11,0,0,0,0,4.5,0,45.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Kinder der Berge",1958,90,NA,7.7,6,14.5,0,0,14.5,0,34.5,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Kinder sind tot, Die",2003,80,NA,8.3,18,0,14.5,0,0,0,14.5,14.5,44.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Kindergarten Cop",1990,111,NA,5.8,13476,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Kindering",1987,3,NA,6.6,39,4.5,4.5,14.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Kinderspiele",1992,111,NA,7,52,4.5,0,0,0,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Kindred, The",1987,91,NA,4.5,184,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kinema no tenchi",1986,135,NA,7.9,19,0,4.5,0,0,0,0,24.5,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"King & Country",1964,89,300000,7.9,144,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"King Arthur",2004,140,90000000,6,14272,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"King Arthur Was a Gentleman",1942,99,NA,5.4,11,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"King Arthur, the Young Warlord",1975,95,NA,6.3,13,24.5,0,0,4.5,4.5,4.5,0,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"King Cobra",1999,93,NA,2.6,407,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"King Creole",1958,116,NA,6.3,669,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"King David",1985,114,NA,4.8,305,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"King Dinosaur",1955,63,NA,1.8,113,64.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"King Frat",1979,82,NA,3.4,100,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"King Is Alive, The",2000,108,NA,6.4,545,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"King John",1899,3,NA,5.6,23,14.5,0,4.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"King Kelly of the U.S.A.",1934,66,NA,1.3,13,64.5,4.5,4.5,0,0,0,0,4.5,0,4.5,"",0,0,1,0,0,1,0 -"King Kong",1933,100,670000,7.9,10301,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"King Kong",1976,134,24000000,5.3,3181,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"King Kong Lives",1986,105,NA,3.1,529,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"King Kongs Faust",1985,80,NA,8,5,24.5,0,0,0,0,0,0,0,24.5,64.5,"",0,0,0,0,0,0,0 -"King Lear",1971,137,NA,6.7,115,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"King Lear",1987,90,NA,4.9,194,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"King Lear",1999,190,NA,6,13,0,0,4.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"King Murder, The",1932,67,NA,4.8,7,0,14.5,0,0,14.5,45.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"King Neptune",1932,7,NA,5.3,16,0,0,4.5,14.5,24.5,34.5,4.5,4.5,0,4.5,"",0,1,0,0,0,0,1 -"King Ralph",1991,97,NA,4.7,3007,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"King Rat",1965,134,NA,7.5,596,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"King Richard and the Crusaders",1954,114,3000000,5.3,71,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"King Rikki",2002,91,NA,4.2,41,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"King Solomon's Mines",1937,80,NA,6.9,113,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"King Solomon's Mines",1950,103,NA,6.8,782,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",1,0,0,0,0,1,0 -"King Solomon's Mines",1985,100,12500000,4.4,1662,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"King Solomon's Treasure",1977,88,NA,4,22,4.5,0,24.5,34.5,0,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"King Steps Out, The",1936,85,NA,6,14,0,0,4.5,4.5,14.5,34.5,24.5,0,4.5,4.5,"",0,0,0,0,0,1,0 -"King Uncle",1993,171,NA,6.2,24,4.5,4.5,0,14.5,0,14.5,4.5,14.5,4.5,24.5,"",1,0,1,1,0,0,0 -"King and Four Queens, The",1956,84,NA,5.7,109,4.5,0,4.5,14.5,24.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"King and I, The",1956,133,NA,7.4,3694,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"King and I, The",1999,87,NA,4,476,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"King and the Chorus Girl, The",1937,94,NA,6.1,41,4.5,0,0,4.5,4.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"King for a Day",1940,7,NA,5.5,10,0,0,0,0,34.5,24.5,44.5,14.5,0,0,"",0,1,1,0,0,0,1 -"King in Exile, The",1992,30,NA,8.7,14,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"King in New York, A",1957,105,NA,6.7,561,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"King of Alcatraz",1938,68,NA,6,11,4.5,0,4.5,0,24.5,0,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"King of Burlesque",1935,85,NA,6.4,7,0,0,0,14.5,14.5,14.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"King of Comedy, The",1983,109,20000000,7.5,6189,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"King of Hockey",1936,55,NA,5.7,21,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"King of Jazz, The",1930,105,2000000,6.8,60,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"King of Kings",1961,168,NA,6.9,646,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"King of Kings, The",1927,155,2500000,7.9,178,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"King of Marvin Gardens, The",1972,103,NA,6.3,523,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"King of New York",1990,103,NA,6.7,2566,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"King of Sex",1986,5,NA,4.4,9,14.5,14.5,0,0,24.5,0,14.5,0,0,44.5,"",0,0,0,0,0,0,1 -"King of the Bingo Game",1999,26,NA,5.1,7,0,0,0,14.5,24.5,0,0,0,44.5,14.5,"",0,0,0,0,0,0,1 -"King of the Bullwhip",1950,58,NA,6.1,6,0,14.5,0,0,0,14.5,34.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"King of the Carnival",1955,167,NA,2.8,5,44.5,0,0,0,44.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"King of the Cowboys",1943,67,NA,6.9,27,0,0,4.5,4.5,4.5,14.5,44.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"King of the Damned",1935,81,NA,4.2,12,0,14.5,0,4.5,34.5,34.5,0,0,0,4.5,"",1,0,0,0,0,0,0 -"King of the Duplicators, The",1968,12,NA,6.6,8,14.5,0,0,0,0,24.5,34.5,24.5,0,0,"",0,0,0,0,1,0,1 -"King of the Forest Rangers",1946,167,NA,7.3,9,0,0,0,0,14.5,34.5,24.5,24.5,0,14.5,"",1,0,0,0,0,0,0 -"King of the Grizzlies",1970,93,NA,4.4,18,24.5,4.5,0,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"King of the Gypsies",1978,112,NA,5.8,202,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"King of the Hill",1972,18,45000,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,0,0,0,1 -"King of the Hill",1993,109,8000000,7.4,1233,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"King of the Jews",2000,18,NA,6.9,12,4.5,0,0,0,0,24.5,14.5,4.5,24.5,14.5,"",0,0,0,0,1,0,1 -"King of the Jungle",1933,73,NA,5.8,12,0,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,4.5,"",1,0,0,0,0,0,0 -"King of the Jungle",2001,87,NA,5.8,171,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"King of the Khyber Rifles",1953,100,NA,6.3,98,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"King of the Kickboxers, The",1991,99,NA,3.7,115,4.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"King of the Lumberjacks",1940,58,NA,5,9,0,0,0,24.5,45.5,14.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"King of the Mardi Gras",1935,8,NA,7,11,0,0,0,0,14.5,0,34.5,0,4.5,34.5,"",0,1,1,0,0,0,1 -"King of the Moon",2004,21,NA,7,7,0,0,0,0,0,0,45.5,0,0,44.5,"",0,0,1,0,0,0,1 -"King of the Mountain",1981,90,2000000,4.1,49,4.5,0,4.5,14.5,24.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"King of the Mounties",1942,196,NA,7.6,5,0,0,0,0,24.5,24.5,0,24.5,24.5,24.5,"",1,0,0,0,0,0,0 -"King of the Pecos",1936,54,NA,3.4,32,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"King of the Roaring 20's - The Story of Arnold Rothstein",1961,106,NA,5.6,16,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"King of the Rocket Men",1949,167,NA,7.1,109,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"King of the Royal Mounted",1940,211,NA,7.6,16,0,0,0,0,4.5,14.5,4.5,14.5,14.5,44.5,"",1,0,0,0,0,0,0 -"King of the Texas Rangers",1941,215,NA,6.7,14,0,0,4.5,0,14.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"King of the Underworld",1939,67,NA,6.2,74,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"King of the Wild",1931,248,NA,5.4,6,0,0,0,14.5,14.5,34.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"King of the Wild Stallions",1959,76,NA,4.7,8,0,0,0,34.5,14.5,0,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"King of the Wind",1989,103,NA,5.1,30,4.5,0,0,14.5,14.5,4.5,34.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"King of the Zombies",1941,67,NA,4.5,131,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"King's Beard, The",2002,73,NA,5.2,7,0,0,0,0,45.5,0,24.5,0,14.5,0,"",0,1,0,0,0,0,0 -"King's Guard, The",2000,92,NA,3.9,113,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"King's Pirate, The",1967,100,NA,5.2,31,4.5,0,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"King's Ransom",2005,95,NA,2,217,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"King's Rhapsody",1955,93,NA,5.7,11,0,0,0,4.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,1,0 -"King's Story, A",1965,102,NA,5.8,6,0,0,0,14.5,0,14.5,0,0,0,64.5,"",0,0,0,0,1,0,0 -"King's Thief, The",1955,78,NA,5.8,67,4.5,0,0,14.5,24.5,34.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"King's Vacation, The",1933,61,NA,6,25,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"King, Queen, Knave",1972,94,NA,4.9,29,4.5,4.5,0,14.5,0,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"King-Size Canary",1947,8,NA,8.5,74,0,0,0,0,4.5,4.5,14.5,24.5,14.5,44.5,"",0,1,1,0,0,0,1 -"King: A Filmed Record... Montgomery to Memphis",1970,185,NA,6.6,45,0,0,4.5,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Kingdom of Heaven",2005,145,130000000,7,6498,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",1,0,0,1,0,0,0 -"Kingdom of the Spiders",1977,97,500000,5.4,484,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kingdom of the Vampire",1991,70,2500,6.6,7,24.5,0,0,14.5,0,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Kingfisher Caper, The",1975,90,NA,4,12,0,4.5,34.5,14.5,24.5,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Kingpin",1996,117,25000000,6.6,10643,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Kings",1998,17,NA,8,6,0,0,0,0,0,34.5,0,34.5,0,34.5,"",0,0,0,0,0,0,1 -"Kings Go Forth",1958,109,NA,6.4,156,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Kings Row",1942,127,NA,7.6,477,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Kings and Desperate Men: A Hostage Incident",1981,118,NA,4.6,24,14.5,14.5,4.5,0,0,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kings of the Sun",1963,108,NA,5.8,125,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kings of the Turf",1941,10,NA,5.1,14,0,14.5,0,4.5,34.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,1,0,1 -"Kingsajz",1988,105,NA,7.8,164,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kingukongu no gyakushu",1967,96,NA,4.3,127,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kingukongu tai Gojira",1962,91,NA,5.1,539,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Kini and Adams",1997,93,NA,6.7,12,0,0,0,4.5,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Kinjite: Forbidden Subjects",1989,97,NA,4.2,317,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kink in the Picasso, A",1990,90,NA,4.8,6,34.5,0,14.5,0,14.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Kinkanshoku",1975,155,NA,8.8,6,0,0,0,0,0,0,0,45.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Kinky Business",1985,85,NA,6.8,26,4.5,0,0,4.5,0,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Kinky Business II",1990,83,NA,5.2,9,14.5,14.5,0,0,24.5,14.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Kinky Coaches and the Pom Pom Pussycats, The",1981,91,2500000,1.9,16,14.5,44.5,4.5,4.5,4.5,0,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Kino im Kopf",1996,87,NA,8.8,5,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Kino-pravda",1925,30,NA,6.3,14,0,0,0,4.5,14.5,24.5,34.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Kinobilletten",1995,15,NA,6.7,31,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Kinpeibei",1969,90,NA,4.4,17,14.5,14.5,14.5,4.5,14.5,4.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Kinsey",2004,118,11000000,7.6,3225,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Kinski Paganini",1989,82,NA,5.7,111,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kipps",1941,82,NA,6.3,33,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Kippur",2000,125,NA,6.3,305,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kira kira hikaru",1992,103,NA,5.4,33,4.5,4.5,0,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Kiri-no-hata",1977,95,NA,7.6,16,0,0,0,0,0,14.5,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Kiriki, acrobates japonais, Les",1907,3,NA,4.6,6,14.5,0,0,0,0,0,14.5,0,64.5,0,"",0,0,1,0,0,0,1 -"Kirlian Witness, The",1981,91,NA,4.8,21,0,0,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Kirmes",1960,102,NA,8.9,12,0,0,0,0,0,0,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Kirschen in Nachbars Garten",1935,85,NA,3.5,12,14.5,0,0,14.5,0,14.5,14.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Kiru",1962,71,NA,7.7,21,0,0,0,0,0,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Kiru",1968,115,NA,6.8,49,0,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,34.5,"",1,0,1,1,0,0,0 -"Kis apokrif no. 2",2004,22,NA,6.8,6,0,0,0,0,0,14.5,34.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Kisangany Diary",1997,45,NA,8,5,0,0,24.5,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Kiseye Berendj",1996,80,NA,7,10,0,14.5,0,0,0,24.5,24.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Kishen Kanhaiya",1990,160,NA,7,18,0,0,0,0,24.5,14.5,34.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kismat",2004,143,NA,4.1,13,4.5,0,4.5,44.5,14.5,4.5,0,0,0,14.5,"",1,0,0,1,0,0,0 -"Kismet",1944,100,3000000,6.2,105,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kismet",1955,113,2692960,5.8,205,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Kismet",1999,100,NA,5.7,36,4.5,0,14.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kisna: The Warrior Poet",2005,170,NA,5.4,108,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Kispus",1956,105,NA,6.5,14,0,0,4.5,4.5,4.5,44.5,14.5,14.5,0,4.5,"",0,0,0,0,0,1,0 -"Kiss",1963,50,NA,6.1,21,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kiss & Tell",1996,96,1000000,5.7,68,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Kiss Before Dying, A",1956,94,NA,6.9,223,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kiss Before Dying, A",1991,94,NA,5.5,795,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kiss Before the Mirror, The",1933,67,NA,6.2,18,0,0,0,4.5,14.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kiss Daddy Goodbye",1981,92,NA,1.9,33,44.5,14.5,14.5,4.5,4.5,0,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Kiss Daddy Goodnight",1988,90,NA,4.4,141,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Kiss Her Goodbye",1959,94,NA,5.8,12,4.5,0,0,4.5,0,44.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Kiss Kiss... Bang Bang",1966,95,NA,4.2,7,0,24.5,0,0,14.5,14.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Kiss Me",2004,120,NA,7,23,14.5,0,4.5,4.5,0,4.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Kiss Me Again",1931,76,NA,3.8,5,0,24.5,24.5,0,24.5,24.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Kiss Me Cat",1953,7,NA,8,33,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Kiss Me Deadly",1955,104,NA,7.6,1836,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Kiss Me Goodbye",1982,101,NA,5.6,302,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kiss Me Kate",1953,109,NA,7.3,729,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Kiss Me Quick!",1964,70,NA,4.8,43,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Kiss Me, Guido",1997,86,NA,5.9,727,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Kiss Me, Stupid",1964,125,3500000,7,712,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kiss My Blood",1998,85,NA,5.5,16,4.5,14.5,0,0,4.5,14.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Kiss Them for Me",1957,105,NA,5.5,207,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Kiss Toledo Goodbye",1999,92,NA,4.4,174,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Kiss Tomorrow Goodbye",1950,102,NA,7,154,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kiss and Be Killed",1991,92,NA,6.2,5,24.5,0,24.5,0,0,0,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Kiss and Make Up",1934,78,NA,5.1,16,0,0,14.5,4.5,14.5,14.5,14.5,14.5,4.5,0,"",0,0,1,0,0,1,0 -"Kiss and Run",2002,88,NA,7,22,0,0,0,0,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Kiss and Tell",1945,90,NA,6.5,13,0,0,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Kiss for Cinderella, A",1925,105,NA,5.2,10,0,14.5,0,0,14.5,0,14.5,14.5,0,64.5,"",0,0,0,1,0,1,0 -"Kiss for Corliss, A",1949,88,NA,5.3,11,0,0,4.5,4.5,24.5,0,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kiss harggayo",1998,105,NA,5.4,23,0,0,4.5,14.5,24.5,34.5,4.5,4.5,4.5,0,"",0,0,0,1,0,1,0 -"Kiss in the Dark, A",1949,87,NA,5.3,24,0,0,0,24.5,24.5,24.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Kiss of Death",1947,98,NA,7.6,532,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kiss of Fire",1955,87,NA,5.3,19,4.5,0,0,24.5,24.5,4.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kiss of Her Flesh, The",1968,75,NA,4.9,16,14.5,0,4.5,14.5,4.5,24.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Kiss of Life",2003,100,NA,5.5,90,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kiss of a Stranger",1999,90,NA,4.4,78,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Kiss of the Dragon",2001,98,25000000,6.2,7887,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Kiss of the Spider Woman",1985,120,NA,7.2,2274,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kiss of the Tarantula",1976,85,200000,3.8,22,24.5,0,14.5,4.5,14.5,0,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kiss of the Vampire, The",1963,88,NA,6.1,192,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Kiss on the Nose, A",2004,13,25000,9.5,11,0,0,0,0,0,0,4.5,0,24.5,64.5,"",0,0,0,1,0,0,1 -"Kiss or Kill",1997,96,2000000,6.2,590,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Kiss the Blood Off My Hands",1948,79,1100000,5.9,58,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kiss the Boys Goodbye",1941,85,NA,5.7,6,0,0,0,0,45.5,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Kiss the Bride",2002,89,NA,5.5,140,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,1,0 -"Kiss the Girls",1997,111,27000000,6.4,9041,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Kiss the Girls Goodbye",1997,94,NA,5,11,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Kiss the Sky",1999,107,6000000,5.6,263,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,0,0,1,0 -"Kiss, The",1896,1,NA,6.1,173,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Kiss, The",1929,89,257000,6.3,90,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Kiss, The",1988,101,NA,4.7,274,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kiss, The",2003,90,NA,5.5,74,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Kiss, The",2004,25,6000,5.8,5,44.5,0,0,0,0,0,0,24.5,24.5,24.5,"PG-13",0,0,0,0,0,0,1 -"Kissan kuolema",1994,89,NA,4.9,74,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kissed",1996,78,NA,6.4,877,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Kisses and Caroms",2004,81,NA,5.6,41,4.5,0,0,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kisses for Breakfast",1941,82,NA,5.7,32,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Kisses for My President",1964,113,NA,4.8,45,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kissin' Cousins",1964,96,800000,4.3,262,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kissing Bandit, The",1948,100,NA,4.5,57,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kissing Jessica Stein",2001,97,1000000,7,4236,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Kissing Time",1933,23,NA,5.2,8,24.5,0,0,14.5,14.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Kissing a Dream",1996,91,NA,2.7,15,24.5,14.5,4.5,4.5,14.5,4.5,0,0,4.5,24.5,"R",0,0,0,0,0,0,0 -"Kissing a Fool",1998,93,NA,5.6,1579,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Kissing on the Mouth",2005,78,NA,6.6,16,0,4.5,4.5,0,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Kit",1970,76,NA,8.3,16,0,0,0,0,4.5,0,0,24.5,34.5,34.5,"",0,0,1,0,0,0,0 -"Kit Carson",1940,97,NA,6.1,34,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kit for Cat",1948,7,NA,7.1,64,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Kita no misaki",1976,113,NA,6.5,51,0,0,0,0,4.5,4.5,45.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kita no zeronen",2005,170,NA,6.9,7,0,0,0,14.5,0,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Kita-kitsune monogatari",1979,90,NA,6.4,32,14.5,0,0,0,4.5,0,0,14.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Kitayskiy serviz",1999,98,NA,4.9,21,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kitchen",1989,109,NA,4.1,20,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Kitchen Party",1997,92,NA,5.9,138,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kitchen Sink",1989,14,NA,7.5,100,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Kitchen Soup for the Soul",2004,1,NA,9.8,8,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,1,0,0,0,1 -"Kitchen Toto, The",1987,96,NA,6.2,49,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kitchen, The",1961,70,NA,6.8,7,0,0,0,0,0,44.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kite",1998,60,NA,6.5,322,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Kitosch, l'uomo che veniva dal sud",1969,95,NA,4.5,7,0,0,14.5,44.5,0,0,0,0,0,44.5,"",1,0,1,0,0,0,0 -"Kitrina gantia, Ta",1960,84,NA,8.4,49,0,4.5,0,0,0,4.5,4.5,14.5,34.5,34.5,"",0,0,1,0,0,0,0 -"Kitten with a Whip",1964,82,NA,5.1,203,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Kitty",1945,103,NA,6.8,68,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Kitty",2002,5,NA,6,17,0,0,0,0,24.5,14.5,4.5,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Kitty Foiled",1948,6,NA,7.6,42,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Kitty Foyle: The Natural History of a Woman",1940,108,NA,7.1,332,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kitty Kornered",1946,7,NA,7.3,45,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Kitty and the Bagman",1982,97,NA,4.7,10,0,0,14.5,24.5,34.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Kitty from Kansas City",1931,8,NA,6.2,18,0,0,4.5,14.5,24.5,14.5,14.5,34.5,4.5,0,"",0,1,0,0,0,0,1 -"Kitty und die Weltkonferenz",1939,97,NA,8.5,6,0,0,0,0,0,0,34.5,34.5,0,34.5,"",0,0,1,0,0,0,0 -"Kizu darake no tenshi",1997,118,NA,5.8,5,0,0,0,24.5,44.5,24.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Kizuna",1998,123,NA,6.9,10,0,14.5,0,14.5,24.5,14.5,14.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Kjell universell",2003,29,NA,6.3,11,4.5,4.5,4.5,0,24.5,0,0,0,14.5,24.5,"",0,0,1,0,0,0,1 -"Klaani - tarina Sammakoitten suvusta",1984,95,NA,7.1,68,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Kladivo na carodejnice",1969,103,NA,8.1,64,0,0,0,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Klamek ji bo Beko",1992,84,NA,7.8,8,14.5,0,0,0,0,14.5,14.5,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Klansman, The",1974,112,5000000,4.3,130,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Klasse von '99 - Schule war gestern, Leben ist jetzt, Die",2003,94,NA,6,91,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Klassen Feind",1983,125,NA,8.2,12,0,4.5,0,0,0,4.5,0,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Klassenfahrt",2002,82,NA,7.2,34,4.5,0,0,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Klassfesten",2002,103,NA,5.9,440,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Klassikko",2001,80,NA,6.7,209,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Klatka",2003,54,NA,6,10,0,0,14.5,0,14.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Klatwa doliny wezy",1988,106,NA,3.6,27,24.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Klavim Lo Novhim Beyarok",1996,92,NA,7.7,23,0,0,0,14.5,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Klearhos, I Marina kai o kodos, O",1961,89,NA,8.3,21,4.5,0,0,0,4.5,4.5,14.5,0,0,45.5,"",0,0,1,0,0,0,0 -"Kleene Punker, Der",1992,74,NA,5.3,29,4.5,0,4.5,24.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,1,1,1,0,0,0 -"Kleftroni kai gentleman",1986,84,NA,7.5,13,4.5,4.5,0,0,0,0,14.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Kleid, Das",1961,88,NA,8.3,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Klein Erna auf dem Jungfernstieg",1969,87,NA,3.1,12,44.5,14.5,14.5,0,4.5,4.5,0,0,4.5,0,"",0,0,1,0,0,0,0 -"Kleine Chaos, Das",1966,9,NA,6.4,53,4.5,0,4.5,0,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Kleine Freiheit",2003,102,NA,6.6,27,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kleine Godard an das Kuratorium junger deutscher Film, Der",1978,84,NA,6.5,6,34.5,14.5,0,0,0,0,14.5,34.5,0,0,"",0,0,0,0,1,0,0 -"Kleine Haie",1992,87,NA,7.6,415,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Kleine Jazzmusik, Eine",1996,70,NA,5,5,0,0,0,64.5,0,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Kleine Kreise",2001,85,NA,6.3,6,0,0,0,0,0,14.5,14.5,14.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Kleine Teun",1998,95,NA,6.5,184,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Kleine blonde dood, De",1993,95,NA,6.7,169,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kleines Arschloch",1997,82,NA,5.2,358,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Kleines Tropicana - Tropicanita",1997,108,NA,7.7,25,0,4.5,0,4.5,0,4.5,14.5,44.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Kleingeld",1999,15,NA,7.3,60,4.5,0,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Kleinhoff Hotel",1977,105,NA,4.2,14,4.5,0,14.5,34.5,4.5,24.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Kleinruppin Forever",2004,103,NA,6.8,82,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Klem in de draaideur",2003,90,NA,7,5,0,0,0,24.5,0,24.5,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Klepto",2003,81,NA,5.6,24,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Kleptomania",1995,90,NA,5.5,51,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,0,14.5,"R",1,0,0,1,0,0,0 -"Kleptomaniac, The",1905,8,NA,5.2,17,14.5,4.5,0,4.5,14.5,34.5,14.5,4.5,0,0,"",0,0,0,1,0,0,1 -"Klezmer on Fish Street",2004,85,NA,9.3,6,0,0,0,0,0,0,0,14.5,45.5,34.5,"",0,0,0,0,1,0,0 -"Klinik des Grauens",1991,15,NA,8.7,9,14.5,0,0,0,0,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Klinkevals",1999,95,NA,5.4,78,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Klippet",1982,97,NA,5,13,0,0,0,4.5,14.5,14.5,0,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Klironomoi, Oi",1964,80,NA,7.5,17,0,4.5,0,4.5,0,14.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kloden rokker",1978,89,NA,5.9,7,0,0,0,0,24.5,14.5,45.5,0,0,0,"",0,0,0,0,1,0,0 -"Kloge mand, Den",1956,98,NA,6,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Klondike Annie",1936,80,NA,6.6,56,0,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Klondike Fever",1980,119,NA,4.8,12,4.5,0,4.5,14.5,0,34.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Klondike Kid, The",1932,7,NA,7.4,29,0,0,0,4.5,4.5,14.5,24.5,44.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Klostret i Sendomir",1920,54,NA,7.1,27,0,0,4.5,0,4.5,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Klotsoskoufi, To",1960,88,NA,5.7,10,0,0,14.5,0,24.5,34.5,14.5,0,0,34.5,"",0,0,1,0,0,1,0 -"Klute",1971,114,NA,7,2293,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Klute in New York: A Background for Suspense",1971,8,NA,4.1,21,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Km. 0",2000,100,NA,7.7,354,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Knack, The",1965,84,364000,6.7,364,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Knafayim Shvurot",2002,84,NA,7.9,591,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Knallharte Jungs",2002,87,NA,4,434,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kneel Before Me",1983,77,NA,7.5,11,0,0,0,0,4.5,0,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Knick Knack",1989,4,NA,8.1,897,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Knickerbocker Holiday",1944,85,NA,4.1,23,4.5,4.5,0,24.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Knife of the Party, The",1934,20,NA,6,7,14.5,0,0,14.5,24.5,14.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"Knight Is Young, The",1938,18,NA,6,7,0,0,14.5,0,0,74.5,14.5,0,0,0,"",0,0,0,0,0,1,1 -"Knight Moves",1992,116,NA,5.7,1420,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Knight Without Armour",1937,107,NA,6.7,92,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Knight for a Day, A",1946,7,NA,7,53,4.5,0,0,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Knight's Tale, A",2001,132,41000000,6.5,15006,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Knight-Mare Hare",1955,7,NA,7.1,60,0,0,4.5,4.5,4.5,14.5,24.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Knightriders",1981,102,NA,5.9,602,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Knights Must Fall",1949,7,NA,7.1,31,0,0,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Knights and Emeralds",1986,94,NA,3.8,12,14.5,0,4.5,14.5,4.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Knights of the Range",1940,70,NA,5.7,5,0,0,0,0,24.5,24.5,0,64.5,0,0,"",0,0,0,0,0,0,0 -"Knights of the Round Table",1953,115,NA,6.1,389,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Knighty Knight Bugs",1958,6,NA,7.4,110,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Knit Your Own Karma",2001,10,NA,4.9,10,0,0,0,14.5,0,0,0,0,24.5,74.5,"",0,0,0,0,0,0,1 -"Kniven i hjertet",1981,90,NA,6.3,11,0,0,0,0,0,34.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Knock",1951,98,NA,7.7,34,0,0,0,4.5,4.5,14.5,4.5,14.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Knock Knock",1940,7,NA,7.8,15,0,0,0,4.5,4.5,4.5,4.5,44.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Knock Knock, I'm Looking to Marry",2003,100,NA,4.9,7,24.5,14.5,0,0,0,14.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Knock Off",1998,91,35000000,3.8,1947,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Knock on Any Door",1949,100,NA,6.5,324,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Knock on Wood",1954,103,NA,6.7,153,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Knock! Knock!",1985,62,NA,5.7,6,14.5,14.5,0,0,0,14.5,14.5,0,34.5,0,"",0,0,0,0,0,0,0 -"Knockaround Guys",2001,91,NA,5.9,3848,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,1,1,0,0,0 -"Knockin' On Heaven's Door",1997,87,NA,7.5,1959,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,1,1,0,0,0 -"Knocking On Heaven's Door",1994,89,NA,8.1,133,0,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Knocking on Death's Door",1999,95,NA,4.1,73,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Knockout",1941,73,NA,6.1,20,0,0,14.5,14.5,14.5,34.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Knockout",1999,103,NA,4.7,15,24.5,0,0,24.5,14.5,4.5,4.5,0,24.5,14.5,"R",0,0,0,0,0,0,0 -"Knockout, The",1914,27,NA,6,60,4.5,4.5,4.5,14.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Knots",2004,93,NA,7.5,42,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"R",0,0,1,0,0,0,0 -"Know Thy Wife",1918,13,NA,6.3,9,0,0,0,0,14.5,14.5,64.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Know Your Enemy: Japan",1945,63,NA,6.2,42,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Know Your Money",1940,20,NA,6.6,8,0,0,0,0,0,34.5,64.5,0,0,0,"",0,0,0,0,0,0,1 -"Know for Sure",1941,23,NA,4.2,10,14.5,14.5,14.5,34.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Knox und die lustigen Vagabunden",1935,70,NA,6.2,5,0,0,0,0,44.5,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Knuckleface Jones",1999,16,NA,6.3,30,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Knut Formos siste jakt",1973,100,NA,3.4,5,0,24.5,24.5,64.5,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Knute Rockne All American",1940,98,NA,6,221,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Knutsen & Ludvigsen",1974,86,NA,4.4,7,0,0,14.5,44.5,14.5,14.5,0,0,14.5,0,"",0,0,1,0,0,0,0 -"Knutzy Knights",1954,17,NA,6.7,26,4.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Ko dou gai bei",1997,98,NA,6.8,207,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Ko mne, Mukhtar!",1964,82,NA,6.8,23,0,4.5,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ko to tamo peva",1980,86,NA,8.1,664,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,1,0,0,0,0 -"Ko zaprem oci",1993,99,NA,6,34,14.5,0,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Ko zorijo jagode",1978,98,NA,6.5,12,0,0,0,0,14.5,14.5,34.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Ko-Ko's Earth Control",1928,6,NA,8.1,19,0,0,0,0,4.5,4.5,24.5,14.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Kochaj albo rzuc",1978,114,NA,6.6,49,4.5,4.5,4.5,0,0,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Kochankowie mojej mamy",1986,81,NA,6.8,15,0,4.5,0,0,14.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kochavim Shel Shlomi, Ha-",2003,94,NA,7,124,0,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Kochiyama soshun",1936,82,NA,8.1,6,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Kocken",2005,111,NA,4,10,14.5,0,14.5,24.5,24.5,24.5,0,0,14.5,14.5,"",0,0,1,1,0,0,0 -"Kod amidze Idriza",2004,94,NA,7,42,14.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Kodo: The Drummers of Japan",1996,58,NA,6.3,8,0,0,0,0,0,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Koeputkiaikuinen ja Simon enkelit",1979,87,NA,4.7,117,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Koffer des Herrn O.F., Die",1931,80,NA,8.3,11,0,0,0,0,4.5,4.5,4.5,44.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Koffie",2001,15,NA,4.8,16,0,4.5,0,24.5,0,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Kogda derevya byli bolshimi",1961,95,NA,7.7,24,0,0,0,0,4.5,24.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Kogda ya stanu velikanom",1978,87,NA,6.7,9,0,0,0,0,14.5,0,24.5,44.5,0,24.5,"",0,0,0,0,0,1,0 -"Kogel mogel",1989,105,NA,6.4,23,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kohav Ha'Kahol, Ha-",1995,86,100000,7.2,26,4.5,0,0,0,0,0,14.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Kohayagawa-ke no aki",1961,103,NA,8.1,157,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kohra",1964,153,NA,8,6,0,0,0,0,0,14.5,34.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Kohtalon kirja",2003,85,NA,3.5,199,24.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Koi Mere Dil Se Poochhe",2002,165,NA,6.1,16,14.5,14.5,0,0,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,1,0 -"Koi no mon",2004,114,NA,6.6,32,0,0,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Koi to hanabi to kanransha",1997,104,NA,3.8,14,24.5,0,0,0,0,24.5,24.5,14.5,0,24.5,"",0,0,0,1,0,1,0 -"Koi wa maiorita",1997,107,NA,8,6,0,0,14.5,0,0,0,0,34.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Koi... Mil Gaya",2003,171,NA,6.2,226,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Koibito tachi wa nureta",1973,76,NA,5.4,6,0,0,0,34.5,0,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Koinonia, ora miden",1966,110,NA,6.9,7,0,0,0,14.5,0,14.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Koirankynnen leikkaaja",2004,105,NA,6.8,214,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Koiya koi nasuna koi",1962,109,NA,6.2,18,0,4.5,0,0,4.5,14.5,34.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Kokken",2002,40,NA,4.2,7,0,24.5,14.5,14.5,14.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Kokkina fanaria, Ta",1963,132,NA,8.2,71,0,0,0,0,0,4.5,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Kokkuri-san",1997,87,NA,2.4,17,14.5,14.5,14.5,14.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Koko Flanel",1990,95,NA,5.7,310,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Koko ni irukoto",2001,115,NA,6.3,12,0,0,4.5,0,4.5,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,1,0 -"Koko, le gorille qui parle",1978,85,NA,6.8,6,0,0,0,14.5,0,14.5,34.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Kokoda Crescent",1989,83,NA,4.6,6,14.5,0,0,34.5,14.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Kokoro",1955,120,NA,6,9,0,0,0,0,34.5,14.5,24.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Koks i kulissen",1983,108,NA,5.4,18,0,0,0,14.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Koktebel'",2003,105,NA,7.5,119,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kol Mamzer Melech",1968,100,NA,5.5,7,0,14.5,0,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kolberg",1945,111,NA,4.9,97,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kolejnosc uczuc",1992,99,NA,6.2,21,0,4.5,4.5,4.5,4.5,14.5,14.5,0,44.5,4.5,"",0,0,1,1,0,1,0 -"Koli",2003,90,NA,7.1,5,0,0,0,0,0,44.5,0,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Kollega's maken de Brug, De",1988,96,NA,5.8,47,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kollektsioner",2001,100,NA,7.6,12,4.5,0,0,0,0,4.5,14.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Kolmastoista koputus",1945,80,NA,7.1,6,0,0,0,0,0,34.5,45.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Kolmiapila",1953,79,NA,4.2,6,0,0,0,34.5,14.5,14.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Kolobos",1999,82,NA,5,341,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Kolos",1993,91,NA,6.2,5,24.5,24.5,0,0,0,0,0,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Kolya",1996,105,NA,7.6,3729,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Kom tillbaka",2004,16,NA,9.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,1,0,0,1 -"Komal Gandhar",1961,134,NA,7.4,12,0,0,0,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Kombina",1982,119,NA,8,8,0,0,0,0,14.5,0,0,45.5,0,34.5,"",0,0,0,1,0,0,0 -"Komedia matrymonialna",1994,105,NA,5.8,7,0,14.5,0,0,14.5,24.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Komediant, The",2000,80,NA,7.5,15,0,0,0,0,4.5,0,24.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Komedie om geld",1936,89,NA,4.8,17,14.5,0,14.5,0,0,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Komediya o Lisistrate",1989,99,NA,5.8,8,34.5,0,0,0,14.5,0,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Komediya strogogo rezhima",1993,78,NA,7.4,21,4.5,0,4.5,0,0,4.5,24.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Komikku zasshi nanka iranai!",1986,120,NA,7.5,16,0,0,0,0,4.5,14.5,44.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Komisario Palmun erehdys",1960,103,NA,8.4,217,4.5,4.5,0,0,4.5,4.5,4.5,14.5,34.5,44.5,"",0,0,0,0,0,0,0 -"Komischer Heiliger, Ein",1979,83,NA,4.8,7,0,0,0,14.5,14.5,0,45.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Komissa tis Kerkyras, I",1972,83,NA,3.9,11,0,14.5,4.5,0,34.5,0,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Komissa tis fabrikas, I",1969,88,NA,7.7,8,0,0,0,0,14.5,14.5,0,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Komissar",1967,110,NA,7.6,128,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Komm, liebe Maid und mache",1969,90,NA,4.4,7,14.5,0,14.5,0,24.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Kommando Leopard",1985,100,NA,4.1,45,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Kommando Sinai",1968,105,NA,6.3,11,4.5,0,0,0,4.5,4.5,0,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Kommissar X - Drei gelbe Katzen",1966,95,NA,5.3,6,0,0,0,14.5,34.5,14.5,34.5,0,0,0,"",1,0,0,0,0,0,0 -"Kommissar X - Drei goldene Schlangen",1969,85,NA,3.5,9,0,24.5,14.5,44.5,14.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Kommissar X - In den Klauen des goldenen Drachen",1966,88,NA,4.7,7,24.5,0,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Kommissar X - Jagd auf Unbekannt",1966,92,NA,6,7,0,0,0,0,44.5,0,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Kommissar X jagt die roten Tiger",1971,89,NA,4,5,0,24.5,0,24.5,24.5,24.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Kommunist",1958,115,NA,9.7,9,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,0,0,0,0 -"Komodo",1999,89,NA,3.5,684,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Kompars, al-",1993,100,NA,7.7,7,0,0,0,14.5,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Komposition in Blau",1935,4,NA,8.5,44,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Komrades",2003,64,NA,7.3,9,0,14.5,0,0,0,0,24.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Komser Sekspir",2001,113,NA,5.5,131,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Komst van Joachim Stiller, De",1976,120,NA,7.1,15,0,0,24.5,0,0,14.5,34.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Komtessen",1961,100,NA,6.5,10,0,0,0,14.5,14.5,44.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Kon-Tiki",1950,68,NA,7.3,125,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Kona Coast",1968,93,NA,4.6,21,14.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Koncert zyczen",1967,16,NA,4.6,64,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Konchu daisenso",1968,84,NA,4.6,7,44.5,14.5,0,0,0,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Kondom des Grauens",1996,107,NA,5.2,583,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Konec srpna v Hotelu Ozon",1967,77,NA,7.6,13,4.5,4.5,0,4.5,0,0,34.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Konec starych casu",1989,97,NA,7.1,52,0,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Koneko monogatari",1986,76,NA,6.8,924,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Konets Sankt-Peterburga",1927,80,NA,7.7,119,0,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Konets operatsii 'Rezident'",1986,145,NA,5.9,6,0,0,14.5,0,14.5,45.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Konets vechnosti",1987,137,NA,8,5,0,0,24.5,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Kong bu ji",1997,87,NA,6.9,34,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kong que",2005,136,NA,7.5,116,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Kong shan ling yu",1979,120,NA,7.6,30,0,0,0,4.5,4.5,0,24.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Kong woo giu gap",2000,111,NA,7.2,71,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Konga",1961,90,500000,3.1,122,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Kongbu fenzi",1986,109,NA,7,87,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kongekabale",2004,103,NA,7.7,436,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Kongo",1932,86,NA,7,90,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Koniec nocy",1957,90,NA,6.4,10,0,0,0,14.5,24.5,24.5,14.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Konjanik",2003,105,NA,7.6,20,14.5,14.5,4.5,0,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Konjiki yasha",1953,95,NA,5.4,8,0,0,0,0,14.5,24.5,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Konkurs",1963,47,NA,8.5,34,0,0,0,0,4.5,4.5,4.5,45.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kono Mado wa Kimi no Mono",1994,95,NA,5.5,15,24.5,0,0,14.5,0,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Kono ko wo nokoshite",1983,128,NA,6,8,14.5,0,0,0,0,74.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Kono yo no sotoe - Club Shinchugun",2004,123,NA,6.9,29,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Konoko no nanatsu no oiwai ni",1982,111,NA,5,7,0,24.5,24.5,0,0,14.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Konopielka",1982,92,NA,8.4,34,0,0,0,0,0,0,24.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Konsequenz, Die",1977,100,NA,7.5,70,0,4.5,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Konsten att flagga",2001,10,NA,2.3,7,44.5,0,24.5,0,0,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Konsul",1989,104,NA,7.2,11,0,0,0,0,0,4.5,64.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Kontakt",1956,97,NA,6.2,8,24.5,0,0,0,0,34.5,14.5,0,0,24.5,"",0,0,0,1,1,0,0 -"Kontaktannoncen",2002,3,NA,6.3,10,0,0,0,0,0,44.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Kontesa Dora",1993,117,NA,2.9,16,24.5,0,0,4.5,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Konto separato",1997,110,NA,5.6,10,0,0,0,34.5,0,24.5,34.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Kontorstid",2003,106,NA,3.7,51,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kontrakt",1980,110,NA,6.8,31,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kontroll",2003,107,500000,7.8,1174,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"R",0,0,0,0,0,0,0 -"Kontserto gia polyvola",1967,109,NA,6.6,9,0,0,0,34.5,0,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Konyok-gorbunok",1947,54,NA,9.7,10,0,0,0,0,0,0,0,14.5,14.5,84.5,"",0,1,0,0,0,0,0 -"Koo tae song loke",1994,103,NA,8,6,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Kook's Tour",1970,53,NA,4.6,26,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kopaszkutya",1981,85,NA,6.7,15,0,0,0,0,4.5,4.5,14.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Kopeyka",2002,100,NA,5.2,33,14.5,0,0,14.5,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Kopf des Mohren, Der",1995,120,NA,7.2,28,4.5,0,4.5,0,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Kopfleuchten",1998,90,NA,6.3,16,0,0,14.5,0,4.5,0,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Kopisten",1999,20,NA,2.1,56,64.5,4.5,0,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,1 -"Kopps",2003,90,NA,6.7,2448,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,1,0,0,0,0 -"Kopytem sem, kopytem tam",1988,133,NA,7.5,33,4.5,0,4.5,4.5,4.5,4.5,4.5,44.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Kora Terry",1940,110,NA,4.3,60,34.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Korczak",1990,115,NA,7.1,108,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kordon",2002,87,NA,6.8,29,4.5,4.5,4.5,0,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Korea",1995,87,500000,6.2,32,4.5,4.5,0,0,4.5,0,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Kori mou i sosialistria, I",1966,94,NA,6.8,27,0,4.5,0,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kori tou iliou, I",1971,92,NA,4.8,6,34.5,0,0,0,14.5,14.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Koridorius",1994,85,NA,4.4,26,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Koritsi me ta mavra, To",1956,94,NA,7.4,78,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Koritsi me tis valitses, To",1993,127,NA,6.1,19,4.5,0,4.5,24.5,0,14.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Koritsi tou louna park, To",1968,92,NA,4.6,14,4.5,4.5,14.5,24.5,34.5,0,4.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Koritsi vomva, To",1976,90,NA,1.9,7,45.5,14.5,0,0,0,0,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Koritsia gia filima",1965,109,NA,7,14,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,0,"",0,0,1,0,0,1,0 -"Koritsia ston ilio",1968,80,NA,6.7,18,0,0,0,0,4.5,24.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Koroidaki tis despoinidos, To",1960,67,NA,7.8,25,0,0,0,0,0,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Koroido gabre",1962,82,NA,8.1,7,0,0,14.5,14.5,0,0,24.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Korol Lir",1969,139,NA,8.4,112,0,4.5,0,0,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Korol-olen",1969,77,NA,6.5,13,0,0,0,0,0,24.5,4.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Koroleva benzokolonki",1963,78,NA,6.9,10,0,0,0,0,0,24.5,24.5,24.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Korona Rossiyskoy imperii, ili snova neulovimyye",1971,134,NA,6,35,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Koroshi",2000,86,NA,6.1,15,4.5,4.5,0,4.5,24.5,14.5,14.5,4.5,24.5,0,"",0,0,0,1,0,0,0 -"Koroshi no rakuin",1967,91,NA,7.2,697,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Koroshiya 1",2001,129,NA,7.1,3599,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Korotkiye vstrechi",1967,96,NA,8.5,56,0,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Korova",1989,10,NA,6.8,25,14.5,0,0,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Korpinpolska",1980,79,NA,4.9,7,14.5,0,0,24.5,0,0,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Korps Mariniers, Het",1965,23,NA,3.1,12,4.5,4.5,4.5,4.5,14.5,14.5,0,4.5,0,24.5,"",0,0,0,0,1,0,1 -"Korridoren",1968,79,NA,6.4,14,4.5,4.5,0,14.5,14.5,14.5,34.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Kort Amerikaans",1979,97,NA,4.2,34,4.5,4.5,4.5,4.5,4.5,44.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Kort en lang, En",2001,100,NA,6.1,517,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Korte sommer, Den",1976,96,NA,5.3,6,0,14.5,0,34.5,0,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Kosh ba kosh",1993,90,NA,6.5,23,0,4.5,4.5,4.5,0,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kosher",2002,5,NA,8,5,24.5,0,0,0,0,24.5,0,24.5,44.5,0,"",0,0,1,0,0,0,1 -"Koshikei",1968,117,NA,8,66,4.5,0,4.5,4.5,4.5,4.5,4.5,34.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Koshish",1972,125,NA,8.7,28,0,0,0,0,0,4.5,4.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Koskenlaskijan morsian",1937,83,NA,8.7,9,0,0,0,0,14.5,24.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Kosmetikkrevolusjonen",1977,80,NA,3.7,11,0,14.5,34.5,4.5,14.5,4.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Kosmonaut",2001,18,NA,5.9,8,14.5,0,0,0,0,14.5,0,24.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Kostas",1979,89,NA,5.5,12,0,4.5,0,14.5,0,14.5,44.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Kostnice",1970,10,NA,6.4,39,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,1,0,0,1,0,1 -"Kosumosu",1997,103,NA,4.6,20,14.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kotbia, El",2002,102,NA,6.3,11,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kotch",1971,113,NA,6.5,181,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Koto",1963,107,NA,6.4,7,0,0,0,0,0,24.5,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Koto",1980,125,NA,7.2,7,0,0,0,14.5,0,0,44.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Kotsos kai oi exoghinoi, O",1980,101,NA,8.2,9,0,14.5,14.5,0,0,0,0,0,14.5,64.5,"",0,0,1,0,0,0,0 -"Kotsos stin EOK, O",1980,99,NA,8.5,6,0,0,0,14.5,0,0,14.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Kotyonok",1996,80,NA,6.3,13,0,0,0,0,0,14.5,24.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Koudak va sarbaz",2000,90,NA,6.5,6,0,0,0,14.5,0,14.5,0,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Kounterfeit",1996,90,NA,4.7,75,14.5,14.5,14.5,14.5,4.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kour",1991,89,NA,7.8,79,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Kourastika na skotono tous agapitikous sou",2002,105,NA,6.1,15,0,4.5,4.5,24.5,4.5,14.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Kourelia tragoudane akoma, Ta",1979,123,NA,5.7,54,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Kovat miehet",1999,19,NA,7.1,29,0,0,0,4.5,14.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,1 -"Kowagaru hitobito",1994,118,NA,6.9,11,4.5,0,0,0,0,0,4.5,44.5,0,34.5,"",0,0,0,0,0,0,0 -"Koyaanisqatsi",1983,87,NA,7.9,4928,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Kozara",1963,124,NA,8.3,31,0,0,0,0,0,4.5,14.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Kozijat rog",1972,100,NA,8.2,147,0,0,0,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Kozijat rog",1994,88,NA,7.1,23,4.5,0,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Kozure satsujin ken",1976,89,NA,6.4,27,4.5,0,0,14.5,4.5,14.5,24.5,24.5,0,14.5,"",1,0,0,0,0,0,0 -"Kracht",1990,100,NA,6.3,15,0,0,4.5,4.5,14.5,4.5,4.5,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Kradetzat na praskovi",1964,105,NA,9.2,32,0,0,0,0,0,0,4.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Krai Thong",2001,92,NA,3.5,15,24.5,24.5,0,4.5,24.5,0,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Kraj rata",1984,93,NA,6.3,6,0,0,0,14.5,14.5,14.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Krajinka",2000,111,NA,7.1,85,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Krajobraz po bitwie",1970,105,NA,8,72,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Krakatit",1947,110,NA,7.1,15,0,0,0,24.5,0,14.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Krakatoa, East of Java",1969,131,NA,5,196,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kral Ubu",1996,88,NA,6.2,35,14.5,0,0,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Kraljevski voz",1981,91,NA,6.4,8,0,0,0,0,14.5,24.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Kraljica noci",2001,95,NA,6.3,18,24.5,4.5,4.5,0,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Krama mig!",2005,86,NA,5.3,9,14.5,0,14.5,0,24.5,34.5,24.5,0,0,0,"",0,0,1,1,0,1,0 -"Kramer vs. Kramer",1979,105,NA,7.5,7587,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kranti",1981,187,NA,7.9,34,0,4.5,0,0,4.5,14.5,24.5,24.5,24.5,4.5,"",1,0,0,1,0,0,0 -"Krantiveer",1994,159,NA,5.4,22,4.5,0,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Krasnaya palatka",1971,121,10000000,5.9,202,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Krasnye kolokola II",1982,139,NA,6.4,11,0,14.5,0,0,4.5,0,0,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Krasnye kolokola, film pervyy - Meksika v ogne",1982,135,NA,3.8,17,0,14.5,14.5,14.5,0,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Krasue",2002,105,NA,7.7,14,0,24.5,14.5,4.5,0,4.5,0,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kratka",1996,50,NA,5.7,6,0,14.5,0,0,14.5,14.5,0,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Krav Al HaVa'ad, Ha-",1986,90,NA,6,7,0,0,0,24.5,14.5,0,44.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Krava",1994,86,NA,7,61,4.5,0,0,0,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Krays, The",1990,119,NA,6.4,793,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Krazy Kat and Ignatz Mouse at the Circus",1916,3,NA,4.7,28,14.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Krazy Kat, Bugologist",1916,3,NA,4.9,19,14.5,4.5,0,4.5,24.5,14.5,24.5,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Kreise",1933,3,NA,7.8,16,0,4.5,0,4.5,0,14.5,14.5,14.5,34.5,4.5,"",0,1,0,0,0,0,1 -"Kreivi",1971,92,NA,5.5,17,4.5,0,14.5,14.5,14.5,0,14.5,4.5,4.5,24.5,"",0,0,1,1,1,0,0 -"Kremlin Letter, The",1970,120,NA,5.7,220,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Krestonosets",1995,120,NA,4.5,8,0,0,14.5,24.5,14.5,24.5,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Kreytserova sonata",1987,158,NA,8.1,23,0,0,0,0,0,4.5,0,14.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Krieg und Frieden",1982,120,NA,7,16,0,0,0,4.5,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Krieger und die Kaiserin, Der",2000,135,NA,7.5,4375,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,1,0 -"Kriegerin des Lichts",2001,91,NA,6.9,8,0,0,0,0,14.5,24.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Kriegsbilder",1996,93,NA,3.7,9,14.5,0,14.5,14.5,14.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Krigerens hjerte",1992,101,NA,4.9,23,14.5,4.5,4.5,14.5,0,4.5,4.5,14.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Krima to boi sou",1970,84,NA,7,5,0,0,0,24.5,0,24.5,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Kriminal",1966,98,NA,3.8,10,14.5,14.5,14.5,0,24.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Kriminaltango",1960,88,NA,5.1,14,0,4.5,4.5,0,24.5,4.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Krippendorf's Tribe",1998,94,NA,4.6,1451,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Kris",1946,93,NA,6.2,58,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kristallines Nichtes",1992,138,NA,6.2,13,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Kristin Lavransdatter",1995,187,NA,4.7,260,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kristin kommenderar",1946,96,NA,4.9,24,24.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kristoffers hus",1979,98,NA,3.9,16,24.5,0,14.5,4.5,14.5,4.5,4.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Kristove roky",1967,95,NA,6,10,0,0,14.5,14.5,0,14.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Krocodylus",2000,84,NA,3,428,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Krodh",1990,152,NA,7.8,5,24.5,0,0,0,0,0,0,24.5,0,64.5,"",1,0,0,0,0,0,0 -"Krodhi",1981,159,NA,8,20,0,4.5,0,0,0,0,24.5,44.5,24.5,4.5,"",1,0,0,0,0,0,0 -"Kroko",2003,95,NA,7.1,57,4.5,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Krokodil Gena",1971,20,NA,7.7,34,0,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,1,0,0,0,0,1 -"Krokus: As Long as We Live",2004,82,200000,7.3,7,0,0,0,0,0,14.5,24.5,44.5,14.5,0,"",0,0,0,0,1,0,0 -"Kroll",1991,101,NA,6.5,61,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Kroniki domowe",1997,85,NA,4.6,17,14.5,0,0,4.5,4.5,0,4.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Kroniske Uskyld, Den",1985,97,NA,5.4,86,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Kronos",1957,78,160000,5.4,250,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Kronprinsen",1979,95,NA,6.4,24,24.5,4.5,4.5,4.5,4.5,0,14.5,4.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Kronprinz Rudolfs letzte Liebe",1956,99,NA,4,11,4.5,4.5,4.5,0,44.5,4.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Kronvittnet",1989,107,NA,5.3,41,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Krooli",2004,26,NA,5.6,9,0,0,0,0,34.5,34.5,24.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Kroppen min",2002,26,NA,6.6,39,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Krouaziera sti Rodo",1960,80,NA,6.2,9,0,0,0,0,14.5,74.5,0,0,14.5,0,"",0,0,1,0,0,0,0 -"Krpelj",1985,11,NA,4.6,21,0,0,0,74.5,4.5,14.5,0,0,4.5,0,"",0,0,0,0,1,0,1 -"Krtek a jezek",1970,9,NA,6.7,10,0,0,0,14.5,14.5,14.5,14.5,14.5,0,45.5,"",0,1,0,0,0,0,1 -"Krtek a karneval",1976,6,NA,7.4,12,0,0,0,0,4.5,14.5,0,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Krtek a koberec",1975,6,NA,8.6,9,0,0,0,0,14.5,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Krtek a metro",1997,5,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,1,0,0,0,0,1 -"Krtek a muzika",1974,6,NA,7.2,10,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Krtek a telefon",1974,8,NA,7.2,10,0,0,0,14.5,14.5,14.5,0,24.5,0,45.5,"",0,1,0,0,0,0,1 -"Krtek a televizor",1970,6,NA,8.7,7,0,0,0,0,0,14.5,0,24.5,0,45.5,"",0,1,0,0,0,0,1 -"Krtek a tranzistor",1968,9,NA,6.9,15,0,0,0,0,24.5,0,4.5,14.5,24.5,34.5,"",0,1,0,0,0,0,1 -"Krtek a vejce",1975,6,NA,6.8,12,0,0,0,0,24.5,4.5,0,4.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Krtek chemikem",1974,6,NA,7.9,7,0,0,0,0,0,44.5,0,14.5,0,44.5,"",0,1,0,0,0,0,1 -"Krtek fotografem",1975,6,NA,7.4,13,0,0,0,0,4.5,4.5,4.5,4.5,34.5,34.5,"",0,1,0,0,0,0,1 -"Krtek v Zoo",1969,7,NA,7.3,7,0,0,0,0,14.5,14.5,14.5,14.5,0,44.5,"",0,1,0,0,0,0,1 -"Krtek ve meste",1982,29,NA,8.5,20,0,0,0,0,0,14.5,0,14.5,4.5,74.5,"",0,1,0,0,0,0,1 -"Krtek ve snu",1984,29,NA,8.1,8,0,0,0,0,0,14.5,14.5,24.5,0,45.5,"",0,0,0,0,0,0,0 -"Krtiny",1981,76,NA,5.6,6,14.5,0,0,0,0,45.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Krug vtoroy",1990,92,NA,7.6,43,4.5,0,4.5,4.5,0,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Krugerandy",1999,100,NA,5.4,7,0,14.5,0,0,24.5,24.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Kruh in mleko",2001,68,NA,6.9,118,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kruimeltje",1999,119,5000000,6.7,224,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Krull",1983,117,NA,5.5,3081,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Krummerne",1991,85,NA,4.9,86,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Krummerne 2: Stakkels Krumme",1992,97,NA,4.3,61,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Krumped",2004,24,NA,8.9,9,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,1,0,1 -"Krush Groove",1985,97,3000000,5.5,253,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Krvavi put",1955,95,NA,6.4,12,0,0,0,4.5,34.5,4.5,0,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Krvavy Hugo",1997,6,NA,3.7,9,24.5,0,0,0,14.5,0,14.5,14.5,44.5,0,"",0,0,0,0,0,0,1 -"Krylya",1966,90,NA,9.6,11,0,0,0,0,4.5,0,0,0,4.5,84.5,"",0,0,0,1,0,0,0 -"Krypskyttere",1982,79,NA,3.6,9,0,34.5,0,24.5,24.5,24.5,0,0,0,0,"",1,0,0,1,0,0,0 -"Krysar",1985,65,NA,8.1,39,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,0,0,0,0,0 -"Krystalbarnet",1996,100,NA,4.1,7,14.5,24.5,14.5,14.5,24.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Krzyk",1983,92,NA,6.4,6,0,0,0,0,34.5,34.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Krzysztof Kieslowski: I'm So-So...",1995,56,NA,7.1,62,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Krzyzacy",1960,166,NA,5.6,114,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kshana Kshanam",1991,158,NA,8.6,24,4.5,0,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Kshatriya",1993,187,NA,6.1,19,0,14.5,0,4.5,14.5,0,24.5,14.5,0,34.5,"",1,0,0,1,0,0,0 -"Ktipokardia sto thranio",1963,114,NA,7.7,28,0,4.5,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Kto, yesli ne my",1998,89,NA,6.4,14,4.5,0,0,0,4.5,34.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Ku qi de sha shou",2000,97,NA,5.5,6,0,0,0,14.5,45.5,0,34.5,0,0,0,"",0,0,0,0,1,0,0 -"Kuang qing sha shou",1995,83,NA,4.9,13,4.5,4.5,4.5,4.5,34.5,4.5,4.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Kuang ye sheng si lian",1995,103,NA,6,10,24.5,0,14.5,0,14.5,24.5,14.5,34.5,0,0,"PG-13",0,0,0,0,0,0,0 -"Kuarup",1989,119,NA,4.4,21,4.5,14.5,4.5,24.5,0,0,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kubanisch rauchen",1999,88,NA,6.3,17,14.5,0,0,0,4.5,24.5,14.5,0,4.5,24.5,"",0,0,1,1,0,0,0 -"Kubanskiye kazaki",1949,104,NA,7.1,15,14.5,0,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Kuch Khatti Kuch Meethi",2001,120,NA,5.7,25,0,4.5,4.5,14.5,24.5,24.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Kuch Kuch Hota Hai",1998,177,NA,7.3,652,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Kuche v chekmedzhe",1982,80,NA,7.7,17,0,4.5,0,0,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Kuchizuke",1957,74,NA,8.1,8,0,0,0,14.5,0,0,14.5,24.5,34.5,14.5,"",0,0,0,1,0,1,0 -"Kudrat",1981,164,NA,8.4,7,0,0,0,0,0,14.5,0,24.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Kudzu",1976,16,NA,7.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,0,1,0,1 -"Kuen gik",1971,111,NA,6.6,12,0,0,14.5,0,4.5,4.5,0,34.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Kuen pra chan tem doueng",2002,112,NA,7.2,8,0,0,0,0,0,34.5,0,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kuen rai ngao",2003,96,NA,5.5,29,4.5,4.5,0,4.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Kuet chin chi gam ji din",2000,106,NA,6,264,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Kuffs",1992,102,NA,5.2,1850,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Kujira tori",2001,16,NA,7.1,26,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,0,64.5,"",0,1,0,0,0,0,1 -"Kuka on Joe Louis?",1992,79,NA,5.9,9,0,0,0,14.5,44.5,0,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Kukkia ja sidontaa",2004,114,NA,5.6,40,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Kukla s millionami",1928,69,NA,8,5,0,0,0,0,0,0,0,84.5,24.5,0,"",0,0,0,0,0,0,0 -"Kukolka",1988,135,NA,7.1,10,0,0,0,0,14.5,14.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Kukushka",2002,105,NA,7.9,1043,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Kulay dugo ang gabi",1966,88,NA,5.3,22,14.5,4.5,0,0,14.5,4.5,14.5,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Kulkuri ja joutsen",1999,117,NA,6.8,167,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Kulkurin valssi",1941,104,NA,7.4,32,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Kull the Conqueror",1997,95,NA,4.4,1268,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Kulla-Gulla",1956,101,NA,5.1,5,0,0,0,24.5,0,44.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Kultamitalivaimo",1947,73,NA,3.4,12,0,14.5,14.5,14.5,14.5,4.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Kummatty",1979,90,NA,6.3,7,14.5,0,0,0,0,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Kummeli kultakuume",1997,96,NA,6.4,442,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Kumo no hitomi",1998,83,NA,7.1,28,4.5,0,0,0,14.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Kumokiri nizaemon",1978,163,NA,7.1,9,0,0,0,14.5,0,14.5,24.5,24.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Kun Hunttalan Matti Suomen osti",1984,94,NA,5,17,0,4.5,4.5,14.5,34.5,0,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kun en pige",1995,170,NA,5.4,50,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kundas",2003,15,NA,5.9,6,0,34.5,0,14.5,0,0,14.5,34.5,0,0,"",0,0,0,1,0,0,1 -"Kundun",1997,128,28000000,7.1,4306,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Kung Fu Genius",1969,91,NA,4.6,16,4.5,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kung Fu Kenobi's Big Adventure",1999,7,NA,5.9,61,4.5,4.5,0,4.5,14.5,4.5,4.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Kung Fu Rascals",1992,101,NA,2.4,27,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Kung Fu: Monkey, Horse, Tiger",1980,88,NA,9,6,14.5,0,0,0,14.5,0,14.5,0,14.5,34.5,"",1,0,0,1,0,0,0 -"Kung Konrad",2004,30,NA,8.3,12,0,0,0,4.5,0,4.5,4.5,24.5,0,45.5,"",0,0,1,1,0,1,1 -"Kung Pao Chicken",1997,5,NA,4.5,32,14.5,0,4.5,0,4.5,14.5,0,4.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Kung Phooey!",2003,87,NA,4.1,85,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Kung Pow: Enter the Fist",2002,82,10000000,5.1,5871,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"PG-13",1,0,1,0,0,0,0 -"Kung ako na lang sana",2003,115,NA,6.9,10,0,0,0,0,0,24.5,24.5,24.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Kung fu 2003",2003,15,NA,9,6,0,0,0,0,14.5,0,0,0,14.5,64.5,"",0,0,0,0,1,0,1 -"Kung zhung hua yuan",2002,71,NA,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Kung-Fu",1979,105,NA,6.7,12,0,0,0,4.5,0,14.5,4.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Kung-Fu Kitties",2004,9,NA,8,5,0,0,0,0,0,24.5,0,64.5,0,24.5,"",0,1,1,0,0,0,1 -"Kung-Fu master",1987,80,NA,6.5,87,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kungliga Johansson",1934,86,NA,7.1,5,0,24.5,0,0,64.5,0,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Kungliga patrasket",1945,117,NA,7.1,23,0,0,0,0,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kungsgatan",1943,96,NA,4.8,7,14.5,0,14.5,14.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Kungsleden",1964,106,NA,3.8,10,14.5,14.5,0,14.5,0,0,0,44.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Kuningas Hidas",2000,60,NA,5.6,14,0,0,14.5,4.5,24.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Kunst en Vliegwerk",1989,112,NA,5,8,14.5,0,0,24.5,0,0,45.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Kuollut mies rakastuu",1942,91,NA,6.5,7,0,0,0,24.5,14.5,0,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Kuollut mies vihastuu",1944,95,NA,7.4,8,0,0,0,34.5,0,0,34.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Kupi mi Eliota",1998,100,NA,5.7,17,34.5,0,4.5,4.5,0,14.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Kuproquo",1999,13,NA,6.6,18,0,0,0,0,14.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Kure melancholik",1999,117,NA,6,39,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Kureji no daiboken",1965,107,NA,8.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Kurenai no buta",1992,94,NA,7.9,2056,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"PG",0,1,1,0,0,1,0 -"Kurenai no nagareboshi",1967,97,NA,7.4,14,0,0,0,4.5,0,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kureopatora",1970,112,NA,9.4,7,14.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,1,1,1,0,1,0 -"Kurier des Zaren, Der",1970,94,NA,6.7,13,0,0,0,0,14.5,34.5,4.5,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Kurische Nehrung",2001,92,NA,6.4,8,0,0,14.5,0,14.5,24.5,0,34.5,14.5,0,"",0,0,0,0,1,0,0 -"Kuriton sukupolvi",1957,94,NA,6.3,24,0,0,0,4.5,4.5,4.5,44.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Kuro bara no yakata",1969,90,NA,6.5,27,0,0,0,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Kuro no tenshi Vol. 2",1999,105,NA,6.8,50,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Kuro no tesuto kaa",1962,95,NA,6.8,12,0,0,0,14.5,4.5,0,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kurochka Ryaba",1994,117,NA,6.2,59,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Kuroe",2001,128,NA,6.4,17,0,0,0,14.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Kuroi ame",1989,123,NA,8.1,273,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Kuroi ie",1999,95,NA,6.7,20,0,4.5,14.5,0,14.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kuroi junin no onna",1961,103,NA,6.7,13,0,0,0,0,4.5,34.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Kurosawa",2001,100,NA,7.7,131,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Kurosufaia",2000,115,NA,6.7,107,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Kurotokage",1968,86,NA,7.1,86,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Kurt & Courtney",1998,95,NA,6.2,1009,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,1,0,0 -"Kurt Gerrons Karussell",1999,70,NA,5.7,14,0,0,0,4.5,24.5,4.5,4.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Kurt og Valde",1983,96,NA,5.3,8,0,14.5,0,0,24.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Kuruizaki sanda rodo",1980,95,NA,3,15,0,14.5,0,4.5,14.5,24.5,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Kurutta Butokai",1988,60,NA,7,12,0,0,0,0,4.5,44.5,4.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Kurutta Ippeji",1926,60,NA,7.9,86,0,4.5,4.5,4.5,4.5,0,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Kurve, Die",2003,40,NA,6.5,11,0,0,0,4.5,14.5,14.5,14.5,4.5,0,24.5,"",0,0,1,1,0,0,1 -"Kuryer",1987,90,NA,8.2,88,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Kurz und schmerzlos",1998,100,NA,7.9,382,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Kusa-meikyu",1983,50,NA,8.6,9,14.5,0,0,0,0,14.5,0,34.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Kuscheldoktor",2001,20,NA,7.8,9,14.5,0,0,0,14.5,0,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Kustom Kar Kommandos",1965,3,NA,6.6,106,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Kutaci",1976,7,NA,5,8,0,0,0,0,64.5,0,0,0,0,34.5,"",0,1,0,0,0,0,1 -"Kuu on vaarallinen",1962,84,NA,6.8,5,0,0,0,0,44.5,24.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Kuutamolla",2002,119,NA,6.1,438,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Kuzis stari moj",1973,94,NA,7,6,0,0,0,0,14.5,0,64.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Kuzz",2000,64,NA,7.5,18,0,14.5,0,0,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Kvalim",1992,90,NA,4.7,31,4.5,0,0,0,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Kvar",1978,91,NA,6.4,7,0,0,0,0,14.5,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Kvarteret korpen",1963,101,NA,8.1,168,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Kvartett",2001,90,NA,9,7,0,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Kvindesind",1980,73,NA,3.4,8,14.5,14.5,34.5,0,0,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Kvinna i vitt",1949,87,NA,5.3,6,0,0,14.5,0,64.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Kvinna ombord, En",1941,84,NA,6,13,0,0,4.5,14.5,4.5,34.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Kvinna utan ansikte",1947,102,NA,8.5,11,0,0,0,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Kvinnas ansikte, En",1938,100,NA,7.1,66,0,4.5,0,4.5,4.5,14.5,14.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Kvinnen i mitt liv",2003,93,NA,5.7,178,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Kwai tsan tseh",1984,100,NA,6.7,685,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Kwik Stop",2001,110,NA,6.6,40,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Kya Yehi Pyaar Hai",2002,145,NA,5.8,11,0,24.5,0,0,14.5,14.5,4.5,0,24.5,0,"",0,0,1,0,0,1,0 -"Kyabare",1986,104,NA,4.7,6,0,14.5,0,14.5,14.5,0,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Kyanq",1993,7,NA,4.3,5,0,0,24.5,24.5,24.5,0,0,0,0,44.5,"",0,0,0,0,1,0,1 -"Kymmenen riivinrautaa",2002,180,NA,4.6,54,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kynighoi, Oi",1977,168,NA,7.1,29,14.5,4.5,4.5,0,4.5,0,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Kyodai Makes the Big Time",1992,91,NA,6,9,14.5,0,0,0,24.5,34.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Kyojin to gangu",1958,95,NA,8.1,77,0,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Kyokatsu koso Waga Jinsei",1968,90,NA,7.2,39,0,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Kyoko",2000,100,NA,5.8,32,4.5,0,4.5,14.5,0,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Kyokon densetsu: utsukushii nazo",1983,60,NA,6.1,7,14.5,0,0,0,14.5,44.5,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Kyokuskin kenka karate burai ken",1977,87,NA,6.9,10,0,0,0,0,14.5,24.5,24.5,14.5,0,44.5,"",1,0,0,1,0,0,0 -"Kyonetsu no kisetsu",1960,75,NA,8.4,5,0,0,0,24.5,0,0,0,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Kyr-Giorgis ekpedevetai, O",1977,89,NA,6.1,9,0,0,0,14.5,24.5,24.5,14.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Kyra mas i mammi, I",1958,77,NA,7,30,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Kyria dimarhos, I",1960,75,NA,7.7,5,0,0,0,24.5,0,24.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Kyriakatiko xypnima",1954,95,NA,9.1,27,4.5,0,0,0,0,4.5,4.5,4.5,24.5,44.5,"",0,0,1,0,0,1,0 -"Kyries tis avlis, Oi",1966,100,NA,9,19,4.5,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,1,1,0,0,0 -"Kyrios pterarhos, O",1963,80,NA,7.1,5,0,0,0,0,44.5,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Kyrkoherden",1970,90,NA,3.6,35,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Kytice",2000,81,NA,7.4,168,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Kyua",1997,115,NA,7.3,792,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Kyuketsuki Gokemidoro",1968,84,NA,5.5,46,4.5,4.5,4.5,0,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"L'Amour",1973,90,NA,4.7,11,4.5,4.5,0,0,24.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"L'Chayim, Comrade Stalin",2002,93,NA,6.5,10,0,0,0,14.5,24.5,34.5,34.5,0,0,14.5,"",0,0,0,0,1,0,0 -"L'Hidato Shel Adolf Eichmann",1994,91,NA,7.8,5,0,0,0,24.5,24.5,0,0,0,0,64.5,"",0,0,0,0,1,0,0 -"L-Shaped Room, The",1962,126,NA,6.9,156,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"L.627",1992,145,NA,7.3,272,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"L.A. Bounty",1989,81,NA,4,37,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"L.A. Confidential",1997,138,35000000,8.4,69600,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"L.A. D.J.",2004,92,NA,4.9,45,24.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"R",0,0,1,0,0,0,0 -"L.A. Knights",2003,20,15000,2.5,15,84.5,0,0,0,4.5,0,0,0,0,14.5,"",0,0,0,0,0,0,1 -"L.A. Plays Itself",1972,55,NA,6,11,0,4.5,0,0,14.5,24.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"L.A. Riot Spectacular, The",2005,80,NA,3.9,33,34.5,0,0,0,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"L.A. Story",1991,95,NA,6.8,7505,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"L.A. Tool & Die",1979,88,NA,5.1,13,0,0,4.5,4.5,4.5,24.5,4.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"L.A. Twister",2004,92,450000,6.4,99,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"L.A. Vice",1989,80,NA,4,9,0,0,14.5,34.5,0,0,14.5,0,0,44.5,"",1,0,0,0,0,0,0 -"L.A. Without a Map",1998,107,NA,6.2,533,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"L.A. X",2002,90,NA,1.4,23,45.5,14.5,4.5,0,0,0,0,0,4.5,14.5,"",0,0,0,1,0,0,0 -"L.E.T.H.A.L. Ladies: Return to Savage Beach",1998,98,NA,3.3,138,24.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"L.I.E.",2001,97,NA,7.2,2296,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"L.I.N.X.",2000,90,NA,2.3,18,14.5,4.5,4.5,0,4.5,0,4.5,0,4.5,45.5,"",0,0,0,0,0,0,0 -"L.T.R.",2002,16,NA,7,30,4.5,14.5,0,0,14.5,0,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"L5: First City in Space",1996,35,NA,5.3,33,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"LBJ",1968,18,NA,8.2,10,0,0,0,0,0,0,14.5,24.5,34.5,44.5,"",0,0,0,0,1,0,1 -"LD 50 Lethal Dose",2003,97,8000000,5,88,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"LSD: Trip or Trap?",1967,19,NA,7.3,7,0,24.5,0,0,0,0,24.5,14.5,0,24.5,"",0,0,0,0,1,0,1 -"La Bamba",1987,108,NA,6.5,2998,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"La Baule-les-Pins",1990,110,NA,6.7,131,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"La Cucaracha",1934,20,50000,6.2,21,0,0,0,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"La Cucaracha",1998,95,NA,6.7,128,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"La Fayette",1962,158,NA,6,12,0,0,4.5,4.5,0,4.5,34.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"La Feet's Defeat",1968,6,NA,6,6,0,0,0,0,14.5,45.5,14.5,0,0,14.5,"",0,1,0,0,0,0,1 -"La Puppe",2003,9,NA,8.5,24,0,0,0,4.5,0,4.5,0,34.5,24.5,24.5,"",0,0,1,1,0,0,1 -"La Tour, prends garde!",1958,82,NA,3.5,10,0,14.5,14.5,44.5,24.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"La capatul liniei",1982,90,NA,8.8,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"La gale",1987,96,NA,6.5,10,0,0,0,0,14.5,24.5,24.5,0,0,45.5,"",0,0,0,0,0,0,0 -"La jiao jiao shi",1999,109,NA,5.1,16,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"La la la l'amour",2002,7,NA,3.7,6,0,0,14.5,0,14.5,0,34.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"La llamaban La Madrina",1973,109,NA,3.1,6,34.5,0,14.5,45.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Laam yan sei sap",2002,103,NA,7.1,133,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Laat de dokter maar schuiven",1980,92,NA,5.3,10,0,0,0,24.5,0,34.5,24.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Laatste Joegoslavische elftal, Het",2000,85,NA,9.2,12,0,0,0,0,0,0,4.5,4.5,44.5,44.5,"",0,0,0,0,1,0,0 -"Laatste sessie, De",1991,92,NA,7.5,7,0,14.5,0,0,0,0,14.5,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Labakan",1957,75,NA,6.1,6,0,0,0,0,34.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Labedzi spiew",1988,90,NA,6,5,0,0,0,0,44.5,0,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Laberinto de pasiones",1982,100,NA,6.7,442,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Laberinto griego, El",1993,96,NA,6.5,21,14.5,0,0,4.5,34.5,4.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Labor Pains",2000,89,NA,4.5,56,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Labroukos balader, O",1981,97,NA,4.5,5,24.5,0,0,24.5,44.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Labyrinth",1959,95,NA,5.8,8,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Labyrinth",1986,101,25000000,7,12661,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Lac aux dames",1934,106,NA,6.5,8,0,0,0,14.5,0,14.5,64.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Lac des morts vivants, Le",1981,83,NA,2.7,302,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lacenaire",1990,120,NA,7,65,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Lachende Erben",1933,76,NA,6.7,23,0,0,0,4.5,0,34.5,24.5,34.5,0,0,"",0,0,1,0,0,1,0 -"Lachenite obuvki na neznayniya voin",1979,85,NA,9.6,18,4.5,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Lacombe Lucien",1974,141,NA,7.8,322,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Lacrima sul viso, Una",1964,90,NA,4.5,5,24.5,24.5,24.5,0,0,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Lad: A Dog",1962,98,NA,6.2,22,0,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ladder 49",2004,115,NA,6.5,5583,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"PG-13",1,0,0,1,0,0,0 -"Ladder of Swords",1989,98,NA,5.6,12,4.5,0,0,0,4.5,34.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ladendiebstahl",1998,8,NA,9.2,9,0,0,14.5,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Ladies Club, The",1986,90,NA,4.4,28,24.5,0,4.5,4.5,24.5,14.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Ladies Courageous",1944,88,NA,6.3,6,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Ladies Crave Excitement",1935,73,NA,7,7,0,0,14.5,0,24.5,0,0,14.5,14.5,24.5,"",1,0,1,1,0,1,0 -"Ladies Must Live",1940,58,NA,5,24,4.5,0,4.5,4.5,34.5,14.5,14.5,4.5,4.5,0,"",0,0,1,0,0,1,0 -"Ladies Please!",1995,60,NA,7.3,7,14.5,0,0,0,0,0,14.5,44.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Ladies Should Listen",1934,62,NA,4.1,11,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ladies They Talk About",1933,69,NA,6.5,110,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ladies Who Do",1963,85,NA,4.7,16,4.5,14.5,0,0,14.5,4.5,4.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ladies and Gentlemen, Mr. Leonard Cohen",1965,45,NA,7.2,34,0,0,0,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Ladies and Gentlemen, the Fabulous Stains",1981,87,NA,6.1,188,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Ladies and Gentlemen: The Rolling Stones",1973,75,NA,7.1,33,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Ladies in Lace Party, The",1985,86,NA,7.3,23,4.5,0,0,4.5,0,4.5,4.5,0,4.5,64.5,"",0,0,0,0,0,0,0 -"Ladies in Lavender",2004,103,NA,6.9,317,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Ladies in Love",1936,97,NA,6,15,0,0,0,0,24.5,24.5,34.5,14.5,4.5,0,"",0,0,1,0,0,1,0 -"Ladies in Retirement",1941,91,NA,6.4,26,0,0,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ladies of Leisure",1930,99,NA,6,54,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Ladies of the Chorus",1948,61,NA,5.6,74,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ladies of the Jury",1932,63,NA,5.5,16,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ladies' Day",1943,62,NA,5.4,13,0,0,0,34.5,24.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Ladies' Man",1931,70,NA,6,14,0,0,0,4.5,24.5,14.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Ladies' Man, The",1961,95,NA,6.4,235,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ladies' Night",2003,89,NA,4.6,67,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Ladies' Night in a Turkish Bath",1928,70,NA,8.3,6,0,0,0,0,0,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ladies' Skirts Nailed to a Fence",1900,1,NA,5.2,25,0,4.5,4.5,4.5,24.5,44.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Ladoni",1993,140,NA,3.5,16,14.5,0,0,0,0,0,14.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Ladri di biciclette",1948,93,NA,8.4,7381,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Ladri di cinema",1994,95,NA,6.5,7,0,0,0,0,24.5,0,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Ladri di saponette",1989,94,NA,6.9,308,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ladri, I",1959,79,NA,5.9,14,4.5,0,4.5,24.5,24.5,4.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Ladro della Gioconda, Il",1966,104,NA,6.3,8,0,0,0,24.5,14.5,34.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Ladro di Bagdad, Il",1961,90,NA,5.8,55,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ladro di bambini, Il",1992,114,NA,7.6,464,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ladro lui, ladra lei",1958,100,NA,6.2,16,0,0,0,0,4.5,24.5,4.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ladrone, Il",1979,108,NA,6.2,20,4.5,4.5,14.5,0,0,24.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Ladrones de tumbas",1990,87,NA,4,19,24.5,4.5,4.5,4.5,14.5,4.5,0,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Ladrones somos gente honrada, Los",1956,89,NA,5,13,0,0,0,14.5,24.5,24.5,0,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lady",1993,28,NA,3.1,8,34.5,0,0,34.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Lady Avenger",1989,82,NA,3.1,16,44.5,14.5,14.5,4.5,0,0,14.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Lady Be Good",1941,112,863460,6.6,80,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lady Beware",1987,108,NA,5.4,203,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lady Caroline Lamb",1972,123,NA,5.1,56,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Lady Chatterley's Lover",1981,104,NA,4.8,255,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Lady Chatterley's Passions 2: Julie's Secret",1995,85,NA,3.5,15,24.5,0,34.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Lady Cocoa",1975,93,NA,5.7,14,4.5,0,24.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lady Consents, The",1936,76,NA,6.9,6,0,0,0,0,0,14.5,84.5,0,0,0,"",0,0,1,0,0,0,0 -"Lady Dracula",1978,79,NA,2.6,21,24.5,4.5,4.5,34.5,0,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lady Dragon",1992,97,NA,3.8,66,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Lady Dragon 2",1993,95,NA,3.6,37,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Lady Emanuelle",1989,77,NA,2.6,14,4.5,14.5,14.5,0,14.5,0,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Lady Eve, The",1941,97,NA,8,2136,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Lady Fights Back, A",1944,10,NA,6.8,6,0,0,0,0,0,45.5,14.5,34.5,0,0,"",0,0,0,0,1,0,1 -"Lady Fishbourne's Complete Guide to Better Table Manners",1976,6,NA,7.4,13,4.5,4.5,0,0,0,0,44.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Lady Gambles, The",1949,99,NA,6.5,59,4.5,4.5,4.5,4.5,4.5,34.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lady Gangster",1942,62,NA,6.6,15,0,0,0,4.5,24.5,44.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Lady Godiva",1955,89,NA,5.5,47,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lady Godiva Rides Again",1951,90,NA,6.2,30,14.5,4.5,14.5,24.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Lady Hamilton - Zwischen Schmach und Liebe",1968,98,NA,5,12,0,0,4.5,4.5,44.5,34.5,0,0,0,4.5,"",0,0,0,1,0,1,0 -"Lady Has Plans, The",1942,77,NA,8.4,10,0,0,0,14.5,14.5,0,0,34.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Lady Ice",1973,93,NA,4.7,44,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Lady In Waiting",1994,84,NA,3.9,59,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lady Is Willing, The",1942,92,NA,5.7,38,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lady Jane",1986,142,NA,7,1018,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lady Killer",1933,74,NA,7,115,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lady Killers",2003,90,NA,3.1,262,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Lady L",1965,109,NA,5.3,154,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lady Luck",1946,97,NA,6.2,37,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lady Lust",1983,73,NA,5.2,14,4.5,0,4.5,14.5,4.5,14.5,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Lady Macbeth von Mzensk",1992,100,NA,8,16,0,0,0,0,4.5,14.5,0,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lady Man",1976,8,NA,5.6,6,0,0,0,14.5,14.5,0,14.5,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Lady Oscar",1980,124,NA,5.7,60,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Lady Paname",1950,106,NA,5.9,11,0,0,14.5,0,14.5,24.5,0,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lady Pays Off, The",1951,80,NA,4.6,6,0,0,14.5,14.5,14.5,34.5,14.5,0,0,0,"",0,0,1,1,0,0,0 -"Lady Refuses, The",1931,72,NA,6.1,20,0,4.5,14.5,14.5,14.5,34.5,4.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Lady Says No, The",1952,80,NA,5,13,0,0,14.5,24.5,34.5,4.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Lady Scarface",1941,66,NA,5.4,20,0,4.5,4.5,14.5,34.5,14.5,24.5,4.5,14.5,0,"",0,0,1,1,0,0,0 -"Lady Sings the Blues",1972,144,NA,6.8,497,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Lady Stay Dead",1981,92,NA,3.7,8,0,14.5,34.5,24.5,0,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Lady Takes a Chance, A",1943,86,NA,5.6,118,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Lady Takes a Flyer, The",1958,95,NA,4.3,29,0,14.5,0,44.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Lady Takes a Sailor, The",1949,99,NA,6.1,46,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Lady Vanishes, The",1938,97,NA,8,4434,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Lady Vanishes, The",1979,95,NA,5,275,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Lady Wants Mink, The",1953,92,NA,5.8,15,4.5,0,4.5,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Lady Windermere's Fan",1925,89,320000,7.8,77,0,0,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Lady Without Passport, A",1950,74,NA,6,48,0,0,0,14.5,14.5,24.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Lady and Gent",1932,80,NA,4,18,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lady and the Bandit, The",1951,79,NA,5.2,7,0,0,0,14.5,45.5,0,0,14.5,0,14.5,"",0,0,0,0,0,1,0 -"Lady and the Lug, The",1940,19,NA,6,8,0,0,0,14.5,24.5,24.5,14.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Lady and the Monster, The",1944,67,NA,5.2,13,0,0,4.5,24.5,4.5,24.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Lady and the Mouse, The",1913,17,NA,6.3,5,0,0,0,0,24.5,0,84.5,0,0,0,"",0,0,0,0,0,0,1 -"Lady and the Tramp",1955,75,4000000,7.4,6952,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,1,0,1,0 -"Lady by Choice",1934,85,NA,5.1,19,4.5,0,4.5,4.5,24.5,34.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Lady for a Day",1933,96,NA,7.6,357,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lady for a Night",1942,87,NA,4.4,57,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lady from Cheyenne, The",1941,88,NA,5.8,16,4.5,0,0,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lady from Chungking",1942,66,NA,4.7,5,0,0,0,24.5,44.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Lady from Louisiana",1941,82,NA,4.3,51,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Lady from Shanghai, The",1947,79,2000000,7.6,2377,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Lady from Texas, The",1951,78,NA,5.6,6,0,0,0,14.5,14.5,45.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Lady in Blue, The",1996,85,NA,3.7,15,14.5,14.5,24.5,4.5,24.5,0,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Lady in Cement",1968,93,NA,5.5,179,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lady in Danger",1935,68,NA,4.9,5,24.5,0,24.5,0,64.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Lady in Question, The",1940,80,NA,6.1,33,0,0,4.5,4.5,4.5,24.5,34.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Lady in Red, The",1979,93,NA,5.4,249,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Lady in White",1988,112,4700000,6.7,656,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lady in a Cage",1964,94,NA,6.2,320,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lady in a Jam",1942,78,NA,5.6,20,0,14.5,4.5,4.5,24.5,34.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lady in the Box",2001,105,NA,6.3,52,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Lady in the Car with Glasses and a Gun, The",1970,105,NA,5.4,27,4.5,0,4.5,0,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lady in the Dark",1944,100,NA,5.7,66,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lady in the Iron Mask",1952,78,NA,6,7,0,0,0,0,14.5,44.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Lady in the Lake",1947,105,NA,6.7,398,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Lady in the Morgue, The",1938,67,NA,6.1,5,0,0,0,0,0,24.5,0,24.5,64.5,0,"",0,0,0,0,0,0,0 -"Lady of Burlesque",1943,91,NA,6.4,205,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lady of Chance, A",1928,78,NA,7.5,32,0,0,0,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Lady of Scandal, The",1930,76,NA,6,7,0,0,14.5,14.5,14.5,14.5,24.5,14.5,0,0,"",0,0,1,1,0,1,0 -"Lady of the Lake",1998,82,60000,3.9,46,24.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,0,14.5,"R",0,0,0,0,0,0,0 -"Lady of the Night",1925,90,NA,8.6,13,0,0,0,0,0,14.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Lady of the Tropics",1939,92,NA,5.2,45,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,1,0 -"Lady on a Train",1945,94,NA,6.6,134,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lady to Love, A",1930,92,NA,6.3,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,1,0,1,0 -"Lady with Red Hair",1940,78,NA,6.6,30,0,0,4.5,14.5,4.5,24.5,44.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Lady with a Lamp, The",1951,110,NA,5.8,7,0,0,0,14.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Lady with a Past",1932,80,NA,5.1,6,14.5,0,0,14.5,0,14.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Lady with the Torch, The",1999,119,NA,7.4,24,4.5,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Lady's Morals, A",1930,87,NA,5.9,11,0,0,4.5,14.5,14.5,24.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Lady, Play Your Mandolin!",1931,7,NA,5.4,32,4.5,0,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Ladybird Ladybird",1994,101,NA,7.4,540,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Ladybug Ladybug",1963,82,NA,7.3,79,4.5,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ladybugs",1992,90,NA,4.5,1489,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ladyhawke",1985,121,20000000,6.8,7090,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Ladykiller",1994,80,NA,1.6,5,64.5,0,0,0,0,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Ladykillers, The",1955,97,NA,7.9,3871,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Ladykillers, The",2004,104,35000000,6.4,10580,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Ladyporn",2001,47,NA,8.7,11,0,4.5,0,0,0,4.5,0,4.5,0,74.5,"",0,0,0,0,1,0,0 -"Laf u srcu",1981,92,NA,6.1,10,0,0,0,0,14.5,24.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Lafayette Escadrille",1958,93,NA,6,83,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Lag",2003,7,NA,6.4,9,0,14.5,0,0,0,0,24.5,34.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Lagaan: Once Upon a Time in India",2001,224,NA,7.5,2717,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG",0,0,0,1,0,1,0 -"Lagarista",2000,100,NA,5.2,5,24.5,0,24.5,24.5,0,0,0,24.5,0,24.5,"",1,0,0,1,0,1,0 -"Lager SSadis Kastrat Kommandantur",1976,91,NA,4,53,14.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Lagerat",1990,90,NA,8,7,0,0,0,0,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Lagodna",1986,12,NA,6.8,7,0,0,0,0,0,24.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Lagodna",1995,93,NA,5.7,8,0,0,14.5,0,0,45.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Lagunilla, mi barrio",1981,99,NA,5.6,10,0,0,14.5,0,0,0,14.5,34.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Lahaka, Ha-",1979,112,NA,5.6,53,4.5,0,0,4.5,0,4.5,4.5,14.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Lahar",1996,92,NA,6.3,10,14.5,14.5,0,24.5,0,24.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Lahav Hatzui",1992,81,NA,5.6,14,0,0,4.5,0,24.5,4.5,24.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Lahn al khouloud",1952,132,NA,4.9,8,0,0,14.5,0,0,0,0,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Lai wong",1991,88,NA,6.7,1083,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",1,0,1,0,0,0,0 -"Laila",1958,100,NA,5.7,6,0,0,14.5,14.5,14.5,34.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Laina-aika",2000,59,NA,4.2,5,24.5,0,0,24.5,44.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Lair of the White Worm, The",1988,93,2500000,5.4,1716,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Laisse aller, c'est une valse",1971,100,NA,6.3,28,0,0,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Laisse tes mains sur mes hanches",2003,105,NA,5.8,116,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Laissez-passer",2002,172,NA,7,310,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Laissons Lucie faire!",2000,91,NA,5.9,49,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Lait de la tendresse humaine, Le",2001,94,NA,5.9,82,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Laitakaupungin laulu",1948,73,NA,7.2,8,0,0,0,14.5,0,24.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Lajanje na zvezde",1998,95,NA,7.5,62,4.5,4.5,0,0,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Lake Placid",1999,82,27000000,5.2,7836,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Lake Placid Serenade",1944,60,NA,6.3,6,0,0,14.5,0,34.5,0,0,34.5,0,14.5,"",0,0,0,0,0,1,0 -"Lake Titicaca",1955,7,NA,6.4,26,4.5,0,4.5,4.5,0,14.5,14.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Lakeboat",2000,98,NA,5.9,223,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Lakeer - Forbidden Lines",2004,170,NA,5.3,17,4.5,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Lakeuden kutsu",2000,99,NA,5.6,103,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lakki",1992,102,NA,3.1,34,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Lakshya",2004,186,NA,7.2,236,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Lal Darja",1997,95,NA,1.7,12,14.5,0,0,45.5,0,0,0,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Lal Salaam",2002,131,NA,8.4,14,0,4.5,0,4.5,4.5,0,24.5,24.5,24.5,0,"",1,0,0,1,0,0,0 -"Lalaki sa buhay ni Selya, Ang",1997,96,NA,7.1,21,0,0,4.5,0,0,4.5,24.5,0,4.5,45.5,"",0,0,0,1,0,0,0 -"Lalakis, o eisagomenos",1984,86,NA,7.1,7,14.5,0,0,14.5,0,0,14.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Lalka",1968,139,NA,7.1,27,4.5,0,0,0,4.5,14.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Lama nel corpo, La",1967,86,NA,3.4,9,14.5,0,24.5,0,0,34.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Lamarca",1994,130,NA,7.4,70,4.5,4.5,4.5,0,4.5,4.5,34.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Lamb",1986,110,NA,5.9,92,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Lamb",2002,7,NA,7.2,24,4.5,4.5,4.5,0,24.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Lambchops",1929,8,NA,5,13,14.5,4.5,4.5,0,0,4.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Lambert the Sheepish Lion",1951,8,NA,7.7,128,0,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Lambeth Walk, The",1940,67,NA,7.1,7,14.5,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lament",2002,8,NA,8.2,5,0,0,0,0,0,44.5,0,0,24.5,44.5,"",0,0,0,1,0,0,1 -"Lamerica",1994,116,NA,7.5,468,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Lamhe",1991,187,NA,7.9,108,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,64.5,"",0,0,0,1,0,1,0 -"Lamma hikyit Maryam",2002,98,NA,8.6,15,0,0,0,0,0,4.5,14.5,14.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Lammas all paremas nurgas",1992,85,NA,8.2,10,0,0,0,0,0,24.5,14.5,34.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Lammbock",2001,93,NA,7.2,879,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lamp Still Burns, The",1943,87,NA,6.5,19,0,0,0,4.5,14.5,34.5,14.5,24.5,4.5,0,"",0,0,0,1,0,1,0 -"Lampa",1959,8,NA,6.9,123,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Lan feng zheng",1993,138,NA,7.6,372,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Lan se ai qing",2000,99,NA,5.7,7,0,0,0,14.5,14.5,14.5,0,45.5,0,0,"",0,0,0,0,0,1,0 -"Lan yu",2001,89,NA,7,335,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Lan yue",1997,97,NA,3.7,11,24.5,0,0,0,4.5,4.5,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Lana in Love",1992,88,NA,3.7,14,4.5,4.5,0,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Lana's Rain",2002,107,215000,7.1,56,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Lanai-Loa",1998,89,NA,3,13,24.5,14.5,0,0,14.5,4.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Lancaster, Pa., High School",1900,2,NA,3.9,6,0,14.5,14.5,14.5,0,14.5,34.5,0,0,0,"",0,0,0,0,1,0,1 -"Lancelot and Guinevere",1963,116,NA,5.4,47,4.5,0,14.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lancelot du Lac",1974,88,NA,7.1,299,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lancer Spy",1937,78,NA,5.9,15,0,4.5,0,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lancieri neri, I",1962,97,NA,6.2,6,0,0,14.5,0,0,14.5,14.5,45.5,0,0,"",1,0,0,1,0,0,0 -"Land Before Time, The",1988,70,12300000,6.4,3630,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,1,0,0,0 -"Land Beyond the Law",1937,54,NA,5.3,12,0,0,0,4.5,34.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Land Beyond the Sunset, The",1912,14,NA,7.9,38,4.5,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Land Girls, The",1998,111,NA,6.1,447,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Land That Time Forgot, The",1975,90,NA,5.4,486,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Land Unknown, The",1957,78,NA,5.5,84,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Land Without Music",1936,64,NA,5.9,11,0,0,0,0,24.5,4.5,4.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Land and Freedom",1995,104,NA,7.3,1393,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Land des Schweigens und der Dunkelheit",1971,85,NA,8,52,0,0,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Land of College Prophets, The",2005,83,80000,6.5,25,0,14.5,0,4.5,4.5,0,14.5,4.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Land of Doom",1986,87,NA,3.7,16,24.5,24.5,4.5,0,14.5,14.5,14.5,0,0,0,"",1,0,0,0,0,0,0 -"Land of Look Behind",1982,90,NA,9.1,14,0,0,0,0,0,0,24.5,4.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Land of Missing Men, The",1930,55,NA,6.8,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Land of No Return",1975,84,NA,5,13,4.5,4.5,4.5,24.5,14.5,34.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Land of Plenty",2004,123,NA,6.6,354,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Land of the Free",1997,100,NA,3.9,73,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Land of the Midnight Fun",1939,8,NA,6.9,7,0,0,0,0,14.5,14.5,14.5,45.5,0,0,"",0,1,1,0,0,0,1 -"Land of the Minotaur",1976,88,NA,3.7,41,14.5,4.5,24.5,14.5,14.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Land of the Open Range",1942,60,NA,5.4,14,0,0,24.5,0,4.5,34.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Land of the Pharaohs",1955,105,2900000,6.3,423,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Landfall",1975,86,NA,3.2,5,24.5,0,24.5,0,0,0,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Landing Stripling",1962,6,NA,2.7,21,24.5,14.5,14.5,14.5,4.5,0,4.5,0,4.5,4.5,"",0,1,1,0,0,0,1 -"Landlady, The",1998,95,NA,4.1,98,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Landlord, The",1970,112,NA,6.4,135,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Landmandsliv",1965,108,NA,6.5,6,0,0,14.5,0,14.5,0,14.5,45.5,0,0,"",0,0,1,0,0,0,0 -"Landru",1963,115,NA,6.4,99,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Landsbykirken",1947,14,NA,7.6,5,0,0,0,0,0,24.5,44.5,0,44.5,0,"",0,0,0,0,0,0,1 -"Landscape Suicide",1986,95,NA,5,5,24.5,0,0,0,0,24.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Landscape with the Fall of Icarus",1994,26,NA,8.4,6,0,0,0,14.5,0,0,0,14.5,34.5,34.5,"",0,1,0,0,0,0,1 -"Landslide",1992,95,NA,4.6,33,4.5,14.5,14.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Landspeed",2002,94,NA,4.5,119,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Landstormens lilla argbigga",1941,90,NA,3.4,7,14.5,14.5,0,0,24.5,0,0,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Landstrykere",1989,138,NA,6.3,23,14.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Landysh serebristyy",2000,88,NA,6.8,18,4.5,0,0,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Lang bei wei jian",1974,119,NA,4.1,7,14.5,0,14.5,44.5,0,14.5,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Lang leve de koningin",1995,180,NA,7.6,165,0,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lang man feng bao",1996,106,NA,5.1,42,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lange Beine - lange Finger",1966,92,NA,6.1,7,0,0,0,14.5,14.5,14.5,0,45.5,0,0,"",0,0,1,0,0,0,0 -"Lange nacht",1998,30,NA,7.1,5,0,0,0,0,0,0,64.5,0,44.5,0,"",0,0,0,0,0,0,1 -"Langer Gang",1992,79,NA,7.6,14,4.5,0,0,0,4.5,4.5,14.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Langitku rumahku",1990,103,NA,7.1,15,4.5,0,0,4.5,0,24.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Language All My Own, A",1935,6,NA,5.8,16,0,0,4.5,4.5,34.5,24.5,14.5,0,4.5,4.5,"",0,1,0,0,0,0,1 -"Lanling wang",1995,95,NA,6,16,0,0,0,4.5,14.5,34.5,24.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Lansdown",2001,80,NA,2.7,82,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Lanse bayue",2000,90,NA,7.6,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,1,0,1,0 -"Lanse da men",2002,85,NA,7.5,278,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Lantana",2001,121,NA,7.6,5421,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Lanterne magique, La",1903,3,NA,3.9,9,34.5,0,14.5,0,14.5,24.5,0,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Lanton Mills",1969,12,NA,4.4,6,0,0,0,34.5,0,14.5,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Lao hu tian ji",1978,97,NA,6.2,33,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Lao mao",1992,84,NA,5.9,15,4.5,0,0,24.5,0,24.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Lao niang gou sao",1986,94,NA,6.1,8,14.5,0,0,14.5,24.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Lao tou",1999,94,NA,7.3,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,0,0,1,0,0 -"Lap Dancer",1995,82,NA,4.6,46,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Lap Dancing",1995,90,NA,3.4,139,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Lapatossu",1937,83,NA,5.5,9,0,0,14.5,14.5,14.5,44.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Lapin kullan kimallus",1999,120,NA,5.5,125,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lapis",1966,10,NA,6,6,0,0,14.5,0,14.5,0,14.5,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Laputa",1987,92,NA,8.3,85,4.5,4.5,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Lara",2002,107,NA,7.9,19,4.5,4.5,0,0,14.5,4.5,4.5,44.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Lara Croft Tomb Raider: The Cradle of Life",2003,117,90000000,5.2,9103,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Lara Croft: Tomb Raider",2001,100,80000000,5.2,21861,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Laramie",1949,55,NA,5.2,9,0,0,14.5,14.5,24.5,24.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Laramie Mountains",1952,54,NA,5.6,11,0,0,14.5,4.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Laramie Project, The",2002,97,NA,7.3,1503,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Larceny",1948,89,NA,6.8,9,0,0,0,0,14.5,0,45.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Larceny on the Air",1937,67,NA,5.5,5,0,64.5,0,0,0,0,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Larceny, Inc.",1942,95,NA,7.4,236,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Laredo",1967,13,NA,3.1,14,0,84.5,0,0,0,0,0,0,0,14.5,"",0,0,0,0,1,0,1 -"Largas vacaciones del 36, Las",1976,107,NA,5.6,16,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Larger Than Life",1996,93,NA,5.2,994,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Larger Than Life",1997,13,NA,5.8,94,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Largo invierno, El",1992,135,NA,6,16,0,0,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Largo retorno",1975,116,NA,5.2,5,0,0,0,0,44.5,0,24.5,0,0,44.5,"",0,0,0,1,0,1,0 -"Largo viaje",1967,83,NA,8.1,8,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Larry Clinton and His Orchestra",1938,10,NA,5.5,5,0,0,0,0,44.5,64.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Lars from 1-10",1998,10,NA,3.3,62,45.5,0,4.5,4.5,4.5,4.5,14.5,0,0,4.5,"",0,0,0,0,1,0,1 -"Lars i porten",1984,90,NA,6.2,12,4.5,0,4.5,4.5,4.5,24.5,34.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Lars-Ole 5C",1973,84,NA,6,29,4.5,0,0,14.5,4.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Las Vegas Hillbillys, The",1966,90,NA,2.6,44,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Las Vegas Lady",1975,87,NA,3.9,16,14.5,14.5,34.5,0,14.5,4.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Las Vegas Nights",1941,90,NA,6.1,6,14.5,0,0,0,14.5,14.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Las Vegas Serial Killer",1986,87,NA,1.1,13,64.5,4.5,4.5,4.5,4.5,4.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Las Vegas Story, The",1952,88,NA,6.4,70,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Las Vegas Weekend",1986,83,2000000,1.1,10,64.5,24.5,0,0,0,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Las Vegas, 500 millones",1968,124,NA,5.9,49,4.5,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Las que tienen que servir",1967,83,NA,3.9,20,4.5,14.5,24.5,14.5,14.5,14.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Laser Man, The",1988,92,NA,4.5,9,24.5,0,14.5,0,24.5,24.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Laser Mission",1990,84,NA,2.5,230,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Laser Moon",1992,90,NA,2.8,16,14.5,44.5,14.5,0,0,0,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Laserblast",1978,85,NA,2.5,533,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Laserhawk",1997,99,NA,3.8,146,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Lash of the Penitentes",1937,35,NA,6.2,6,0,0,0,0,45.5,14.5,0,34.5,0,0,"",0,0,0,1,0,0,1 -"Lashou shentan",1992,131,4500000,7.9,6568,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"R",1,0,0,1,0,0,0 -"Lasse & Geir",1976,91,NA,6,37,14.5,4.5,0,0,4.5,0,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lasse-Maja",1941,115,NA,4.1,10,0,0,34.5,0,14.5,34.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Lassie",1994,94,NA,5.4,386,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lassie Come Home",1943,89,NA,6.9,465,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lassie's Great Adventure",1965,73,NA,5.5,30,4.5,0,4.5,14.5,14.5,44.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lassiter",1984,100,NA,5.5,390,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Lasso",2001,4,NA,5.3,5,0,0,24.5,0,0,24.5,44.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Last Action Hero",1993,130,60000000,5.4,15266,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Last American Hero, The",1973,91,NA,5.9,223,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Last American Hobo, The",1967,82,NA,1,10,64.5,0,0,0,14.5,0,14.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Last American Virgin, The",1982,92,NA,5.3,1033,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Last American Virgin, The",2000,10,NA,5.1,17,14.5,0,4.5,14.5,14.5,14.5,34.5,0,4.5,0,"",0,0,1,0,0,0,1 -"Last Angry Man, The",1959,100,NA,7.2,44,0,4.5,4.5,0,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Last Attack of the Beast, The",2002,14,NA,6.9,25,0,0,0,0,4.5,14.5,34.5,4.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Last Ball",2001,96,NA,5.9,54,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Last Bandit, The",1949,80,NA,6.2,11,0,0,0,0,4.5,44.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Last Best Sunday, The",1999,101,NA,5.1,52,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Last Big Attraction, The",1999,90,60000,2.6,23,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Last Blitzkrieg, The",1959,84,NA,4.5,24,4.5,0,4.5,24.5,24.5,34.5,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Last Blow Job, The",2001,15,NA,5.4,24,4.5,0,14.5,4.5,14.5,14.5,24.5,0,4.5,24.5,"",0,0,0,0,0,0,1 -"Last Boy Scout, The",1991,96,NA,6.4,10044,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Last Breeze of Summer",1991,30,60000,7.6,5,0,24.5,0,0,0,24.5,0,0,0,64.5,"",0,0,0,1,0,0,1 -"Last Broadcast, The",1998,86,0,5.7,967,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Buffalo, The",1990,27,NA,6.6,12,0,0,0,4.5,0,14.5,4.5,44.5,0,24.5,"",0,0,0,0,0,0,1 -"Last Bus Home, The",1997,93,NA,3.7,12,24.5,0,0,4.5,14.5,0,34.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Last Call",1991,90,NA,4.1,69,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last Call at Maud's",1993,77,NA,7.2,17,0,0,0,4.5,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Last Castle, The",2001,131,60000000,6.4,7233,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Last Chair",2003,30,25000,9,12,4.5,0,0,0,0,0,0,4.5,4.5,74.5,"",0,0,0,0,0,0,1 -"Last Challenge, The",1967,105,NA,5.7,70,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last Chance",1999,98,NA,5.8,61,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Last Chance Love",1997,95,NA,5.9,5,24.5,0,44.5,0,0,24.5,0,0,24.5,0,"",0,0,0,1,0,1,0 -"Last Chants for a Slow Dance",1977,90,NA,8.8,13,0,0,4.5,4.5,4.5,4.5,4.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Last Chase, The",1981,101,4900000,4.3,147,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Last Clear Chance",1959,26,NA,2.7,32,34.5,24.5,4.5,14.5,4.5,4.5,0,0,0,4.5,"",0,0,0,0,1,0,1 -"Last Command, The",1928,88,NA,8.5,174,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Last Command, The",1955,110,NA,6.5,102,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Last Conversation",2003,12,NA,6.1,32,24.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,44.5,"",0,0,0,1,0,0,1 -"Last Crooked Mile, The",1946,67,NA,6.9,9,0,0,0,14.5,0,24.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Last Cry",2001,85,NA,3.7,123,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Last Customer, The",2003,23,NA,8.2,24,14.5,0,0,0,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Last Dance",1996,103,NA,5.7,994,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Last Dance",2002,84,NA,7.8,11,0,0,0,0,0,0,34.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Last Days of Chez Nous, The",1992,96,NA,6.7,181,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Last Days of Disco, The",1998,113,NA,6.3,2633,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Last Days of Dolwyn, The",1949,95,NA,7.1,22,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Last Days of Frankie the Fly, The",1997,96,NA,5.1,435,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Last Days of Pompeii, The",1935,96,1000000,6.5,106,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Last Days, The",1998,87,NA,7.6,508,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,0,1,0,0 -"Last Detail, The",1973,103,NA,7.4,2184,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Last Dragon, The",1985,109,10000000,5.6,1343,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Last Drop of Water, The",1911,18,NA,6,11,0,0,0,4.5,44.5,4.5,24.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Last Embrace",1979,102,NA,6.2,289,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last Embrace, The",1997,84,NA,3.8,10,24.5,0,34.5,24.5,0,14.5,24.5,0,0,0,"R",0,0,0,0,0,1,0 -"Last Emperor, The",1987,219,25000000,7.7,9507,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Last Escape, The",1970,90,NA,4.8,22,4.5,4.5,4.5,0,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Last Exit",2003,97,NA,7.2,34,4.5,4.5,0,4.5,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Last Exit to Brooklyn",1989,102,NA,6.6,956,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Last Fight, The",1983,86,NA,4.1,14,4.5,14.5,0,0,24.5,24.5,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Last Flight of Noah's Ark, The",1980,97,NA,4.6,164,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last Flight, The",1931,76,NA,7,59,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Last Foxtrot in Burbank",1973,65,NA,5.9,13,0,0,4.5,0,24.5,44.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Last Frontier, The",1932,213,NA,6.5,6,0,0,0,0,14.5,14.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Last Frontier, The",1955,98,NA,6.4,70,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last Frontier, The",2002,22,NA,4.9,18,4.5,0,14.5,0,34.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Last Full Measure, The",2004,18,50000,7.5,19,14.5,0,0,4.5,14.5,0,0,0,24.5,44.5,"",0,0,0,1,0,0,1 -"Last Gangster, The",1937,81,NA,6.8,151,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Last Gasp",1995,93,NA,5.5,176,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,0,0,0,0 -"Last Gentleman, The",1934,80,NA,6.5,12,0,0,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Last Good Time, The",1994,90,NA,6.1,91,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Last Good War, The",1999,13,NA,7.5,11,4.5,0,4.5,0,0,0,24.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Last Goodbye",2004,95,NA,4,24,24.5,4.5,4.5,0,0,0,4.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Last Great Ride, The",1999,93,NA,4.6,46,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Last Great Wilderness, The",2002,95,NA,5.5,128,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Last Grenade, The",1970,94,NA,5.5,26,4.5,4.5,0,14.5,24.5,14.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Last Gun, The",1959,8,NA,5.3,36,24.5,4.5,0,4.5,0,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Last Gunshot, The",2001,24,NA,5.8,7,0,0,0,0,14.5,14.5,0,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Last Hard Men, The",1976,94,NA,5.8,181,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last Holiday",1950,88,NA,8.1,169,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Last Home Run, The",1996,93,NA,5.5,51,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Horror Film, The",1982,87,2000000,3.9,111,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Horror Movie, The",2003,80,780000,5.2,409,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Last Horseman, The",1944,54,NA,4.4,5,0,24.5,24.5,0,24.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Last Hour, The",1991,81,NA,3.7,34,24.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Last House on the Left, The",1972,85,87000,5.5,2522,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Hungry Cat, The",1961,7,NA,7,26,0,0,0,0,0,24.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Last Hunt, The",1956,104,NA,6.9,139,0,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Last Hurrah, The",1958,121,NA,7.2,418,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Last Installment, The",1945,19,NA,6.3,13,0,0,4.5,4.5,24.5,14.5,34.5,0,0,4.5,"",0,0,0,1,0,0,1 -"Last Island, The",1990,115,NA,6.6,51,4.5,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Last Journey, The",1936,66,NA,8.1,7,0,0,0,0,0,0,44.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Last Just Man, The",2002,70,NA,9.3,70,0,0,0,0,0,0,4.5,14.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Last Klezmer: Leopold Kozlowski, His Life and Music, The",1994,85,NA,7.3,15,0,0,4.5,0,0,4.5,14.5,4.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Last Late Night, The",1999,94,NA,4.4,54,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Last Leaf, The",1993,30,NA,7.6,8,0,0,0,0,14.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Last Letter, The",2004,80,NA,3.1,46,4.5,34.5,24.5,14.5,14.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Last Man Alive, The",1971,10,NA,8,8,0,0,14.5,0,14.5,0,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Last Man Running",2003,88,NA,9.3,19,0,0,4.5,4.5,0,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Last Man Standing",1996,101,67000000,5.7,6751,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Last Man on Earth, The",1964,86,NA,7,673,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Last Man, The",2000,95,NA,5.6,149,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"R",1,0,1,0,0,0,0 -"Last Married Couple in America, The",1980,103,NA,4.8,98,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Last Marshal, The",1999,102,NA,5.1,104,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Last Mile, The",1932,75,NA,6.8,18,0,0,0,0,4.5,24.5,24.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Last Mile, The",1959,81,NA,6.6,41,0,0,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Last Minute",2004,83,NA,6.9,6,0,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Last Minute, The",2001,104,NA,6,219,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Last Movie, The",1971,108,1000000,3.9,145,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Last Musketeer, The",1952,67,NA,7.1,6,0,0,0,14.5,14.5,34.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Last Night at the Alamo",1984,80,NA,6.7,69,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Last Orders",2001,109,12000000,7.1,1583,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Last Outlaw, The",1927,63,NA,2.7,10,44.5,14.5,0,0,0,14.5,0,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Last Outlaw, The",1936,62,NA,3.7,20,24.5,4.5,0,0,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Outpost, The",1935,72,NA,4.8,21,0,4.5,14.5,14.5,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Last Outpost, The",1951,89,NA,4.5,63,14.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last Page, The",1952,84,NA,5.7,9,0,0,0,14.5,0,44.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Last Party 2000",2001,90,1000000,6.3,205,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Last Party, The",1993,96,NA,5.4,206,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Last Patrol, The",2000,95,8200000,2.9,236,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Last Picture Show, The",1971,118,1300000,8,5340,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Last Plane Out",1983,92,NA,4.7,24,24.5,4.5,4.5,14.5,14.5,24.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Last Porno Flick, The",1974,88,NA,1.5,17,44.5,14.5,0,14.5,0,0,0,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Last Posse, The",1953,73,NA,6.1,27,0,0,0,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last Post, The",2001,16,NA,4.5,15,4.5,14.5,0,0,0,24.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Last Producer, The",2000,89,NA,4.4,74,4.5,14.5,4.5,14.5,24.5,24.5,4.5,0,4.5,4.5,"R",0,0,0,1,0,0,0 -"Last Prom, The",1980,24,NA,4.4,10,0,14.5,14.5,14.5,14.5,34.5,14.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Last Race, The",2002,22,NA,6,37,4.5,0,4.5,4.5,14.5,0,4.5,4.5,24.5,34.5,"",1,0,0,0,0,0,1 -"Last Real Cowboys, The",2000,12,NA,5.9,34,0,14.5,0,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Last Rebel, The",1971,90,NA,3.1,30,34.5,14.5,14.5,24.5,4.5,0,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Last Remake of Beau Geste, The",1977,85,NA,5.5,406,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Last Resort",2000,73,NA,7.3,323,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Last Resort, The",1997,86,5000000,5,62,4.5,4.5,4.5,4.5,45.5,4.5,4.5,4.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Last Reunion, The",1980,98,NA,5.1,10,0,14.5,14.5,14.5,14.5,24.5,24.5,0,14.5,14.5,"",1,0,0,0,0,0,0 -"Last Ride",2001,106,NA,3.2,12,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Last Ride, The",1944,57,NA,5.1,17,0,4.5,4.5,14.5,24.5,34.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Last Ride, The",1991,84,NA,6.9,8,24.5,0,0,0,24.5,0,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Last Riders, The",1991,90,NA,5.7,15,0,0,24.5,4.5,14.5,0,34.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Last Rites",1980,86,NA,3.8,22,34.5,14.5,4.5,14.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Last Rites",1988,103,NA,5.1,171,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last Rites",1998,90,NA,6.2,247,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Last Road, The",1997,90,NA,3.6,23,24.5,14.5,0,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Last Round-Up, The",1947,77,NA,5.9,6,0,0,14.5,0,34.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Last Roundup, The",1943,6,NA,6.8,5,0,0,0,0,24.5,24.5,24.5,0,44.5,0,"",0,1,1,0,0,0,1 -"Last Run",2001,91,NA,4.8,136,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Last Run, The",1971,95,NA,5.4,165,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Last Run, The",2004,97,NA,6.5,9,34.5,0,0,0,14.5,0,0,0,14.5,44.5,"",0,0,1,1,0,0,0 -"Last Rung On the Ladder, The",1987,12,1500,5.5,6,14.5,0,0,0,14.5,14.5,0,34.5,0,14.5,"",0,0,0,1,0,0,1 -"Last Safari, The",1967,110,NA,5.2,25,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Samurai, The",2003,154,100000000,7.9,31668,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",1,0,0,1,0,0,0 -"Last Scene",2002,99,NA,6.5,28,0,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Last Seduction II, The",1999,96,NA,3.7,107,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"Last Seduction, The",1994,110,2500000,7.2,4157,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Last September, The",1999,103,NA,6.1,188,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Last Shot You Hear, The",1969,90,NA,4.2,6,0,14.5,14.5,34.5,0,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Last Shot, The",2004,93,NA,5.5,299,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Last Sign, The",2004,90,NA,3.7,82,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Last Slumber Party, The",1987,80,NA,2,81,45.5,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Soviet Movie, The",2003,80,3500000,7.6,6,14.5,34.5,0,0,0,0,0,14.5,34.5,0,"",1,0,1,0,0,0,0 -"Last Stagecoach West, The",1957,87,150000,6.3,9,0,14.5,0,14.5,14.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Last Stand",2000,94,NA,1.9,22,45.5,14.5,14.5,4.5,0,0,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Last Stand",2003,23,NA,9.2,8,0,0,0,0,14.5,0,0,0,14.5,74.5,"",0,0,0,1,0,0,1 -"Last Stand at Lang Mei",1990,90,NA,4.8,32,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,0,44.5,"",1,0,0,0,0,0,0 -"Last Starfighter, The",1984,101,15000000,6.2,4890,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Last Stop, The",2000,92,NA,4.8,210,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Last Summer",1969,97,NA,6.7,217,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Last Summer in the Hamptons",1995,108,NA,5.9,119,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Last Summer, The",2004,95,NA,6,8,24.5,14.5,0,0,14.5,0,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Last Sunset, The",1961,112,NA,6.4,174,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Last Supper",1992,60,NA,7,45,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Last Supper, The",1994,96,NA,6.6,49,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Last Supper, The",1995,92,NA,6.8,3331,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Last Tattoo, The",1994,111,NA,5.2,64,0,4.5,14.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Last Temptation of Christ, The",1988,164,7000000,7.5,8074,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Last Time I Committed Suicide, The",1997,92,4000000,5.3,530,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Last Time I Saw Archie, The",1961,98,2000000,5.7,73,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Last Time I Saw Paris, The",1954,116,NA,5.9,408,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Last Time, The",2002,12,NA,5.2,11,0,4.5,0,0,14.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Last Train from Gun Hill",1959,98,NA,7.1,509,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Last Train from Madrid, The",1937,85,NA,6.4,16,0,0,0,14.5,14.5,14.5,45.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Last Tycoon, The",1976,125,NA,6.2,971,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Last Tzaddik, The",1998,20,NA,5.3,6,14.5,14.5,0,14.5,0,14.5,0,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Last Unicorn, The",1982,92,NA,6.8,3221,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Last Valley, The",1971,128,NA,6.9,371,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Last Victory, The",2004,88,NA,7.5,37,0,0,0,4.5,0,4.5,24.5,44.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Last Voyage, The",1960,91,NA,6.4,237,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Last Wagon, The",1956,98,NA,7,180,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Waltz, The",1978,117,NA,7.8,2314,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Last Wave, The",1977,106,NA,6.9,911,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Last Wedding",2001,100,NA,6.4,134,0,0,4.5,14.5,4.5,4.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Last Winter, The",1984,89,NA,4.6,20,14.5,4.5,14.5,14.5,4.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Last Winter, The",1990,115,NA,7.3,28,0,0,0,4.5,4.5,0,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Last Woman on Earth",1960,71,NA,4.2,115,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Word",2002,16,8500,8,6,0,0,0,34.5,0,0,0,0,0,64.5,"",0,0,0,1,0,0,1 -"Last Word, The",1979,105,NA,5.7,16,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Last Word, The",1995,70,NA,4.6,109,14.5,4.5,4.5,24.5,4.5,24.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Last Year, The",2002,108,NA,3.8,48,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Last Yellow, The",1999,93,NA,6.2,72,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Last of England, The",1988,87,NA,6.3,127,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Last of Mrs. Cheyney, The",1929,94,NA,5.8,44,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Last of Mrs. Cheyney, The",1937,98,NA,6.6,121,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Last of Sheila, The",1973,120,NA,7.1,648,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Last of the Badmen",1957,79,NA,5.3,23,0,4.5,4.5,4.5,34.5,34.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Last of the Blue Devils, The",1979,90,NA,4.7,23,4.5,0,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Last of the Buccaneers",1950,79,NA,5.4,12,0,0,4.5,0,14.5,4.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Last of the Comanches",1953,85,NA,6.1,46,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Last of the Cowboys, The",1977,106,NA,4.8,68,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Last of the Dogmen",1995,118,NA,6.3,929,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG",0,0,0,0,0,0,0 -"Last of the Fast Guns, The",1958,82,NA,4.8,22,4.5,0,4.5,14.5,24.5,4.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Last of the Finest, The",1990,106,NA,5.2,188,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Last of the High Kings, The",1996,104,NA,6.2,447,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Last of the Knucklemen, The",1979,93,NA,5.8,16,4.5,0,0,4.5,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Last of the Mobile Hot Shots",1970,100,NA,4.4,29,4.5,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Last of the Mohicans, The",1932,231,NA,5.3,27,14.5,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Last of the Mohicans, The",1936,91,NA,7,109,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Last of the Mohicans, The",1992,117,40000000,7.5,15293,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Last of the Pagans",1935,72,NA,4.9,18,0,0,14.5,24.5,14.5,14.5,14.5,4.5,4.5,0,"",0,0,0,1,0,1,0 -"Last of the Pony Riders",1953,58,NA,5.8,14,0,4.5,0,24.5,24.5,0,4.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Last of the Red Hot Lovers",1972,98,NA,5,110,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Last of the Redmen",1947,79,NA,6,9,14.5,0,34.5,0,0,24.5,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Last of the Secret Agents?, The",1966,92,NA,3.6,42,0,4.5,24.5,14.5,14.5,24.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Last of the Wild Horses",1948,84,NA,2,45,45.5,24.5,4.5,4.5,4.5,0,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Last to Surrender",1998,95,NA,3.9,51,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Lastikman",2003,105,NA,7,5,0,0,0,0,24.5,0,44.5,44.5,0,0,"",1,0,1,0,0,0,0 -"Lat sau wui cheun",2000,92,NA,6.1,58,4.5,4.5,4.5,14.5,14.5,4.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lata dwudzieste, lata trzydzieste",1983,102,NA,5.4,7,0,0,0,14.5,14.5,14.5,24.5,0,0,24.5,"",0,0,1,0,0,1,0 -"Latajace machiny kontra pan Samochodzik",1991,82,NA,7.6,5,0,24.5,0,0,0,0,24.5,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Latchkey",2004,17,NA,8.7,17,4.5,0,0,0,4.5,0,0,4.5,34.5,44.5,"",0,0,0,1,0,0,1 -"Latcho Drom",1993,103,NA,7.4,271,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Late Bloomer",2004,13,12000,9,6,0,0,0,0,14.5,0,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Late Bloomers",1996,104,NA,6.1,96,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Late Breaking News",2004,86,NA,9,9,0,0,0,0,0,0,0,24.5,45.5,24.5,"",0,0,0,0,1,0,0 -"Late Edwina Black, The",1951,78,NA,5.8,6,0,0,14.5,0,14.5,14.5,0,45.5,0,0,"",0,0,0,1,0,0,0 -"Late Flowering Love",1980,21,NA,8.4,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,1,0,0,1 -"Late George Apley, The",1947,97,NA,7.1,85,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Late Great Planet Earth, The",1979,90,NA,3.5,60,24.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Late Night Sessions",1999,82,NA,3.9,14,24.5,4.5,4.5,14.5,0,4.5,4.5,24.5,0,14.5,"R",0,0,0,0,0,0,0 -"Late Night Shopping",2001,91,NA,6.8,535,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Late One Night",2001,33,NA,3.9,22,14.5,4.5,14.5,0,0,0,4.5,14.5,0,44.5,"",0,0,0,1,0,0,1 -"Late Show",1999,111,NA,5.7,387,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Late Show, The",1977,94,NA,6.6,302,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Late Summer",2001,28,NA,8.1,8,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,0,0,1,0,0,1 -"Late Veracity",2002,20,50000,8,5,24.5,0,0,0,0,0,0,0,24.5,64.5,"",0,0,0,1,0,0,1 -"Late Watch",2004,80,NA,4.2,36,4.5,4.5,0,4.5,0,4.5,4.5,4.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Laterna ftoheia kai filotimo",1955,91,NA,8.2,39,0,0,0,0,4.5,4.5,4.5,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Laterna ftoheia kai garyfallo",1957,86,NA,6.7,23,4.5,0,4.5,4.5,0,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Latin Boys Go to Hell",1997,67,NA,4.9,107,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Latin Lovers",1953,104,NA,4.3,40,14.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Latin Quarter",1946,72,NA,6.1,10,0,0,14.5,0,24.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Latino Bar",1991,84,NA,7.2,17,0,4.5,4.5,0,4.5,0,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Latitude Zero",2000,85,NA,9.3,39,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Lato milosci",1995,86,NA,5.8,16,0,14.5,4.5,14.5,4.5,0,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Latter Days",2003,107,850000,7.3,1396,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"R",0,0,1,1,0,1,0 -"Latter-Day Saint Leaders: Past and Present",1948,21,NA,5,6,0,14.5,0,14.5,0,0,14.5,0,0,45.5,"",0,0,0,0,1,0,1 -"Lau man bye biu",2000,98,NA,5.9,7,0,0,0,14.5,24.5,24.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Lau sing yue",1999,110,NA,6.8,22,0,0,0,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Laud Weiner",2001,4,NA,5.3,5,0,24.5,0,0,24.5,24.5,0,0,24.5,24.5,"",0,0,1,0,0,0,1 -"Lauderdale",1989,91,NA,3.7,54,14.5,14.5,4.5,14.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Lauf der Dinge, Der",1987,30,NA,7.3,120,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Lauf der Dinge, Der",1992,5,NA,5.3,15,0,4.5,0,0,4.5,14.5,4.5,24.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Laugh and Get Rich",1931,72,NA,6.1,30,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Laugh, Clown, Laugh",1928,73,NA,8,172,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Laughing Anne",1954,90,NA,4,5,0,0,0,84.5,0,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Laughing Boy",1934,78,NA,2.5,9,34.5,34.5,14.5,0,0,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Laughing Dead",1998,85,200000,7.6,22,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Laughing Dead, The",1989,103,NA,3.6,58,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Laughing Gas",1914,16,NA,6.2,50,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Laughing Gas",1931,6,NA,6.5,7,0,0,0,0,14.5,44.5,24.5,0,14.5,0,"",0,1,1,0,0,0,1 -"Laughing Gravy",1931,31,NA,7.2,138,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Laughing Irish Eyes",1936,70,NA,1.3,8,74.5,14.5,0,0,0,14.5,0,0,0,0,"",0,0,1,0,0,1,0 -"Laughing Policeman, The",1973,112,NA,6,287,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Laughing Sinners",1931,72,NA,5.4,75,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Laughing at Life",1933,71,NA,5.1,6,14.5,0,14.5,0,0,64.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Laughter",1930,85,NA,6,20,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Laughter in Paradise",1951,93,NA,7.1,113,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Laughter in the Dark",1969,104,NA,6.6,11,4.5,0,0,0,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Laughter of God, The",1990,88,NA,5.8,18,0,14.5,0,0,24.5,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Laughterhouse",1984,89,NA,6.4,22,4.5,0,4.5,0,4.5,4.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Laukaus tehtaalla",1973,79,NA,6.7,7,14.5,0,0,14.5,14.5,0,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Laulu tulipunaisesta kukasta",1938,110,NA,8.4,14,0,0,0,0,4.5,4.5,44.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Laulu tulipunaisesta kukasta",1971,92,NA,6.6,11,0,0,4.5,0,14.5,24.5,4.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Laundry",2002,126,NA,7.4,71,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Laura",1944,88,NA,8.2,4632,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,1,0 -"Laura Cadieux... la suite",1999,98,NA,5,68,14.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lauras Stern",2004,80,NA,6.2,37,0,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Laure",1975,95,NA,5.1,20,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Laureati, I",1995,88,NA,5.8,100,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Laurel Canyon",2002,103,NA,6.5,2614,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Laurel and Hardy's Laughing 20's",1965,91,NA,7.8,65,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Laurel-Hardy Murder Case, The",1930,30,NA,7.2,118,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Laurin",1989,80,NA,6.7,55,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Lausbubengeschichten",1964,102,NA,6.1,34,0,4.5,0,4.5,24.5,14.5,24.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Lautlos",2004,94,NA,6.5,120,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Lautrec",1998,128,NA,7.2,132,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lava",2002,96,NA,4.9,56,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lavender Hill Mob, The",1951,81,NA,7.8,1876,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Lavina",1982,153,NA,8.2,16,0,0,0,0,0,0,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Lavirint",2002,119,NA,7,69,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Lavorare con lentezza",2004,111,NA,6.9,55,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lavoura Arcaica",2001,171,NA,7.9,165,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Law West of Tombstone, The",1938,73,NA,6.7,21,0,0,4.5,0,4.5,44.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Law and Disorder",1958,76,NA,5.8,33,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Law and Disorder",1974,99,NA,6.3,46,4.5,4.5,4.5,4.5,4.5,14.5,44.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Law and Jake Wade, The",1958,86,NA,6.5,179,4.5,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Law and Order",1932,75,NA,7.6,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Law and Order",1953,80,NA,3.9,60,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,0,4.5,"",1,0,0,0,0,1,0 -"Law and the Lady, The",1951,104,NA,5.9,35,0,0,4.5,14.5,4.5,4.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Law in Her Hands, The",1936,58,NA,5.4,19,4.5,0,0,24.5,24.5,24.5,34.5,0,0,0,"",0,0,1,1,0,0,0 -"Law of Enclosures, The",2000,111,NA,6.9,87,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Law of the Badlands",1951,59,NA,5.2,12,0,14.5,0,4.5,14.5,14.5,0,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Law of the Canyon",1947,56,NA,5.7,5,0,0,0,44.5,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Law of the Jungle",1942,61,NA,5.6,14,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Law of the Lawless",1964,87,NA,4.9,28,4.5,0,14.5,24.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Law of the Pampas",1939,72,NA,7.4,15,0,0,0,0,14.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Law of the Underworld",1938,58,NA,6.1,7,0,14.5,14.5,14.5,0,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Law of the Wild",1934,225,NA,5.4,7,0,0,0,0,14.5,24.5,44.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Law vs. Billy the Kid, The",1954,72,NA,3.7,15,0,14.5,24.5,14.5,24.5,24.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Lawa. Opowiesc o 'Dziadach' Adama Mickiewicza.",1989,133,NA,7.4,13,0,0,0,0,0,34.5,14.5,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Laweczka",2004,84,NA,4.6,33,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,1,0 -"Lawless Breed, The",1953,83,NA,5.9,69,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lawless Eighties, The",1957,70,NA,5.9,5,0,0,24.5,0,44.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Lawless Empire",1945,58,NA,5.1,11,0,0,0,34.5,4.5,0,34.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Lawless Frontier, The",1934,52,NA,4.3,82,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lawless Heart, The",2001,86,NA,7,434,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Lawless Land, The",1988,81,NA,4,11,4.5,4.5,24.5,14.5,4.5,0,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Lawless Nineties, The",1936,55,NA,3.4,28,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Lawless Range",1935,53,NA,4.2,67,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Lawless Rider, The",1954,62,NA,3.2,9,44.5,14.5,0,0,14.5,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Lawless Riders",1935,58,NA,5.5,6,0,0,0,34.5,34.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Lawless Street, A",1955,78,NA,6.2,48,0,0,0,14.5,14.5,34.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Lawless Valley",1938,59,NA,5.5,11,0,0,0,4.5,14.5,34.5,24.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Lawless, The",1950,83,NA,6.8,29,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lawman",1971,99,NA,6.5,311,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lawn Dogs",1997,101,8000000,7.5,1856,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Lawnmower Man 2: Beyond Cyberspace",1996,92,NA,2.4,2303,45.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Lawnmower Man, The",1987,12,5000,5.6,17,14.5,0,14.5,0,24.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Lawnmower Man, The",1992,140,10000000,5,5799,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Lawrence of Arabia",1962,227,15000000,8.6,31230,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Laws of Attraction",2004,90,28000000,5.7,2349,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Laws of Deception",1997,98,NA,4.7,94,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Laws of Gravity",1992,100,38000,6.5,283,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lawyer Man",1933,68,NA,6.8,49,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lawyer, The",1970,120,NA,6,31,0,0,4.5,4.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Laxdale Hall",1953,77,NA,7.2,9,0,0,0,0,24.5,0,34.5,34.5,0,14.5,"",0,0,1,0,0,1,0 -"Lay It Down",2001,50,NA,2.3,30,24.5,24.5,0,4.5,0,4.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Lay of the Land, The",1997,94,NA,2.7,14,24.5,4.5,0,24.5,0,4.5,14.5,24.5,0,0,"R",0,0,1,1,0,0,0 -"Layer Cake",2004,105,NA,7.1,1671,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Layin' Low",1996,96,NA,3.3,32,24.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Laying the Ghost",1991,85,NA,6.2,6,0,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Layover",2001,95,NA,4.4,70,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Lazarillo de Tormes, El",1959,114,NA,7.1,17,14.5,0,0,0,4.5,14.5,4.5,14.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Lazarus",1994,87,NA,4,11,24.5,0,0,0,14.5,24.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Lazy River",1934,75,NA,4.5,14,0,4.5,24.5,24.5,4.5,14.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Lazy Sunday Afternoon",1999,10,NA,5.5,13,0,0,0,4.5,34.5,0,34.5,14.5,0,4.5,"",0,1,0,0,0,0,1 -"Lazybones",1925,80,NA,7.4,10,0,14.5,0,0,14.5,0,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Lazybones",1935,65,NA,5,7,0,0,0,0,44.5,14.5,0,24.5,0,14.5,"",0,0,1,0,0,1,0 -"Lbs.",2004,99,NA,8.5,13,0,0,4.5,0,0,4.5,0,14.5,34.5,34.5,"",0,0,1,1,0,0,0 -"Le Ball and Chain Gang",1968,6,NA,5.3,5,0,24.5,0,24.5,0,64.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Le Mans",1971,106,NA,6.3,742,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Le Petomane",1979,33,NA,7.7,18,4.5,0,4.5,0,14.5,0,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Le llamaban J.R.",1982,90,NA,1.7,7,74.5,14.5,0,0,14.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Le'an Ne'elam Daniel Wax?",1972,94,NA,8,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,1,0,0,0 -"Lea",1996,100,NA,7.6,127,4.5,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Lead Shoes",1949,18,NA,6.6,5,0,0,24.5,24.5,0,0,64.5,0,0,0,"",0,0,0,0,0,0,1 -"Leadbelly",1976,126,NA,6.3,87,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Leader",1964,176,NA,8.7,6,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Leader of the Band",1987,90,NA,5.2,22,24.5,4.5,0,4.5,4.5,4.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Leader, His Driver and the Driver's Wife, The",1991,85,NA,6.2,20,0,4.5,0,0,0,4.5,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Leading Man, The",1996,95,NA,5.9,420,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"League of Extraordinary Gentlemen, The",2003,110,78000000,5.4,15647,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"League of Gentlemen, The",1959,116,NA,7.4,321,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"League of Ordinary Gentlemen, A",2004,93,NA,6.1,23,4.5,4.5,4.5,4.5,14.5,0,4.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"League of Their Own, A",1987,27,NA,7.6,5,0,0,24.5,0,0,0,24.5,24.5,0,44.5,"",0,0,0,0,1,0,1 -"League of Their Own, A",1992,128,40000000,6.9,14318,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Lean on Me",1989,104,NA,6.9,2451,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Leandras, Las",1969,109,NA,5.5,13,4.5,0,0,24.5,14.5,14.5,4.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Leap Year",1921,60,NA,6,17,0,0,4.5,4.5,0,24.5,24.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Leap of Faith",1992,108,NA,5.9,2627,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Leap of Faith, A",1996,86,NA,5.9,37,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,0,0,1,0,0 -"Leapin' Leprechauns",1995,84,NA,3.6,57,24.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,14.5,"PG",0,0,0,0,0,0,0 -"Learn Polikeness",1938,7,NA,5.4,14,4.5,4.5,0,4.5,14.5,4.5,24.5,4.5,0,24.5,"",0,1,1,0,0,0,1 -"Learning Curve, The",2001,113,1000000,5.2,177,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Learning Tree, The",1969,107,NA,6.5,113,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Learning to Swim",1999,20,NA,9.3,7,0,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Lease of Life",1954,94,NA,6.4,26,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Least of These, The",2002,20,NA,6.8,64,0,4.5,0,0,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,1 -"Leather Boys, The",1964,108,NA,6.7,59,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Leather Burners, The",1943,58,NA,6.4,21,4.5,0,0,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",1,0,0,0,0,0,0 -"Leather Jacket Love Story",1997,85,67000,6.1,110,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Leather Jackets",1992,90,NA,3.7,135,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Leather and Iron",2002,90,650000,5.5,6,34.5,14.5,0,0,0,0,0,0,14.5,34.5,"",1,0,0,1,0,0,0 -"Leatherface: Texas Chainsaw Massacre III",1990,85,NA,4,1008,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Leatherneck, The",1929,65,NA,6.8,5,0,0,0,24.5,0,24.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Leathernecks Have Landed, The",1936,67,NA,4.8,11,14.5,0,0,14.5,4.5,34.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Leave 'Em Laughing",1928,21,NA,7.1,52,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Leave Her to Heaven",1945,110,NA,7.5,650,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Leave It to Beaver",1997,84,NA,4.7,518,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"Leave It to Blondie",1945,72,NA,6.2,26,0,0,14.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Leave It to the Irish",1944,71,NA,1.7,8,74.5,14.5,0,0,0,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Leave It!",2002,28,30000,8.8,10,14.5,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,1,1,0,1,1 -"Leave Well Enough Alone",1939,6,NA,7.3,5,0,0,24.5,0,0,0,0,24.5,24.5,44.5,"",0,1,1,0,0,0,1 -"Leaving Drew",2000,21,NA,5.4,6,0,0,0,0,14.5,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Leaving Jerusalem by Railway",1896,1,NA,7,32,4.5,0,0,0,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Leaving Las Vegas",1995,111,4000000,7.5,18027,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Leaving Metropolis",2002,89,NA,6.4,136,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Leaving Normal",1992,110,NA,6.4,411,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Leaving Peoria",2000,30,NA,6.7,6,0,14.5,0,14.5,0,0,34.5,0,0,34.5,"",0,0,0,0,0,0,1 -"Leaving Scars",1997,90,NA,2.8,18,24.5,14.5,14.5,14.5,24.5,0,0,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Lebedyne ozero-zona",1990,96,NA,5.6,23,14.5,0,4.5,4.5,0,4.5,4.5,4.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Leben ist eine Baustelle., Das",1997,115,NA,7.4,567,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Leben lang kurze Hosen tragen, Ein",2002,86,NA,7.5,72,4.5,4.5,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lebensborn",1997,98,NA,5.8,33,4.5,4.5,0,4.5,4.5,14.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lebenspornografie",2004,89,NA,6.6,8,24.5,0,0,0,0,0,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lebewohl, Fremde",1991,100,NA,9.5,8,0,0,0,0,0,0,14.5,14.5,0,74.5,"",0,0,0,0,0,0,0 -"Lector",2000,19,NA,7,10,34.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Lectrice, La",1988,97,NA,7.1,323,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Lecture on Camouflage, A",1944,3,NA,6,5,0,0,0,0,44.5,24.5,0,44.5,0,0,"",0,1,0,0,0,0,1 -"Ledi Makbet Mtsenskogo uyezda",1989,76,NA,6.5,13,0,0,0,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ledina",2003,78,NA,5.7,9,14.5,14.5,14.5,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lee Chang-houi wingudan",1986,125,NA,2.6,8,45.5,14.5,0,0,24.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Lee Jae-sueui nan",1999,100,NA,4.6,28,0,0,14.5,24.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Leech Woman, The",1960,77,NA,2.9,262,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Leeches!",2003,85,NA,2.4,129,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Leedvermaak",1989,92,NA,5.1,24,0,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Leela",2002,97,NA,6.8,41,0,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Leeuw van Vlaanderen, De",1985,90,NA,5.5,106,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lef",1999,90,NA,5.1,95,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Left Hand of God, The",1955,87,NA,6.1,298,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Left Handed Gun, The",1958,102,NA,6.4,339,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Left Luggage",1998,100,NA,7.4,834,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Left Right and Centre",1959,95,NA,6.7,31,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Left Turn",2001,15,NA,6.1,36,4.5,4.5,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Leftenan Adnan",2000,127,8000000,7.6,16,14.5,0,0,0,4.5,14.5,24.5,14.5,0,24.5,"",0,0,0,0,0,1,0 -"Lefteris",1994,107,NA,7.2,20,0,0,0,4.5,0,24.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Lefty-Right",2002,50,NA,6.8,6,14.5,0,0,0,14.5,0,14.5,0,34.5,14.5,"",0,0,1,1,0,0,0 -"Legacy of Blood",1978,82,NA,3.2,19,24.5,14.5,24.5,14.5,14.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Legacy of Satan",1976,68,NA,1.9,9,24.5,24.5,34.5,0,0,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Legacy, The",1978,102,2500000,5,241,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Legacy: Murder & Media, Politics & Prisons, The",1999,76,NA,6.2,7,0,0,0,0,0,24.5,0,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Legado",2004,70,NA,6.2,5,0,0,24.5,0,0,44.5,24.5,0,24.5,0,"",0,0,0,0,1,0,0 -"Legal Briefs",1993,95,NA,4.9,9,0,14.5,0,34.5,24.5,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Legal Deceit",1997,93,NA,2.7,23,44.5,14.5,0,4.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Legal Eagles",1986,116,35000000,5.6,2132,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Legal Tender",1991,95,NA,3.2,28,14.5,14.5,24.5,14.5,4.5,0,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Legally Blonde",2001,96,18000000,6.4,17572,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Legally Blonde 2: Red, White & Blonde",2003,95,45000000,4.4,6293,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Legally Desi",2004,140,NA,4.8,5,44.5,24.5,0,0,0,0,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Legend",1985,89,25000000,6.1,7744,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Legend of Alfred Packer, The",1980,93,NA,4.2,12,4.5,0,14.5,0,24.5,14.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Legend of Bagger Vance, The",2000,126,60000000,6.4,7123,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Legend of Bhagat Singh, The",2002,155,NA,7.8,94,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Legend of Billie Jean, The",1985,96,NA,5.5,1142,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Legend of Black Thunder Mountain, The",1979,83,NA,5.3,9,34.5,0,14.5,0,0,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Legend of Blood Mountain, The",1965,65,750000,1.1,19,64.5,14.5,0,0,0,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Legend of Boggy Creek, The",1973,85,100000,4.3,273,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Legend of Coyote Rock, The",1945,7,NA,6.7,22,0,0,4.5,4.5,4.5,45.5,4.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Legend of Cryin' Ryan, The",1998,92,NA,5.4,37,4.5,4.5,0,0,4.5,14.5,14.5,4.5,4.5,34.5,"PG",0,0,0,0,0,0,0 -"Legend of Diablo, The",2004,85,NA,1.4,23,74.5,14.5,0,0,0,0,0,0,4.5,4.5,"R",0,0,0,0,0,0,0 -"Legend of Dolemite, The",1994,75,NA,6,16,4.5,4.5,0,0,14.5,24.5,34.5,0,0,14.5,"",0,0,1,0,1,0,0 -"Legend of Earl Durand, The",1974,110,NA,5.2,8,0,0,0,24.5,14.5,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Legend of Gator Face, The",1996,99,NA,4.5,43,4.5,14.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Legend of Grizzly Adams, The",1990,76,NA,3,6,14.5,14.5,14.5,0,14.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Legend of Hell House, The",1973,95,NA,7,1100,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Legend of Hillbilly John, The",1974,89,NA,5,13,0,4.5,4.5,0,24.5,34.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Legend of Johnny Lingo, The",2003,91,NA,5.5,69,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Legend of Lady Blue",1979,90,NA,3.7,15,24.5,4.5,0,4.5,24.5,14.5,0,0,24.5,4.5,"",0,0,0,1,0,0,0 -"Legend of Leigh Bowery, The",2002,60,NA,6.5,18,0,0,0,0,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Legend of Lobo, The",1962,67,NA,6.1,48,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Legend of Loch Lomond, The",2001,38,NA,7.1,8,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,1,0,0,1 -"Legend of Lylah Clare, The",1968,130,NA,5.9,143,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Legend of Nigger Charley, The",1972,98,NA,5.5,27,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Legend of Razorback, The",2002,25,50000,5.1,29,4.5,4.5,0,0,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Legend of Rockabye Point, The",1955,6,NA,7.7,21,0,0,0,0,4.5,4.5,4.5,14.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Legend of Tom Dooley, The",1959,79,NA,5,30,0,4.5,14.5,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Legend of Wolf Mountain, The",1993,91,NA,4.2,26,14.5,14.5,0,4.5,14.5,24.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Legend of the 7 Golden Vampires, The",1974,83,NA,5.6,384,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Legend of the Boy and the Eagle, The",1967,48,NA,9.5,8,0,0,0,0,0,14.5,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Legend of the Flying Canoe, The",1996,11,NA,5.7,7,0,0,24.5,0,14.5,14.5,0,14.5,24.5,0,"",0,1,0,0,0,0,1 -"Legend of the Lone Ranger, The",1952,74,NA,7.9,26,0,0,0,4.5,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Legend of the Lone Ranger, The",1981,98,18000000,4.3,307,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Legend of the Lost",1957,109,1750000,4.8,195,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Legend of the Mummy",1997,96,2000000,2.4,257,34.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Legend of the Phantom Rider",2002,100,NA,5.8,59,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Legend of the Sky Kingdom, The",2004,73,NA,4.8,5,0,24.5,24.5,0,0,44.5,24.5,0,0,0,"",0,1,0,0,0,0,0 -"Legend of the Spirit Dog",1997,86,NA,3,19,14.5,14.5,0,0,4.5,4.5,0,24.5,0,34.5,"PG",0,0,0,1,0,0,0 -"Legend of the Werewolf",1975,85,NA,4.4,101,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Legenda o Tile",1976,311,NA,9.1,28,0,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Legendary Champions",1968,77,NA,8.2,5,0,0,0,0,0,64.5,0,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Legende von Paul und Paula, Die",1973,105,NA,7.3,153,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Legends of the Fall",1994,133,30000000,6.7,13327,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Legends of the North",1995,96,NA,4.2,19,14.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,0,"PG",0,0,1,1,0,0,0 -"Legends: The Who",1997,60,NA,5.5,13,14.5,0,0,0,4.5,0,4.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Legge dei gangsters, La",1969,95,NA,3.3,7,0,24.5,14.5,0,14.5,14.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Legge, La",1959,121,NA,6.3,52,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Leggenda del pianista sull'oceano, La",1998,120,9000000,7.6,3599,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Leggenda del rubino malese, La",1985,95,NA,3.3,25,24.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,0,"",1,0,0,0,0,0,0 -"Leggenda del santo bevitore, La",1988,127,NA,7.1,151,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Leggenda di Al, John e Jack, La",2002,105,NA,5.7,202,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Leggenda di Enea, La",1962,95,NA,4.4,38,0,4.5,14.5,14.5,14.5,34.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Leghorn Blows at Midnight, The",1950,7,NA,6.5,32,0,0,0,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Leghorn Swoggled",1951,7,NA,7,22,0,0,0,0,24.5,4.5,14.5,44.5,0,4.5,"",0,1,1,0,0,0,1 -"Legion of the Dead",2001,92,2700000,3.4,374,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Legion of the Lawless",1940,59,NA,5.7,5,0,0,0,0,24.5,44.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Legion of the Night",1995,85,80000,4,27,24.5,4.5,14.5,4.5,14.5,4.5,0,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Legione dei dannati, La",1969,94,NA,3.9,25,4.5,4.5,14.5,24.5,24.5,4.5,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Legioni di Cleopatra, Le",1960,91,NA,4.9,15,0,0,4.5,24.5,24.5,44.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Legionnaire",1998,98,35000000,4.5,1773,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Legong: Dance of the Virgins",1935,53,NA,8.1,12,0,0,0,0,4.5,4.5,44.5,24.5,4.5,4.5,"",0,0,0,1,0,1,1 -"Legs Apart",2000,5,NA,3.9,14,14.5,14.5,4.5,24.5,24.5,0,0,0,0,24.5,"",0,0,0,1,0,0,1 -"Legwork",2002,36,NA,8.5,11,4.5,0,0,0,0,0,4.5,14.5,4.5,45.5,"",0,0,0,1,0,0,1 -"Lei ting zhan jing",2000,92,NA,5.1,404,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Lei yu",1957,124,NA,6.2,6,0,0,0,0,0,34.5,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Leiden des jungen Werthers, Die",1976,105,NA,5.6,9,14.5,14.5,24.5,0,0,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Leif",1987,108,NA,5.9,140,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Leif Erickson, Discoverer of North America",2000,85,NA,5.5,6,34.5,0,14.5,0,0,0,0,14.5,0,34.5,"",0,1,0,0,0,0,0 -"Leihmann, Der",1994,85,NA,3.6,7,0,24.5,24.5,0,24.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Leikkikalugangsteri",1969,88,NA,5.7,33,0,4.5,4.5,4.5,34.5,24.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Leila",1996,110,NA,7.7,187,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Leila Diniz",1987,90,NA,9.3,39,0,0,0,4.5,0,4.5,4.5,4.5,44.5,34.5,"",0,0,0,1,0,0,0 -"Leila Sakhina",1994,120,NA,4.1,7,0,14.5,0,0,0,0,0,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Leily Ba Man Ast",1996,95,NA,8.1,20,0,0,0,0,0,4.5,4.5,14.5,34.5,44.5,"",0,0,0,0,0,0,0 -"Leise Krieger",2004,28,NA,6.3,6,14.5,0,0,14.5,0,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,1 -"Leise Schatten",1992,91,NA,6.2,8,0,0,0,0,0,45.5,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Leise flehen meine Lieder",1933,85,NA,7.9,13,0,4.5,4.5,0,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Lek",2000,105,NA,7.2,911,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Lekarstwo na milosc",1966,95,NA,7.2,22,0,0,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Lekin...",1990,171,NA,8.5,27,4.5,0,0,4.5,4.5,0,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Lektionen in Finsternis",1992,50,NA,8.4,184,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Lemming Aid",1994,12,NA,5.6,14,0,0,0,0,45.5,0,14.5,14.5,14.5,4.5,"",0,0,1,1,0,0,1 -"Lemmy",2002,111,NA,8.9,8,0,0,0,0,14.5,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Lemmy pour les dames",1961,97,NA,5.9,17,4.5,4.5,0,0,14.5,14.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Lemon",1969,8,NA,6.1,13,14.5,0,0,4.5,4.5,4.5,0,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Lemon Crush",2002,15,NA,6.6,16,4.5,0,0,14.5,4.5,34.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,1,1 -"Lemon Drop Kid, The",1934,71,NA,5.9,13,0,0,0,4.5,34.5,4.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Lemon Drop Kid, The",1951,91,NA,7,249,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Lemon Grove Kids Meet the Monsters",1965,78,NA,2.8,31,24.5,4.5,4.5,4.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Lemon Sisters, The",1990,93,NA,4.2,357,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Lemonade Stand, The",2002,20,NA,8,7,0,0,0,14.5,0,0,0,45.5,0,24.5,"",0,0,0,0,0,0,1 -"Lemonade Stories",2004,46,NA,9,8,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Lemony Snicket's A Series of Unfortunate Events",2004,108,125000000,6.7,8402,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,0,0,0,0 -"Lemora: A Child's Tale of the Supernatural",1975,113,NA,5.9,154,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Lena",2001,108,NA,7.3,57,0,0,4.5,4.5,14.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lena's Dreams",1997,86,NA,4,18,14.5,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lena's Holiday",1991,100,NA,4.9,70,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lena's Spaghetti",1994,23,NA,3.2,5,0,0,24.5,24.5,24.5,0,0,24.5,0,24.5,"",0,0,0,1,0,0,1 -"Lend a Paw",1941,8,NA,7.3,38,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Leneged Einayim Ma'araviyot",1996,95,NA,7.6,16,0,0,14.5,0,0,4.5,14.5,34.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Leng mian hu",1973,70,NA,9.8,8,0,0,0,0,0,0,0,14.5,0,84.5,"",1,0,0,0,0,0,0 -"Lengua asesina, La",1996,98,4000000,4,244,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Lengua de las mariposas, La",1999,96,NA,7.3,1258,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Lengvai ir saldziai",2004,23,NA,7.8,11,4.5,0,0,0,4.5,4.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Leni Riefenstahl im Sudan",2000,60,NA,1.2,11,64.5,0,0,14.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Lenin v 1918 godu",1939,130,NA,6.7,13,0,0,4.5,0,14.5,24.5,4.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Lenin v Parizhe",1980,106,NA,7.6,69,0,0,0,0,0,4.5,45.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Lenin v Polshe",1966,98,NA,7.1,21,0,4.5,0,0,0,0,34.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Lenin v oktyabre",1937,103,NA,5.6,11,0,0,0,0,24.5,4.5,14.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Lenin, din gavtyv",1972,82,NA,3.1,10,45.5,0,14.5,0,24.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Leningrad Cowboys Go America",1989,78,NA,6.6,926,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Leningrad Cowboys Meet Moses",1994,94,NA,4.7,154,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lenny",1974,111,NA,7.5,2145,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lenny Bruce Without Tears",1972,78,NA,5.6,15,4.5,4.5,0,0,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Lenny Bruce: Performance Film",1967,72,NA,6.6,28,0,0,0,4.5,14.5,4.5,34.5,14.5,14.5,24.5,"",0,0,1,0,1,0,0 -"Lenny Bruce: Swear to Tell the Truth",1998,100,NA,8.4,163,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Lenny Live and Unleashed",1989,97,NA,5.5,17,0,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Leo",2000,92,NA,6.3,48,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Leo",2002,103,NA,6.4,137,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Leo & Lance",1983,86,NA,8.1,7,0,0,0,0,0,0,14.5,45.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Leo and Loree",1980,97,NA,4.4,19,24.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Leo es pardo",1976,10,NA,8,7,0,0,0,0,0,14.5,0,74.5,0,14.5,"",0,0,0,0,0,0,1 -"Leo the Last",1970,104,NA,5.7,76,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Leo the Lion",1994,45,NA,5,5,24.5,0,24.5,24.5,0,0,0,24.5,24.5,0,"",0,1,0,0,0,0,0 -"Leo und Claire",2001,103,NA,7.2,49,4.5,4.5,14.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Leon the Pig Farmer",1993,98,NA,5.6,157,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Leonard Part 6",1987,85,NA,2.3,2207,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Leonard-Cushing Fight",1894,1,NA,4.4,20,4.5,0,14.5,14.5,24.5,14.5,14.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Leonarduv denik",1972,12,NA,6.4,29,0,4.5,0,0,24.5,14.5,24.5,24.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Leone di Tebe",1964,89,NA,4.8,23,4.5,4.5,24.5,4.5,24.5,14.5,4.5,0,4.5,14.5,"",1,0,0,1,0,0,0 -"Leonie",1997,11,NA,6.7,24,14.5,24.5,4.5,4.5,0,4.5,0,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Leonor",1975,90,NA,2.5,14,14.5,14.5,0,14.5,4.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Leonora",1984,85,NA,8,5,0,0,0,24.5,0,0,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Leopard Man, The",1943,66,NA,6.8,298,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Leopard Son, The",1996,87,NA,7.3,64,4.5,0,0,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Leopard in the Snow",1978,94,NA,5,23,14.5,0,4.5,14.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Leopardi di Churchill, I",1970,80,NA,3.5,10,0,24.5,24.5,14.5,34.5,0,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Lepa sela lepo gore",1996,115,NA,7.5,958,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Lepiej byc piekna i bogata",1993,98,NA,5.1,7,0,14.5,0,0,0,24.5,0,14.5,44.5,0,"",0,0,1,0,0,0,0 -"Lepke",1975,110,NA,4.8,50,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lepota poroka",1986,105,NA,7.9,74,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Leprechaun",1993,92,900000,3.6,2288,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Leprechaun 2",1994,86,2000000,3.6,648,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lepsie byt bohaty a zdravy ako chudobny a chory",1993,108,NA,7.6,10,0,0,0,0,24.5,14.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Leptirov oblak",1977,92,NA,5.3,6,0,0,14.5,14.5,34.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Les Chiefs",2004,90,NA,7.7,14,0,0,0,0,4.5,4.5,4.5,24.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Les Girls",1957,114,NA,6.7,297,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Les Milles",1995,103,NA,6.3,54,0,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Les Pantless Menace",1999,4,NA,5.2,43,4.5,4.5,4.5,0,14.5,24.5,14.5,4.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Les Patterson Saves the World",1987,98,NA,3.8,69,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lesbianas de Buenos Aires",2004,82,NA,6.6,26,14.5,4.5,4.5,0,4.5,0,0,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Lesbo-A-Go-Go",2003,50,NA,6.8,12,4.5,0,0,14.5,4.5,14.5,4.5,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Less Like Me",2004,121,30000,7.6,25,24.5,0,0,0,0,0,0,4.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Less Than Zero",1987,98,NA,5.6,2283,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lesser Evil, The",1912,17,NA,6.1,8,0,14.5,0,0,34.5,0,24.5,24.5,0,0,"",0,0,0,1,0,0,1 -"Lesser Evil, The",1998,96,NA,6.9,226,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Lesser Prophets",1997,100,NA,5.7,111,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Lesson in Love, A",1931,10,NA,5.3,8,0,0,0,14.5,24.5,45.5,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Lessons for an Assassin",2001,84,NA,2.5,16,34.5,14.5,24.5,4.5,0,0,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Lestnitsa",1989,114,NA,7.7,6,0,0,0,0,0,14.5,14.5,45.5,14.5,0,"",0,0,0,1,0,0,0 -"Let 'em Have It",1935,96,NA,6.9,9,0,0,0,24.5,0,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Let Freedom Ring",1939,87,NA,6.1,24,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Let George Do It",1940,82,NA,6.4,22,4.5,4.5,0,4.5,4.5,4.5,24.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Let Go",2003,5,NA,7.4,7,24.5,0,0,0,0,0,0,0,0,74.5,"",0,1,0,0,0,0,1 -"Let Him Have It",1991,115,NA,7.2,399,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Let It Be",1970,81,NA,7.3,615,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Let It Be Me",1936,8,NA,6.2,13,0,0,0,4.5,24.5,14.5,34.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Let It Come Down: The Life of Paul Bowles",1998,75,NA,7.4,27,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Let It Ride",1989,87,NA,6.3,1079,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Let Me Call You Sweetheart",1932,9,NA,4.7,8,0,0,14.5,24.5,34.5,24.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Let Me Die a Woman",1978,79,NA,4.3,41,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Let Me Dream Again",1900,1,NA,6.1,31,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,0,"",0,0,1,0,0,0,1 -"Let Me In, I Hear Laughter",2000,65,NA,7.8,12,24.5,0,0,0,4.5,0,0,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Let Me Tell Ya 'Bout Black Chicks",1985,69,NA,3.6,9,14.5,14.5,0,0,24.5,0,0,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Let My Puppets Come",1976,45,NA,3.2,30,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Let No Man Write My Epitaph",1960,105,NA,5.9,45,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Let Sleeping Dogs Lie",1995,17,NA,8.2,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,0,0,0,1 -"Let There Be Light",1946,58,NA,7.6,41,0,4.5,0,0,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Let Us Be Gay",1930,79,NA,7.1,58,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Let Us Live!",1939,69,NA,7,6,0,0,0,14.5,14.5,14.5,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Let mrtve ptice",1973,88,NA,6.7,6,0,0,0,0,14.5,14.5,34.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Let the Balloon Go",1976,92,NA,7.3,9,14.5,0,0,0,0,0,44.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Let the Church Say, Amen",2004,87,NA,7.3,7,0,0,0,14.5,14.5,0,24.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Let the Devil Wear Black",1999,91,NA,5.2,175,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Let the People Sing",1942,105,NA,7.6,11,0,0,0,0,0,4.5,34.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Let's All Go to the Lobby",1957,1,NA,7,14,0,0,0,4.5,24.5,0,14.5,14.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Let's Be Happy",1957,107,NA,5.9,11,0,4.5,0,0,45.5,0,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Let's Celebrake",1938,7,NA,6.9,10,0,0,24.5,0,0,14.5,34.5,0,14.5,34.5,"",0,1,1,0,0,0,1 -"Let's Dance",1933,11,NA,8,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,0,1,0,0,0,1 -"Let's Dance",1950,112,NA,6,74,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Let's Do It Again",1953,95,NA,5.7,15,14.5,0,0,4.5,4.5,44.5,24.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Let's Do It Again",1975,110,NA,5.9,239,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Let's Do It!",1982,82,NA,2.5,15,24.5,4.5,4.5,4.5,4.5,4.5,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Let's Face It",1943,76,NA,6.4,12,0,4.5,0,14.5,4.5,0,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Let's Get Frank",2003,75,NA,6.1,8,0,0,0,14.5,14.5,34.5,0,14.5,24.5,0,"",0,0,0,0,1,0,0 -"Let's Get Harry",1986,102,NA,4.8,307,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Let's Get Laid",1977,90,NA,4.2,26,24.5,14.5,4.5,4.5,24.5,14.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Let's Get Lost",1988,120,NA,7.8,115,0,4.5,0,0,4.5,4.5,4.5,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Let's Get Lost",1997,96,NA,6.4,121,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Let's Get Movin'",1936,6,NA,6.3,5,0,0,0,0,24.5,0,44.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Let's Get Real!",1999,7,NA,5.7,13,14.5,0,0,14.5,24.5,14.5,0,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Let's Get Tough!",1942,62,NA,5.8,66,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Let's Go Crazy",1951,32,NA,7.9,6,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,1,0,0,0,1 -"Let's Go Native",1930,77,NA,7.1,12,0,0,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Let's Go Navy!",1951,68,NA,6.7,36,0,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Let's Go to the Movies",1949,9,NA,6.3,10,0,0,0,0,14.5,44.5,14.5,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Let's Kill All the Lawyers",1992,103,NA,4,7,44.5,14.5,14.5,0,0,0,0,0,0,24.5,"R",0,0,1,1,0,0,0 -"Let's Kill Uncle",1966,92,NA,6.6,41,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Let's Live a Little",1948,85,NA,5.6,18,0,14.5,4.5,14.5,14.5,44.5,14.5,4.5,0,0,"",0,0,1,0,0,1,0 -"Let's Make It Legal",1951,77,NA,6,55,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Let's Make Love",1960,109,NA,6.1,718,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Let's Make Music",1941,84,NA,5.8,11,4.5,0,0,4.5,4.5,14.5,44.5,0,0,4.5,"",0,0,0,1,0,1,0 -"Let's Rock",1958,79,NA,4.1,21,0,14.5,24.5,4.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Let's Rock Again!",2004,67,NA,9.3,18,4.5,0,0,0,0,4.5,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Let's Scare Jessica to Death",1971,89,NA,5.7,273,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"PG-13",0,0,0,0,0,0,0 -"Let's Sing Again",1936,70,NA,5.6,7,0,0,0,0,44.5,24.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Let's Sing a Song of the West",1947,9,NA,6.5,6,0,0,0,0,14.5,45.5,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Let's Sing along with Popeye",1934,2,NA,4.7,7,0,0,0,24.5,14.5,24.5,0,14.5,0,14.5,"",0,1,0,0,0,0,0 -"Let's Spend the Night Together",1982,95,NA,5.7,93,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Let's Stalk Spinach",1951,6,NA,4.7,5,0,0,24.5,0,24.5,44.5,0,24.5,0,0,"",0,1,1,0,0,0,1 -"Let's Stick Together",1952,7,NA,6.7,13,0,0,4.5,4.5,0,4.5,44.5,4.5,0,24.5,"",0,1,1,0,0,0,1 -"Let's Talk",2002,98,NA,6,17,4.5,0,4.5,4.5,0,24.5,0,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Let's Try Again",1934,67,NA,4.2,19,4.5,14.5,24.5,4.5,14.5,24.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Let's You and Him Fight",1934,6,NA,6.5,12,0,0,0,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Lethal",2005,90,NA,1.8,37,45.5,4.5,4.5,4.5,0,0,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Lethal Games",1990,83,NA,2.3,9,24.5,14.5,0,14.5,14.5,0,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Lethal Girls 2",1995,89,NA,2.8,6,45.5,0,0,0,14.5,14.5,14.5,0,0,0,"",1,0,0,0,0,0,0 -"Lethal Lolita",1993,86,NA,7,5,0,0,0,0,24.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Lethal Ninja",1993,83,NA,2.6,34,45.5,4.5,4.5,4.5,4.5,14.5,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Lethal Orbit",1996,90,NA,3,18,24.5,34.5,14.5,0,4.5,0,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Lethal Pursuit",1988,95,NA,5.1,11,4.5,4.5,4.5,4.5,4.5,0,34.5,0,4.5,4.5,"",1,0,0,1,0,0,0 -"Lethal Seduction",1997,92,NA,1.8,21,24.5,34.5,4.5,4.5,0,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Lethal Target",1999,92,NA,3.9,33,14.5,24.5,4.5,14.5,14.5,0,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Lethal Tender",1997,90,NA,3.9,130,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Lethal Weapon",1987,117,15000000,7.5,20041,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",1,0,1,0,0,0,0 -"Lethal Weapon 2",1989,118,NA,6.9,14997,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Lethal Weapon 3",1992,121,NA,6.3,13780,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Lethal Weapon 4",1998,127,140000000,6.3,17758,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Lethal Woman",1988,83,NA,4.9,5,0,0,64.5,0,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Lethal Woman",1990,96,NA,4,31,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Letheui yeonga",1987,90,NA,1.8,5,84.5,24.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Letniye lyudi",1995,89,NA,4.4,5,0,0,0,24.5,0,44.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Letter From Death Row, A",1998,89,NA,3.8,197,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Letter Without Words, A",1998,62,NA,6.6,7,0,0,0,0,0,24.5,14.5,44.5,0,14.5,"",0,0,0,0,1,0,0 -"Letter for Evie, A",1946,89,NA,6.8,38,4.5,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Letter from a Soldier, A",1951,9,NA,6.9,13,0,0,0,0,24.5,24.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,1 -"Letter from an Unknown Woman",1948,86,NA,7.7,733,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Letter from the Western Front, A",1999,9,NA,6.3,25,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Letter of Introduction",1938,104,NA,5.9,31,0,0,4.5,4.5,34.5,14.5,34.5,14.5,0,0,"",0,0,1,1,0,0,0 -"Letter to Brezhnev",1985,94,NA,6.7,252,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Letter to Jane",1972,52,NA,6.1,26,14.5,0,4.5,4.5,4.5,14.5,14.5,0,4.5,34.5,"",0,0,0,0,1,0,0 -"Letter to Three Wives, A",1949,103,NA,7.7,1012,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Letter to True, A",2004,78,NA,6,23,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Letter, The",1929,65,NA,8.3,30,4.5,0,0,4.5,0,4.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Letter, The",1940,95,NA,7.6,1061,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Letter: An American Town and the 'Somali Invasion', The",2003,76,NA,7.7,64,4.5,0,4.5,0,0,0,4.5,14.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Lettera, La",1997,10,NA,3.8,16,14.5,4.5,0,0,0,14.5,4.5,4.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Lettere al vento",2003,90,NA,7.3,7,0,14.5,0,0,14.5,14.5,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Lettere di una novizia",1960,82,NA,7,10,0,0,0,14.5,0,45.5,0,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Letters",2000,9,NA,5.2,8,14.5,0,24.5,14.5,0,34.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Letters About the Weather",1999,10,NA,5.3,6,0,0,0,14.5,0,0,45.5,0,0,34.5,"",0,0,0,1,0,0,1 -"Letters Not About Love",1997,60,NA,7.5,6,0,0,0,0,34.5,14.5,0,34.5,0,14.5,"",0,0,0,0,1,0,0 -"Letters from a Killer",1998,104,NA,5.5,522,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Letters from the East",1996,110,NA,7.1,15,0,0,0,4.5,0,0,4.5,24.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Letters of Service",2004,13,NA,9.1,9,0,0,0,0,0,0,0,44.5,0,45.5,"",0,0,0,1,0,0,1 -"Letters to Ali",2004,106,NA,6,17,4.5,0,4.5,14.5,14.5,4.5,24.5,14.5,14.5,0,"",0,0,0,0,1,0,0 -"Letters to My Mother's Early Lovers",1999,105,NA,3.6,9,0,0,14.5,0,0,0,14.5,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Letters to an Unknown Lover",1986,101,NA,6.3,17,0,0,0,0,14.5,4.5,0,14.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Letti selvaggi",1979,83,NA,3.8,45,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Letto a tre piazze",1960,105,NA,6.4,19,0,0,0,0,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lettre d'amour zoulou",2004,100,NA,6.5,6,0,0,0,0,14.5,34.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Lettre d'amour, La",1989,16,NA,8.6,5,0,0,0,0,0,0,44.5,24.5,44.5,0,"",0,1,0,0,0,0,1 -"Lettre, La",1998,14,NA,7.2,84,4.5,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Lettre, La",1999,107,NA,6.5,155,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lettres de mon moulin, Les",1954,160,NA,8.2,9,0,0,0,0,0,0,44.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Letty Lynton",1932,84,NA,6,24,4.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Letyat zhuravli",1957,94,NA,7.9,713,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Letzte Akt, Der",1955,113,NA,6.5,31,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Letzte Chance, Die",1945,104,NA,8.5,12,0,0,0,0,0,0,14.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Letzte Loch, Das",1981,92,NA,8.5,6,0,0,0,0,14.5,0,0,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Letzte Mann, Der",1924,90,NA,7.9,1024,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Letzte Mann, Der",1955,105,NA,5.3,11,0,0,4.5,14.5,4.5,24.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Letzte Mohikaner, Der",1965,92,NA,4.9,22,4.5,0,4.5,14.5,34.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Letzte Patrone, Die",2000,6,NA,4.2,5,0,0,24.5,44.5,0,0,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Letzte Rache, Die",1982,85,NA,9.3,6,0,0,0,0,0,0,14.5,0,14.5,64.5,"",0,1,0,0,0,0,0 -"Letzte Ritt nach Santa Cruz, Der",1964,95,NA,3.1,12,4.5,34.5,14.5,0,4.5,14.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Letzte Zeuge, Der",1960,102,NA,6.3,13,0,0,0,4.5,0,34.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Letzten Jahre der Kindheit, Die",1979,105,NA,8.2,8,14.5,0,0,0,0,0,0,64.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Leung juk",1994,107,NA,7.6,123,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Lev Tolstoy",1984,168,NA,4.2,6,45.5,14.5,0,0,0,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Lev vel",2002,23,NA,4.8,5,24.5,0,24.5,0,0,24.5,44.5,0,0,0,"",0,0,0,1,0,0,1 -"Leva livet",2001,95,NA,5.3,166,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Level Five",1997,110,NA,5.7,70,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Levelland",2003,107,NA,5.8,46,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"R",0,0,0,0,0,0,0 -"Leven na mevrouw de Nijs, Het",2001,48,NA,3.3,5,0,24.5,24.5,0,0,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Leviathan",1962,92,NA,5.7,6,14.5,0,0,14.5,0,14.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Leviathan",1989,98,NA,5,1726,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Levis HVC, The",2002,3,NA,5.9,5,0,24.5,0,0,24.5,0,0,24.5,0,44.5,"",0,0,1,0,0,0,1 -"Levitation",1997,100,NA,4.3,22,24.5,0,0,0,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Levity",2003,100,7500000,6.4,1459,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Levoton veri",1946,91,NA,8.5,14,0,0,4.5,0,0,14.5,4.5,4.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Levottomat",2000,90,NA,6.3,959,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Levottomat 3",2004,99,NA,2.2,534,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Levsha",1986,90,NA,6.2,9,0,0,0,0,14.5,0,14.5,24.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Lewis & Clark & George",1997,83,NA,5.4,269,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Lewis Mumford on the City, Part 3: The City and Its Region",1963,28,NA,9,8,0,0,0,0,0,0,0,0,100,0,"",0,0,0,0,1,0,1 -"Lex, the Wonder Dog",1973,92,NA,8.7,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Ley de Herodes, La",1999,120,NA,8.3,368,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,1,0,0,0,0 -"Ley de la frontera, La",1995,115,NA,7.3,79,4.5,0,0,4.5,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Ley del deseo, La",1987,102,NA,7.3,1027,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Leyenda de fuego",2001,101,NA,6.2,7,0,14.5,0,0,0,44.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Leyenda de la doncella, La",1994,96,NA,6.8,8,14.5,0,14.5,0,24.5,0,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Leyenda del viento del Norte, La",1992,70,NA,4.5,7,0,0,0,14.5,0,0,0,14.5,24.5,44.5,"",0,1,0,0,0,0,0 -"Leylasede",1995,100,700000,6.6,29,0,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Leyton, El",2002,95,NA,7.1,21,0,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lez Be Friends",2000,13,NA,3.9,6,0,0,14.5,14.5,0,0,0,14.5,14.5,34.5,"",0,0,1,1,0,0,1 -"Lezate divanegi",2003,73,NA,6.8,16,0,0,0,4.5,0,44.5,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Lezioni private",1975,95,NA,3,12,14.5,4.5,14.5,0,14.5,0,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Lhorn",2003,108,NA,4.9,15,24.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Li'l Abner",1940,78,NA,4.7,62,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Li'l Abner",1959,114,NA,6.4,271,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Liaisons dangereuses, Les",1959,106,NA,6.3,146,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Liam",2000,90,NA,6.9,741,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Lian ai de tian kong",1994,95,NA,5.8,8,24.5,0,0,0,0,14.5,24.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Lian ai feng jing",2003,100,NA,6.3,75,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Lian ai zhong de Bao Bei",2004,95,5000000,5.4,38,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lian'ai qiyi",2001,90,NA,4.9,18,4.5,0,14.5,0,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Liane, die Tochter des Dschungels",1961,101,NA,6,5,24.5,0,0,0,24.5,24.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Liang Shan Ba yu Zhu Ying Tai",1963,126,NA,6.7,38,4.5,0,0,4.5,4.5,14.5,0,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Liang ge zhi neng huo yi ge",1997,89,NA,7,124,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Liang zhi lao hu",1985,91,NA,3.3,19,24.5,14.5,4.5,14.5,14.5,0,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Lianlian fengchen",1986,109,NA,7.8,143,0,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Lianna",1983,110,300000,6.9,258,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Liao zhai yan tan",1987,90,NA,5.7,197,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Liao zhai yan tan xu ji zhi wu tong shen",1991,96,NA,4.8,26,4.5,14.5,4.5,4.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Liar Liar",1997,86,45000000,6.5,22969,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Liar's Moon",1981,106,NA,5.6,98,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Liar's Poker",1999,93,NA,4,38,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Liars Club",2001,99,NA,6.1,31,4.5,4.5,0,4.5,0,4.5,14.5,4.5,14.5,34.5,"R",0,0,1,0,0,1,0 -"Liars' Club, The",1993,95,NA,5.1,138,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Libby, Montana",2004,124,NA,9.1,7,0,0,0,0,0,0,0,14.5,45.5,24.5,"",0,0,0,0,1,0,0 -"Libel",1959,100,NA,7.2,96,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Libeled Lady",1936,98,NA,7.8,676,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Libera",1993,83,NA,5.1,32,14.5,0,4.5,4.5,4.5,14.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Libera me",1993,75,NA,7.2,18,0,0,0,0,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Libera me",2000,119,4000000,6.4,58,0,0,4.5,14.5,4.5,24.5,14.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Libera, amore mio...",1973,112,NA,5.8,11,0,0,4.5,4.5,4.5,24.5,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Liberace of Baghdad, The",2005,74,NA,8.4,9,0,0,0,0,0,14.5,0,44.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Liberace: Behind the Music",1988,97,NA,5,17,4.5,0,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Liberata Me",2002,27,66000,6.7,15,34.5,0,0,0,0,0,0,4.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Liberation of L.B. Jones, The",1970,102,NA,6.4,65,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Liberi",2003,113,NA,5.5,23,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Liberi armati pericolosi",1976,100,NA,7.4,14,0,0,0,0,4.5,0,34.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Libero",1973,88,NA,4.4,10,0,14.5,44.5,24.5,14.5,0,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Libero Burro",1999,96,NA,5.2,23,4.5,4.5,0,24.5,4.5,24.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Libertad, La",2001,73,NA,6.5,36,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Libertarias",1996,125,NA,7,197,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Libertin, Le",2000,100,NA,6.1,357,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Libertine",1986,11,NA,7.4,49,4.5,0,0,0,14.5,4.5,4.5,14.5,24.5,34.5,"",1,0,0,0,0,0,1 -"Libertine, The",2004,130,NA,7.5,152,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Libertino, O",1973,86,NA,5.6,5,0,24.5,0,0,24.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Liberty",1929,20,NA,8.3,110,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Liberty & Bash",1990,92,NA,2.3,25,14.5,24.5,14.5,4.5,0,14.5,0,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Liberty Bound",2004,90,100000,4.7,60,14.5,0,4.5,0,0,4.5,4.5,4.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Liberty Heights",1999,122,NA,7,2011,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Liberty Stands Still",2002,92,11000000,5.6,1560,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Liberty belle",1983,112,NA,6.1,9,14.5,24.5,0,0,0,24.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Liberty in Restraint",2004,100,NA,7,5,24.5,0,0,0,0,0,24.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Libido",1973,118,NA,3.6,5,0,24.5,24.5,0,24.5,24.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Libiomfi",2003,75,NA,5.5,12,24.5,14.5,0,0,4.5,0,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Libre de culpas",1996,100,NA,6.3,6,14.5,0,0,0,14.5,0,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Libro de piedra, El",1969,100,NA,7.7,31,4.5,0,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Liceale nella classe dei ripetenti, La",1979,90,NA,3,21,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Liceale seduce i professori, La",1979,93,NA,3.1,18,24.5,14.5,4.5,4.5,14.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Liceale, La",1975,82,NA,4,29,4.5,4.5,24.5,4.5,24.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Licence to Kill",1989,133,40000000,6.2,8523,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"License Exam",2004,2,1000,7,6,14.5,14.5,0,0,0,0,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"License to Drive",1988,88,8000000,5.3,2163,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"License to Thrill",1989,75,NA,5,15,4.5,0,4.5,0,0,0,14.5,24.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Licensed to Kill",1965,96,NA,5.6,19,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Licensed to Kill",1997,80,NA,6.5,31,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Lichter",2003,105,NA,8,522,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Lick the Star",1998,14,NA,5.8,125,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Lickerish Quartet, The",1970,90,NA,4.5,87,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lickety-Splat",1961,6,NA,7.3,38,0,0,0,0,4.5,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Lie Down with Dogs",1995,84,NA,4.8,261,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Lie huo zhan che",1995,114,NA,6.7,70,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lieb Vaterland magst ruhig sein",1976,92,NA,5.3,11,0,0,0,0,44.5,24.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Liebe '47",1949,118,NA,8.8,5,0,0,0,0,0,0,24.5,0,64.5,24.5,"",0,0,0,1,0,1,0 -"Liebe auf den ersten Blick",1991,105,NA,6.6,9,0,0,0,0,0,24.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Liebe auf krummen Beinen",1959,90,NA,3.2,10,14.5,0,24.5,24.5,14.5,24.5,0,24.5,0,0,"",0,0,1,0,0,1,0 -"Liebe der Jeanne Ney, Die",1927,100,NA,8.2,55,0,0,0,0,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Liebe im Schatten des Drachen",1998,87,NA,5.1,17,0,14.5,4.5,14.5,14.5,14.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Liebe in Deutschland, Eine",1983,132,NA,7.2,74,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Liebe in drei Dimensionen",1973,93,NA,3,18,24.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Liebe und Verlangen",2003,87,NA,6.7,6,0,0,0,0,14.5,34.5,34.5,0,14.5,0,"",0,0,0,1,0,1,0 -"Liebe, Tanz und 1000 Schlager",1955,98,NA,4.8,5,0,0,24.5,0,24.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Liebelei",1933,88,NA,7.9,119,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Liebenden vom Hotel von Osman, Die",2001,15,NA,8.6,39,0,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Lieber Fidel - Maritas Geschichte",2000,56,NA,7.1,41,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Lieberman In Love",1995,39,NA,7.1,36,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"LiebesLuder",2000,91,NA,6.2,127,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Liebesbriefe einer portugiesischen Nonne, Die",1977,85,NA,5.7,107,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Liebesjagd durch 7 Betten",1973,80,NA,5.2,16,0,14.5,0,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Liebeskarussell, Das",1965,93,NA,4.4,18,4.5,14.5,0,14.5,34.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Liebeskonzil",1982,92,NA,3.8,6,0,34.5,0,0,14.5,0,14.5,0,34.5,0,"",0,0,0,0,0,0,0 -"Liebesmarkt",1973,96,NA,1.6,7,45.5,0,0,14.5,14.5,0,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Liebesquelle, Die",1965,83,NA,4,6,14.5,34.5,0,14.5,14.5,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Liebestraum",1991,112,NA,6,388,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lied geht um die Welt, Ein",1933,76,NA,5.1,9,0,0,0,44.5,0,14.5,14.5,24.5,0,14.5,"",0,0,0,1,0,1,0 -"Liefdesbekentenissen",1967,80,NA,5.5,5,0,0,0,24.5,24.5,0,24.5,24.5,0,24.5,"",0,0,0,1,0,1,0 -"Liefje",2001,82,NA,6.2,20,4.5,4.5,4.5,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Liegen lernen",2003,87,NA,6.9,362,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Liens du sang, Les",1978,95,NA,5.7,141,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lies",1983,100,NA,6.1,36,0,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lies My Father Told Me",1960,60,NA,8,5,0,0,0,0,0,24.5,24.5,64.5,0,0,"",0,0,0,1,0,0,0 -"Lies My Father Told Me",1975,102,NA,6.4,89,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lieu du crime, Le",1986,90,NA,6.8,120,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lieutenant Wore Skirts, The",1956,99,NA,5.5,27,0,14.5,14.5,0,14.5,24.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Lieve jongens",1980,88,NA,4.5,38,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Liever verliefd",2003,87,NA,6.2,231,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Life",1996,85,NA,7.4,28,14.5,0,0,4.5,0,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Life",1999,108,75000000,5.8,4857,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Life",2000,6,NA,6.1,8,0,0,14.5,14.5,0,0,24.5,34.5,0,14.5,"",0,1,0,0,0,0,1 -"Life 101",1995,93,NA,6.1,59,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Life Apart: Hasidism in America, A",1997,96,NA,6,28,14.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Life Aquatic with Steve Zissou, The",2004,118,25000000,7.3,9170,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Life Before This, The",1999,92,NA,6.1,202,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Life Begins",1932,71,NA,6.1,25,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Life Begins at Eight-Thirty",1942,85,NA,7.1,15,0,0,0,0,24.5,24.5,14.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Life Begins at Forty",1935,85,NA,7.1,13,0,0,0,0,0,14.5,14.5,34.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Life Begins for Andy Hardy",1941,101,NA,6.3,82,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Life Classes",1987,117,NA,6.6,16,4.5,4.5,0,0,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Life During Wartime",1997,92,NA,5.1,299,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Life Is Cheap... But Toilet Paper Is Expensive",1989,89,NA,5.1,31,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Life Is Sweet",1990,103,NA,7.5,1020,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Life Is Too Short to Dance with Ugly Women",1996,9,NA,5.1,15,24.5,0,0,14.5,0,44.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Life Less Ordinary, A",1997,103,12000000,6.4,8209,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Life Makes Sense If You're Famous",2002,7,NA,7.3,15,14.5,0,0,0,14.5,4.5,14.5,4.5,0,44.5,"",0,0,0,0,0,0,1 -"Life Returns",1935,63,NA,6.1,8,14.5,0,24.5,0,0,14.5,14.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Life Stinks",1991,92,NA,4.9,1434,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Life Tastes Good",1999,88,NA,5.2,24,14.5,0,0,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Life Without Death",2000,82,NA,6.7,39,0,0,4.5,4.5,4.5,14.5,34.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Life Without Dick",2001,97,NA,4.1,404,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Life and Death of Colonel Blimp, The",1943,163,NA,8.2,1054,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Life and Death of Peter Sellers, The",2004,122,NA,6.7,1140,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Life and Death on the A List",1996,50,NA,6.7,10,0,0,0,0,0,34.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Life and Debt",2001,80,NA,7.1,155,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Life and Legend of Bruce Lee",1973,85,NA,7.5,19,0,0,0,0,4.5,0,14.5,44.5,0,34.5,"",0,0,0,0,0,0,0 -"Life and Times of Allen Ginsberg, The",1994,82,NA,5.9,18,4.5,0,0,14.5,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Life and Times of Grizzly Adams, The",1974,93,NA,5.1,102,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Life and Times of Hank Greenberg, The",1998,90,NA,7.6,285,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"PG",0,0,0,0,1,0,0 -"Life and Times of Judge Roy Bean, The",1972,120,NA,6.6,1022,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Life and Times of MC Beer Bong, The",2004,85,1000,8.8,6,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,1,0,0,0,0 -"Life and Times of Rosie the Riveter, The",1980,65,NA,7.5,49,0,0,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Life as a House",2001,127,18000000,7.5,7696,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Life at Stake, A",1954,78,NA,5.7,9,0,0,14.5,0,24.5,14.5,24.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Life at the Top",1965,117,NA,6.6,23,4.5,0,0,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Life for Ruth",1962,93,NA,6.9,22,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Life for a Life, A",1998,55,NA,7.8,15,0,0,0,0,0,14.5,24.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Life in Bed",2003,75,750000,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,1,0,0,0,0 -"Life in the Day, A",1986,5,NA,2.4,12,34.5,14.5,0,4.5,4.5,4.5,14.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Life of Brian",1979,94,4000000,8.1,33325,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Life of David Gale, The",2003,130,50000000,7.1,10580,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Life of Emile Zola, The",1937,116,NA,7.4,400,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Life of Her Own, A",1950,108,NA,5.8,61,4.5,0,0,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Life of Jimmy Dolan, The",1933,89,202000,5.4,36,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Life of Larry, The",1995,10,NA,9.3,28,4.5,0,0,0,0,0,0,4.5,24.5,64.5,"",0,1,1,0,0,0,1 -"Life of Sin, A",1979,112,NA,4.2,5,24.5,0,0,24.5,0,44.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Life of Stuff, The",1997,90,NA,2.2,26,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Life of Vergie Winters, The",1934,82,NA,5.7,24,0,4.5,0,4.5,24.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Life of a Gigolo",1998,91,NA,2.7,54,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Life of an American Fireman",1903,6,NA,6.5,72,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,1 -"Life of the Jews of Palestine",1913,78,NA,5.8,5,24.5,0,0,0,0,0,84.5,0,0,0,"",0,0,0,0,1,0,0 -"Life of the Party, The",1930,79,NA,4.2,15,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Life of the Party, The",1937,77,NA,5.9,19,0,0,4.5,4.5,14.5,14.5,44.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Life or Something Like It",2002,105,NA,5.7,3620,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Life with Big Cats",2000,53,NA,8.8,8,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,1,0,0 -"Life with Blondie",1945,72,NA,6.7,32,0,0,0,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Life with Father",1947,118,NA,7.3,707,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Life with Feathers",1945,8,NA,7,40,4.5,0,4.5,4.5,4.5,14.5,44.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Life with Henry",1941,80,NA,7.3,7,24.5,0,0,0,0,24.5,0,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Life with Mikey",1993,91,NA,5.3,1141,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Life with Tom",1953,7,NA,6.3,27,0,0,0,14.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Life with the Lyons",1954,81,NA,4.9,5,0,0,24.5,0,0,44.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Life, Liberty & the Pursuit of Happiness",2003,14,NA,8.4,10,0,0,0,0,0,14.5,0,45.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Life/Drawing",2001,89,NA,7.6,10,0,0,0,0,14.5,14.5,34.5,24.5,24.5,14.5,"R",0,0,1,0,0,1,0 -"Lifeboat",1944,96,NA,7.6,2765,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lifebreath",1997,90,NA,4.3,107,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Lifeforce",1985,101,25000000,5.6,2071,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lifeguard",1976,96,NA,5.8,189,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lifeguard",1990,82,NA,5.1,6,0,0,14.5,0,14.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lifehouse Concert, The",2000,96,NA,7.2,6,0,0,0,0,0,14.5,34.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Lifepod",1980,90,NA,4.9,39,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Lifespan",1974,85,NA,5.6,23,0,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Lifestyle, The",1999,78,NA,5,77,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Lifetime Guarantee: Phranc's Adventure in Plastic",2001,58,NA,4,10,0,14.5,0,0,0,0,14.5,34.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Lift",1997,91,NA,4.5,9,14.5,0,14.5,0,14.5,14.5,0,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Lift",1998,10,NA,6.9,8,0,0,0,14.5,14.5,34.5,14.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Lift, De",1983,95,NA,6.2,754,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lift, The",1972,7,NA,5.6,27,4.5,14.5,0,0,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Lift, The",2000,16,NA,7.9,13,4.5,4.5,0,0,4.5,0,4.5,0,14.5,45.5,"",0,0,0,1,0,0,1 -"Ligabue",1978,126,NA,7.8,5,0,0,0,0,0,24.5,24.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Ligaya ang itawag mo sa akin",1997,105,NA,3.3,15,24.5,0,0,0,24.5,34.5,0,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Light Ahead, The",1939,94,NA,6.9,18,0,0,4.5,14.5,0,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Light Fantastic",1964,85,NA,7.2,6,0,14.5,0,0,0,14.5,14.5,14.5,0,34.5,"",0,0,0,1,0,1,0 -"Light Is Calling",2004,8,NA,7.4,15,4.5,0,0,4.5,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Light It Up",1999,99,13000000,5.7,856,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Light Sleeper",1992,103,5000000,6.8,742,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Light That Failed, The",1939,97,NA,6.5,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Light Touch, The",1952,93,NA,6,38,4.5,4.5,0,24.5,4.5,24.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Light Up the Sky!",1960,90,NA,8.1,11,0,0,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Light at the Edge of the World, The",1971,120,NA,4.9,153,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Light in the Dark, The",1922,33,NA,6.5,13,0,0,0,4.5,34.5,0,24.5,14.5,14.5,0,"",0,0,0,1,0,1,1 -"Light in the Forest, The",1958,83,NA,7,79,4.5,0,4.5,0,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Light in the Piazza",1962,102,553280,6.5,162,4.5,0,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Light of Darkness",1998,9,NA,7.4,12,0,0,0,4.5,0,24.5,4.5,34.5,0,24.5,"",0,0,0,1,0,0,1 -"Light of Day",1987,107,NA,4.8,488,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Light of Western Stars, The",1940,64,NA,6.3,11,0,0,0,14.5,4.5,34.5,24.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Lighter Than Hare",1960,7,NA,7,41,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Lighthorsemen, The",1987,115,NA,6.3,263,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lighthouse Hill",2004,94,NA,5.3,27,4.5,4.5,4.5,4.5,0,4.5,0,4.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Lighthouse Keeping",1946,7,NA,7,29,0,0,4.5,0,14.5,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Lighthouse Mouse",1955,7,NA,6.3,17,0,0,0,4.5,14.5,14.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Lightmaker",2001,89,NA,7.2,109,4.5,4.5,0,0,0,0,0,0,4.5,94.5,"",0,0,0,0,0,0,0 -"Lightnin'",1925,104,NA,4.1,24,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lightnin' Crandall",1937,60,NA,5.6,5,0,0,0,24.5,0,64.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Lightning Bug",2004,97,NA,8.1,30,4.5,4.5,4.5,0,4.5,0,4.5,4.5,4.5,64.5,"",0,0,1,1,0,0,0 -"Lightning Jack",1994,98,NA,4.8,1020,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lightning Over Braddock: A Rustbowl Fantasy",1988,80,54000,5.8,9,24.5,0,14.5,0,0,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Lightning Over Water",1980,116,700000,6.7,132,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,1,0,0 -"Lightning Raiders",1945,61,NA,4.8,6,0,0,0,34.5,34.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Lightning Strikes Twice",1934,63,NA,4.5,11,0,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Lightning Strikes Twice",1951,91,NA,6.4,42,0,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Lightning in a Bottle",2004,108,NA,6.2,85,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"PG-13",0,0,0,0,1,0,0 -"Lightning, the White Stallion",1986,95,NA,4.4,23,4.5,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lights Fantastic",1942,6,NA,6.7,18,0,0,0,0,24.5,4.5,24.5,34.5,14.5,0,"",0,1,1,0,0,0,1 -"Lights of New York",1928,57,75000,5,61,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lights of Old Santa Fe",1944,76,NA,6,17,0,0,0,4.5,34.5,14.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Lights, Camera, War!",2000,35,NA,4.8,17,14.5,0,4.5,0,0,0,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Lightship, The",1985,92,NA,5.8,131,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ligne 208",2001,97,NA,4.7,7,0,14.5,14.5,0,14.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Ligne de chaleur, La",1987,90,NA,6.2,5,24.5,0,0,0,0,0,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Ligne de vie",1996,100,NA,5.9,30,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Liian iso keikka",1986,95,NA,5.5,35,4.5,0,4.5,4.5,0,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Lijepe zene prolaze kroz grad",1986,94,NA,8.7,5,0,0,24.5,0,0,0,0,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Lijmen/Het been",2000,110,NA,6.3,200,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Like Father",2001,97,NA,6.1,12,0,0,0,14.5,24.5,0,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Like Father Like Son",1987,100,NA,4.5,897,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Like It Is",1998,97,NA,6.9,387,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Like Mike",2002,99,30000000,4.9,1484,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Like Mike-ael Jackson",2003,4,NA,1.6,7,74.5,0,24.5,0,0,0,0,0,0,0,"",0,0,1,0,0,0,1 -"Like Twenty Impossibles",2003,17,NA,4.9,8,14.5,0,14.5,14.5,0,14.5,0,0,24.5,24.5,"",0,0,0,1,0,0,1 -"Likely Lads, The",1976,90,NA,6.5,88,4.5,0,0,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Likely Story, A",1947,80,NA,5.6,12,0,0,0,4.5,34.5,4.5,44.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Lil' River Rats and the Adventure of the Lost Treasure, The",2003,80,NA,7,10,34.5,0,0,0,0,0,14.5,0,0,64.5,"PG",0,0,0,0,0,0,0 -"Lila Lili",1999,105,NA,5.7,13,4.5,0,0,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Lilac Time",1928,80,NA,8.5,20,0,0,0,4.5,0,14.5,14.5,34.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Lilacs in the Spring",1955,72,NA,4.9,26,14.5,0,4.5,14.5,14.5,14.5,4.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Lili",1953,81,NA,7.3,445,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Lili Marleen",1981,120,NA,7.2,409,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lili et le loup",1996,5,NA,5.7,6,0,0,0,0,34.5,0,14.5,34.5,0,14.5,"",0,1,0,0,0,0,1 -"Lilian (la virgen pervertida)",1984,79,NA,7.4,15,14.5,0,4.5,0,4.5,14.5,0,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Lilian's Story",1995,91,NA,7.4,64,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Lilies - Les feluettes",1996,95,NA,7.4,761,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,0,1,0,1,0 -"Lilies of the Field",1963,94,240000,7.6,1391,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Liliom",1930,94,NA,7.6,5,0,0,0,0,24.5,24.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Liliom",1934,118,NA,6.8,75,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Liliomfi",1954,109,NA,8.1,18,0,0,0,0,0,4.5,4.5,24.5,0,64.5,"",0,0,1,0,0,0,0 -"Lilith",1964,114,NA,6.8,202,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lilith Unleashed",1988,85,NA,6,8,14.5,0,0,0,14.5,24.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Lilith on Top",2001,100,NA,8,6,0,0,0,0,0,0,34.5,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Liliya Bel'gii",1915,14,NA,8.2,13,0,0,4.5,0,14.5,4.5,4.5,4.5,34.5,24.5,"",0,1,0,1,0,0,1 -"Lilja 4-ever",2002,109,NA,8,4631,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Lilla helgonet",1944,104,NA,5.6,8,0,0,14.5,14.5,0,34.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Lille Fridolf blir morfar",1957,90,NA,4.7,15,0,24.5,24.5,0,4.5,4.5,24.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Lille Fridolf och jag",1956,98,NA,3.2,11,0,4.5,34.5,14.5,0,0,0,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Lille Napoleon",1943,96,NA,6.9,10,0,0,0,0,0,24.5,74.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Lille frk Norge",2003,90,NA,4.8,35,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lille og den store, Den",2001,70,NA,5.8,5,24.5,0,0,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Lille pige med svovlstikkerne, Den",1999,10,NA,6.1,11,0,4.5,0,0,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Lille spejl",1978,101,NA,6.1,11,0,0,0,4.5,0,34.5,14.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Lilli Marlene",1950,74,NA,6.5,6,0,0,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Lillian",1993,82,NA,8.6,12,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Lillian Russell",1940,127,NA,5.6,41,0,4.5,4.5,4.5,24.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lilly Turner",1933,65,NA,6,30,0,0,4.5,14.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lilly's Story",2002,130,NA,5,29,0,0,4.5,24.5,24.5,24.5,4.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Lilo & Stitch",2002,86,80000000,7.3,10944,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,1,1,1,0,0,0 -"Lilovyy shar",1987,77,NA,6.3,27,4.5,0,14.5,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Lily C.A.T.",1987,80,NA,5.4,59,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Lily Tomlin",1986,90,NA,6.1,39,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Lily and Jim",1997,13,NA,7.5,173,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,1,1 -"Lily's Crickets",2002,44,NA,8,5,0,0,0,24.5,0,0,0,24.5,44.5,24.5,"",0,0,0,1,0,0,1 -"Lily, aime-moi",1975,100,NA,5.2,5,0,0,0,24.5,44.5,0,24.5,24.5,0,0,"",0,0,1,0,0,1,0 -"Limb Salesman, The",2004,80,NA,4.8,25,24.5,4.5,4.5,4.5,0,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Limbo",1972,112,NA,4.8,12,0,14.5,4.5,4.5,34.5,0,0,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Limbo",1999,126,8300000,7.1,2063,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Limbo",2003,7,NA,7.4,5,0,0,0,0,0,24.5,64.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Lime",2001,92,NA,4.9,50,14.5,14.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Limehouse Blues",1934,63,NA,6.6,8,0,0,0,0,14.5,14.5,45.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Limelight",1936,80,NA,8.5,11,0,0,0,0,4.5,0,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Limelight",1952,147,NA,7.6,1569,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Limey, The",1999,89,9000000,7.2,7732,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Limit Up",1989,88,NA,4.2,42,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Limita",1994,89,NA,4.6,22,4.5,0,4.5,0,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Limite",1931,120,NA,8.8,91,4.5,4.5,0,0,4.5,0,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Limited, The",2000,12,NA,6.2,11,0,0,0,0,4.5,24.5,24.5,0,24.5,4.5,"",0,0,0,1,0,0,1 -"Limousine Love",1928,20,NA,8,11,0,0,0,4.5,0,0,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Limp",1999,90,NA,6.5,6,14.5,0,0,14.5,0,0,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Limpan",1983,82,NA,6.4,14,0,0,0,4.5,4.5,44.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Limping Man, The",1953,76,NA,6.2,11,0,0,0,4.5,14.5,24.5,34.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Limuzyna Daimler-Benz",1982,91,NA,5.9,7,0,0,0,0,14.5,44.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Lin shi rong",1979,108,NA,7.6,232,4.5,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Lin zexu",1959,103,NA,6.8,12,4.5,0,4.5,0,0,24.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lina Braake",1975,85,NA,6.7,28,4.5,0,4.5,0,14.5,4.5,4.5,44.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lincoln Conspiracy, The",1977,90,NA,4.9,22,4.5,4.5,4.5,4.5,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Lincoln and 31st",2001,12,NA,7.8,8,0,0,0,14.5,14.5,0,0,34.5,14.5,24.5,"",1,0,0,1,0,0,1 -"Lincoln in the White House",1939,21,NA,5.2,6,0,0,0,14.5,14.5,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Linda",1929,75,NA,6.8,6,0,0,0,0,14.5,0,45.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Linda",1981,88,NA,5,45,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Linda Lovelace for President",1975,109,NA,4.1,31,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Linda Sara",1994,107,NA,4.5,44,14.5,4.5,0,0,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Linda and Abilene",1969,93,NA,1,7,84.5,0,0,0,0,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Linda/Les and Annie",1992,32,NA,6.2,6,0,0,0,0,14.5,0,14.5,45.5,0,14.5,"",0,0,0,0,1,0,1 -"Lindbergh",1990,56,NA,2.1,7,44.5,24.5,0,0,0,14.5,0,0,0,14.5,"",0,0,0,0,1,0,0 -"Lindenwirtin vom Donaustrand, Die",1957,87,NA,2.8,9,14.5,24.5,0,34.5,0,34.5,0,0,0,0,"",0,0,0,0,0,1,0 -"Line",1961,86,NA,5.5,5,0,0,0,24.5,0,0,64.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Line King: The Al Hirschfeld Story, The",1996,86,NA,7.2,60,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Line of Masculinity, The",2003,4,1000,8.2,10,0,0,24.5,0,0,0,14.5,0,14.5,64.5,"",0,0,1,0,0,0,1 -"Line, The",1980,95,NA,3.3,14,14.5,14.5,4.5,0,14.5,0,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Line, the Cross & the Curve, The",1993,50,NA,7.6,81,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Lines: Horizontal",1962,6,NA,7.8,21,0,0,0,0,0,24.5,4.5,34.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Lines: Vertical",1960,6,NA,8.1,11,0,0,0,0,0,4.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Lineup, The",1958,86,NA,7.3,72,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lingua del santo, La",2000,110,NA,6.5,119,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Linguini Incident, The",1991,105,NA,5.7,293,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Linie 1",1988,99,NA,7.4,24,4.5,0,4.5,0,0,4.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Link",1986,103,NA,5,273,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Linus eller Tegelhusets hemlighet",1979,97,NA,4,9,0,0,34.5,14.5,14.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Lion Around",1950,7,NA,6.7,27,0,0,0,4.5,4.5,14.5,44.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Lion Has Wings, The",1939,76,NA,7.2,40,0,0,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lion Hunters, The",1951,75,NA,5,6,0,0,0,14.5,45.5,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Lion Is in the Streets, A",1953,88,NA,6.3,101,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lion King, The",1994,89,79300000,7.8,32924,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Lion Roars Again, The",1975,17,NA,4.8,20,4.5,14.5,0,24.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,0,0,1,0,1 -"Lion Strike",1994,90,NA,3.5,41,14.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Lion and the Horse, The",1952,83,NA,4.9,15,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lion at World's End, The",1971,89,NA,6.3,16,14.5,4.5,0,0,14.5,14.5,4.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Lion et l'agneau, Le",1995,8,NA,6.8,22,0,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Lion in Winter, The",1968,137,NA,8.1,5871,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Lion of Oz",2000,74,NA,4.3,27,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Lion volatile, Le",2003,12,NA,8.4,7,0,0,0,0,14.5,14.5,24.5,0,14.5,24.5,"",0,0,0,0,0,1,1 -"Lion's Busy, The",1950,7,NA,7,13,0,0,0,4.5,0,4.5,45.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Lion, The",1962,96,NA,5.5,76,4.5,0,0,4.5,14.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Lionceaux, Les",2003,77,NA,3.3,8,34.5,24.5,0,14.5,0,0,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Lionheart",1987,104,NA,5.2,218,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lionheart",1990,105,2500000,5.1,2123,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Lionheart: The Jesse Martin Story",1999,90,NA,8.2,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,0,0,1,0,0 -"Lionpower From MGM",1967,27,NA,6.1,20,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Lions for Breakfast",1975,98,NA,3.8,7,45.5,0,14.5,14.5,0,0,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Lions of Capitalism, The",1977,55,NA,6,10,0,0,14.5,14.5,14.5,24.5,34.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Lip Service",2001,95,NA,4.2,44,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Lipgloss Explosion!",2001,106,NA,3.9,24,14.5,0,0,0,4.5,0,4.5,4.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Lips",1981,80,NA,5.7,10,0,0,0,24.5,34.5,24.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Lips to Lips",2000,97,NA,7.3,9,0,0,0,14.5,0,14.5,14.5,14.5,0,45.5,"",0,0,1,1,0,0,0 -"Lipservice",1998,18,NA,9.1,7,0,0,0,0,0,0,24.5,0,0,74.5,"",0,0,1,0,0,0,1 -"Lipstick",1976,89,NA,4.3,301,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lipstick",1999,8,NA,5.1,5,0,0,0,0,44.5,0,0,44.5,24.5,0,"",0,0,0,0,0,0,1 -"Lipstick & Dynamite, Piss & Vinegar: The First Ladies of Wrestling",2004,75,NA,7.6,27,0,4.5,4.5,4.5,0,4.5,24.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Lipstick Camera",1994,91,NA,3.5,85,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Liquid A$$ets",1982,83,NA,6.5,6,0,0,0,0,34.5,34.5,0,34.5,0,0,"",0,0,1,0,0,0,0 -"Liquid Bridge",2003,98,NA,3.5,51,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,34.5,"R",1,0,0,1,0,0,0 -"Liquid Lips",1976,73,12000,5.7,11,4.5,0,14.5,0,4.5,4.5,4.5,0,0,44.5,"",1,0,0,0,0,0,0 -"Liquid Sky",1982,118,NA,5.5,1037,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Liquidator, The",1965,105,NA,5.4,136,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Lisa",1962,112,NA,5.5,36,0,0,0,4.5,14.5,24.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Lisa",1989,95,NA,5.3,196,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lisa",1996,105,NA,3.7,30,14.5,14.5,4.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Lisa",2001,109,NA,5.4,59,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Lisa Theory, The",1994,80,NA,3.6,8,14.5,0,0,0,0,14.5,24.5,14.5,0,34.5,"",0,0,0,1,0,1,0 -"Lisa kai oloi oi alloi, H",2003,104,NA,5.6,26,0,0,14.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Lisa, Lisa",1977,66,NA,4.1,74,14.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Lisbela E O Prisioneiro",2003,106,NA,7.8,253,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Lisboa",1999,100,NA,6.9,172,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lisboa",2004,85,NA,5.6,5,24.5,0,0,24.5,0,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Lisbon",1956,90,NA,5.2,41,0,0,0,14.5,24.5,24.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Lisbon Story",1994,100,NA,6.8,619,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Liselotte von der Pfalz",1966,99,NA,7.9,7,0,0,0,0,14.5,0,14.5,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Lisice",1970,80,NA,7.4,22,0,0,0,0,0,4.5,0,14.5,34.5,44.5,"",0,0,0,1,0,0,0 -"List of Adrian Messenger, The",1963,98,3000000,7,642,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"List, The",1998,40,NA,7.2,6,14.5,0,0,0,0,0,34.5,14.5,0,34.5,"",0,0,0,1,0,0,1 -"List, The",2000,93,NA,5,113,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Lista de espera",2000,102,NA,7.3,367,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Liste noire",1984,83,NA,5.6,14,0,14.5,0,14.5,14.5,24.5,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Liste noire",1995,90,NA,6.3,150,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Listen",1996,101,NA,5,108,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Listen Up: The Lives of Quincy Jones",1990,115,NA,4.6,55,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Listen to Britain",1942,20,NA,8.3,52,0,0,0,0,14.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Listen to Me",1989,107,NA,4.7,254,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Listen to the City",1984,78,NA,2.9,10,44.5,14.5,14.5,0,14.5,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Listen, Darling",1938,75,NA,5.9,55,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Listen, Judge",1952,17,NA,7.1,46,0,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Listening",2003,25,NA,3.8,11,0,4.5,0,0,0,0,0,14.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Lisztomania",1975,103,NA,5.4,222,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Lit feng chin che 2 gik chuk chuen suet",1999,109,NA,5.4,101,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Lit, Le",1982,80,NA,4.4,13,45.5,4.5,4.5,0,0,4.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Litan",1982,88,NA,4.8,9,0,0,14.5,14.5,14.5,24.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Liten Ida",1981,79,NA,5.7,27,0,0,0,4.5,34.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Liten julsaga, En",1999,58,NA,5.9,26,0,4.5,4.5,0,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lithivm",1998,127,500000,3.3,117,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Litterbug, The",1961,8,NA,7.6,16,4.5,0,0,0,0,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Little 'Tinker",1948,7,NA,7.1,32,4.5,0,0,0,4.5,24.5,14.5,14.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Little American, The",1917,80,166949,7.1,20,0,0,4.5,0,14.5,24.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Little Annie Rooney",1925,94,NA,7.3,53,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Little Ark, The",1972,100,NA,5.3,28,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Little Bear Movie, The",2001,75,NA,5.8,15,0,4.5,0,4.5,14.5,0,14.5,0,24.5,44.5,"",0,1,0,0,0,0,0 -"Little Beau Porky",1936,8,NA,6.6,5,0,0,0,0,44.5,0,44.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Little Beaux Pink",1968,6,NA,5.9,8,0,0,0,0,14.5,84.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Little Big Girls",1996,135,NA,6,5,24.5,0,0,24.5,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Little Big Horn",1951,86,NA,8.4,56,0,0,0,4.5,4.5,14.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Little Big League",1994,119,NA,5.7,1160,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Little Big Man",1970,149,NA,7.7,6385,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Little Big Shot",1935,72,NA,5.7,20,0,0,4.5,14.5,14.5,14.5,34.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Little Bigfoot 2: The Journey Home",1997,93,NA,2.7,31,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,0,24.5,"PG",0,0,0,0,0,0,0 -"Little Bit of Hanky Panky, A",1984,75,NA,7.6,16,0,4.5,0,0,4.5,4.5,0,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Little Bit of Heaven, A",1940,87,NA,8,5,0,0,0,0,24.5,24.5,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Little Bit of Soul, A",1998,96,NA,5.8,142,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Little Blabbermouse",1940,8,NA,6.9,14,0,0,0,0,24.5,24.5,34.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Little Black Book",2004,111,35000000,4.7,1894,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Little Black Sambo",1935,8,NA,5.8,42,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Little Boy Blue",1997,105,NA,6.3,453,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Little Boy Blues",1999,85,NA,6.3,14,14.5,0,0,0,14.5,24.5,24.5,0,14.5,4.5,"",0,0,1,1,0,0,0 -"Little Boy Boo",1954,6,NA,7.5,26,0,0,0,0,4.5,4.5,34.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Little Boy Lost",1953,95,NA,6.5,55,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Little Boy Lost",1978,90,395000,4.9,18,4.5,14.5,0,14.5,24.5,4.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Little Brother Rat",1939,7,NA,6.7,7,0,0,0,0,0,44.5,14.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Little Brother of War",2003,95,NA,5.2,28,4.5,4.5,0,14.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Little Buck Cheeser",1937,8,NA,6.2,11,0,0,0,0,4.5,34.5,14.5,34.5,0,0,"",0,1,0,0,0,0,1 -"Little Buddha",1993,123,NA,5.6,2417,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Little Caesar",1931,79,NA,7.4,957,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Little Cigars",1973,92,NA,4.7,26,14.5,0,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Little City",1997,93,NA,6.1,367,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Little Cobras: Operation Dalmatian",1997,91,NA,2.1,17,45.5,14.5,4.5,0,24.5,0,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Little Colonel, The",1935,80,NA,6.9,148,4.5,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Little Convict, The",1979,77,NA,5,13,0,4.5,4.5,14.5,0,14.5,14.5,14.5,0,24.5,"",0,1,0,0,0,0,0 -"Little Corey Gorey",1993,90,NA,3.5,21,4.5,14.5,14.5,4.5,14.5,14.5,0,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Little Crazy, A",2003,85,NA,8,8,0,0,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Little Criminals",1995,120,NA,7.6,145,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Little Daddy",1931,20,NA,8.2,14,0,0,0,0,0,4.5,4.5,34.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Little Dark Poet",1999,5,NA,4.2,17,14.5,4.5,0,14.5,14.5,14.5,14.5,0,4.5,14.5,"",0,1,0,0,0,0,1 -"Little Darlings",1980,96,NA,5.7,722,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Little Death, The",1995,91,NA,5.2,77,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Little Dickie",2002,7,NA,7,18,0,0,4.5,0,0,24.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Little Dieter Needs to Fly",1997,80,NA,7.9,229,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,34.5,"",0,0,0,1,1,0,0 -"Little Dorrit",1988,360,NA,7.4,171,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Little Dragons, The",1980,90,NA,3.3,17,14.5,14.5,24.5,14.5,14.5,14.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Little Drummer Girl, The",1984,130,NA,6,380,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Little Dutch Mill",1934,9,NA,4.9,10,0,0,44.5,14.5,14.5,34.5,0,14.5,0,0,"",0,1,0,0,0,0,1 -"Little Dutch Plate",1935,7,NA,5.8,9,0,0,14.5,0,34.5,0,24.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Little Egypt",1951,82,NA,6,11,0,0,4.5,0,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Little Engine That Could, The",1991,30,NA,5.5,6,14.5,0,14.5,0,0,34.5,0,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Little England",1996,80,NA,8.6,112,4.5,4.5,0,4.5,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Little Failures",2003,11,NA,9.4,8,0,14.5,14.5,0,0,14.5,0,0,24.5,34.5,"",0,0,0,0,0,0,1 -"Little Fauss and Big Halsy",1970,99,NA,4.9,177,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Little Flags",1999,3,NA,8,9,0,0,0,0,14.5,24.5,0,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Little Foxes, The",1941,115,NA,7.7,1193,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Little Friend",1934,85,NA,5.7,8,0,0,0,14.5,34.5,14.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Little Fugitive",1953,80,30000,7.7,235,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Little Ghost",1997,90,NA,5.9,89,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Little Giant",1946,90,NA,6.2,88,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Little Giant, The",1933,76,197000,6.8,63,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Little Giants",1994,107,NA,5.4,1760,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Little Girl Who Lives Down the Lane, The",1976,91,NA,7.1,655,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Little Girls Blue",1978,75,NA,6.7,35,4.5,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Little Girls Blue Part II: A Touch of Blue",1983,82,NA,5.9,13,4.5,0,0,24.5,4.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Little Gravel Voice",1942,8,NA,5,5,0,0,0,0,100,0,0,0,0,0,"",0,1,1,0,0,0,1 -"Little Heroes",1999,92,NA,4.9,43,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Little Heroes 2",2000,90,NA,4,42,4.5,4.5,0,4.5,0,4.5,24.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Little Hiawatha",1937,9,NA,6.4,42,0,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Little Hut, The",1957,78,NA,5.3,114,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Little Indiscretions",1999,80,NA,3.8,16,14.5,4.5,0,14.5,14.5,4.5,0,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Little Inside, A",2001,95,NA,5.6,60,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Little Irish Girl, The",1926,67,NA,1.1,7,84.5,14.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Little Jack Little & Orchestra",1936,11,NA,5.3,5,0,0,0,0,64.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Little Johnny Jet",1952,7,NA,7.2,33,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Little Kings",2003,99,NA,7.4,5,24.5,0,0,0,0,0,0,44.5,0,44.5,"",0,0,1,1,0,0,0 -"Little Lambkin",1940,6,NA,4.2,11,0,34.5,4.5,0,14.5,0,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Little Lamby",1937,8,NA,4.9,6,0,0,0,64.5,14.5,0,0,14.5,0,0,"",0,1,1,0,0,0,1 -"Little Laura and Big John",1973,82,NA,2,17,44.5,4.5,14.5,14.5,0,14.5,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Little Lion Hunter",1939,7,NA,6.7,10,0,0,0,0,14.5,14.5,45.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Little Lord Fauntleroy",1921,111,NA,7.8,15,0,0,0,0,14.5,0,24.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Little Lord Fauntleroy",1936,98,NA,7.2,208,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Little Lord Fauntleroy",1980,103,NA,6.6,363,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Little Man",1999,23,NA,4.3,20,4.5,14.5,0,14.5,14.5,4.5,0,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Little Man Tate",1991,99,NA,6.6,3104,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Little Man, What Now?",1934,91,NA,7.9,41,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Little Match Girl, The",1937,8,NA,8.4,21,0,0,4.5,0,4.5,4.5,4.5,0,14.5,45.5,"",0,1,0,1,0,0,1 -"Little Men",1940,84,NA,5.9,20,0,0,4.5,14.5,24.5,24.5,24.5,14.5,4.5,0,"",0,0,1,1,0,0,0 -"Little Men",1997,98,NA,5.4,110,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Little Mermaid, The",1989,83,NA,7.3,12681,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,1,0 -"Little Minister, The",1934,110,650000,6.4,111,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Little Miss Broadway",1938,70,NA,6.4,101,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Little Miss Magic",1997,86,NA,3.3,42,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"PG",0,0,1,0,0,0,0 -"Little Miss Marker",1934,79,NA,6.7,125,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Little Miss Marker",1980,103,NA,5.1,184,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Little Miss Millions",1993,90,NA,4.1,94,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Little Miss Thoroughbred",1938,63,NA,5.8,17,0,0,0,4.5,4.5,44.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Little Mister Jim",1946,92,NA,7.2,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Little Monsters",1989,100,NA,4.9,782,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Little Mother",1973,90,NA,5.9,18,14.5,4.5,4.5,0,14.5,14.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Little Movie, A",2005,1,NA,8.8,9,0,0,0,0,0,14.5,14.5,24.5,0,45.5,"",0,0,0,1,0,0,1 -"Little Murders",1971,110,NA,7,349,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Little Nellie Kelly",1940,98,665300,6.4,73,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Little Nemo",1911,3,NA,8,72,0,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Little Nemo: Adventures in Slumberland",1992,85,NA,5.6,245,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,34.5,"",0,1,0,1,0,0,0 -"Little Nicky",2000,90,80000000,4.9,9485,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Little Night Music, A",1977,124,NA,4.6,103,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Little Nikita",1988,98,NA,5.7,889,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Little Nobody",1936,7,NA,4.5,5,0,0,44.5,0,64.5,0,0,0,0,0,"",0,1,0,0,0,0,1 -"Little Noises",1991,110,NA,4.7,60,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Little Odessa",1994,98,2300000,6.5,1222,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Little Old New York",1940,100,NA,6.5,16,0,0,0,4.5,4.5,24.5,14.5,44.5,4.5,0,"",0,0,1,0,0,0,0 -"Little Oral Annie Takes Manhattan",1985,82,NA,5.5,5,0,0,0,0,24.5,0,44.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Little Orphan Airedale",1947,7,NA,6.5,24,0,0,0,14.5,4.5,14.5,45.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Little Orphan Annie",1932,70,NA,8.2,11,4.5,4.5,0,14.5,0,4.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Little Orphan, The",1948,8,NA,7.4,66,0,0,0,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Little Patriot, The",1995,90,NA,4.2,16,14.5,14.5,0,14.5,0,0,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Little Phantasy on a 19th-century Painting, A",1946,4,NA,6.2,7,0,0,0,0,44.5,24.5,14.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Little Prince, The",1974,88,NA,5.7,371,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Little Princess, A",1995,97,NA,7.4,2578,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Little Princess, The",1917,62,NA,7,17,4.5,0,0,14.5,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Little Princess, The",1939,91,NA,7,494,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Little Quacker",1950,7,NA,6.9,32,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Little Rascals, The",1994,82,NA,5.1,1770,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Little Red",2000,85,NA,3.1,19,14.5,14.5,0,0,14.5,14.5,24.5,14.5,14.5,0,"R",0,0,0,1,0,0,0 -"Little Red Monkey",1955,71,NA,5.4,10,0,0,0,14.5,44.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Little Red Riding Hood",1997,12,NA,7.3,112,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Little Red Riding Rabbit",1944,7,NA,7.7,88,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Little Red Rodent Hood",1952,7,NA,7.1,24,0,0,0,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Little Red Walking Hood",1937,7,NA,6.8,21,4.5,0,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Little Richard Story, The",1980,90,NA,9.2,5,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,0,0,0,0,0,0 -"Little Romance, A",1979,108,NA,7.2,763,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Little Runaway",1952,7,NA,7,25,0,0,4.5,0,4.5,4.5,34.5,24.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Little Rural Riding Hood",1949,6,NA,7.7,65,4.5,0,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Little School Mouse",1954,7,NA,6.8,27,0,0,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Little Secrets",2001,97,2500000,6.9,457,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Little Senegal",2001,97,NA,7.2,125,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Little Sex, A",1982,95,NA,4.5,78,14.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Little Shepherd of Kingdom Come, The",1961,108,NA,5.9,11,4.5,0,0,4.5,24.5,0,45.5,0,0,0,"",0,0,0,1,0,0,0 -"Little Shop of Erotica",2001,87,NA,1.9,24,45.5,14.5,4.5,4.5,4.5,4.5,0,0,0,4.5,"R",0,0,0,0,0,0,0 -"Little Shop of Horrors",1986,94,30000000,6.4,8911,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Little Shop of Horrors, The",1960,70,27000,6.2,1988,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Little Shots of Happiness",1997,83,NA,4.1,44,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Little Sister",2000,26,NA,5.2,15,0,0,24.5,4.5,14.5,4.5,0,14.5,24.5,14.5,"",0,0,1,0,0,1,1 -"Little Soap and Water, A",1935,6,NA,5,19,0,4.5,24.5,0,14.5,24.5,14.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Little Stabs at Happiness",1960,15,NA,7.7,8,14.5,0,0,0,0,24.5,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Little Stiff, A",1991,86,NA,4.8,24,14.5,4.5,4.5,4.5,0,0,4.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Little Stranger, The",1936,8,NA,4.5,8,0,0,0,64.5,24.5,0,0,0,0,14.5,"",0,1,1,0,0,0,1 -"Little Swee' Pea",1936,7,NA,6.3,31,4.5,0,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Little Sweetheart",1989,89,NA,5.2,60,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Little Terrorist",2004,15,NA,7.1,73,4.5,4.5,4.5,4.5,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Little Toot",1954,9,NA,7.4,45,4.5,0,0,4.5,4.5,14.5,34.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Little Tough Guy",1938,86,NA,5.7,16,4.5,0,0,14.5,14.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Little Train Robbery, The",1905,12,NA,5.2,12,4.5,4.5,0,0,24.5,34.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Little Treasure",1985,95,NA,4.4,61,4.5,4.5,14.5,14.5,34.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Little Unicorn, The",1998,92,NA,3.4,36,14.5,4.5,14.5,4.5,4.5,14.5,0,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Little Vampire, The",2000,91,22000000,5.6,601,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Little Vicious, A",1991,30,NA,5,16,0,0,0,4.5,44.5,0,4.5,0,4.5,34.5,"",0,0,0,0,1,0,1 -"Little Voice",1998,96,NA,7.1,4592,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"Little Whirlwind, The",1941,8,NA,6.3,36,0,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Little White Lies",1996,100,NA,5,31,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Little Wise Quacker, The",1952,6,NA,6.9,6,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Little Witches",1996,90,NA,4,379,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Little Women",1918,60,NA,6.7,5,24.5,0,0,0,24.5,0,24.5,0,0,44.5,"",0,0,0,1,0,1,0 -"Little Women",1933,117,424000,7.4,989,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Little Women",1949,121,NA,7,557,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Little Women",1994,115,NA,7.1,7008,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Little Women in Transit",1996,7,NA,5,10,24.5,14.5,14.5,14.5,0,14.5,0,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Littlest Cowboy, The",2003,19,10000,7.5,13,14.5,0,0,0,0,14.5,0,24.5,0,44.5,"",0,0,1,0,0,0,1 -"Littlest Diplomat, The",1937,19,NA,5,12,0,14.5,0,4.5,24.5,34.5,4.5,0,0,4.5,"",0,0,0,1,0,0,1 -"Littlest Hobo, The",1958,77,NA,4.1,31,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Littlest Horse Thieves, The",1977,104,NA,7.1,49,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Littlest Outlaw, The",1955,75,NA,6.7,28,0,0,4.5,4.5,4.5,24.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Littlest Rebel, The",1935,70,NA,6.2,117,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Littoral",2004,96,NA,5.6,18,14.5,0,0,0,14.5,4.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Liu Awaiting Spring",1998,10,NA,6.8,15,14.5,0,0,0,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Liu san jie",1960,117,NA,7.8,17,4.5,0,4.5,14.5,0,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Liulian piao piao",2000,116,NA,7.2,129,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Liv",1967,88,NA,5,5,44.5,0,0,0,24.5,0,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Liv Ullmann scener fra et liv",1997,76,NA,5.2,23,14.5,4.5,4.5,0,4.5,24.5,4.5,4.5,0,24.5,"",0,0,0,0,1,0,0 -"Liv till varje pris",1998,93,NA,7.1,30,0,0,0,4.5,14.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Live Bait",1995,84,NA,5.8,21,14.5,0,0,4.5,4.5,4.5,24.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Live Fast, Die Young",1958,82,NA,5.4,24,0,0,4.5,4.5,24.5,24.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Live Forever",2003,82,NA,6.8,233,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Live From Shiva's Dance Floor",2003,21,NA,5.6,20,0,14.5,0,0,14.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Live Ghost, The",1934,20,NA,7.5,124,0,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Live It Up",1963,75,NA,4.6,8,0,0,0,14.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Live Now - Pay Later",1962,104,NA,6.9,18,4.5,0,0,0,4.5,14.5,24.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Live Nude Girls",1995,95,NA,5.6,449,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Live Nude Girls Unite!",2000,75,NA,6.4,130,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Live Wire",1992,85,NA,5.2,598,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Live Wires",1946,65,NA,6.6,34,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Live Wires and Love Sparks",1916,25,NA,3.7,8,14.5,0,64.5,14.5,14.5,0,0,0,0,0,"",0,0,1,0,0,0,1 -"Live a Little, Love a Little",1968,90,NA,4.5,178,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Live and Let Die",1973,121,7000000,6.6,8022,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Live by the Fist",1993,77,NA,4.4,27,14.5,4.5,4.5,0,14.5,4.5,4.5,0,4.5,44.5,"",1,0,0,0,0,0,0 -"Live for the Moment",2004,91,NA,2.8,52,64.5,4.5,4.5,0,0,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Live, Love and Learn",1937,78,NA,6,26,4.5,0,14.5,4.5,14.5,24.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Lively Set, The",1964,95,NA,5.3,62,4.5,0,4.5,4.5,24.5,4.5,4.5,14.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Livers Ain't Cheap",1997,89,2500000,4.5,81,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Lives of a Bengal Lancer, The",1935,109,NA,7.5,295,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Livet i 8 bitar",2002,85,NA,4.7,227,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Livets dans",1998,54,NA,1.4,14,44.5,4.5,0,0,0,0,0,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Livin' Large!",1991,96,NA,3.9,72,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Living Buddha",1994,120,NA,4.8,19,4.5,0,0,0,4.5,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Living Daylights, The",1987,130,30000000,6.4,7495,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Living Desert, The",1953,69,NA,7.9,140,0,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Living Doll",1990,92,NA,4.6,13,4.5,14.5,0,24.5,14.5,0,0,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Living Free",1972,90,NA,5.4,56,4.5,4.5,0,14.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Living Ghost, The",1942,61,NA,3.9,10,24.5,14.5,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Living Idol, The",1957,100,NA,6.9,8,0,0,0,0,24.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Living In Missouri",2001,90,10000,8.2,14,0,0,0,0,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Living It Up",1954,95,NA,6.4,209,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Living Life",2004,88,150000,3.5,30,4.5,4.5,14.5,4.5,4.5,0,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Living Museum, The",1999,78,NA,7.6,18,4.5,4.5,0,0,4.5,0,0,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Living Out Loud",1998,103,12000000,6.5,1774,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"Living Proof: HIV and the Pursuit of Happiness",1994,72,NA,6,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Living Sea, The",1995,40,NA,7,143,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Living Venus",1961,74,NA,1,10,84.5,0,0,14.5,0,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Living Witness, The",1999,112,NA,5.5,32,24.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Living and Dining",2003,92,100000,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Living in Fear",2001,90,NA,5,50,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Living in Hope",2002,84,NA,3.7,17,24.5,4.5,0,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Living in Oblivion",1995,90,NA,7.4,3438,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Living in Peril",1997,93,NA,4.8,196,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Living in a Big Way",1947,104,NA,5.2,54,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Living on Tokyo Time",1987,83,NA,7,58,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Living on Velvet",1935,75,NA,5.9,30,14.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Living the Life",2000,90,NA,7.3,25,14.5,4.5,0,0,0,4.5,0,14.5,14.5,45.5,"R",0,0,0,0,0,0,0 -"Living with the Fosters",2002,113,NA,7.6,6,0,0,0,0,0,34.5,0,14.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Living with...",1994,65,NA,6.6,18,34.5,0,0,0,0,0,0,4.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Livre de Marie, Le",1984,28,NA,6.7,24,4.5,0,0,0,0,4.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Livsfarlig film",1988,109,NA,4.2,9,34.5,0,14.5,0,14.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Livvakterna",2001,112,NA,6.5,962,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Liza",1972,100,NA,6,46,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Liza kai i alli, I",1961,98,NA,5.5,14,4.5,0,0,4.5,34.5,14.5,24.5,14.5,0,0,"",0,0,1,0,0,1,0 -"Lizzie",1957,81,NA,5.7,58,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lizzie",2001,87,500000,9,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Lizzie Borden Hash & Rehash",1995,30,NA,3,9,0,0,14.5,0,0,0,0,24.5,0,64.5,"",0,0,0,0,1,0,1 -"Lizzie McGuire Movie, The",2003,94,17000000,5,2541,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"Ljeto u zlatnoj dolini",2003,105,NA,8,134,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ljuba",1996,105,NA,3,6,34.5,0,34.5,0,0,0,0,0,0,34.5,"",1,0,0,0,0,0,0 -"Ljubav i moda",1960,105,NA,6.6,12,0,0,0,0,14.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Ljubavna pisma s predumisljajem",1985,95,NA,6,9,0,24.5,0,14.5,0,0,14.5,44.5,0,14.5,"",0,0,0,0,0,0,0 -"Ljubavni slucaj ili tragedija sluzbenice P.T.T.",1967,70,NA,6.1,72,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Ljubavni zivot Budimira Trajkovica",1977,100,NA,6.8,18,0,4.5,0,0,0,24.5,24.5,24.5,0,14.5,"",0,0,0,0,0,1,0 -"Ljubi, ljubi, al' glavu ne gubi",1981,90,NA,6.9,10,0,14.5,0,0,14.5,0,0,24.5,24.5,44.5,"",0,0,1,0,0,1,0 -"Ljubljana",2001,71,NA,6.1,46,14.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Llamada de apareamiento",2004,3,2000,6.4,15,4.5,0,0,0,0,24.5,4.5,0,14.5,45.5,"",0,0,1,0,0,0,1 -"Llamada del vampiro, La",1972,88,NA,2.9,20,24.5,24.5,14.5,14.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Llanto por un bandido",1964,100,NA,5.2,17,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Llorona, La",1933,73,NA,7.8,5,0,0,0,0,0,24.5,24.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Lloyd",2001,74,NA,5,149,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"PG",0,0,1,1,0,0,0 -"Lloyd's of London",1936,115,NA,7,80,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lo Sam Zayin",1987,102,NA,7.3,7,0,0,0,0,24.5,14.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Lo chiamavano Bulldozer",1978,115,NA,6.5,267,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Lo chiamavano King",1971,90,NA,4.7,6,0,14.5,0,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Lo chiamavano requiescat Fasthand",1972,85,NA,4.4,7,14.5,0,24.5,0,44.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Lo chiameremo Andrea",1972,100,NA,6.8,8,0,0,24.5,0,0,14.5,24.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Lo foo chut gang",1988,88,NA,7,199,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Lo voglio morto",1969,82,NA,5.9,13,0,4.5,4.5,4.5,4.5,14.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Loaded",1994,96,NA,4.5,226,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Loaded Gun: Life and Death and Dickinson",2002,60,NA,8,5,0,0,0,0,0,44.5,0,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Loaded Pistols",1948,70,NA,5.8,8,0,0,0,14.5,34.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Loaded Weapon 1",1993,84,13000000,5.4,6485,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Loads",1985,19,NA,6.4,6,0,0,0,0,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Loaf",1991,3,NA,3.6,76,34.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Loan Shark",1952,79,NA,7.6,13,0,0,0,0,14.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Loan Shark",1999,60,NA,2.6,5,0,24.5,0,0,0,0,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Loba y la Paloma, La",1974,90,NA,2.3,5,0,24.5,0,44.5,44.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Loba, La",1965,85,NA,3.7,8,0,14.5,14.5,0,0,14.5,0,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Lobas, Las",1986,82,NA,3.3,5,0,24.5,44.5,0,24.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Lobo Paramilitary Christmas Special, The",2002,13,2400,3.5,35,4.5,4.5,0,0,4.5,4.5,4.5,4.5,14.5,45.5,"",1,0,1,0,0,0,1 -"Lobo, El",2004,123,NA,6.7,205,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lobos de Washington, Los",1999,94,NA,6.2,81,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Lobster Man from Mars",1989,82,NA,5.5,103,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Local Boy Makes Good",1931,67,NA,5.8,23,0,0,0,4.5,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Local Hero",1983,111,NA,7.6,4715,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Local Stigmatic, The",1990,52,NA,6.9,36,4.5,0,4.5,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Locals, The",2003,88,NA,5.6,251,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Locataire, Le",1976,125,NA,7.5,2311,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Location: Far From the Madding Crowd",1967,11,NA,6.7,21,0,0,4.5,0,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Loch Ness",1996,101,NA,5,560,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Loch Ness Horror, The",1981,89,NA,1.7,26,44.5,24.5,14.5,4.5,4.5,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Lock Up",1989,115,NA,5.4,2485,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Lock Up Your Daughters!",1969,102,NA,3.8,27,4.5,14.5,14.5,4.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lock, Stock and Two Smoking Barrels",1998,126,NA,7.9,34293,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,0,0,0,0 -"Lock-Up: The Prisoners of Rikers Island",1994,75,NA,8,7,0,0,0,0,0,0,24.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Lockdown",1990,90,NA,3.5,7,0,0,44.5,14.5,0,14.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Lockdown",2000,105,NA,5.9,220,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Locked Door, The",1929,74,NA,4.3,5,0,0,24.5,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Locket, The",1946,85,NA,7,127,4.5,4.5,0,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Loco Boy Makes Good",1942,18,NA,7.5,58,4.5,0,0,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Loco veneno",1989,95,NA,7,6,0,0,0,0,34.5,14.5,0,14.5,34.5,0,"",0,0,1,0,0,0,0 -"Locomotive",1997,92,NA,8,6,0,0,0,0,0,0,34.5,45.5,14.5,0,"",1,0,0,1,0,1,0 -"Locura de amor",1948,112,NA,6.5,21,0,0,0,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Locuras del extraterrestre, Las",1988,84,NA,1.2,10,45.5,14.5,0,0,0,0,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Locusts, The",1997,124,NA,5.9,482,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Lodela",1996,26,NA,7.9,7,0,0,0,0,0,0,14.5,44.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Lodger, The",1927,101,NA,7.4,867,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lodger, The",1932,67,NA,5.8,20,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Lodger, The",1944,84,NA,7,159,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lodz Ghetto",1989,103,NA,8.6,11,0,0,4.5,0,4.5,0,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Loenatik - De moevie",2002,90,NA,6.5,134,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Loft Tapes: Student Films From Notre Dame, The",1999,110,NA,1,5,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Log of the U-35, The",1919,27,NA,6.9,7,0,0,14.5,0,14.5,14.5,14.5,0,14.5,24.5,"",0,0,0,0,1,0,1 -"Logan's Run",1976,120,9000000,6.5,5441,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Logan's Run: A Look Into the 23rd Century",1976,9,NA,6.2,42,0,0,4.5,4.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Loggerheads",2005,95,NA,3.3,66,4.5,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Loi du cochon, La",2001,96,NA,7.1,149,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Loi du survivant, La",1967,100,NA,8.3,53,0,0,0,0,0,4.5,4.5,4.5,44.5,44.5,"",0,0,0,1,0,0,0 -"Loin",2001,126,NA,6.9,177,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Loin du Bresil",1992,100,NA,6,6,14.5,0,0,0,14.5,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Loin du Vietnam",1967,120,NA,6,30,4.5,0,4.5,4.5,4.5,24.5,4.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Lokis",1970,100,NA,5.7,9,0,0,0,24.5,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Lola",1961,90,NA,7.5,264,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lola",1964,95,NA,8.2,24,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Lola",1986,106,NA,4.9,31,0,14.5,4.5,14.5,4.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Lola",1990,92,NA,5.1,15,4.5,0,0,14.5,4.5,4.5,34.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Lola + Bilidikid",1999,93,NA,7.4,249,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Lola Zipper",1991,90,NA,3.5,15,24.5,0,14.5,14.5,24.5,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Lola nos lleva al huerto, La",1984,90,NA,2.3,18,34.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Lola rennt",1998,80,NA,8.2,32791,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,1,0 -"Lola se va a los puertos, La",1993,105,NA,5.8,6,34.5,0,14.5,0,0,34.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Lola, vende ca",2002,93,NA,7.3,7,0,0,0,0,14.5,14.5,44.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Lolita",1962,152,2000000,7.6,9150,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Lolita",1997,137,58000000,6.8,5757,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Lolita 2000",1997,83,NA,4.5,67,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lollipop Cover, The",1965,82,NA,5.8,5,0,0,0,24.5,24.5,0,0,0,64.5,0,"",0,0,0,1,0,0,0 -"Lollipops",2001,8,NA,5.3,23,0,0,4.5,4.5,14.5,34.5,14.5,0,4.5,24.5,"",0,0,0,0,0,0,1 -"Lolly-Madonna XXX",1973,103,NA,5,89,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Lolo",1993,88,NA,3.4,22,14.5,4.5,0,4.5,4.5,4.5,4.5,34.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Loma",1976,113,NA,6.8,70,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lomalla",2000,85,NA,4.8,185,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Londinium",2001,87,NA,4.9,184,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"London",1971,29,NA,7.3,25,0,0,4.5,0,0,0,34.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"London",1994,85,NA,6.9,55,4.5,4.5,0,4.5,0,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"London After Midnight",1927,69,NA,7.3,94,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"London Belongs to Me",1948,112,NA,6.5,34,0,0,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"London Can Take It!",1940,9,NA,7.9,27,0,4.5,0,0,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"London Connection, The",1979,100,NA,5.4,12,4.5,0,0,0,14.5,4.5,4.5,34.5,4.5,14.5,"",1,0,0,0,0,0,0 -"London Conspiracy",1976,98,NA,6.3,10,0,0,0,0,34.5,0,14.5,14.5,0,45.5,"",0,0,1,0,0,0,0 -"London Kills Me",1991,107,NA,5.4,177,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"London Nobody Knows, The",1967,53,NA,7.8,14,0,0,0,0,0,0,14.5,0,4.5,74.5,"",0,0,0,0,0,0,0 -"London Orbital",2002,77,NA,7.1,8,0,0,0,0,14.5,0,45.5,0,24.5,14.5,"",0,0,0,0,1,0,0 -"London Rock and Roll Show, The",1973,84,NA,7.3,7,0,0,0,0,0,0,44.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"London Story",1980,15,NA,5.8,8,0,0,0,0,24.5,24.5,14.5,0,24.5,14.5,"",0,0,0,0,0,0,1 -"London Town",1946,126,NA,3.3,7,24.5,14.5,0,0,0,14.5,14.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"London by Night",1937,69,NA,7.4,7,0,0,14.5,0,24.5,0,14.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Londra chiama Polo Nord",1956,94,NA,4.4,8,0,0,0,45.5,24.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Lone Gun, The",1954,76,NA,5.9,18,0,14.5,0,14.5,24.5,24.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Lone Hand",1953,80,NA,6.1,15,4.5,0,0,14.5,14.5,24.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Lone Hero",2002,90,NA,4.9,216,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Lone Ninja Warrior",1981,93,NA,3.5,7,0,14.5,14.5,14.5,0,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Lone Prairie, The",1942,58,NA,5.1,5,0,0,0,24.5,44.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Lone Ranger Rides Again, The",1939,263,NA,7.9,10,14.5,0,0,0,14.5,24.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Lone Ranger and the Lost City of Gold, The",1958,81,NA,6.1,79,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Lone Ranger, The",1938,264,NA,6,21,0,4.5,4.5,0,4.5,0,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Lone Ranger, The",1956,86,NA,6.3,123,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Lone Rider in Ghost Town, The",1941,64,NA,5.4,6,0,14.5,0,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Lone Star",1952,94,NA,5.9,105,4.5,0,4.5,4.5,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lone Star",1996,135,5000000,7.7,8518,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Lone Star Law Men",1941,61,NA,4,6,0,14.5,0,34.5,34.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Lone Star Ranger, The",1930,64,NA,4.3,6,0,0,84.5,0,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Lone Star State of Mind",2002,88,NA,5.6,514,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Lone Stranger and Porky, The",1939,7,NA,7.1,12,0,0,0,0,4.5,4.5,45.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Lone Tiger",1998,95,NA,3.2,6,34.5,34.5,14.5,0,0,0,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Lone Wolf",1988,97,NA,3.4,38,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Lone Wolf McQuade",1983,105,5000000,5.4,721,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Lone Wolf Meets a Lady, The",1940,71,NA,5.8,6,0,0,0,34.5,0,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Lone Wolf Returns, The",1935,68,NA,6.6,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Lone Wolf Spy Hunt, The",1939,67,NA,5.6,10,0,0,14.5,14.5,34.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Lone Wolf Strikes, The",1940,57,NA,5.5,6,0,0,14.5,0,34.5,34.5,14.5,0,0,0,"",0,0,1,1,0,0,0 -"Lonedale Operator, The",1911,17,NA,6.9,101,4.5,0,4.5,0,4.5,24.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Loneliness of the Long Distance Runner, The",1962,104,NA,7.8,723,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lonely Are the Brave",1962,107,NA,7.8,764,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lonely Boy",1962,27,NA,8,26,0,4.5,0,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Lonely Guy, The",1984,90,NA,5.9,1037,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lonely Hearts",1982,106,NA,7.1,64,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Lonely Hearts",1991,109,NA,5.2,71,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lonely Lady, The",1983,92,NA,2.5,234,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lonely Man, The",1957,88,NA,5.6,57,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Lonely Passion of Judith Hearne, The",1987,110,NA,7.2,130,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lonely Trail, The",1936,56,NA,4.2,37,14.5,4.5,4.5,0,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lonely Villa, The",1909,8,NA,6,51,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Lonely Wives",1931,85,NA,6.1,42,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lonely in America",1991,96,NA,4.1,34,14.5,4.5,0,14.5,14.5,4.5,14.5,14.5,0,24.5,"",0,0,1,0,0,1,0 -"Lonelyhearts",1958,103,NA,6.4,107,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lonelyland",2002,15,7000,4.2,12,4.5,0,0,0,0,14.5,14.5,4.5,0,45.5,"",0,0,0,0,0,0,1 -"Loners, The",1972,79,NA,4.1,8,0,24.5,24.5,24.5,0,0,14.5,14.5,0,0,"",1,0,0,1,0,0,0 -"Lonesome",1928,69,NA,8.2,44,0,0,0,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Lonesome Cowboys",1969,95,NA,5,81,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Lonesome Ghosts",1937,9,NA,7.9,107,0,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Lonesome Jim",2005,91,500000,4.1,96,4.5,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Lonesome Joe",2003,13,NA,6.2,10,0,0,0,0,0,34.5,14.5,0,34.5,34.5,"",0,0,1,0,0,0,1 -"Lonesome Lenny",1946,8,NA,8,33,0,0,0,4.5,0,4.5,24.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Lonesome Mouse, The",1943,8,NA,6.4,20,0,0,4.5,14.5,0,24.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Lonesome Stranger, The",1940,9,NA,7.6,12,0,0,0,0,0,0,14.5,34.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Lonesome Stranger, The",1946,11,NA,5.3,5,0,0,0,24.5,0,24.5,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Lonesome Trail, The",1955,73,NA,3.4,12,34.5,0,0,0,0,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Long Arm, The",1956,96,NA,6.9,54,0,0,0,4.5,4.5,14.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Long Dark Hall, The",1951,86,NA,5.8,19,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Long Day Closes, The",1992,85,NA,6.7,206,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Long Day's Dying, The",1968,95,NA,6.6,75,0,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Long Day's Journey Into Night",1962,170,NA,7.8,629,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Long Day's Journey Into Night",1996,173,NA,8.5,64,4.5,0,4.5,0,4.5,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Long Division",1999,13,NA,7.4,5,24.5,0,0,0,0,0,0,0,84.5,0,"",0,0,0,0,0,0,1 -"Long Duel, The",1967,115,NA,5.6,55,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Long Gone",2003,90,NA,7.7,27,0,0,0,4.5,0,4.5,14.5,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Long Good Friday, The",1980,114,NA,7.5,2092,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Long Goodbye, The",1973,112,NA,7.4,1780,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Long Gray Line, The",1955,138,1748000,6.9,364,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Long Haul, The",1957,100,NA,7.1,11,0,0,0,0,14.5,4.5,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Long Hello and Short Goodbye",1999,95,NA,5.7,105,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Long Island Cannibal Massacre",1980,95,NA,2.8,26,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Long Jeanne Silver",1977,62,NA,5.3,17,4.5,4.5,14.5,0,24.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Long John Silver",1954,106,NA,5.8,53,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Long Kiss Goodnight, The",1996,120,65000000,6.5,12516,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Long Life, Happiness & Prosperity",2002,90,NA,6.4,116,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Long Lost Father",1934,68,NA,3.7,6,0,0,14.5,34.5,14.5,0,0,34.5,0,0,"",0,0,0,1,0,0,0 -"Long Lost Love",2001,93,NA,5,8,0,14.5,0,14.5,0,24.5,14.5,0,24.5,14.5,"",0,0,1,1,0,1,0 -"Long Memory, The",1952,96,NA,6.7,50,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Long Night's Journey Into Day",2000,94,NA,8.1,76,4.5,0,0,4.5,0,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Long Night, The",1947,93,NA,6.8,83,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Long Pants",1927,60,NA,7.1,41,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Long Riders, The",1980,99,10000000,7,1190,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Long Road Home, The",1999,88,NA,4.8,16,4.5,0,0,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Long Run, The",2000,112,NA,5.3,73,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Long Shadow, The",1992,80,NA,6,19,0,14.5,14.5,14.5,4.5,14.5,34.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Long Ships, The",1963,126,NA,5.8,295,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Long Shot",1980,85,NA,5.4,10,14.5,0,0,0,45.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Long Strange Trip, or The Writer, the Naked Girl, and the Guy with a Hole in His Head",1999,81,NA,4.4,15,4.5,0,4.5,14.5,24.5,0,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Long Time Dead",2002,95,NA,4.9,1215,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Long Time Since",1997,89,NA,4.1,42,24.5,0,0,4.5,0,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Long Voyage Home, The",1940,105,NA,6.6,360,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Long Wait, The",1954,94,NA,7,11,0,0,0,4.5,0,14.5,4.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Long Walk Home, The",1990,97,NA,7,528,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Long Way Home, The",1997,120,NA,7.7,126,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Long Weekend",1978,92,NA,5.7,95,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Long Weekend (O'Despair), The",1989,87,NA,6,7,24.5,14.5,14.5,0,14.5,0,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Long Weekend, The",1994,82,NA,5.7,9,44.5,0,0,0,24.5,14.5,24.5,0,0,0,"R",0,0,0,0,0,0,0 -"Long and Short of It, The",2003,5,NA,6.6,812,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Long and the Short and the Tall, The",1960,110,NA,6,94,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Long de xin",1985,91,NA,5.7,341,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,1,1,0,0,0 -"Long feng zei zhuo zei",1990,90,NA,6,9,0,0,0,14.5,14.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Long hu dou",1970,90,NA,6.7,24,0,0,0,0,24.5,14.5,34.5,24.5,4.5,0,"",1,0,0,1,0,0,0 -"Long hu feng yun",1987,101,NA,7.1,779,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Long hu men",1979,85,NA,3.6,18,4.5,14.5,14.5,0,0,4.5,24.5,24.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Long ji mao",1985,60,NA,5.5,9,14.5,0,0,0,0,24.5,14.5,14.5,0,44.5,"",0,1,0,0,0,1,0 -"Long maan saat sau Zi jau jan",1990,92,NA,6.4,21,0,0,14.5,0,4.5,4.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Long quan",1979,94,NA,5.5,174,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Long teng hu yue",1983,92,NA,4.2,151,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Long xiao ye",1982,90,NA,6.5,304,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Long xie shi san ying",1978,90,NA,7.8,19,0,0,0,0,0,0,14.5,64.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Long xing tian xia",1989,89,NA,4.7,230,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Long zai Shaolin",1996,89,NA,6.3,24,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Long zai bian yuan",1999,90,NA,5,50,4.5,0,14.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Long zai jiang hu",1986,105,NA,5.5,98,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Long zai jiang hu",1998,112,NA,5.6,50,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Long zai tian ya",1988,96,NA,4.8,49,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Long zhi ren zhe",1982,95,NA,7.6,161,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Long zhi zheng ba",1989,104,NA,3,14,24.5,14.5,0,14.5,0,0,24.5,24.5,4.5,0,"",1,0,0,0,0,0,0 -"Long, Hot Summer, The",1958,115,NA,7.2,1016,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Long, Long Trailer, The",1954,103,NA,6.6,557,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Long-Haired Hare",1949,8,NA,8.1,172,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Longe da Vista",1998,87,NA,6.6,16,4.5,0,0,0,0,34.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Longest Day, The",1962,180,8000000,7.7,6517,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Longest Most Meaningless Movie in the World, The",1970,2880,NA,6.4,15,44.5,0,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Longest Night, The",1936,51,NA,6.4,15,0,0,0,0,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Longest Yard, The",1974,122,NA,7.1,1944,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Longs manteaux, Les",1986,106,NA,5.5,17,4.5,4.5,0,14.5,14.5,24.5,24.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Longshot",2000,93,NA,2.4,316,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Longshot, The",1986,89,NA,4.9,116,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Longshots",1994,60,NA,7.7,7,0,0,0,0,0,0,44.5,44.5,14.5,0,"",0,0,0,0,1,0,0 -"Longxiong hudi",1986,86,NA,6.4,1217,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Lontano in fondo agli occhi",2000,99,NA,4.5,26,14.5,0,14.5,4.5,14.5,24.5,4.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Look",2001,11,NA,6.7,13,0,0,0,0,4.5,0,44.5,34.5,4.5,0,"",0,0,0,0,0,0,1 -"Look Back at Crossbow, A",1965,10,NA,6.2,15,0,0,4.5,0,4.5,44.5,24.5,4.5,0,14.5,"",0,0,0,0,1,0,1 -"Look Back in Anger",1980,100,NA,6.4,20,0,0,4.5,14.5,14.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Look Back, Don't Look Back",1999,30,NA,4.5,19,14.5,0,4.5,14.5,24.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Look Me in the Eye",1994,80,NA,3.7,22,4.5,4.5,4.5,0,34.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Look Up and Laugh",1935,80,NA,8.2,12,0,0,0,0,0,0,0,24.5,4.5,64.5,"",0,0,1,0,0,0,0 -"Look Who's Laughing",1941,79,NA,5.9,54,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Look Who's Talking",1989,93,7500000,5.5,10847,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Look Who's Talking Now",1993,96,NA,3.6,3733,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Look Who's Talking Too",1990,81,NA,3.7,6813,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Look at Life",1965,1,NA,5.8,46,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Look at Liv, A",1979,67,NA,6.5,5,0,0,0,0,24.5,0,0,0,24.5,64.5,"",0,0,0,0,1,0,0 -"Look at the World of SOYLENT GREEN, A",1973,10,NA,6,28,0,0,14.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Look for the Silver Lining",1949,106,NA,5.9,51,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Look in Any Window",1961,87,NA,5,10,0,24.5,0,14.5,0,24.5,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Looker",1981,93,NA,5.7,693,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lookin' Italian",1998,97,NA,5.1,49,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Lookin' to Get Out",1982,105,17000000,3.6,83,4.5,14.5,14.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Looking Forward",1933,82,NA,6.2,27,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Looking Glass War, The",1969,108,NA,5.3,87,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Looking Out",2002,15,42000,9.4,10,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,1,0,0,1,1 -"Looking Through Lillian",2002,98,NA,6.1,164,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Looking Up",1977,94,NA,9.1,23,0,0,0,0,0,0,0,24.5,44.5,34.5,"",0,0,1,1,0,0,0 -"Looking at London",1946,10,NA,6.4,12,0,4.5,0,0,4.5,44.5,4.5,24.5,0,4.5,"",0,0,0,0,1,0,1 -"Looking for Alibrandi",2000,103,NA,7.5,657,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Looking for Angelina",2005,85,NA,6.3,7,14.5,14.5,0,14.5,0,0,14.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Looking for Chencho",2002,23,NA,6,5,0,0,0,0,0,64.5,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Looking for Danger",1957,62,NA,5.6,6,0,0,0,0,34.5,14.5,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Looking for Jimmy",2002,90,NA,4.9,14,24.5,0,4.5,4.5,4.5,14.5,0,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Looking for Kitty",2004,95,NA,8.1,9,14.5,14.5,0,0,0,0,0,0,0,74.5,"",0,0,0,0,0,0,0 -"Looking for Langston",1988,45,NA,6.8,44,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Looking for Leonard",1999,87,NA,6.1,59,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Looking for Lola",1998,99,NA,3.8,95,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"Looking for Love",1964,85,NA,5.1,26,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Looking for Mr. Goodbar",1977,135,NA,6.1,1235,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Looking for My Brother",2003,55,NA,5.6,5,0,0,0,0,24.5,24.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Looking for Richard",1996,111,NA,7.3,2602,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,1,0,0 -"Looking for Trouble",1934,80,NA,4.8,6,0,14.5,0,0,14.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Looking for Trouble",1996,79,NA,4.8,5,24.5,24.5,24.5,0,0,0,0,24.5,0,24.5,"PG",0,0,0,0,0,0,0 -"Looking for an Echo",2000,97,NA,6.1,105,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Looks Can Kill",1994,1,NA,5.9,5,0,0,0,24.5,0,0,24.5,44.5,0,24.5,"",0,1,0,0,0,0,1 -"Looks and Smiles",1981,104,NA,6.8,27,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lool",1988,94,NA,7.7,12,4.5,0,0,0,0,0,4.5,4.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Loon Dreaming",2002,6,NA,5.1,7,0,0,24.5,0,24.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Looney Tunes: Back in Action",2003,91,80000000,6.1,2559,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",1,1,1,0,0,0,0 -"Looney, Looney, Looney Bugs Bunny Movie, The",1981,79,NA,6.6,207,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Loons",1991,80,NA,5,5,44.5,0,0,0,0,0,24.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Looosers!",1995,86,NA,7.8,25,4.5,0,0,14.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Loophole",1954,80,NA,6.8,7,0,0,0,0,0,24.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Loophole",1981,99,NA,5.1,68,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Loops",1940,3,NA,6.1,8,0,0,0,24.5,14.5,0,24.5,14.5,24.5,0,"",0,1,0,0,0,0,1 -"Loos",1989,90,NA,5.9,41,0,0,14.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Loose Ankles",1930,67,NA,6.2,28,0,0,4.5,14.5,14.5,14.5,34.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Loose Cannons",1990,94,NA,4,752,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Loose Connections",1983,96,NA,5.4,15,0,0,0,24.5,0,14.5,4.5,44.5,24.5,0,"",0,0,1,0,0,0,0 -"Loose Ends",2003,9,NA,4.9,10,34.5,14.5,0,0,24.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Loose Ends IV",1988,108,NA,5,68,44.5,0,0,0,45.5,4.5,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Loose Loot",1953,16,NA,7.8,32,0,0,0,0,0,4.5,24.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Loose Screws",1985,88,NA,3.2,83,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Loose Shoes",1980,84,NA,5.2,85,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Loose Women",1996,87,NA,3.5,34,14.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Loose in London",1953,62,NA,6.7,29,0,0,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Loot",1970,101,NA,5.5,44,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Looters, The",1955,87,NA,6.4,6,0,0,0,14.5,14.5,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Lord Byron of Broadway",1930,77,NA,4.5,18,4.5,14.5,14.5,14.5,4.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Lord Camber's Ladies",1932,80,NA,5.8,14,0,0,4.5,14.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Lord Epping Returns",1951,19,NA,6.4,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Lord Jeff",1938,85,NA,6.4,30,0,0,0,4.5,4.5,34.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lord Jim",1965,154,NA,6.5,458,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lord Love a Duck",1966,105,NA,6.5,257,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Lord of Illusions",1995,120,NA,5.3,2091,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Lord of the Flies",1963,92,NA,7.1,1650,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Lord of the Flies",1990,90,NA,5.9,2260,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lord of the Jungle",1955,69,NA,6.7,10,0,0,14.5,0,14.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lord of the Rings, The",1978,132,8000000,5.8,5734,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Lord of the Rings: The Fellowship of the Ring, The",2001,208,93000000,8.8,157608,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"PG-13",1,0,0,0,0,0,0 -"Lord of the Rings: The Return of the King, The",2003,251,94000000,9,103631,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"PG-13",1,0,0,0,0,0,0 -"Lord of the Rings: The Two Towers, The",2002,223,94000000,8.8,114797,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG-13",1,0,0,0,0,0,0 -"Lord of the Road",1999,24,NA,7.4,12,0,0,0,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Lord of the Undead",2004,86,NA,4.5,17,34.5,14.5,4.5,0,14.5,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Lord's of Flatbush, The",1974,86,NA,5.5,523,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lords of Discipline, The",1983,102,NA,6.5,543,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lords of Magick, The",1989,98,NA,2.8,13,34.5,14.5,14.5,0,4.5,4.5,0,4.5,14.5,0,"",0,0,1,0,0,0,0 -"Lorenzo's Oil",1992,129,NA,6.9,2650,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lorna",1964,78,60000,4.9,138,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lorna Doone",1922,70,NA,7.3,39,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Lorna Doone",1935,90,NA,6.1,13,0,0,0,0,14.5,45.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Lorna Doone",1951,88,NA,5.1,22,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Los",2001,90,NA,6.9,13,4.5,0,0,0,14.5,4.5,0,34.5,34.5,4.5,"",0,0,0,0,1,0,0 -"Los Angeles Plays Itself",2003,169,NA,7.1,100,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Los Angeles Streetfighter",1985,85,NA,4.2,38,24.5,4.5,14.5,4.5,14.5,0,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Los Angeles: 'Wonder City of the West'",1935,9,NA,6,7,0,0,14.5,0,24.5,0,14.5,24.5,0,14.5,"",0,0,0,0,1,0,1 -"Los Enchiladas!",1999,75,NA,6.1,42,4.5,0,4.5,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,1,0,0,0,0 -"Los Locos",1997,99,NA,5.2,79,24.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Los Zafiros: Music from the Edge of Time",2003,79,NA,3.5,8,0,0,14.5,0,0,0,0,14.5,64.5,14.5,"",0,0,0,0,1,0,0 -"Los que tocan el piano",1968,96,NA,5.5,11,0,0,0,0,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Loser",1991,84,NA,4.4,12,4.5,0,4.5,0,0,0,4.5,24.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Loser",1996,85,38000,7.2,70,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Loser",2000,92,20000000,5.1,5152,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Losers Lounge",2003,87,NA,5.7,17,4.5,14.5,14.5,14.5,0,4.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Losers, The",1968,75,NA,2.2,7,24.5,0,0,0,24.5,0,0,14.5,0,24.5,"",1,0,0,0,0,0,0 -"Losin' It",1983,100,7000000,4.5,645,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Losing Control",1998,93,NA,3.6,42,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Losing Ground",1982,86,NA,9.1,7,0,0,0,14.5,0,0,0,0,0,84.5,"",0,0,1,0,0,0,0 -"Losing Isaiah",1995,111,17000000,6.1,794,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Losing Lois Lane",2004,20,6000,7.1,24,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,0,44.5,"",0,0,1,0,0,0,1 -"Loss of Nameless Things, The",2004,103,NA,8.6,7,0,0,0,0,0,24.5,0,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Loss of Sexual Innocence, The",1999,106,4000000,5.3,977,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Lost",1955,89,NA,5.7,36,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Lost",1983,92,NA,1,15,64.5,4.5,0,0,14.5,0,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Lost",2000,13,NA,5.6,11,4.5,0,0,0,44.5,24.5,4.5,0,4.5,0,"",0,0,0,0,0,0,1 -"Lost Angel",1943,91,NA,7,56,0,0,0,0,4.5,14.5,34.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Lost Angeles",2000,90,NA,6.2,8,0,14.5,0,0,14.5,0,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Lost Angels",1989,116,NA,5.6,209,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lost Battalion",1961,83,NA,4.8,8,14.5,14.5,14.5,24.5,24.5,0,0,0,14.5,0,"",1,0,0,1,0,0,0 -"Lost Book Found",1996,35,NA,7.5,21,0,0,0,0,4.5,0,14.5,14.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Lost Boundaries",1949,99,250000,6.9,15,0,0,0,0,0,24.5,4.5,64.5,0,0,"",0,0,0,1,0,0,0 -"Lost Boys of Sudan",2003,87,NA,7.5,87,0,0,0,4.5,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Lost Boys, The",1987,97,NA,6.7,11294,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lost Canyon",1942,61,NA,6.8,19,0,0,0,24.5,0,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Lost Cause",2000,7,NA,4.6,14,14.5,4.5,0,14.5,0,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Lost Chick, The",1935,10,NA,4.2,5,0,0,24.5,0,64.5,0,0,0,0,24.5,"",0,1,0,0,0,0,1 -"Lost Children of Berlin, The",1997,50,NA,6.3,25,24.5,0,0,14.5,0,0,4.5,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Lost City of the Jungle",1946,265,NA,5.8,10,14.5,0,0,0,14.5,44.5,14.5,34.5,0,0,"",1,0,0,0,0,0,0 -"Lost Command",1966,129,NA,6.4,146,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lost Continent",1951,83,NA,3.4,180,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lost Continent, The",1968,89,NA,5.7,191,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lost Dream, The",1949,8,NA,6.1,5,0,0,0,0,0,64.5,24.5,0,24.5,0,"",0,1,0,0,0,0,1 -"Lost Empire, The",1983,83,NA,4.5,84,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Lost Girl",2000,40,NA,3.9,8,14.5,0,0,0,0,0,0,0,24.5,64.5,"",0,0,0,0,0,0,1 -"Lost Highway",1997,135,15000000,7.3,15936,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Lost Horizon",1937,118,2000000,7.7,2103,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Lost Horizon",1973,150,12000000,4.4,436,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Lost Hours, The",1952,67,NA,6.2,5,0,0,0,0,0,84.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Lost Hurl, The",1997,6,NA,1.5,8,34.5,0,0,0,0,14.5,0,0,0,45.5,"",0,1,1,0,0,0,1 -"Lost Idol, The",1990,103,NA,3.4,12,45.5,4.5,4.5,0,0,4.5,4.5,0,4.5,0,"",1,0,0,1,0,0,0 -"Lost In La Mancha",2002,89,NA,7.4,2112,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",0,0,0,0,1,0,0 -"Lost Junction",2003,95,NA,5.1,203,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Lost Killers",2000,98,NA,6.3,62,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lost Lady, A",1934,61,NA,5.3,21,4.5,0,0,4.5,24.5,24.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Lost Man, The",1969,122,NA,5.4,18,0,0,4.5,4.5,34.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lost Missile, The",1958,70,NA,4.7,19,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Lost Moment, The",1947,89,NA,7.2,59,0,4.5,0,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Lost Patrol, The",1934,66,254000,7.4,276,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lost Planet Airmen",1951,65,NA,5.6,12,0,4.5,24.5,4.5,4.5,24.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Lost Platoon, The",1991,86,NA,4.2,29,14.5,14.5,14.5,14.5,14.5,4.5,14.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Lost Skeleton of Cadavra, The",2001,90,NA,6.7,717,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG",0,0,1,0,0,0,0 -"Lost Son, The",1999,102,NA,6.7,396,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Lost Souls",2000,97,28000000,4.6,3423,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Lost Squadron, The",1932,79,NA,6.3,55,0,4.5,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lost Stooges, The",1990,55,NA,5.6,12,14.5,0,0,0,0,0,45.5,4.5,0,14.5,"",0,0,1,0,1,0,0 -"Lost Things",2003,83,NA,5.8,82,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lost Treasure",2003,85,NA,3.9,71,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Lost Treasure of Sawtooth Island, The",1999,92,NA,4.7,37,14.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,4.5,24.5,"PG",0,0,0,0,0,0,0 -"Lost Tribe, The",1949,72,NA,5.2,23,4.5,0,14.5,4.5,4.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Lost Tribe, The",1983,114,NA,3.6,13,0,4.5,14.5,34.5,4.5,4.5,4.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Lost Volcano, The",1950,67,NA,5.8,13,0,0,0,4.5,34.5,4.5,24.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Lost Weekend",1999,35,NA,5.8,22,0,0,0,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Lost Weekend, The",1945,101,1250000,8.1,2661,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Lost World, The",1925,93,NA,7,376,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lost World, The",1960,97,NA,4.9,275,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lost World, The",1992,99,NA,4.6,124,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lost World, The",1998,97,NA,3.8,247,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Lost World: Jurassic Park, The",1997,129,73000000,5.5,28055,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Lost Worlds: Life in the Balance",2001,40,NA,8.2,26,0,0,0,0,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Lost and Delirious",2001,103,NA,7,2917,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Lost and Found",1979,106,NA,4.5,49,14.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lost and Foundling",1944,8,NA,5.9,11,0,4.5,0,4.5,4.5,44.5,4.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Lost and Foundry",1937,7,NA,6.1,18,0,14.5,14.5,0,14.5,14.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Lost at Sea",1995,90,NA,5.8,12,4.5,4.5,0,0,0,0,14.5,14.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Lost in Africa",1994,100,NA,4,62,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Lost in Alaska",1952,80,672000,5.4,183,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Lost in America",1985,91,NA,6.8,1244,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Lost in Space",1998,130,80000000,4.7,15209,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Lost in Translation",2003,102,4000000,8,42450,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Lost in Yonkers",1993,114,NA,6.3,531,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lost in a Harem",1944,89,NA,5.7,105,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lost in the Pershing Point Hotel",2000,107,NA,4.7,39,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Lost in the Stars",1974,97,NA,5.7,17,4.5,0,0,14.5,14.5,14.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Lost in the Stratosphere",1934,64,NA,3.6,6,0,14.5,14.5,14.5,45.5,0,0,0,0,0,"",0,0,1,1,0,0,0 -"Lost on the Bohemian Road",1995,89,NA,5.9,11,0,4.5,4.5,0,14.5,4.5,4.5,4.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Lost!",1986,95,NA,5.9,15,4.5,0,0,14.5,4.5,24.5,14.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Lost, Lonely and Vicious",1958,73,NA,3.9,14,0,4.5,44.5,14.5,4.5,0,0,0,24.5,4.5,"",0,0,0,1,0,0,0 -"Lost, Lost, Lost",1976,178,NA,6.4,9,24.5,0,0,0,0,34.5,0,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Lost/Found",2003,70,15000,8.4,15,14.5,0,0,0,0,0,0,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Lot",2003,18,NA,4.7,7,0,0,0,24.5,14.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Lot Like Love, A",2005,107,30000000,4.6,786,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Lot in Sodom",1933,28,NA,5.4,36,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Loteling, De",1973,93,NA,6.8,32,0,4.5,0,0,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lothringen!",1994,21,NA,5.8,6,0,34.5,0,0,14.5,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Lotna",1959,90,NA,6.4,25,4.5,0,0,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lotrando a Zubejda",1997,106,NA,6.9,41,4.5,4.5,0,0,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lotte in Italia",1971,76,NA,7.2,7,24.5,0,14.5,0,0,0,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Lotte in Weimar",1974,125,NA,7.1,7,0,0,0,0,14.5,0,24.5,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Lottery Bride, The",1930,80,NA,5.7,17,0,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Lottery, The",1969,20,NA,6.8,16,4.5,0,0,0,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Lottery, The",1987,3,NA,6.3,31,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Lotto Land",1995,87,NA,6.5,12,0,4.5,0,0,4.5,24.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lottovoittaja UKK Turhapuro",1976,88,NA,5.8,105,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lotus Blossom",1921,70,NA,5.3,5,24.5,0,0,0,24.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Lotus Eaters, The",1993,101,NA,5.9,73,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lou Reed: Rock and Roll Heart",1998,73,NA,7.7,61,4.5,0,0,0,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Loufa kai parallaghi",1984,99,NA,8.9,215,4.5,4.5,4.5,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Louie Bluie",1986,75,NA,8.5,29,0,0,4.5,0,4.5,4.5,4.5,24.5,0,64.5,"",0,0,0,0,1,0,0 -"Louie the Fly",1999,3,NA,5.2,8,14.5,0,0,24.5,14.5,34.5,0,14.5,0,0,"",0,1,0,0,0,0,1 -"Louis & Frank",1998,87,NA,3,46,34.5,24.5,4.5,4.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,1,1,0,0,0 -"Louis 19, le roi des ondes",1994,95,NA,6.1,209,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Louis Armstrong: Satchmo",2000,90,NA,7.9,8,0,0,0,0,14.5,14.5,0,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Louis Prima: The Wildest!",1999,90,NA,6.4,35,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Louis, enfant roi",1993,160,NA,7.1,55,4.5,0,0,4.5,4.5,4.5,24.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Louisa",1950,90,NA,4.6,43,14.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Louisa, een woord van liefde",1972,109,NA,5,8,0,0,14.5,14.5,14.5,34.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Louise",1939,83,NA,6.4,5,0,0,0,0,0,24.5,0,64.5,24.5,0,"",0,0,0,0,0,0,0 -"Louise (Take 2)",1998,115,NA,6.8,121,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Louise... l'insoumise",1985,95,NA,6.4,5,0,0,0,0,24.5,0,24.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Louisiana Purchase",1941,98,NA,6.4,68,0,0,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Louisiana Story",1948,78,258000,7.7,147,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,1,0,0 -"Louisville",1998,19,NA,6.3,8,0,0,0,0,14.5,14.5,34.5,0,24.5,14.5,"",0,0,0,1,0,0,1 -"Loulou",1980,101,NA,6.7,210,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Loulou",2003,29,NA,7.1,10,0,0,0,0,0,14.5,45.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Loulou Graffiti",1991,90,NA,5.6,11,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Lounge Bar, The",1989,12,NA,6.1,28,4.5,0,4.5,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Lourdes de segunda mano",1995,17,NA,4.7,8,45.5,0,24.5,0,0,0,0,24.5,0,0,"",0,0,1,0,0,0,1 -"Loustrakos, O",1962,92,NA,6,6,0,14.5,0,14.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Louves, Les",1957,101,NA,8.2,6,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Louvre Come Back to Me!",1962,6,NA,7.2,34,0,4.5,0,0,4.5,24.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Lovable Cheat, The",1949,75,NA,6.1,8,0,0,0,14.5,24.5,14.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Love",1919,23,NA,8.1,7,0,0,0,0,0,0,44.5,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Love",1982,105,NA,5.8,5,0,0,24.5,0,24.5,24.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Love",2003,104,NA,8,10,14.5,0,0,0,0,0,14.5,34.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Love",2005,90,350000,7.8,12,4.5,0,0,0,4.5,4.5,4.5,4.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Love $ Greed",1991,89,NA,4.8,5,0,24.5,24.5,0,24.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Love & Basketball",2000,124,15000000,6.7,2093,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,1,0 -"Love & Human Remains",1993,100,NA,6.7,854,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Love & Pop",1998,110,NA,7,107,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Love & Sex",2000,75,NA,6,1371,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Love & Valour",2003,80,NA,6,9,14.5,0,0,14.5,0,0,14.5,14.5,14.5,44.5,"",1,0,0,1,0,0,0 -"Love 'Em and Leave 'Em",1926,62,NA,6.9,17,4.5,0,0,14.5,0,4.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Love 101",2000,86,NA,3.9,43,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Love Actually",2003,129,NA,7.7,21918,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Love Addict (Offenbach)",1985,5,NA,5.7,5,0,0,0,0,24.5,0,84.5,0,0,0,"",0,0,0,0,0,0,1 -"Love Affair",1932,68,NA,6.3,21,0,0,4.5,14.5,4.5,34.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Love Affair",1939,87,NA,7.4,416,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Love Affair",1994,108,NA,5.6,1162,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Love After Death",1968,72,NA,2.8,11,44.5,4.5,4.5,0,0,4.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Love Among the Millionaires",1930,74,NA,6.1,6,0,0,0,14.5,0,0,45.5,0,0,34.5,"",0,0,1,0,0,1,0 -"Love Before Breakfast",1936,70,NA,6.7,17,0,0,0,0,24.5,14.5,44.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Love Begins at Twenty",1936,58,NA,5.9,14,0,0,0,24.5,14.5,4.5,14.5,14.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Love Bites",1993,98,NA,4.5,105,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Love Bites",1999,13,NA,6.1,40,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Love Box, The",1972,90,NA,1.9,6,34.5,0,0,0,34.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Love Bug, The",1968,103,NA,6.1,1649,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Love Business",1931,20,NA,8.2,34,0,0,0,0,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Love Butcher, The",1975,85,NA,5,22,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Love Camp 7",1969,96,NA,4.3,56,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Love Child",1982,96,NA,5.1,57,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Love Child",1995,23,NA,6.1,65,4.5,0,0,4.5,24.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Love Chronicles",2003,78,NA,7.5,6,0,0,14.5,14.5,0,0,0,14.5,0,45.5,"R",0,0,0,0,0,0,0 -"Love Come Down",2000,99,NA,5.4,99,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Love Comes Quietly",1973,113,NA,4,16,4.5,0,14.5,14.5,14.5,24.5,0,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Love Crazy",1941,99,NA,7.4,231,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Love Crimes",1992,90,NA,3.9,260,34.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Love Crimes of Gillian Guess, The",2004,91,NA,4.7,29,14.5,4.5,14.5,4.5,4.5,24.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Love Cult, The",1970,65,NA,2.5,13,14.5,24.5,4.5,24.5,4.5,0,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Love Disease",2000,108,60000,8.6,46,0,0,0,4.5,0,4.5,4.5,34.5,34.5,14.5,"",0,0,1,0,0,1,0 -"Love Divided, A",1999,98,NA,7,94,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Love Don't Cost a Thing",2003,100,NA,4.1,689,24.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Love Dream",1989,97,NA,2.7,58,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Love Feast, The",1969,63,NA,2.2,39,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Love Field",1992,102,NA,6.6,609,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Love Finds Andy Hardy",1938,91,NA,6.8,177,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Love From Ground Zero",1998,102,NA,6.3,15,0,0,14.5,4.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Love God",1997,82,22000,4,35,14.5,4.5,14.5,14.5,0,4.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Love God?, The",1969,101,NA,5.7,87,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Love Goddesses, The",1965,87,NA,7.2,129,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Love Goggles",1999,120,NA,3.9,20,24.5,14.5,14.5,14.5,24.5,0,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Love Happens",1999,88,NA,5.7,56,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Love Happy",1949,85,NA,5.6,363,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Love Hurts",1991,106,NA,5.2,42,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Love In a 4 Letter World",1970,93,NA,4.4,8,0,14.5,24.5,14.5,0,34.5,14.5,0,0,0,"",0,0,1,1,0,0,0 -"Love In the Time of Money",2002,90,NA,5.5,138,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Love Is All",1999,3,NA,5.6,16,4.5,0,0,14.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Love Is All There Is",1996,120,NA,4.1,211,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Love Is Better Than Ever",1952,78,NA,5.5,42,0,0,4.5,14.5,14.5,34.5,14.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Love Is Like That",1993,93,NA,4.9,31,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Love Is News",1937,72,NA,7,22,0,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Love Is War",1970,96,NA,3.1,9,0,44.5,24.5,14.5,14.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Love Is a Ball",1963,111,NA,5.2,57,0,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Love Is a Headache",1938,73,NA,7,19,4.5,0,14.5,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Love Is a Many-Splendored Thing",1955,102,NA,6.5,551,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Love Is a Racket",1932,71,NA,5.7,49,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Love Is a Splendid Illusion",1969,86,NA,6.2,7,14.5,14.5,0,0,14.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Love Is a Treasure",2002,55,NA,6.2,8,0,0,0,0,0,64.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Love Is on the Air",1937,62,NA,3.5,33,24.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Love Is the Devil: Study for a Portrait of Francis Bacon",1998,90,NA,6.4,491,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Love Is the Law",2003,6,NA,6.1,17,4.5,0,0,0,24.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Love Jones",1997,104,NA,6.4,497,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Love Kills",1998,91,NA,3.4,87,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Love Laughs at Andy Hardy",1947,93,NA,5.4,64,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Love Lesson, The",1995,87,NA,4.2,5,24.5,24.5,24.5,0,0,0,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Love Letter",1995,117,NA,7.6,996,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG",0,0,0,1,0,1,0 -"Love Letter",1998,108,NA,7.7,23,0,4.5,0,0,4.5,4.5,24.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Love Letter to Edie",1975,14,NA,6.8,29,4.5,0,0,4.5,0,0,24.5,24.5,0,44.5,"",0,0,0,0,1,0,1 -"Love Letter to Steve McQueen, A",2002,7,NA,3,12,45.5,0,0,14.5,0,4.5,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Love Letter, The",1999,88,15000000,5.2,1258,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Love Letters",1945,101,NA,7.3,182,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"PG-13",0,0,0,1,0,1,0 -"Love Letters",1984,98,550000,6.1,158,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Love Letters from Teralba Road, The",1977,50,NA,6.1,5,0,0,0,0,0,24.5,24.5,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Love Letters: A Romantic Trilogy",2001,96,NA,3.7,7,0,14.5,14.5,14.5,0,0,0,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Love Life",2001,95,NA,8.6,144,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,34.5,"",0,0,1,0,0,1,0 -"Love Light, The",1921,89,NA,6.9,66,0,0,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Love Liza",2002,90,1000000,6.6,1588,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Love Lottery, The",1954,89,NA,4.9,24,0,14.5,4.5,4.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Love Machine, The",1971,108,NA,3.5,53,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Love Match, The",1955,85,NA,8,12,4.5,0,0,0,0,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Love Math",2005,10,NA,8.2,5,0,0,0,0,24.5,0,24.5,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Love Me Deadly",1973,95,NA,4.1,31,14.5,4.5,4.5,4.5,34.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Love Me Forever",1935,91,NA,8.9,7,14.5,0,0,0,0,14.5,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Love Me Tender",1956,89,1000000,5.6,442,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Love Me Tonight",1932,88,NA,8,321,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Love Me Twice",1996,81,NA,2.9,22,4.5,14.5,34.5,14.5,4.5,4.5,0,0,4.5,0,"R",0,0,0,0,0,0,0 -"Love Me or Leave Me",1955,122,NA,7.2,452,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Love Me or Leave Me Alone",2003,15,NA,6.4,22,0,0,4.5,0,4.5,14.5,44.5,14.5,0,4.5,"",0,0,0,0,0,1,1 -"Love Me, Love My Mouse",1966,6,NA,4.9,22,4.5,4.5,0,14.5,14.5,34.5,4.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Love Nest",1951,84,NA,5.9,60,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Love Nest on Wheels",1937,20,NA,6.8,6,0,0,0,0,14.5,14.5,0,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Love Nest, The",1923,23,NA,7.1,165,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Love Never Dies",1921,60,NA,6.3,20,0,0,0,4.5,14.5,34.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Love Object",2003,88,1000000,6.3,427,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Love On Tap",1939,11,NA,5.3,9,14.5,14.5,14.5,0,24.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Love Parade, The",1929,107,650000,7.1,96,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Love Philosophy",2001,89,NA,5.6,7,14.5,14.5,0,14.5,14.5,0,0,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Love Pill, The",1971,82,NA,4.1,6,45.5,0,14.5,0,14.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Love Potion No. 9",1992,92,NA,5.3,2273,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Love Serenade",1996,101,NA,6.8,492,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Love Slaves",1976,87,NA,6,6,0,0,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Love Slaves of the Amazon",1957,81,NA,5.4,7,0,0,0,44.5,0,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Love Song for Bobby Long, A",2004,119,NA,6.7,721,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Love Song of Henry Milk, The",2001,12,NA,5.2,23,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Love Stinks",1999,94,4000000,5.3,1311,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Love Story",1944,113,NA,6.5,48,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Love Story",1970,99,2200000,6.2,2844,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,1,0,1,0 -"Love Story: Berlin 1942",1997,48,NA,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,0,0,1,0,0 -"Love Streams",1984,141,NA,7.4,229,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Love That Boy",2003,85,NA,6.6,112,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Love That Brute",1950,86,NA,5.1,6,14.5,0,0,0,14.5,14.5,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Love That Pup",1949,8,NA,6.2,23,0,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Love Thy Brother",2002,10,NA,5.9,24,0,0,4.5,4.5,14.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Love Thy Neighbor",1940,82,NA,7.6,12,0,0,4.5,0,4.5,0,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Love Thy Neighbor",2002,89,NA,3.7,17,14.5,4.5,4.5,4.5,4.5,0,0,14.5,24.5,24.5,"R",0,0,0,0,0,0,0 -"Love Thy Neighbour",1973,85,NA,6,19,14.5,4.5,0,14.5,14.5,4.5,14.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Love Toy",1968,75,NA,2.8,10,24.5,14.5,14.5,14.5,0,14.5,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Love Trap, The",1929,71,NA,7,33,0,0,0,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Love Tricycle",2003,14,NA,8,11,0,0,0,0,0,0,4.5,44.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Love Walked In",1997,95,NA,5.4,143,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Love You",1980,80,NA,4.9,10,0,0,14.5,14.5,0,14.5,24.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Love You Till Tuesday",1969,28,NA,7.3,9,0,0,0,0,24.5,14.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Love and 145 Watts",2004,3,NA,8.7,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Love and Bullets",1979,103,NA,5.1,182,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Love and Curses",1938,8,NA,6.3,5,0,0,0,0,44.5,24.5,0,44.5,0,0,"",0,1,1,0,0,0,1 -"Love and Deaf",2004,8,NA,7.4,16,0,0,0,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Love and Death",1975,85,3000000,7.6,4193,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Love and Death on Long Island",1997,94,NA,6.9,1405,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Love and Diane",2002,155,NA,8,30,0,0,4.5,0,0,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Love and Hisses",1934,18,NA,6.4,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Love and Kisses",1965,87,NA,5.5,17,4.5,0,14.5,0,14.5,4.5,0,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Love and Learn",1947,83,NA,5,8,0,0,14.5,24.5,0,34.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Love and Loathing at the Ass Lamp Lounge",2003,72,NA,8.4,5,0,0,0,0,0,0,0,84.5,0,24.5,"",0,0,0,0,0,0,0 -"Love and Money",1982,90,NA,3.9,36,14.5,4.5,24.5,14.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Love and Music",1971,83,NA,8.6,7,0,0,0,0,0,14.5,0,44.5,0,44.5,"",0,0,0,0,1,0,0 -"Love and Other Catastrophes",1996,78,250000,6.5,783,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Love and Pain and the Whole Damn Thing",1973,110,NA,7,65,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Love and Rage",1998,100,NA,5.7,46,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Love and Testosterone",2003,80,NA,4.9,34,4.5,0,0,4.5,0,0,4.5,14.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Love and War",1899,2,NA,4.1,14,4.5,4.5,4.5,24.5,24.5,4.5,14.5,0,0,4.5,"",0,0,0,1,0,0,1 -"Love and a .45",1994,98,NA,6,934,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Love and a Bullet",2002,85,NA,5.2,288,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Love and the Midnight Auto Supply",1977,91,NA,4.2,9,14.5,0,14.5,0,0,14.5,24.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Love at 7-11",2002,97,NA,5.5,9,0,0,0,14.5,24.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Love at First Bite",1950,16,NA,7.2,31,0,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Love at First Bite",1979,94,NA,5.7,1101,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Love at Large",1990,97,NA,6,292,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Love at Stake",1988,86,NA,4.8,105,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Love at Times Square",2003,120,NA,2.7,12,45.5,4.5,34.5,0,4.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Love by the Light of the Moon",1901,1,NA,5.4,5,0,0,0,24.5,44.5,0,24.5,24.5,0,0,"",0,0,1,0,0,1,1 -"Love from a Stranger",1937,86,NA,6.2,33,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Love in Bloom",1935,75,NA,5,20,0,0,14.5,24.5,14.5,34.5,0,14.5,0,4.5,"",0,0,0,0,0,1,0 -"Love in Paris",1997,105,NA,1.9,575,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Love in a Goldfish Bowl",1961,88,NA,3.4,17,4.5,14.5,14.5,14.5,14.5,0,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Love in a Taxi",1980,90,NA,7.7,5,0,0,24.5,0,0,0,24.5,44.5,0,24.5,"",0,0,0,1,0,1,0 -"Love in the Afternoon",1957,125,2100000,7.3,1125,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Love in the Ruins",1995,35,NA,7.4,10,0,0,0,0,14.5,0,14.5,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Love me",2000,107,NA,5.7,64,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Love of Sunya, The",1927,78,NA,7.2,20,4.5,0,0,0,24.5,14.5,24.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Love on Wheels",1932,86,NA,5,8,0,14.5,0,14.5,34.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Love on a Bet",1936,77,NA,6.7,22,4.5,0,0,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Love on the Dole",1941,94,NA,7.4,57,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Love on the Run",1936,80,NA,5.9,84,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Love or Money",1990,90,NA,3.7,13,24.5,0,4.5,14.5,34.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Love the Hard Way",2001,104,NA,6.1,400,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Love with the Proper Stranger",1963,102,NA,7.1,426,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Love! Valour! Compassion!",1997,108,NA,6.4,1036,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Love's Brother",2004,103,NA,6,160,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Love's Labour's Lost",2000,93,13000000,5.9,1254,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"Love's Prisoner",1919,47,NA,7.8,7,0,0,0,14.5,0,0,44.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Love, Death",1972,82,NA,4.2,9,24.5,24.5,24.5,0,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Love, Honor and Behave",1938,71,NA,5.8,21,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Love, Honour and Obey",2000,103,NA,6,851,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Love, Loot and Crash",1915,11,NA,6.6,7,0,0,0,0,0,44.5,14.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Love, Ludlow",2005,97,75000,8.6,22,0,4.5,0,0,4.5,0,14.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Love, Sex & Murder",2001,5,NA,5.7,57,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,1,0,0,1,1 -"Love, Sex and Eating the Bones",2003,100,NA,5.7,211,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Love, Speed and Thrills",1915,13,NA,5.1,15,0,14.5,0,24.5,14.5,34.5,4.5,4.5,0,0,"",1,0,1,0,0,0,1 -"Love, etc.",1996,105,NA,6.6,196,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Love-Hotel in Tirol, Das",1978,91,NA,3.6,6,0,14.5,14.5,14.5,45.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Love-Ins, The",1967,91,NA,3.7,24,24.5,0,4.5,14.5,4.5,4.5,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Love-Tails of Morocco",1931,17,NA,5,11,0,4.5,4.5,4.5,4.5,14.5,24.5,0,4.5,4.5,"",0,0,1,0,0,0,1 -"Love-moi",1991,97,NA,5.7,28,4.5,4.5,0,0,24.5,34.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Love.com",2000,85,NA,1.5,38,45.5,14.5,4.5,0,0,0,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Love/Juice",2000,78,NA,6.7,37,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Love: The Movie",2004,9,NA,8.8,13,4.5,0,4.5,0,0,14.5,4.5,4.5,0,45.5,"",0,0,1,0,0,1,1 -"LoveGame",2003,5,NA,4.3,18,24.5,4.5,14.5,0,4.5,0,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,1 -"Lovebite",1999,1,NA,6,11,0,4.5,0,0,24.5,24.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Loveblind",2000,99,NA,4.3,39,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,34.5,"R",0,0,0,0,0,0,0 -"Loved",1997,109,NA,4.3,135,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Loved One, The",1965,122,NA,7.1,575,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Lovedolls Superstar",1986,80,NA,6.5,13,4.5,0,4.5,0,0,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Loveless, The",1982,82,NA,5.8,84,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lovelife",1997,88,NA,5.6,112,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Lovelines",1984,93,NA,3.7,44,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Lovelorn Leghorn",1951,7,NA,7.7,41,0,0,4.5,4.5,0,14.5,24.5,24.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Lovely",1997,16,NA,6.6,27,0,4.5,4.5,0,4.5,0,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Lovely & Amazing",2001,91,250000,6.9,1813,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Lovely But Deadly",1981,93,NA,4.3,34,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Lovely Rita",2001,80,NA,6.3,118,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lovely Way to Die, A",1968,103,NA,5.2,38,4.5,4.5,4.5,14.5,24.5,4.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Lovely to Look at",1952,103,NA,6.3,79,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Lovemaster, The",1997,84,NA,4.5,28,14.5,0,4.5,4.5,4.5,0,4.5,4.5,4.5,45.5,"R",0,0,1,0,0,1,0 -"Lover Boy",1988,60,NA,5.3,30,4.5,0,4.5,0,14.5,34.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Lover Come Back",1946,90,NA,6.3,17,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lover Come Back",1961,107,NA,7.2,669,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Lover Girl",1997,87,1000000,5.3,102,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Lover for My Husband, A",2003,72,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,1,0 -"Lover's Knot",1996,82,NA,5,77,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Lover's Leap",1995,90,NA,3,56,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Loverboy",1989,98,NA,5.2,815,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Loverboy",1996,10,NA,7.1,10,14.5,0,14.5,0,14.5,24.5,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Lovers Lane",1999,90,NA,3.1,270,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lovers and Luggers",1937,68,NA,4.6,5,0,0,24.5,0,24.5,0,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Lovers and Other Strangers",1970,104,NA,6.4,199,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Lovers, Liars and Thieves",1997,90,NA,2.2,13,44.5,0,0,24.5,0,0,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Lovers, Lovers",1994,90,NA,2.7,28,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Loves Me... Loves Me Not",1992,8,NA,6.8,43,0,0,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Loves of Carmen, The",1948,99,NA,5.7,71,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Loves of Cynthia, The",1972,86,NA,4.6,5,0,0,0,24.5,64.5,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Loves of Edgar Allan Poe, The",1942,67,NA,5.3,26,0,0,4.5,14.5,34.5,24.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Lovesick",1983,95,NA,4.4,175,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Lovespell",1981,91,NA,2.7,24,24.5,4.5,4.5,0,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Lovin' Molly",1974,98,NA,5.7,76,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Loving",1970,89,NA,6.1,67,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Loving Couples",1980,97,NA,4.2,71,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Loving Jezebel",1999,87,NA,4.2,105,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Loving You",1957,101,NA,5.6,284,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Loving and Laughing",1971,90,NA,5.5,16,14.5,0,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lovushka dlya odinokogo muzhchiny",1990,92,NA,5.3,10,0,0,0,14.5,0,34.5,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Low",1995,95,NA,5.2,14,4.5,4.5,0,4.5,0,14.5,0,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Low Blow",1986,90,NA,3.1,29,44.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Low Down Dirty Shame, A",1994,100,NA,5.2,699,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Low Down, The",2000,96,NA,6.4,119,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Low Life, The",1995,96,NA,5.4,158,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Low Self-Esteem Girl",2000,96,NA,4.1,20,24.5,0,4.5,4.5,0,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Lowball",1997,99,NA,4.6,35,14.5,14.5,4.5,4.5,4.5,24.5,4.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Lowell Blues: The Words of Jack Kerouac",2000,30,NA,8.9,7,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,1 -"Loyalties",1986,98,NA,6.9,29,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Lt. Robin Crusoe, U.S.N.",1966,110,NA,4.9,208,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lu cheng",2004,112,NA,6.9,14,0,0,0,0,14.5,14.5,4.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Lu mao zi",2004,100,500000,7.5,34,4.5,0,0,14.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Lua de Cristal",1990,90,NA,5.2,81,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Luba",1990,78,NA,9.4,8,0,0,0,0,0,0,14.5,0,24.5,64.5,"",0,0,0,1,0,1,0 -"Luca il contrabbandiere",1980,88,NA,6.7,150,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Luca vive",2002,111,NA,4.2,7,44.5,0,0,14.5,0,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Lucas",1986,100,NA,6.5,2441,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Lucas the Ear of Corn",1977,4,NA,3,6,0,34.5,0,64.5,0,0,0,0,0,0,"",0,1,1,0,0,0,1 -"Luce dei miei occhi",2001,113,NA,7,189,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Luce negli occhi, La",2001,90,NA,5.5,9,0,0,0,24.5,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lucertola con la pelle di donna, Una",1971,95,NA,6.9,101,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Luces de Buenos Aires",1931,85,NA,6.8,5,0,0,0,0,0,24.5,44.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Luchadoras contra la momia, Las",1964,85,NA,2.7,39,24.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Luchino Visconti",1999,60,NA,5,38,14.5,0,4.5,0,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Luci lontane",1987,89,NA,6.8,8,0,0,0,0,14.5,14.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Lucia",1998,108,NA,8.6,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Lucia Chase (Polavision Vignette)",1978,3,NA,4.4,8,0,14.5,14.5,24.5,24.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Lucie",1979,99,NA,6,7,0,0,14.5,14.5,14.5,14.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Lucie Aubrac",1997,115,NA,6.7,335,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Lucien Brouillard",1983,90,NA,2.6,6,14.5,14.5,14.5,0,14.5,0,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Lucifer",1987,100,NA,3.2,10,34.5,14.5,14.5,0,24.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Lucifer Rising",1972,29,NA,6.4,110,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Lucifurs",1998,85,NA,3.1,18,24.5,4.5,0,14.5,24.5,4.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Lucignolo",1999,90,NA,4.1,43,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Lucinda's Spell",1998,105,NA,3,54,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Luck",2003,91,NA,5.9,111,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Luck of Ginger Coffey, The",1964,100,NA,6.6,43,0,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Luck of Roaring Camp, The",1937,58,NA,5.8,5,0,0,24.5,24.5,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Luck of the Draw",2000,101,NA,4.6,178,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Luck of the Irish, The",1920,70,NA,1,7,100,0,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Luck of the Irish, The",1936,67,NA,1,7,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Luck of the Irish, The",1948,99,NA,5,112,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Luck, Trust & Ketchup: Robert Altman In Carver Country",1993,90,NA,4.9,48,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Lucker",1986,80,NA,4.5,29,4.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Luckiest Guy in the World, The",1946,21,NA,6.9,9,0,0,0,0,0,24.5,44.5,14.5,24.5,0,"",0,0,0,0,0,0,1 -"Luckiest Man in the World, The",1989,85,NA,5.1,8,0,14.5,0,14.5,24.5,0,0,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Luckiest Nut in the World, The",2002,20,NA,9,8,0,0,0,0,0,0,14.5,0,64.5,24.5,"",0,0,0,0,1,0,1 -"Lucky",2002,83,NA,6.2,110,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Lucky 13",2004,95,1200000,5.7,151,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Lucky 13",2005,99,NA,5.4,19,24.5,0,0,0,0,0,0,0,4.5,74.5,"",0,0,1,0,0,0,0 -"Lucky Break",1994,88,NA,6,130,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Lucky Break",2001,108,6000000,6.3,707,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Lucky Bugger",2002,3,NA,8.6,6,14.5,0,0,0,0,0,34.5,14.5,0,34.5,"",0,0,0,1,0,0,1 -"Lucky Cisco Kid",1940,67,NA,4.1,18,34.5,4.5,0,0,0,4.5,44.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Lucky Corner, The",1936,12,NA,7,24,4.5,0,0,0,14.5,4.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Lucky Day",2000,12,NA,5.3,5,0,0,0,0,44.5,0,0,64.5,0,0,"",0,0,0,0,0,0,1 -"Lucky Devils",1933,64,NA,6.6,23,0,0,0,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lucky Ducky",1948,7,NA,7.6,35,0,0,0,0,4.5,24.5,14.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Lucky Jim",1957,95,NA,6.3,88,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lucky Jordan",1942,84,NA,6.7,24,4.5,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Lucky Lady",1975,118,13000000,4.6,231,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lucky Losers",1950,70,NA,6.1,29,0,0,0,4.5,24.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Lucky Luciano",1974,105,NA,6.1,81,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lucky Luke",1991,92,NA,3.8,287,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lucky Me",1954,100,NA,5.8,64,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lucky Night",1939,82,NA,4.5,51,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lucky Number",1951,7,NA,7.6,28,4.5,0,0,0,4.5,14.5,14.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Lucky Numbers",2000,105,65000000,5,2396,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Lucky Partners",1940,99,NA,6.2,82,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Lucky People Center International",1998,85,NA,7.2,135,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Lucky Pink",1968,6,NA,5.6,8,0,0,0,0,24.5,64.5,0,0,0,14.5,"",0,1,0,0,0,0,1 -"Lucky Star",1929,90,NA,8,34,0,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Lucky Star, The",1980,110,NA,6.4,41,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Lucky Stiff",1988,82,NA,3.3,68,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lucky Stiff, The",1949,99,NA,5.8,13,0,0,0,14.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lucky Terror",1936,61,NA,5.5,6,0,0,0,14.5,14.5,14.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Lucky Texan, The",1934,55,NA,4.9,111,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Lucky Three an Elliott Smith Portrait",1997,11,NA,8.4,51,0,0,0,0,4.5,0,4.5,4.5,4.5,84.5,"",0,0,0,0,1,0,1 -"Lucky: No Time for Love",2005,141,NA,6.7,50,14.5,0,0,4.5,14.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Lucky: The Irish Pimp",1997,3,NA,1,8,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Luckytown",2000,101,NA,4.7,257,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Lucrecia Borgia",1947,85,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Lucrezia Borgia, l'amante del diavolo",1968,98,NA,3.5,5,0,44.5,0,0,24.5,44.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Lucy & Ricky",2003,3,NA,6,13,4.5,0,0,0,0,14.5,0,0,4.5,64.5,"",0,0,0,0,0,0,1 -"Lucy Gallant",1955,104,NA,5.8,83,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lucy Tsak Tsak",2000,2,NA,5.1,17,4.5,4.5,4.5,0,14.5,44.5,14.5,4.5,4.5,0,"",0,0,0,0,1,0,1 -"Lucy en miroir",2003,45,NA,7.8,5,24.5,0,0,0,0,0,0,0,44.5,44.5,"",0,0,0,1,0,0,1 -"Lude godine",1978,83,NA,6.8,19,0,14.5,14.5,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Lude godine, II deo",1980,93,NA,6,10,0,34.5,0,0,14.5,0,0,34.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Ludovic - Un vent de magie",2002,12,NA,7.8,8,0,0,0,0,0,0,24.5,64.5,0,14.5,"",0,1,0,0,0,0,1 -"Ludovic II: un crocodile dans mon jardin",1999,10,NA,6.8,9,0,0,0,0,14.5,24.5,45.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Ludovic: The Snow Gift",1998,14,NA,8,9,0,0,0,0,0,14.5,14.5,34.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Ludovic: Visiting Grandpa",2001,11,NA,8.2,10,0,0,0,0,0,0,34.5,34.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Ludwig",1972,240,NA,7.4,406,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ludwig 1881",1993,90,NA,7.5,14,0,0,0,0,0,4.5,24.5,14.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Ludwig II.",1955,115,NA,6.9,37,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Luen chin chung sing",2000,100,NA,6.2,69,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Luen oi hang sing",2002,111,NA,5.8,46,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Luffaren och Rasmus",1955,88,NA,6.6,25,0,0,4.5,14.5,24.5,24.5,14.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Lugar en el mundo, Un",1992,120,NA,7.4,446,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Lugares comunes",2002,115,NA,8.1,326,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Luger",1982,85,NA,5.4,12,4.5,4.5,0,0,14.5,4.5,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Luggage of the Gods!",1987,74,NA,4.7,31,34.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Lugosi: Hollywood's Dracula",1997,55,NA,8.6,15,0,0,0,0,0,0,4.5,24.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Lui yun na wa yee",2000,100,NA,6.7,28,0,0,0,4.5,14.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Luigi's Ladies",1989,91,NA,5.1,6,0,0,0,14.5,14.5,0,45.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Luis Martinetti, Contortionist",1894,1,NA,6.1,38,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Luk Erosa",1987,104,NA,5.8,5,0,0,24.5,0,24.5,44.5,0,24.5,0,0,"",0,0,0,1,0,1,0 -"Luk siu fung",2001,200,NA,4.5,8,34.5,0,14.5,0,14.5,0,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Luke",1967,14,NA,5.3,5,24.5,0,0,0,0,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Luke",2004,10,NA,6.6,7,0,0,0,0,0,14.5,0,0,14.5,74.5,"",0,0,0,1,0,0,1 -"Lullaby Land",1933,7,NA,6.3,51,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Lullaby of Broadway",1951,92,NA,6.4,132,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Lulu",1962,100,NA,7.3,7,0,0,0,0,0,0,24.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Lulu",2002,90,NA,6.4,10,0,14.5,34.5,0,14.5,14.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Lulu Belle",1948,86,NA,4.9,16,0,4.5,0,4.5,44.5,4.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Lulu in Berlin",1984,50,NA,6.1,10,0,0,0,0,14.5,34.5,14.5,34.5,0,24.5,"",0,0,0,0,1,0,0 -"Lulu on the Bridge",1998,112,NA,6.1,1278,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Lumber Jack-Rabbit",1954,7,NA,6.4,47,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Lumber Jerks",1955,7,NA,6.2,71,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Lumberjack",1944,65,NA,7.5,17,0,0,4.5,0,4.5,14.5,24.5,4.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Lumberjack and Jill",1949,6,NA,5.6,5,0,0,0,44.5,24.5,0,24.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Lumikuningatar",1986,90,NA,6.3,41,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Luminal",2004,89,NA,4.8,17,34.5,14.5,0,0,4.5,0,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Luminarias",2000,100,1000000,2.7,381,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Luminous Motion",1998,91,NA,4.5,82,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lump, The",1991,8,NA,7.6,31,4.5,0,0,4.5,4.5,4.5,4.5,34.5,24.5,0,"",0,1,1,0,0,0,1 -"Lumpazivagabundus",1956,99,NA,4.8,9,0,0,34.5,24.5,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Lumpia",2003,80,1000,6,13,34.5,4.5,0,0,4.5,14.5,0,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Lumumba",2000,120,NA,6.7,397,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lun Wen-Xu lao dian Liu Xian-Kai",1993,94,NA,6.4,12,0,0,14.5,0,14.5,4.5,14.5,4.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Luna Butterflys",2000,24,NA,6,5,24.5,0,24.5,0,24.5,0,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Luna Papa",1999,109,NA,7.1,869,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Luna Park",1992,111,NA,6.3,98,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Luna caliente",1985,90,NA,1.2,5,64.5,0,0,24.5,0,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Luna de Avellaneda",2004,143,NA,7.1,225,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Luna de miel",1959,90,NA,5.4,10,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Luna e l'altra",1996,99,NA,6.3,40,4.5,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Luna en el espejo, La",1990,75,NA,6.9,33,14.5,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Luna negra, La",1990,90,NA,6.9,9,14.5,0,0,0,0,0,44.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Luna rossa",2001,116,NA,7,27,4.5,0,0,4.5,4.5,4.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Luna, La",1979,142,NA,6.2,434,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Lunar Girl",2001,85,NA,7.3,23,24.5,0,0,0,4.5,0,0,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Lunarcop",1994,88,NA,2.6,80,34.5,4.5,24.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,1,0,0,0 -"Lunastus",1997,78,NA,5.7,38,4.5,4.5,4.5,0,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lunatics: A Love Story",1991,87,850000,5.4,135,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Lunch",2001,4,NA,7.1,43,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Lunch Meat",1987,88,NA,2.7,23,34.5,24.5,4.5,0,4.5,0,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lunch Wagon",1980,88,NA,4,54,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lunch with Charles",2001,102,NA,6.2,62,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Luncheon at Twelve",1933,21,NA,6.1,5,0,0,24.5,0,24.5,0,24.5,24.5,24.5,0,"",0,0,1,0,0,0,1 -"Lunchroom Manners",1960,10,NA,4.6,7,0,0,14.5,14.5,14.5,0,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Lundi matin",2002,122,NA,6.1,263,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Lune dans le caniveau, La",1983,126,NA,5.5,250,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Lune de miel",1985,98,NA,3.1,15,24.5,14.5,24.5,0,4.5,4.5,4.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Lune froide",1991,90,NA,7.6,70,4.5,4.5,4.5,4.5,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Lunes 1, domingo 7",1968,80,NA,5.5,7,0,0,0,24.5,14.5,24.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Lunes al sol, Los",2002,113,4000000,7.8,1466,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Lung Min",1992,145,NA,5.6,25,4.5,0,0,0,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Lung Ta: Les cavaliers du vent",1990,86,NA,1.4,7,24.5,0,0,24.5,0,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Lunga cavalcata della vendetta, La",1972,92,NA,2.5,7,0,24.5,14.5,14.5,14.5,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Lunga lunga lunga notte d'amore, Una",2001,102,NA,4.3,18,4.5,4.5,0,24.5,4.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Lunga notte del '43, La",1960,110,NA,7.9,23,0,0,0,0,0,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Lunga notte di Veronique, La",1966,90,NA,4.3,5,24.5,0,44.5,0,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Lunga vita alla signora",1987,115,NA,6.2,36,4.5,4.5,14.5,0,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lunghe notti della Gestapo, Le",1977,80,NA,4.3,26,14.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Lunghi capelli della morte, I",1964,100,NA,5.3,38,4.5,4.5,0,14.5,4.5,24.5,4.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Lunghi giorni della vendetta, I",1966,90,NA,6.2,17,0,0,0,0,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Lungo il fiume",1992,81,NA,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Lungo silenzio, Il",1993,95,NA,6.8,20,0,4.5,0,0,14.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Lungo, il corto, il gatto, Il",1967,90,NA,6.8,10,14.5,14.5,0,0,0,14.5,45.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Lunnaya raduga",1984,88,NA,6.9,8,14.5,0,0,14.5,14.5,0,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lunoi bul polon sad",2000,115,NA,8.4,14,4.5,0,0,0,0,0,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Luo tuo Xiang Zi",1982,123,NA,7.8,20,0,0,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Lupa mannara, La",1976,79,NA,4.4,63,4.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lupo B'New York",1976,90,NA,6.1,7,14.5,14.5,14.5,0,0,0,14.5,0,0,44.5,"",0,0,1,1,0,0,0 -"Lupo dei mari, Il",1975,92,NA,3.3,13,24.5,4.5,14.5,14.5,14.5,0,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Lupo della Sila, Il",1949,77,NA,9,5,0,0,0,0,0,24.5,0,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Lupo di mare, Il",1987,98,NA,2.7,6,45.5,14.5,14.5,0,0,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Lupo e l'agnello, Il",1980,95,NA,5,10,0,0,24.5,44.5,24.5,0,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Lupo the Butcher",1987,3,NA,6.9,23,0,0,0,4.5,14.5,4.5,24.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Lurch",2001,20,NA,6.1,10,0,0,0,14.5,0,34.5,14.5,44.5,14.5,0,"",0,0,0,0,0,0,1 -"Lure of the Wilderness",1952,93,NA,7.2,20,0,0,0,0,14.5,4.5,34.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lured",1947,102,NA,6.8,133,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Lured Innocence",1999,93,NA,4.4,115,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Lurid Tales: The Castle Queen",1996,82,NA,2.7,17,24.5,24.5,14.5,4.5,0,4.5,14.5,0,0,14.5,"R",0,0,0,1,0,0,0 -"Lurkers",1988,90,NA,3,31,14.5,14.5,14.5,14.5,4.5,0,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lurking Fear",1994,76,1000000,4.2,124,4.5,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lush",1999,93,NA,4.6,79,24.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Lust",1994,100,NA,1.7,42,74.5,4.5,0,4.5,0,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Lust and Revenge",1996,95,NA,6.7,29,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Lust for Frankenstein",1998,82,NA,2.8,63,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Lust for Gold",1949,90,NA,7.3,68,0,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Lust for Life",1956,122,NA,7.4,992,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Lust for a Vampire",1971,91,NA,5.3,214,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lust in the Dust",1985,84,NA,4.7,319,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Lust on the Orient-Express",1986,100,NA,4.9,11,4.5,0,0,4.5,34.5,4.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Lusten till ett liv",1999,89,NA,4.6,26,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Luster",2002,90,NA,5,203,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Lusting Hours, The",1967,73,NA,6.1,5,0,0,0,44.5,24.5,0,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Lusty Men, The",1952,113,NA,7.2,170,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Lutalica",1987,99,NA,3.1,5,64.5,0,0,44.5,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Lute: camina o revienta, El",1987,123,NA,5.8,39,4.5,0,4.5,14.5,4.5,34.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Luther",1973,110,NA,6,54,4.5,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Luther",2003,121,NA,7.1,1567,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Luther the Geek",1990,80,NA,6.1,202,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Lutrede, De",2002,74,NA,3.2,72,45.5,0,0,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Lutte, La",1961,28,NA,8.1,18,0,0,0,0,0,4.5,24.5,24.5,34.5,4.5,"",0,0,0,0,0,0,1 -"Luv",1967,93,NA,5.2,62,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Luxo Jr.",1986,2,NA,7.5,875,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Luxo Jr. in 'Surprise' and 'Light & Heavy'",1991,1,NA,8.8,30,0,0,0,0,4.5,4.5,14.5,4.5,4.5,64.5,"",0,1,0,0,0,0,1 -"Luxure",1976,67,NA,4.3,7,24.5,0,0,0,14.5,14.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Luxury Liner",1948,98,NA,6.1,58,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Luz",2000,8,NA,5.5,9,0,0,14.5,14.5,14.5,34.5,24.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Luz del Fuego",1982,102,NA,7.7,15,4.5,0,4.5,0,0,14.5,14.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Luz prodigiosa, La",2003,108,2000000,7,44,0,0,0,0,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Luzhin Defence, The",2000,109,NA,7,1371,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Luzia Homem",1987,105,NA,7.1,35,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Lvinaya dolya",2001,103,NA,7,5,0,0,24.5,0,0,0,44.5,24.5,0,24.5,"",1,0,0,0,0,0,0 -"Lycanthrope",1999,90,NA,4.3,13,14.5,0,24.5,4.5,34.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Lycanthropus",1962,83,NA,4.8,69,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Lyckan kommer",1942,108,NA,5.5,13,0,4.5,0,4.5,34.5,34.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Lyckantropen",2002,28,NA,7.6,20,14.5,0,0,0,4.5,4.5,24.5,34.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Lyckliga skitar",1970,100,NA,6.1,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Lydia",1941,104,NA,6.6,46,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Lydia Bailey",1952,89,NA,6.5,15,0,0,0,4.5,0,34.5,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Lyftet",1978,117,NA,7,14,0,0,0,0,14.5,14.5,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Lyin' Mouse, The",1937,7,NA,6.7,9,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Lying In Wait",2000,90,NA,4.4,103,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Lykkefanten",1997,57,NA,6.9,9,0,0,0,24.5,0,14.5,14.5,14.5,44.5,0,"",0,0,0,0,0,0,0 -"Lykken er en underlig fisk",1989,92,NA,3.8,5,0,0,24.5,84.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Lykkevej",2003,95,NA,6.9,133,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Lynch",2004,10,NA,7.7,10,14.5,0,0,0,0,14.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Lyrikaften",2002,5,NA,4.7,9,0,0,0,24.5,0,34.5,24.5,14.5,14.5,0,"",0,0,1,0,0,0,1 -"Lyrisch Nitraat",1991,50,NA,7.5,45,4.5,0,0,0,4.5,4.5,34.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Lysistrati",1972,100,NA,5.2,5,0,24.5,24.5,24.5,0,24.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Lyubimaya zhenshchina mekhanika Gavrilova",1981,75,NA,7.1,17,0,0,0,4.5,4.5,14.5,34.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Lyubimetz 13",1958,89,NA,8.4,32,0,0,0,4.5,4.5,0,4.5,4.5,24.5,64.5,"",0,0,1,0,0,0,0 -"Lyubov",1991,105,NA,7,37,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,1,0 -"Lyubov i golubi",1984,107,NA,7.3,75,0,0,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Lyubov moya, pechal moya",1978,94,NA,6.6,7,0,0,0,14.5,0,24.5,14.5,0,14.5,24.5,"",0,0,0,0,0,1,0 -"Lyubov s privilegiyami",1989,105,NA,7.3,5,0,0,0,0,0,0,44.5,44.5,24.5,0,"",0,0,0,1,0,1,0 -"Lyubovnik",2002,100,NA,7.1,89,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Lyubovnoto lyato na edin lyokhman",1990,78,NA,7.4,9,0,0,0,0,0,0,24.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Lyutuy",1974,98,NA,6.9,9,0,0,0,0,14.5,0,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"M",1931,99,NA,8.5,12053,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"M",1951,88,NA,6.8,85,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"M Word, The",2004,4,NA,7.7,10,24.5,0,14.5,0,0,0,24.5,14.5,34.5,14.5,"",0,0,0,0,0,0,1 -"M' agapas",1989,102,NA,6,7,0,0,0,0,14.5,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,1,0 -"M-G-M Jubilee Overture",1954,10,NA,6.3,12,0,0,0,0,4.5,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"M. Butterfly",1993,101,NA,6.3,1188,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"M.A. Numminen Goes Tech-no",1995,4,NA,7.3,14,0,0,4.5,0,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"M.A. Numminen Meets Schubert",1996,4,NA,5.4,6,0,14.5,0,0,0,14.5,0,0,34.5,34.5,"",0,0,0,0,0,0,1 -"M.A. Numminen Sings Wittgenstein",1993,2,NA,6.6,26,4.5,0,4.5,4.5,4.5,0,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"M.A. Numminen Turns Rabbit - The Universal Declaration of the Rights of the Rabbits",1999,3,NA,5.3,17,0,4.5,0,14.5,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"M.D.C. - Maschera di cera",1997,98,3000000,5.2,272,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"M.O. of M.I.",2002,90,NA,5.5,37,14.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"M/Other",1999,147,NA,6.6,75,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"MA 2412 - Die Staatsdiener",2003,97,NA,4.1,61,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"MASH",1970,112,3500000,7.8,14829,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"MC5*: A True Testimonial",2002,120,NA,7,51,0,0,4.5,4.5,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"MGM Christmas Trailer",1937,2,NA,7.3,13,0,0,0,4.5,4.5,0,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,1 -"MGM Sarajevo: Covjek, Bog, Monstrum",1994,94,NA,9.7,9,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,0,1,0,0 -"MURDER and murder",1996,113,NA,4.6,17,4.5,24.5,14.5,0,4.5,4.5,0,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"MVP 2: Most Vertical Primate",2001,87,NA,3.8,81,34.5,14.5,4.5,4.5,4.5,4.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"MVP: Most Valuable Primate",2000,93,NA,4.8,196,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Ma 6-T va crack-er",1997,105,NA,5.6,121,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ma Barker's Killer Brood",1960,82,NA,5.3,13,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ma Sheraiti B'Hebron",1999,73,NA,6.9,7,24.5,0,0,0,0,0,0,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Ma Wing-Jing",1997,99,NA,6.2,91,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ma and Pa Kettle",1949,76,NA,6.1,150,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ma and Pa Kettle Back on the Farm",1951,80,NA,6.3,88,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ma and Pa Kettle Go to Town",1950,79,NA,6,115,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ma and Pa Kettle at Home",1954,80,NA,5.7,72,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ma and Pa Kettle at Waikiki",1955,79,NA,5.2,69,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ma and Pa Kettle at the Fair",1952,78,NA,6.3,72,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ma and Pa Kettle on Vacation",1953,79,NA,6,69,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ma che colpa abbiamo noi",2003,114,NA,6.2,132,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ma femme est une actrice",2001,93,NA,6.7,915,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Ma femme me quitte",1996,90,NA,3.6,23,14.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Ma femme s'appelle reviens",1982,85,NA,5.9,43,4.5,4.5,4.5,4.5,4.5,44.5,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Ma femme... s'appelle Maurice",2002,102,NA,3.4,106,24.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ma l'amor mio non muore",1913,90,NA,8.4,7,0,0,0,0,0,0,0,44.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Ma nuit chez Maud",1969,105,NA,7.6,662,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ma petite entreprise",1999,96,NA,6.4,195,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Ma pomme",1950,100,NA,5.8,7,0,14.5,14.5,0,14.5,14.5,0,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Ma quando arrivano le ragazze?",2005,146,NA,6.5,30,0,0,0,0,14.5,34.5,24.5,24.5,0,4.5,"",0,0,1,1,0,1,0 -"Ma vie en rose",1997,88,NA,7.4,2228,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Ma vie est un enfer",1991,105,NA,5.9,146,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Ma voisine danse le ska",2003,90,NA,6,16,0,0,4.5,0,34.5,24.5,24.5,4.5,4.5,0,"",0,0,1,1,0,0,0 -"Ma yong zhen",1972,94,NA,7.6,53,4.5,4.5,0,0,4.5,4.5,24.5,24.5,14.5,24.5,"",1,0,0,1,0,1,0 -"Ma-ma",1976,83,NA,7.7,129,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Maa",2001,120,NA,6,8,0,34.5,0,0,24.5,14.5,14.5,0,14.5,0,"",0,0,0,0,1,0,0 -"Maa on syntinen laulu",1973,108,NA,7.5,60,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Maai hung paak yan",2001,94,NA,7.9,62,0,4.5,0,0,0,4.5,14.5,24.5,24.5,24.5,"",1,0,1,0,0,0,0 -"Maang gwai jeung yan toi",1998,85,NA,4.8,8,0,14.5,0,24.5,24.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Maangamizi: The Ancient One",2001,110,NA,8.2,17,4.5,14.5,0,0,0,0,0,0,34.5,44.5,"",0,0,0,1,0,0,0 -"Maarek hob",2004,88,NA,6.5,21,4.5,0,4.5,0,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mababangong bangungot",1977,93,NA,6.5,59,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Mabel and Fatty's Married Life",1915,11,NA,4.8,8,14.5,0,0,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Mabel at the Wheel",1914,18,NA,4.7,25,0,4.5,0,44.5,24.5,4.5,24.5,4.5,0,0,"",0,0,1,0,0,0,1 -"Mabel's Busy Day",1914,16,NA,5.3,71,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Mabel's Dramatic Career",1913,14,NA,6,21,4.5,0,0,24.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,1 -"Mabel's Married Life",1914,17,NA,5.7,51,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Mabel's Strange Predicament",1914,17,NA,5.6,34,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,1 -"Mabel's Wilful Way",1915,11,NA,6.4,5,24.5,0,0,0,0,24.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Mabel, Fatty and the Law",1915,11,NA,5.1,23,24.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Mabeobui seong",2002,118,NA,2.5,5,44.5,24.5,44.5,0,0,0,0,0,0,0,"",0,0,1,1,0,1,0 -"Mabodet el gamahir",1967,146,NA,2.7,15,14.5,0,4.5,0,0,4.5,4.5,24.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Maboroshi no hikari",1995,110,NA,7.7,450,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Mabudachi",2001,98,NA,6.5,49,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mabuta no haha",1962,83,NA,5.9,6,0,0,0,0,14.5,0,14.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Mac",1992,117,NA,5.8,272,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mac and Me",1988,95,NA,3.2,1372,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"MacArthur",1977,130,NA,6.4,448,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"MacKintosh Man, The",1973,98,NA,6,403,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Macabre",1958,72,150000,5.5,58,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Macabre Pair of Shorts",1996,76,NA,9.4,20,0,0,4.5,0,0,0,4.5,0,4.5,84.5,"",0,0,1,0,0,0,0 -"Macabro",1980,89,NA,5.5,142,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Macadam tribu",1996,90,NA,7.3,5,0,0,0,0,64.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Macao",1952,81,NA,6.3,219,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Macao, l'enfer du jeu",1942,84,NA,6.2,16,0,0,0,4.5,4.5,24.5,24.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Macario",1960,91,NA,7.8,108,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Macbeth",1948,107,NA,7.3,638,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Macbeth",1997,129,NA,4.6,45,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Macbeth in Manhattan",1999,97,NA,5.3,48,14.5,4.5,0,0,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Macbeth-Sangrador",1999,86,NA,6.1,25,0,0,0,4.5,4.5,14.5,0,0,4.5,64.5,"",0,0,0,1,0,0,0 -"Macbeth: The Comedy",2001,91,NA,8.6,23,4.5,4.5,0,0,0,0,4.5,4.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Maccheroni",1985,105,NA,6.1,130,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Macchie solari",1975,100,NA,5.2,99,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Macchina ammazzacattivi, La",1952,80,NA,5.3,18,0,0,0,24.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Macellaio, Il",1998,93,NA,3.3,50,34.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Maceo",1994,85,NA,8.7,14,0,0,0,0,0,4.5,0,34.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Mach 2",2001,91,NA,3.4,70,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Machboim",1980,90,NA,5.9,6,0,0,0,14.5,14.5,0,14.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Mache alles mit",1971,87,NA,1.2,6,64.5,14.5,0,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Machibuse",1970,117,NA,6.8,65,0,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Machine, La",1994,96,NA,5.3,170,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Machine-Gun Kelly",1958,80,NA,5.6,112,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Machismo: 40 Graves for 40 Guns",1971,95,NA,2.4,13,34.5,24.5,0,0,24.5,4.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Macho Callahan",1970,99,NA,4.2,47,14.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Macho Dancer",1988,136,NA,6.8,46,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Machorka-Muff",1963,18,NA,8.4,13,0,0,0,4.5,0,0,14.5,4.5,34.5,34.5,"",0,0,0,1,0,0,1 -"Machssomim",2003,80,NA,7.7,52,0,4.5,0,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Macht der Bilder: Leni Riefenstahl, Die",1993,180,NA,7.9,375,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Machuca",2004,121,1500000,8.4,449,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Maciste all'inferno",1925,66,NA,7.3,23,0,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Maciste all'inferno",1962,88,NA,4.1,47,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Maciste alla corte del Gran Khan",1961,80,NA,5.5,18,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,0,"",1,0,0,1,0,0,0 -"Maciste contre la reine des Amazones",1973,88,NA,4.2,17,4.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Maciste contro i cacciatori di teste",1962,79,NA,1.7,57,64.5,14.5,4.5,4.5,4.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Maciste contro i mostri",1962,82,NA,4.5,13,4.5,4.5,14.5,24.5,14.5,4.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Maciste contro il vampiro",1961,91,NA,4.7,32,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Maciste contro lo sceicco",1962,106,NA,4,5,24.5,0,24.5,24.5,44.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Maciste e la regina di Samar",1964,88,NA,2.2,131,34.5,24.5,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Maciste nella terra dei ciclopi",1961,100,NA,4.8,16,4.5,4.5,4.5,14.5,34.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Maciste nella valle dei re",1960,89,NA,5.9,13,0,0,0,4.5,14.5,14.5,4.5,34.5,0,24.5,"",1,0,0,1,0,0,0 -"Maciste, gladiatore di Sparta",1964,103,NA,4.3,11,14.5,4.5,4.5,0,4.5,24.5,4.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Mack the Knife",1990,118,NA,4.7,68,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Mack, The",1973,110,NA,6,235,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mackan",1977,100,NA,5.3,19,0,4.5,24.5,4.5,4.5,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Macken - Roy's & Roger's Bilservice",1990,92,NA,5.2,104,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mackenna's Gold",1969,136,7000000,6.2,644,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mackintosh and T.J.",1975,96,NA,5.1,23,4.5,0,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Maclovia",1948,105,NA,8.3,12,0,0,0,0,0,4.5,4.5,34.5,0,45.5,"",0,0,0,1,0,1,0 -"Macomber Affair, The",1947,89,NA,7.1,68,4.5,0,0,4.5,4.5,14.5,34.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Macon County Jail",1997,92,NA,4.4,90,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Macon County Line",1974,89,225000,6.2,124,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Macumba Love",1960,86,NA,3.4,12,14.5,4.5,14.5,14.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Macumba sexual",1983,80,NA,4.3,8,24.5,0,0,0,0,14.5,14.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Mad About Mambo",2000,92,NA,5.7,332,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Mad About Men",1954,90,NA,5.9,33,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mad About Music",1938,100,NA,7.8,54,4.5,0,0,0,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Mad About You",1990,92,NA,7.6,21,0,4.5,4.5,4.5,0,4.5,24.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Mad Bomber in Love",1992,85,NA,4.6,15,14.5,0,0,0,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Mad Bomber, The",1973,91,NA,3.3,52,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mad City",1997,115,50000000,6,3965,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Mad Cows",1999,90,NA,3.8,89,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mad Doctor of Blood Island",1968,85,NA,4.7,56,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mad Doctor of Market Street, The",1942,61,NA,4.5,17,14.5,0,14.5,14.5,44.5,0,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Mad Doctor, The",1933,7,NA,7.7,49,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Mad Doctor, The",1941,90,NA,6.4,12,0,0,0,0,4.5,44.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Mad Doctors of Borneo",1993,1,NA,3.2,6,45.5,0,0,0,0,45.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Mad Dog Coll",1961,88,NA,5,13,0,0,4.5,34.5,34.5,0,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Mad Dog Coll",1992,98,NA,4.6,14,4.5,4.5,0,4.5,24.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Mad Dog Morgan",1976,102,NA,5.2,73,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mad Dog Time",1996,85,NA,4.8,643,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Mad Dog and Glory",1993,97,NA,6.1,3601,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Mad Dog, The",1932,7,NA,7,17,0,0,14.5,4.5,0,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Mad Dogs",2002,91,1400000,3.1,11,4.5,24.5,0,4.5,0,14.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mad Dogs & Englishmen",1971,117,NA,6.2,29,0,0,4.5,0,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Mad Dogs and Englishmen",1995,97,NA,3.7,136,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Mad Genius, The",1931,81,NA,6.3,45,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mad Ghoul, The",1943,65,NA,5.2,39,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mad Love",1935,68,257502,7.1,322,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Mad Love",1995,93,NA,5,1606,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Mad Love Life of a Hot Vampire, The",1971,50,NA,2.7,11,14.5,14.5,4.5,0,24.5,0,0,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Mad Magician, The",1954,72,NA,5.6,118,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mad Man of Martinique",1979,17,NA,4,18,34.5,24.5,0,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Mad Max",1979,93,350000,6.8,11542,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Mad Max 2",1981,94,NA,7.4,12091,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Mad Max Beyond Thunderdome",1985,107,NA,5.8,8207,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Mad Miss Manton, The",1938,80,NA,6.7,162,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Mad Monster Party?",1967,94,NA,5.9,314,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Mad Monster, The",1942,77,NA,3.3,93,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Mad Room, The",1969,93,NA,5.2,45,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mad Song",2000,93,NA,5.3,24,4.5,4.5,0,4.5,4.5,4.5,0,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Mad Songs of Fernanda Hussein, The",2001,168,NA,6.5,21,4.5,0,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mad Youth",1940,76,NA,5.5,6,0,14.5,0,34.5,0,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Mad as a Mars Hare",1963,7,NA,7.3,61,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mad at the Moon",1992,98,NA,5.1,80,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Madadayo",1993,134,11900000,7.4,554,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Madagascar",1994,50,NA,7.3,17,0,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Madagascar Skin",1995,96,NA,6.7,63,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Madalena",1960,91,NA,5.3,51,4.5,0,0,4.5,4.5,4.5,4.5,24.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Madam Satan",1930,115,980000,5.9,102,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Madam Savant",1997,89,NA,2.1,15,34.5,14.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Madama Butterfly",1954,114,NA,4.9,9,14.5,0,14.5,0,14.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Madame Bovary",1933,101,NA,6,43,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Madame Bovary",1949,115,NA,6.9,217,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Madame Bovary",1991,140,NA,6.6,357,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Madame Butterfly",1932,86,NA,5.8,24,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Madame Butterfly",1995,134,NA,7.2,101,0,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Madame Claude",1977,105,NA,4.7,40,14.5,4.5,14.5,24.5,14.5,4.5,14.5,0,4.5,4.5,"",0,0,1,1,0,0,0 -"Madame Curie",1943,124,NA,7.1,184,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Madame DuBarry",1919,85,NA,6,43,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Madame DuBarry",1934,79,NA,6.3,37,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Madame Edouard",2004,97,NA,4.6,38,4.5,4.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Madame Jeanette",2004,91,NA,6.7,6,0,14.5,0,14.5,0,0,14.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Madame Sin",1972,90,NA,5.7,132,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Madame Sousatzka",1988,122,NA,6.2,294,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Madame X",1929,95,NA,5.9,36,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Madame X",1937,72,NA,7.2,43,0,0,0,4.5,4.5,24.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Madame X",1966,100,NA,6.5,258,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Madame de...",1953,105,NA,7.8,447,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Madame du Barry",1954,106,NA,7.2,8,0,0,0,0,0,34.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Madame und ihre Nichte",1969,87,NA,4.1,15,44.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Madar",1991,108,NA,7.7,23,4.5,0,0,4.5,0,4.5,24.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Madchen's Uniform",2004,13,1000,7.8,10,0,0,24.5,0,14.5,0,14.5,0,0,64.5,"",0,0,1,0,0,0,1 -"Maddalena",1971,105,NA,2.8,9,14.5,14.5,14.5,0,14.5,0,0,0,0,45.5,"",0,0,0,1,0,0,0 -"Maddalena, zero in condotta",1940,75,NA,6.9,21,0,0,0,4.5,0,4.5,24.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Maddening, The",1995,95,NA,4.7,157,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Made",1972,101,NA,4.2,14,4.5,14.5,0,24.5,4.5,0,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Made",2001,94,5000000,6.5,4487,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Made In Paris",1965,7,NA,5.3,8,0,0,0,0,34.5,34.5,0,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Made Incorrect",2002,18,25000,8.2,6,14.5,0,0,0,0,0,0,14.5,0,64.5,"",0,0,0,1,0,0,1 -"Made Men",1997,102,NA,6.7,8,0,0,0,14.5,34.5,0,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Made Men",1999,94,NA,5.7,457,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Made for Each Other",1939,92,NA,6.6,379,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Made for Each Other",1971,100,NA,6.3,48,4.5,4.5,0,4.5,14.5,14.5,4.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Made in America",1993,111,NA,4.6,2662,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Made in Argentina",1987,86,NA,7,45,4.5,4.5,0,0,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Made in Denmark",2002,59,NA,8.9,8,0,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,1,1,0,0 -"Made in Greece",1987,118,NA,7.3,15,0,4.5,0,4.5,14.5,0,4.5,44.5,24.5,0,"",0,0,1,0,0,0,0 -"Made in Heaven",1952,90,NA,5,11,14.5,0,0,14.5,44.5,4.5,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Made in Heaven",1987,103,NA,5.8,667,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Made in Israel",2001,113,NA,4.1,29,14.5,4.5,0,4.5,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Made in Italy",1967,100,NA,7.2,11,0,0,0,0,4.5,4.5,24.5,4.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Made in Milan",1990,20,NA,6.7,23,4.5,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Made in Paris",1966,103,NA,4.6,46,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Made in U.S.A.",1966,90,50000,6.4,94,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Made in USA",1988,82,NA,4.5,82,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Made in the USA",2001,105,NA,6.3,14,0,0,0,0,0,44.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Made-Up",2002,96,NA,6.5,74,4.5,4.5,0,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Madeleine",1950,101,NA,6.4,62,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Madelief: Krassen in het tafelblad",1998,85,NA,7.9,96,4.5,0,4.5,0,0,4.5,24.5,44.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Madeline",1952,8,NA,6.9,12,0,0,0,0,4.5,0,34.5,24.5,0,34.5,"",0,1,0,0,0,0,1 -"Madeline",1998,88,NA,6.1,550,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Madeline: Lost in Paris",1999,90,NA,4.8,22,4.5,0,0,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Mademoiselle",1966,103,NA,7.2,84,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Mademoiselle",2001,76,NA,6.5,240,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Mademoiselle Fifi",1944,69,NA,6.4,41,0,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mademoiselle Strip-tease",1957,100,NA,5.6,5,0,0,0,24.5,44.5,24.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Maden",1978,90,NA,6,15,0,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Madepse ti kano ta bradia",1980,85,NA,8,8,0,0,0,0,0,14.5,0,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Madhouse",1974,89,NA,5.3,168,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Madhouse",1990,90,NA,4.3,497,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Madhouse",2004,91,3000000,5.4,389,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Madigan",1968,101,NA,6.7,418,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Madison",2001,94,NA,5.8,107,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"PG",0,0,0,1,0,0,0 -"Madison Avenue",1962,94,NA,6,37,0,0,4.5,14.5,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Madison Sq. Garden",1932,74,NA,8.5,6,0,0,0,0,14.5,0,0,45.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Madly",1969,85,NA,6.2,80,4.5,0,4.5,4.5,4.5,4.5,45.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Madman",1978,95,NA,3.4,30,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Madman",1982,88,NA,3.9,207,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Madmen of Mandoras",1964,64,NA,1.8,113,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Madness and Genius",2003,103,19000,6.4,20,4.5,4.5,0,14.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Madness of King George, The",1994,107,NA,7.3,2901,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Madness of the Heart",1949,91,NA,4.9,16,4.5,4.5,0,4.5,34.5,14.5,14.5,0,4.5,4.5,"",0,0,0,1,0,1,0 -"Mado",1976,135,NA,6.6,76,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mado Mavrogenous",1971,95,NA,5.6,8,0,14.5,0,14.5,24.5,24.5,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Madonna of the Seven Moons",1945,88,NA,7.1,38,4.5,0,0,4.5,4.5,4.5,34.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Madonna: Truth or Dare",1991,114,4500000,5.5,2660,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Madre muerta, La",1993,105,NA,7,167,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Madre, La",1995,16,NA,6.7,19,4.5,4.5,4.5,0,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Madregilda",1993,113,NA,6.7,22,0,0,0,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Madres de la Plaza de Mayo, Las",1985,64,NA,6.7,11,0,0,0,0,0,4.5,44.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Madreselva",1938,93,NA,8.1,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Madriguera, La",1969,102,NA,5.6,15,0,0,0,4.5,24.5,0,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Madron",1970,90,NA,5,23,14.5,0,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Madwoman of Chaillot, The",1969,132,NA,5.6,191,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Mae Day: The Crumbling of a Documentary",1992,10,NA,3.4,109,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,1,0,1 -"Maechun",1988,96,NA,8.3,6,0,0,0,14.5,0,0,0,34.5,0,45.5,"",0,0,0,1,0,0,0 -"Maegjuga aeinboda joheun 7gaji iyu",1996,124,NA,7.4,8,0,0,0,0,24.5,0,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Maelstrom - Il figlio dell'altrove",2001,86,NA,3.8,17,14.5,4.5,14.5,4.5,0,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Maestro",2003,89,NA,6,15,4.5,4.5,4.5,0,0,24.5,44.5,0,14.5,4.5,"",0,0,0,0,1,0,0 -"Maestro",2004,29,NA,8,9,14.5,0,0,0,0,24.5,0,0,14.5,45.5,"",0,0,1,1,0,0,1 -"Maestro de esgrima, El",1992,88,NA,6.9,101,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Maestro di Don Giovanni, Il",1954,86,NA,5.3,11,0,0,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Maestro e Margherita, Il",1972,95,NA,5.7,39,4.5,0,0,4.5,14.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Maestro, El",1957,90,NA,5.9,9,0,0,0,14.5,0,0,24.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Maestro, Il",1989,90,NA,5.6,26,34.5,0,0,4.5,4.5,14.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Maestro: King of the Cowboy Artists, The",1995,54,NA,8.2,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,0,0,1,0,0 -"Maestros",2000,100,NA,6.4,7,0,0,0,0,0,24.5,45.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Mafalda",1982,82,NA,7.8,5,0,0,0,24.5,24.5,0,0,0,0,64.5,"",0,1,0,0,0,0,0 -"Maffia, La",1972,120,NA,8.3,8,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Mafia Movie Madness",2003,1,NA,5.1,13,14.5,0,0,0,14.5,0,0,0,0,64.5,"",0,0,1,0,0,0,1 -"Mafia Vs. Ninja",1984,90,NA,5,49,4.5,4.5,14.5,4.5,0,4.5,4.5,4.5,4.5,44.5,"",1,0,0,1,0,0,0 -"Mafia, Pizza, Razzia",1997,15,NA,6.9,54,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Mafiaen - det er osse mig!",1974,91,NA,5,21,0,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mafioso",1962,105,NA,7.6,38,4.5,0,0,0,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Mafu Cage, The",1978,102,NA,4.6,35,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mag Wheels",1977,81,NA,3.8,12,24.5,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Magarece godine",1994,97,NA,3.3,12,4.5,0,0,0,24.5,0,0,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Magdalen",1998,70,NA,7.8,14,24.5,0,0,0,0,0,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Magdalena Viraga",1986,90,NA,5,10,24.5,14.5,0,0,14.5,14.5,0,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Magdalene",1989,113,NA,4.1,16,14.5,14.5,0,34.5,4.5,0,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Magdalene Sisters, The",2002,119,NA,8,4350,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Magdanas lurja",1955,50,NA,8.1,7,0,0,0,0,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Magenta",1996,91,NA,4.6,57,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Maggie, The",1954,92,NA,6.5,82,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Magi randagi, I",1996,94,NA,6.6,19,0,0,0,0,24.5,0,24.5,14.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Magia nuda",1975,100,NA,5.6,27,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Magic",1978,107,NA,6,764,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Magic Alphabet, The",1942,11,NA,5.7,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Magic Bow, The",1946,106,NA,5.4,25,4.5,0,4.5,14.5,4.5,4.5,24.5,0,4.5,24.5,"",0,0,0,0,0,1,0 -"Magic Box, The",1951,118,NA,7.5,115,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Magic Bricks",1908,3,NA,5.8,24,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Magic Carpet, The",1951,84,NA,4.4,15,24.5,0,14.5,24.5,4.5,14.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Magic Christian, The",1969,92,NA,5.6,640,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Magic Christmas Tree, The",1965,60,NA,2.4,7,45.5,0,14.5,0,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Magic Face, The",1951,88,NA,6.8,17,14.5,0,0,0,0,14.5,0,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Magic Garden of Stanley Sweetheart, The",1970,117,NA,5,30,0,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Magic Journeys",1982,16,NA,8.8,16,0,0,4.5,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Magic Kid II",1994,87,NA,3.9,33,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Magic On a Stick",1946,10,NA,5.9,6,0,0,0,14.5,14.5,0,45.5,0,14.5,0,"",0,0,0,0,1,0,1 -"Magic Pancakes",1994,10,NA,4.6,5,24.5,0,0,44.5,0,0,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Magic Pearl, The",1997,90,NA,1.5,11,14.5,4.5,0,0,0,0,4.5,4.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Magic Pony, The",1977,63,NA,7.6,9,14.5,0,0,0,0,14.5,0,44.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Magic Pudding, The",2000,81,NA,6.5,42,4.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Magic Riddle, The",1991,93,NA,5.7,9,0,0,0,24.5,0,14.5,14.5,0,14.5,44.5,"",0,1,0,0,0,0,0 -"Magic Rock",2001,94,NA,5,21,14.5,0,4.5,4.5,14.5,4.5,0,4.5,4.5,34.5,"",0,0,1,1,0,1,0 -"Magic Roundabout, The",2005,85,20000000,5.7,142,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Magic Snowman, The",1988,85,NA,5.7,25,14.5,4.5,4.5,0,4.5,34.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Magic Spectacles",1961,74,NA,1,8,84.5,0,0,0,0,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Magic Sticks",1987,97,NA,6.2,97,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Magic Sword, The",1962,80,NA,4,228,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Magic Town",1947,103,NA,6.4,200,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Magic Within, The",1997,30,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,1,0,0,1 -"Magic Years, Vol. 1, The",1987,55,NA,8.4,26,0,0,4.5,0,4.5,0,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Magic in the Water",1995,101,NA,6.2,288,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,"PG",0,0,0,0,0,0,0 -"Magic of Flight, The",1996,40,NA,5.7,48,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Magic of Hollywood... Is the Magic of People, The",1976,21,NA,6.1,7,0,0,0,14.5,24.5,14.5,0,14.5,24.5,0,"",0,0,0,0,1,0,1 -"Magic of Lassie, The",1978,100,NA,4.8,71,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Magic of Marciano, The",2000,100,4500000,6.7,73,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Magic of the Golden Bear: Goldy III, The",1994,104,NA,3.4,21,34.5,4.5,0,0,4.5,14.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Magical Life of Long Tack Sam, The",2003,90,NA,6.7,44,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Magical Maestro",1952,7,NA,8.7,86,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,1,1,0,0,0,1 -"Magical Time Traveling Thugtastic Jug, The",2004,17,NA,8.2,12,0,4.5,0,0,4.5,4.5,4.5,0,14.5,45.5,"",0,0,1,0,0,0,1 -"Magical World of Chuck Jones, The",1992,93,NA,6.3,56,14.5,4.5,4.5,0,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Magician Mickey",1937,7,NA,7.4,63,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Magician of Lublin, The",1979,105,NA,4.8,37,4.5,0,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Magician's Daughter, The",1938,18,NA,5.8,6,14.5,0,0,0,0,45.5,34.5,0,0,0,"",0,0,0,0,0,1,1 -"Magicien, Le",1898,1,NA,6,10,14.5,0,0,0,0,14.5,24.5,64.5,0,0,"",0,0,0,0,0,0,1 -"Magiciens, Les",1976,97,NA,5.1,20,14.5,0,0,14.5,24.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Magik and Rose",1999,90,NA,5.5,17,0,0,4.5,4.5,14.5,4.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Magiki polis",1955,90,NA,7.1,11,0,0,0,0,4.5,0,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Magliari, I",1959,132,NA,6.3,34,0,4.5,0,4.5,4.5,24.5,24.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Magnat",1987,171,NA,8,13,0,0,0,4.5,0,4.5,24.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Magnatul",2004,80,NA,5.7,16,34.5,0,4.5,0,0,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Magnet, The",1950,79,NA,7.4,45,0,0,0,4.5,4.5,4.5,14.5,4.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Magnetic Monster, The",1953,76,105000,5.3,117,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Magnetic Telescope, The",1942,8,NA,6.8,55,4.5,4.5,4.5,4.5,0,14.5,24.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Magnetism",2004,3,NA,6.5,8,0,0,14.5,0,24.5,14.5,0,14.5,14.5,24.5,"",0,1,0,0,0,1,1 -"Magnificat",1993,110,NA,6.9,17,0,0,0,0,24.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Magnificent Ambersons, The",1942,131,850000,8,3407,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Magnificent Doll",1946,95,NA,5.3,15,0,0,4.5,14.5,4.5,34.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Magnificent Dope, The",1942,83,NA,6.5,44,0,0,0,0,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Magnificent Matador, The",1955,94,NA,5.3,30,0,0,4.5,24.5,14.5,14.5,44.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Magnificent Obsession",1935,112,NA,7.3,64,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Magnificent Obsession",1954,108,NA,6.8,479,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Magnificent Seven Deadly Sins, The",1971,107,NA,6.1,42,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Magnificent Seven Ride!, The",1972,100,NA,5.1,185,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Magnificent Seven, The",1960,128,NA,7.8,10058,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Magnificent Two, The",1967,100,NA,4.2,36,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Magnificent Yankee, The",1950,89,NA,7.4,53,4.5,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Magnifico",2003,120,NA,7.5,55,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Magnifico avventuriero, Il",1963,93,NA,4.3,9,0,0,24.5,14.5,24.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Magnifico cornuto, Il",1964,124,NA,6.1,19,0,4.5,4.5,0,0,24.5,34.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Magnifico gladiatore, Il",1964,95,NA,5.1,6,0,0,34.5,14.5,14.5,14.5,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Magnifique, Le",1973,94,NA,7.1,405,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Magnitnye buri",2003,93,NA,4.1,13,0,4.5,14.5,14.5,14.5,0,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Magnolia",1999,188,37000000,8,45992,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Magnum Force",1973,118,NA,6.6,3724,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Magnum Special per Tony Saitta, Una",1976,99,NA,5,47,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mago",2002,80,NA,2.6,22,34.5,24.5,4.5,0,14.5,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Mago, El",1949,100,NA,6.6,13,0,0,0,4.5,0,34.5,34.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Magokoro",1939,67,NA,6.8,6,0,0,0,0,0,34.5,0,34.5,34.5,0,"",0,0,0,0,0,0,0 -"Magonia",2001,112,NA,7.4,80,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Magos y gigantes",2003,85,NA,7.5,6,0,0,0,14.5,14.5,0,0,14.5,34.5,14.5,"",0,1,1,0,0,0,0 -"Magus, The",1968,117,NA,5.1,215,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Magyarok",1978,107,NA,6.8,13,0,0,0,0,0,24.5,34.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Magzat, A",1993,102,NA,6.1,10,0,0,0,14.5,0,24.5,34.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Mah nakorn",2004,100,NA,8.7,9,0,0,0,0,0,0,14.5,44.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Mahagonny",1980,141,NA,7,7,0,0,0,0,0,45.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Mahal",1949,165,NA,7.4,16,0,4.5,0,0,14.5,0,4.5,14.5,34.5,34.5,"",0,0,0,1,0,1,0 -"Mahanadi",1993,162,NA,8.4,28,4.5,0,0,0,14.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Mahanagar",1963,122,NA,8.3,82,0,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mahapurush",1965,65,NA,7.8,12,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Mahjong",1996,121,NA,7.5,119,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Mahler",1974,115,NA,6.7,242,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mahogany",1975,109,NA,5,259,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mai fu",1997,100,NA,5.2,19,14.5,0,4.5,14.5,0,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Mai jeneoreisheon",2004,85,NA,5.9,17,4.5,0,4.5,24.5,4.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Mai nei dak gung dui",1982,90,NA,4.2,260,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Mai shen qi",1978,96,NA,7.4,26,0,0,14.5,4.5,0,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Mai's America",2002,71,NA,6.6,28,4.5,0,0,0,0,4.5,14.5,14.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Maid in Manhattan",2002,105,55000000,4.6,12237,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Maid in Sweden",1971,80,NA,5.9,20,14.5,4.5,0,14.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Maid of Honor",1999,25,NA,4.2,30,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Maid of Salem",1937,85,NA,6.4,36,4.5,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Maid to Order",1987,93,NA,5,607,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Maid's Night Out",1938,64,NA,6.2,39,4.5,0,0,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Maid, The",1991,84,NA,5.3,177,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Maids, The",1974,95,NA,6.2,47,0,4.5,14.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Maidstone",1970,110,NA,5.6,14,24.5,14.5,14.5,0,24.5,14.5,0,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Maigret et l'affaire Saint-Fiacre",1959,101,NA,7,69,0,0,4.5,0,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mail Dog",1947,7,NA,6.9,14,0,0,0,0,24.5,24.5,24.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Mail Order Bride",1964,83,NA,6.2,52,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mail Order Bride",2003,84,NA,4.2,65,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Mail Order Wife",2004,92,NA,7,53,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,1,0,0,0,0 -"Mail Pilot, The",1933,8,NA,6.3,31,0,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mailbox, The",1977,24,NA,7.8,11,4.5,0,0,4.5,0,0,14.5,45.5,0,4.5,"",0,0,0,1,0,0,1 -"Mailman, The",2004,85,75000,7,6,14.5,0,0,0,0,0,14.5,34.5,34.5,0,"R",0,0,0,0,0,0,0 -"Maimil",2001,90,NA,6.2,35,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Main Attraction, The",1962,90,NA,5.1,26,4.5,0,4.5,14.5,14.5,4.5,14.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Main Event, The",1979,112,NA,5,401,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Main Hoon Na",2004,179,NA,6.9,363,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,1,1,0,1,0 -"Main Khiladi Tu Anari",1994,175,NA,5.3,24,0,4.5,4.5,0,4.5,4.5,24.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Main Prem Ki Diwani Hoon",2003,178,NA,4.1,99,24.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Main Street After Dark",1945,97,NA,6,21,0,0,4.5,4.5,14.5,24.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Main Street on the March!",1941,20,NA,6.8,7,0,0,0,0,14.5,24.5,14.5,24.5,0,14.5,"",0,0,0,0,1,0,1 -"Main Street to Broadway",1953,103,NA,4.4,12,0,14.5,4.5,24.5,14.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Main du diable, La",1943,80,NA,8.4,54,0,0,0,0,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Maine Dil Tujhko Diya",2002,154,NA,6.8,11,14.5,0,0,0,0,24.5,0,14.5,4.5,24.5,"",1,0,0,1,0,1,0 -"Maine Pyar Kiya",1989,192,NA,7.5,113,4.5,4.5,0,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Mains vides, Les",2003,130,NA,4.6,45,14.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,1,1,0,0,0 -"Maintenance by Any Means",2003,102,NA,3.4,8,45.5,14.5,14.5,0,0,0,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Maisie",1939,75,NA,6.1,37,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Maisie Gets Her Man",1942,86,NA,5.8,21,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Maisie Goes to Reno",1944,90,NA,5.8,21,0,0,4.5,4.5,34.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Maisie Was a Lady",1941,79,NA,6.5,34,0,4.5,4.5,0,4.5,34.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Maison Ikkoku",1986,97,NA,7.1,23,0,0,4.5,0,4.5,14.5,4.5,0,24.5,44.5,"",0,0,1,1,0,1,0 -"Maison de Jean-Jacques, La",1968,8,NA,7,10,0,0,0,0,14.5,34.5,44.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Maison de jade, La",1988,95,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Maison des Bories, La",1970,87,NA,6.2,23,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Maison des milles et un plaisirs, La",1984,89,NA,2.9,5,44.5,24.5,0,24.5,0,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Maison du Maltais, La",1938,90,NA,8.1,11,0,0,4.5,0,14.5,0,0,45.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Maison sous la mer, La",1947,105,NA,5.6,5,0,0,0,0,44.5,0,0,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Maison sous les arbres, La",1971,96,NA,4.7,35,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Maite",1994,92,NA,5.5,15,0,4.5,0,0,14.5,4.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Maja Steinansikt",2000,85,NA,4.9,12,24.5,4.5,0,0,24.5,4.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Majestic, The",2001,156,72000000,6.7,8649,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG",0,0,0,1,0,1,0 -"Major Barbara",1941,121,NA,7.1,148,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Major Damage",2001,3,NA,7.2,7,0,0,0,0,14.5,0,45.5,24.5,0,0,"",1,1,0,0,0,0,1 -"Major Dundee",1965,152,3800000,6.4,468,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Major League",1989,107,11000000,6.7,8078,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Major League II",1994,105,NA,4.7,3357,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Major League: Back to the Minors",1998,100,NA,4,1109,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Major Payne",1995,95,NA,5.1,2120,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Major and the Minor, The",1942,100,928000,7.5,598,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Majorens oppasser",1964,93,NA,5.8,38,0,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Majorettes, The",1986,92,85000,2.7,52,24.5,14.5,4.5,14.5,4.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Majority of One, A",1962,156,NA,5.6,125,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Majstori, majstori",1980,83,NA,8,44,0,4.5,0,0,0,4.5,4.5,4.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Mak dau goo si",2001,75,NA,7.3,182,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,1,0,0,0 -"Mak pigreco 100",1987,91,NA,3.6,6,34.5,0,0,0,34.5,0,0,0,0,34.5,"",0,0,1,0,0,1,0 -"Makarov",1993,99,NA,5.6,19,0,0,14.5,14.5,14.5,14.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Make Believe Ballroom",1949,79,NA,5.5,6,14.5,0,14.5,0,0,0,0,14.5,0,45.5,"",0,0,1,0,0,0,0 -"Make Haste to Live",1954,90,NA,6,15,0,0,0,14.5,14.5,44.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Make Me a Star",1932,86,NA,6.6,32,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Make Mine Mink",1960,100,NA,6.2,132,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Make Mine Music",1946,75,NA,6.9,204,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Make Mine a Million",1959,81,NA,6.9,7,0,0,0,14.5,0,44.5,0,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Make Way for Tomorrow",1937,91,NA,8.4,194,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Make Way for a Lady",1936,65,NA,5.6,13,0,0,4.5,34.5,14.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Make Your Own Bed",1944,82,NA,5.3,24,4.5,4.5,14.5,14.5,4.5,34.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Make a Wish",1937,77,NA,5.7,12,0,0,4.5,14.5,4.5,4.5,4.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Makebelieve",2000,90,NA,6.2,6,14.5,0,0,0,14.5,0,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Makedonskiot del od pekolot",1971,95,NA,8.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Maker of Men",1931,71,NA,3.9,17,24.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Maker, The",1997,98,NA,5.6,251,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Makers of Melody",1929,18,NA,6.7,8,14.5,0,0,0,14.5,24.5,0,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Makhdu'un, al-",1972,100,NA,6.3,11,0,0,0,0,0,24.5,4.5,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Making Arrangements",2003,105,NA,4.2,6,0,0,0,34.5,0,0,34.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Making It",1971,97,NA,4,21,0,14.5,0,4.5,34.5,14.5,14.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Making Love",1982,113,NA,6.1,361,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Making Love",2000,18,NA,8,5,0,0,0,0,24.5,0,24.5,0,44.5,24.5,"",0,0,0,0,0,0,1 -"Making Mr. Right",1987,98,NA,5,549,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Making Revolution",2003,88,NA,7.1,18,0,0,0,0,0,0,14.5,24.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Making Sandwiches",1998,30,NA,4.3,56,14.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Making Stars",1935,7,NA,4.5,25,4.5,0,14.5,24.5,24.5,4.5,4.5,14.5,4.5,0,"",0,1,0,0,0,0,1 -"Making Venus",2002,70,NA,7.2,10,0,0,0,0,24.5,0,24.5,64.5,0,0,"",0,0,0,0,1,0,0 -"Making Waves",1998,87,NA,4.6,14,4.5,0,14.5,0,14.5,4.5,0,0,14.5,44.5,"",0,0,0,1,0,0,0 -"Making a Killing",2002,90,NA,6.8,16,0,4.5,0,4.5,0,14.5,14.5,34.5,0,14.5,"R",0,0,0,0,0,0,0 -"Making a Living",1914,15,NA,5.6,94,4.5,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Making a Splash",1984,25,NA,7,15,0,0,0,4.5,0,14.5,0,14.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Making an American Citizen",1912,16,NA,5.5,25,4.5,0,14.5,14.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Making and Meaning of 'We Are Family', The",2002,64,NA,1.6,10,45.5,0,0,14.5,0,0,14.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Making of '...And God Spoke', The",1993,82,NA,6.1,313,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Making of 'Butch Cassidy and the Sundance Kid', The",1970,42,NA,6.7,79,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Making of 'Invasion of the Freedom Snatchers', The",2004,90,NA,1,15,74.5,4.5,0,4.5,4.5,0,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Making of Monsters, The",1991,35,NA,6.7,14,0,0,0,4.5,0,0,0,14.5,44.5,34.5,"",0,0,0,0,0,0,1 -"Making of a New Empire, The",1999,95,NA,5.5,16,4.5,4.5,0,4.5,14.5,14.5,4.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Making of a Prodigy, The",2003,12,NA,8.2,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,1,0,0,1 -"Making of the Mahatma, The",1996,144,NA,5.7,13,0,4.5,0,0,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Making the Grade",1984,105,NA,5.2,204,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Making the Rules",1996,96,NA,3.9,21,14.5,0,14.5,0,4.5,4.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Makkers staakt uw wild geraas",1960,97,NA,6.3,32,4.5,0,0,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mako: The Jaws of Death",1976,91,NA,3.5,47,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Makrykosteoi kai Kontogiorgides",1960,76,NA,8.8,35,0,0,0,0,4.5,0,14.5,24.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Maksim Perepelitsa",1955,94,NA,8.5,14,0,0,0,0,0,4.5,24.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Mal",1999,85,NA,5.3,30,24.5,0,14.5,0,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mala",1991,95,NA,9.3,15,4.5,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Mala Noche",1985,78,25000,7.5,75,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mala carodejnice",1986,96,NA,8.5,8,0,0,0,0,0,0,24.5,14.5,24.5,34.5,"",0,1,0,0,0,0,0 -"Mala espina",2001,20,NA,6.7,15,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Mala nocna muzika",2002,95,200000,4.5,29,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",1,0,1,0,0,0,0 -"Mala ordina, La",1972,92,NA,6.9,82,0,4.5,0,0,4.5,14.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Mala pljacka vlaka",1984,103,NA,7.4,9,14.5,0,0,14.5,0,0,14.5,34.5,0,34.5,"",0,0,1,1,0,0,0 -"Mala racha",2001,65,70000,8.5,6,0,0,0,0,0,0,14.5,45.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Malabar Princess",2004,94,NA,5.7,65,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Malabimba",1979,87,NA,5.4,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Malachance",2004,87,NA,7.4,13,14.5,0,4.5,0,0,0,0,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Malachi's Cove",1974,75,NA,5.5,13,0,0,0,0,24.5,4.5,34.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Maladie d'amour",1987,122,NA,4.8,32,0,4.5,4.5,4.5,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Maladie de Sachs, La",1999,107,NA,7.2,231,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Malaga",1954,84,NA,4.1,18,14.5,0,14.5,24.5,24.5,14.5,0,4.5,0,0,"",0,0,0,1,0,0,0 -"Malaika la tuhaliq fi al-dar albayda, Al",2004,94,NA,6.2,14,0,0,0,0,14.5,24.5,4.5,14.5,34.5,0,"",0,0,1,1,0,0,0 -"Malamondo, I",1964,110,NA,6.3,7,14.5,0,0,14.5,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Malarek",1989,100,NA,5.5,33,4.5,4.5,0,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Malastrana",1971,92,NA,6.5,143,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Malatesta's Carnival of Blood",1973,74,NA,7.7,14,0,0,0,0,0,24.5,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Malato immaginario, Il",1979,107,NA,5.2,23,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Malaya",1949,95,NA,6.9,115,4.5,0,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Malcolm",1986,90,NA,6.6,373,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Malcolm",2002,18,NA,6.8,15,0,0,0,0,14.5,4.5,34.5,24.5,24.5,4.5,"",0,0,0,1,0,0,1 -"Malcolm X",1972,91,NA,5.9,58,4.5,4.5,4.5,0,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Malcolm X",1992,202,34000000,7.5,6873,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Maldonne",1968,96,NA,4.5,6,0,14.5,0,34.5,0,14.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Male Animal, The",1942,101,NA,7.1,131,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Male Fantasy",2004,78,NA,7.1,16,4.5,0,0,4.5,4.5,0,34.5,34.5,4.5,0,"",0,0,1,1,0,0,0 -"Male Order",2001,23,10000,8.8,6,0,0,0,0,14.5,0,0,0,34.5,45.5,"",0,0,1,1,0,0,1 -"Male and Female",1919,116,NA,7.2,122,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Male di questo secolo, il",1997,3,NA,1.4,10,24.5,14.5,0,0,0,0,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Male oscuro, Il",1990,114,NA,6,6,0,0,0,0,0,84.5,14.5,0,0,0,"",0,0,1,1,0,0,0 -"Maledetta mia",2003,50,NA,9.1,7,0,0,0,14.5,0,0,0,0,74.5,14.5,"",0,0,0,0,1,0,0 -"Maledetto il giorno che t'ho incontrato",1992,112,NA,6.5,129,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Maledetto imbroglio, Un",1959,120,NA,7.3,75,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Malefemmene",2001,90,NA,5.7,6,0,0,0,14.5,14.5,0,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Maleficio II, El",1986,105,NA,4.1,6,0,0,14.5,34.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Malena es un nombre de tango",1996,109,NA,6.6,88,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Malenka",1969,88,NA,4.2,50,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Malenkaya Vera",1988,110,NA,6.8,199,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Malenkie lyudi",2003,86,NA,5.8,31,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Malevil",1981,120,NA,7.1,69,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Malevolent",2002,95,NA,5,88,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Malheurs d'Alfred, Les",1972,98,NA,6.4,50,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Malheurs de Sophie, Les",1981,87,NA,7.4,5,0,0,0,0,24.5,0,0,84.5,0,0,"",0,0,0,0,0,0,0 -"Malibu Beach",1978,96,NA,2.4,43,34.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Malibu Beach Party",1940,8,NA,6.7,18,0,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Malibu Beach Vampires, The",1991,96,NA,1.7,15,74.5,14.5,0,0,4.5,0,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Malibu Bikini Shop, The",1985,99,NA,3.8,137,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Malibu Days Big Bear Nights",1982,120,NA,6.9,7,0,0,0,0,14.5,0,44.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Malibu Express",1985,105,500000,3.9,154,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Malibu High",1979,92,NA,3.3,23,14.5,24.5,0,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Malibu's Most Wanted",2003,86,16000000,4.9,2099,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Malice",1993,107,NA,6.2,3783,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Malicious",1995,92,NA,4.7,272,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Malin plaisir, Le",1975,105,NA,5.4,82,4.5,4.5,4.5,4.5,14.5,24.5,44.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Malina",1991,125,NA,8.6,41,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Malizia",1973,93,NA,6.1,135,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Malizia erotica",1979,84,NA,3.3,14,24.5,14.5,4.5,14.5,24.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Malizie di Venere, Le",1969,87,NA,5,40,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Malka Lev Adom",1996,34,NA,6.2,6,0,0,0,0,0,34.5,0,0,0,64.5,"",0,0,1,1,0,0,1 -"Malli",1998,90,NA,7.7,7,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,1,0,0,0 -"Malliswari",1951,194,NA,8.9,8,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,1,0 -"Mallory Effect, The",2002,88,NA,6.2,23,24.5,0,0,0,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Mallrats",1995,94,6100000,7.1,22837,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Malombra",1917,75,NA,7.3,14,0,0,4.5,4.5,0,24.5,4.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Malombra",1942,94,NA,7.4,13,4.5,4.5,0,0,0,0,34.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Malombra",1984,91,NA,4.3,6,14.5,14.5,0,0,34.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Malone",1987,92,NA,5,283,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Malostranske humoresky",1996,91,NA,4.6,6,14.5,0,0,34.5,14.5,0,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Malou",1981,95,NA,6.1,5,24.5,0,0,24.5,24.5,0,0,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Malpertuis",1971,125,NA,6.2,130,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Malpractice",2001,90,NA,5.3,58,4.5,0,4.5,24.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Malquerida, La",1949,86,NA,6.8,16,14.5,0,0,0,4.5,4.5,4.5,0,24.5,34.5,"",0,0,0,1,0,0,0 -"Malta Story",1953,97,NA,6.7,134,0,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Maltese Bippy, The",1969,88,NA,4,46,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Maltese Falcon, The",1931,80,NA,6.9,191,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Maltese Falcon, The",1941,101,300000,8.4,19444,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Maltese Flamingo",1986,75,NA,7,6,0,14.5,0,0,0,0,34.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Malu tianshi",1937,95,NA,7.6,38,0,0,0,0,0,4.5,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Malunde",2001,119,NA,5.5,44,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Malvado Carabel, El",1956,81,NA,6.6,12,0,0,4.5,0,4.5,4.5,34.5,34.5,4.5,0,"",0,0,1,0,0,0,0 -"Malzenstwo z rozsadku",1967,90,NA,5.5,13,0,0,4.5,4.5,14.5,24.5,24.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"Mama",1992,90,NA,5.8,8,0,24.5,0,0,14.5,0,34.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Mama",1999,100,3000000,6,66,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mama Africa",2002,78,NA,5.8,23,4.5,0,0,0,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mama Aloko",2002,90,NA,6.2,5,24.5,0,0,0,24.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Mama Mia - Nur keine Panik",1984,94,NA,2.3,31,64.5,14.5,0,4.5,0,4.5,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Mama is boos!",1986,110,NA,5.2,231,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mama vyshla zamuzh",1969,85,NA,8.2,11,0,0,0,0,4.5,0,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mama's Dirty Girls",1974,82,NA,8.4,5,0,24.5,0,0,24.5,0,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Mama's New Hat",1939,8,NA,5.7,20,0,4.5,0,14.5,14.5,34.5,24.5,0,4.5,4.5,"",0,1,1,0,0,0,1 -"Mama's Proefkonijn",1996,45,NA,4.3,11,14.5,0,0,0,0,14.5,34.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Mama, ne goryuy",1998,83,NA,5.6,39,4.5,0,0,14.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Mamadrama: The Jewish Mother in Cinema",2001,73,NA,5.4,5,0,0,0,24.5,0,0,64.5,0,24.5,0,"",0,0,0,0,1,0,0 -"Maman et la putain, La",1973,210,NA,7.5,466,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Maman que man",1982,55,NA,9.5,6,0,0,0,0,0,0,0,34.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Mamas & the Papas: Straight Shooters",1988,80,NA,8.6,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,0,0,1,0,0 -"Mamay",2003,80,200000,6.6,14,0,0,4.5,0,0,24.5,24.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Mamba",1988,81,NA,4.7,73,14.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mambo",1954,110,NA,5.2,22,4.5,0,4.5,4.5,14.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mambo Kings, The",1992,104,NA,6.2,1031,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mambo italiano",2003,92,NA,6.6,1229,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Mambospiel, Das",1998,106,NA,6,28,34.5,4.5,4.5,14.5,4.5,4.5,0,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Mame",1974,132,12000000,4.8,524,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mamele",1938,103,NA,7.5,6,0,0,14.5,0,0,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mamies, Les",1992,82,NA,2.4,7,44.5,0,14.5,14.5,0,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Mamirolle",2000,90,NA,4.9,7,14.5,14.5,14.5,0,24.5,0,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Mamluqi",1958,97,NA,8.8,10,14.5,0,0,0,0,0,14.5,0,0,84.5,"",1,0,0,0,0,1,0 -"Mamma",1941,80,NA,7.6,5,0,0,0,0,24.5,0,24.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Mamma",1982,91,NA,5.2,6,0,0,0,0,45.5,0,45.5,0,0,0,"",0,0,0,1,1,0,0 -"Mamma Dracula",1980,91,NA,2.3,20,34.5,24.5,14.5,14.5,4.5,0,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Mamma Roma",1962,95,NA,8,443,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mamma mia, che impressione!",1951,75,NA,6.5,12,0,0,4.5,4.5,4.5,0,45.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Mamma tar semester",1957,106,NA,4.3,6,0,14.5,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Mamma, pappa, barn",2003,99,NA,6.1,97,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Mammo",1994,124,NA,6.4,30,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Mammoth",2005,8,2000,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,1,0,0,1 -"Mammy",1930,84,NA,6.2,25,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mamy Blue",1999,101,NA,3.1,23,34.5,14.5,4.5,14.5,4.5,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Man About Town",1939,85,NA,7.4,29,0,0,4.5,0,14.5,24.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Man About Town",1997,21,NA,8,52,14.5,4.5,0,0,0,4.5,4.5,14.5,34.5,34.5,"",0,0,0,1,0,0,1 -"Man About the House",1974,90,NA,5.7,77,0,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Man About the House, A",1947,99,NA,5.1,5,0,0,0,0,44.5,0,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Man Afraid",1957,84,NA,6.1,19,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man Alive",1945,70,NA,5.9,16,0,0,0,14.5,14.5,24.5,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Man Alone, A",1955,96,NA,6.2,58,4.5,0,0,14.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man Apart, A",2003,110,36000000,5.4,4231,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Man Beast",1956,67,NA,3.1,48,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Man Behind the Gun, The",1953,82,NA,5.6,32,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Man Betrayed, A",1941,82,250000,4.7,52,4.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Man Between, The",1953,100,NA,6.7,91,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man Called Adam, A",1966,99,NA,4.1,25,24.5,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Man Called Dagger, A",1967,86,NA,3.8,12,14.5,0,14.5,0,0,24.5,14.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Man Called Flintstone, The",1966,87,NA,6.3,159,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Man Called Gannon, A",1969,105,NA,4.6,20,14.5,0,4.5,24.5,14.5,24.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Man Called Horse, A",1970,114,NA,6.8,705,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Man Called Peter, A",1955,119,NA,7.1,161,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Man Called Sarge, A",1990,88,NA,4.3,64,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Man Called Sledge, A",1970,93,NA,5.4,89,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man Called... Rainbo, A",1990,99,35000,5.4,53,34.5,0,4.5,4.5,4.5,4.5,0,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Man Could Get Killed, A",1966,97,NA,6.3,55,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Man Dancin'",2003,113,NA,6,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Man Feel Pain",2004,11,NA,8.1,10,0,0,0,0,0,14.5,14.5,44.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Man Friday",1975,115,NA,5.7,92,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man From Monterey, The",1933,57,NA,4,55,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man From Planet X, The",1951,70,50000,5.6,219,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Man From Wyoming, A",1930,70,NA,6.6,6,0,0,0,0,14.5,45.5,14.5,14.5,0,0,"",0,0,0,0,0,1,0 -"Man Hunt",1936,60,NA,5.9,8,0,0,24.5,14.5,0,24.5,34.5,0,0,0,"",0,0,1,1,0,0,0 -"Man Hunt",1941,105,NA,7.5,242,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Man I Love, The",1947,96,NA,6.8,81,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Man I Married, The",1940,77,NA,6.8,19,0,4.5,0,0,14.5,14.5,34.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man Inside, The",1958,90,NA,4.8,11,0,0,4.5,24.5,4.5,0,4.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Man Is Mostly Water, A",2001,110,NA,3.2,14,14.5,14.5,4.5,0,24.5,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Man Made Monster",1941,59,NA,5.6,66,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man Outside",1986,97,NA,5.2,22,4.5,4.5,0,4.5,24.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Man Outside, The",1967,97,NA,5.5,6,14.5,0,0,0,0,14.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Man They Could Not Hang, The",1939,64,NA,6.1,49,0,0,0,4.5,24.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Man Trouble",1992,100,NA,4.3,503,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Man Upstairs, The",1958,88,NA,6.7,13,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Man Wanted",1932,62,NA,6.5,45,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Man Who Broke the Bank at Monte Carlo, The",1935,71,NA,6.3,15,0,0,0,0,24.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Man Who Came Back, The",1931,74,NA,7,6,0,0,0,0,0,14.5,14.5,64.5,0,0,"",0,0,0,1,0,0,0 -"Man Who Came to Dinner, The",1942,112,NA,7.5,863,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Man Who Cheated Himself, The",1950,81,NA,8.2,13,0,0,0,0,0,4.5,34.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Man Who Could Cheat Death, The",1959,83,NA,6.4,53,0,0,4.5,0,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Man Who Could Work Miracles, The",1936,82,NA,7.5,158,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Man Who Counted, The",1998,39,NA,5.1,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Man Who Cried, The",2000,97,NA,5.9,2313,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Man Who Dared, The",1933,72,NA,5.4,5,0,0,0,44.5,44.5,0,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Man Who Dared, The",1939,60,NA,6.3,12,4.5,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Man Who Died Twice, The",1958,70,NA,6.1,6,0,0,14.5,14.5,0,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Man Who Drove with Mandela, The",1998,82,NA,6.3,6,14.5,0,0,0,34.5,0,14.5,0,0,34.5,"",0,0,0,0,1,0,0 -"Man Who Fell to Earth, The",1976,140,NA,6.5,2005,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man Who Found Himself, The",1937,67,NA,6.1,17,4.5,0,0,14.5,14.5,24.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Man Who Had Power Over Women, The",1970,89,NA,4.7,10,14.5,0,14.5,0,0,0,24.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Man Who Haunted Himself, The",1970,94,NA,5.5,165,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Man Who Invented the Moon",2003,33,NA,9.6,10,0,0,0,0,0,0,14.5,0,14.5,84.5,"",0,0,1,0,0,0,1 -"Man Who Knew Too Little, The",1997,94,NA,6.2,4457,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Man Who Knew Too Much, The",1934,75,NA,7,1760,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man Who Knew Too Much, The",1956,120,2500000,7.4,5388,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Man Who Laughs, The",1928,110,NA,8.2,179,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Man Who Liked Funerals, The",1959,60,NA,4.3,6,0,0,14.5,14.5,14.5,45.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Man Who Lived Twice, The",1936,73,NA,6.1,7,0,0,0,0,14.5,44.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Man Who Loved Cat Dancing, The",1973,123,NA,5.2,211,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man Who Loved Redheads, The",1955,90,NA,6,17,0,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Man Who Loved Women, The",1983,110,NA,4.8,380,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Man Who Makes the Difference, The",1968,7,NA,6.6,13,4.5,0,0,4.5,4.5,34.5,14.5,0,4.5,24.5,"",0,0,0,0,1,0,1 -"Man Who Might Have Been: An Inquiry Into the Life and Death of Herbert Norman, The",1999,98,NA,8.2,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Man Who Never Was, The",1956,103,NA,7.2,339,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man Who Played God, The",1932,81,NA,7.3,120,0,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Man Who Reclaimed His Head, The",1934,80,NA,5.8,17,0,0,0,4.5,24.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Man Who Saw Tomorrow, The",1980,90,NA,5.2,210,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,1,0,0 -"Man Who Shot Liberty Valance, The",1962,123,3200000,8.2,7281,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Man Who Skied Down Everest, The",1975,85,NA,6.6,29,4.5,0,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Man Who Stole Dreams, The",1987,11,NA,8.1,8,0,0,0,0,14.5,0,0,14.5,34.5,34.5,"",0,1,0,0,0,0,1 -"Man Who Sued God, The",2001,97,NA,6.5,898,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Man Who Talked Too Much, The",1940,76,NA,6.4,43,0,0,4.5,4.5,14.5,14.5,44.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Man Who Turned to Stone, The",1957,71,NA,3.5,15,4.5,4.5,14.5,44.5,24.5,4.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Man Who Understood Women, The",1959,135,NA,4.6,14,4.5,4.5,14.5,14.5,14.5,24.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Man Who Wasn't There, The",1983,111,NA,2.9,99,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Man Who Wasn't There, The",2001,118,20000000,7.7,17028,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,1,1,0,0,0 -"Man Who Watched the Trains Go By, The",1953,82,NA,5.7,27,0,0,4.5,14.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Man Who Wipes Mirrors, The",2003,117,NA,7.4,5,0,0,0,0,24.5,0,44.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Man Who Would Be King, The",1975,129,8000000,7.9,8035,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Man Who Would Not Die, The",1975,91,NA,3.7,8,0,24.5,24.5,0,24.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Man Who Wouldn't Die, The",1942,65,NA,6.6,17,0,4.5,0,0,14.5,24.5,4.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Man Who Wouldn't Talk, The",1958,85,NA,5.8,6,14.5,0,0,14.5,0,14.5,45.5,0,0,0,"",0,0,0,1,0,0,0 -"Man Without a Body, The",1957,80,NA,4.3,23,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Man Without a Country, The",1937,21,NA,6.4,17,0,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Man Without a Face, The",1993,114,NA,6.4,5055,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Man Without a Star",1955,89,NA,7,244,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man Woman Film",1999,95,35000,3.8,234,94.5,4.5,4.5,0,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Man and Boy",1972,98,NA,4.6,29,4.5,4.5,14.5,14.5,24.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Man and Dog",1999,15,NA,5,16,0,14.5,4.5,14.5,0,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Man at the Top",1973,92,NA,2.4,8,0,24.5,14.5,14.5,0,0,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Man braucht kein Geld",1932,92,NA,7.5,19,0,0,0,0,4.5,34.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Man chu",1982,110,NA,1.8,7,45.5,14.5,0,0,0,0,24.5,0,0,0,"",0,0,0,1,0,1,0 -"Man die zijn haar kort liet knippen, De",1965,94,NA,6.6,33,4.5,0,0,0,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Man for All Seasons, A",1966,120,3900000,8,4356,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Man from Beyond, The",1922,74,NA,6.4,10,0,0,0,0,14.5,44.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Man from Bitter Ridge, The",1955,80,NA,5.8,15,0,0,14.5,0,24.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man from Button Willow, The",1965,81,NA,4.3,11,0,0,24.5,4.5,4.5,14.5,4.5,4.5,0,14.5,"",0,1,0,0,0,0,0 -"Man from Colorado, The",1948,100,NA,6.6,101,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man from Dakota, The",1940,75,NA,4.2,17,24.5,4.5,4.5,4.5,4.5,44.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Man from Del Rio",1956,82,NA,6.3,34,0,0,4.5,14.5,4.5,14.5,44.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Man from Down Under, The",1943,103,NA,5.7,19,0,4.5,0,14.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Man from Elysian Fields, The",2001,106,6500000,6.8,1198,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Man from Frisco",1944,91,NA,6.3,5,0,0,0,24.5,24.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Man from God's Country",1958,72,NA,5.2,14,0,0,4.5,14.5,24.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Man from Headquarters",1942,64,NA,5.6,5,0,0,0,64.5,24.5,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Man from Hell's Edges",1932,57,NA,4.3,6,14.5,0,0,0,45.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Man from Home, The",1922,70,NA,6.7,9,14.5,0,0,14.5,0,14.5,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Man from Hong Kong, The",1975,111,450000,4.8,83,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Man from Laramie, The",1955,104,NA,7.4,685,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Man from Music Mountain",1938,58,NA,5.9,19,0,0,14.5,4.5,34.5,4.5,4.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Man from Snowy River, The",1982,102,NA,6.8,1277,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Man from Tangier",1957,66,NA,4.2,7,14.5,0,14.5,24.5,14.5,0,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Man from Texas, The",1915,41,NA,4.9,36,4.5,0,14.5,14.5,24.5,24.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Man from Toronto, The",1933,77,NA,5.1,10,0,0,14.5,14.5,34.5,14.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Man from Tumbleweeds, The",1940,59,NA,4.6,14,0,4.5,4.5,24.5,14.5,24.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Man from Utah, The",1934,52,NA,4.5,120,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man from the Alamo, The",1953,79,NA,6.2,118,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man from the Diner's Club, The",1963,96,NA,6.4,46,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Man in Black",1949,80,NA,6.9,8,0,0,0,0,34.5,14.5,0,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Man in Grey, The",1943,116,NA,6.7,51,0,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Man in Grey, The",1997,100,NA,6,6,0,0,0,14.5,0,45.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Man in Half Moon Street, The",1945,92,NA,6.2,7,0,0,0,0,14.5,24.5,14.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Man in Possession, The",1931,84,NA,6.4,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Man in de linnenkast, De",2003,10,NA,5.8,16,0,0,0,4.5,34.5,14.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,1 -"Man in the Attic",1953,82,NA,5.5,40,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man in the Back Seat, The",1960,57,NA,7.3,6,0,0,0,0,14.5,0,45.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Man in the Bath, The",2001,7,10000,6.7,24,14.5,0,4.5,4.5,4.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Man in the Black Suit, The",2004,20,NA,4.5,10,14.5,0,0,14.5,0,14.5,14.5,34.5,0,34.5,"",0,0,0,0,0,0,1 -"Man in the Dark",1953,70,NA,5.6,17,4.5,0,14.5,0,14.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Man in the Glass Booth, The",1975,117,NA,7.4,153,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Man in the Gray Flannel Suit, The",1956,153,NA,7.1,436,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man in the Iron Mask, The",1939,96,NA,7.3,141,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Man in the Iron Mask, The",1998,132,35000000,6,11127,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Man in the Lower-Left Hand Corner of the Photograph, The",1999,14,NA,6.6,5,24.5,0,0,0,0,24.5,0,44.5,0,24.5,"",0,1,0,1,0,0,1 -"Man in the Middle",1964,94,NA,6.3,44,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Man in the Mirror",1936,71,NA,4.5,7,14.5,0,0,14.5,24.5,0,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Man in the Moon",1960,98,NA,6.9,22,4.5,4.5,0,0,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Man in the Moon, The",1991,99,NA,7.4,2268,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Man in the Net, The",1959,98,NA,5.7,53,0,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man in the Saddle",1951,87,NA,6.2,59,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man in the Sky, The",1957,87,NA,6.7,16,0,0,0,4.5,14.5,14.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Man in the Vault",1956,73,NA,2,8,45.5,14.5,0,0,14.5,0,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Man in the White Suit, The",1951,85,NA,7.6,1221,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Man in the Wilderness",1971,104,NA,6.3,203,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Man met de hond, De",1998,85,NA,6.7,37,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Man of Aran",1934,76,NA,7.8,205,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Man of Conquest",1939,105,1000000,6.8,26,0,4.5,0,4.5,4.5,14.5,44.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man of Flowers",1983,91,NA,7.4,127,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Man of Her Dreams",1997,94,NA,4.8,60,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Man of La Mancha",1972,132,12000000,5.6,544,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Man of No Importance, A",1994,99,NA,6.6,289,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Man of Violence",1971,98,NA,5.9,10,0,14.5,24.5,0,14.5,34.5,0,24.5,0,14.5,"",1,0,0,1,0,0,0 -"Man of a Thousand Faces",1957,122,NA,7.2,368,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man of the Century",1999,77,NA,6.7,359,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Man of the Forest",1933,62,NA,5.7,11,0,0,0,14.5,14.5,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Man of the House",1995,96,NA,4.5,1254,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Man of the House",2005,97,40000000,5.2,511,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Man of the Moment",1955,85,NA,5.1,42,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Man of the West",1958,100,NA,7.5,413,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Man of the World",1931,74,NA,6.2,8,0,0,0,14.5,14.5,14.5,24.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Man of the Year",1995,86,NA,6,129,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Man on Fire",1957,95,NA,5.9,38,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man on Fire",1987,92,NA,4.5,140,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Man on Fire",2004,146,70000000,7.4,14358,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Man on a String",1960,92,NA,5.9,14,0,0,4.5,4.5,24.5,4.5,14.5,24.5,0,24.5,"",1,0,0,1,0,0,0 -"Man on a Tightrope",1953,105,NA,6.5,65,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man on the Eiffel Tower, The",1950,97,NA,6.2,80,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man on the Flying Trapeze",1935,65,NA,8,162,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Man on the Flying Trapeze, The",1934,7,NA,6.5,15,0,0,0,14.5,4.5,24.5,24.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Man on the Moon",1999,118,52000000,7.3,19826,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Man on the Moon, The",1993,23,NA,9.2,7,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Man on the Run",1948,80,NA,7.8,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Man or Gun",1958,79,NA,5.5,15,0,0,4.5,14.5,24.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Man qing shi da ku xing",1995,88,NA,5.8,115,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Man spricht deutsh",1988,84,NA,6.5,128,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Man to Man",1930,68,NA,7.5,7,0,0,0,0,14.5,14.5,0,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man to Man",1992,74,NA,5,11,14.5,0,4.5,0,0,0,14.5,0,4.5,44.5,"",0,0,0,1,0,0,0 -"Man to Man",2005,122,30000000,6,76,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Man van staal",1999,85,NA,6.8,47,4.5,4.5,14.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Man with Bogart's Face, The",1980,106,NA,5.3,111,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Man with My Face",1951,79,NA,6,18,0,0,0,4.5,14.5,44.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Man with Nine Lives, The",1940,73,NA,6.1,22,0,0,0,4.5,4.5,34.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Man with No Eyes, The",2001,21,NA,8,9,0,0,0,14.5,0,24.5,14.5,0,14.5,44.5,"",0,0,0,0,0,0,1 -"Man with One Red Shoe, The",1985,92,NA,5.3,2452,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Man with Rain in His Shoes, The",1998,96,NA,6.6,607,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Man with Two Brains, The",1983,93,NA,6.2,4149,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Man with Two Faces, The",1934,73,NA,5.3,41,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Man with Two Lives",1942,65,NA,6,9,0,0,0,0,0,74.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Man with a Cloak, The",1951,81,NA,6.3,84,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Man with a Plan",1996,89,100000,7.1,68,4.5,0,4.5,0,4.5,0,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Man with the Beautiful Eyes, The",1999,5,NA,7.8,31,0,0,0,0,4.5,24.5,14.5,34.5,14.5,14.5,"",0,1,0,1,0,0,1 -"Man with the Empty Room, The",2001,19,NA,5.9,5,0,0,0,0,24.5,24.5,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Man with the Golden Arm, The",1955,119,NA,7.4,861,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Man with the Golden Gun, The",1974,125,13000000,6.4,7425,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Man with the Gun",1955,83,NA,6.1,51,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man with the Perfect Swing, The",1995,95,NA,8.2,10,0,14.5,0,0,14.5,0,0,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Man with the Smallest Penis in Existence and the Electron Microscope Technician Who Loved Him, The",2003,9,NA,5.8,83,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Man with the Steel Whip",1954,167,NA,5.9,5,0,0,0,0,64.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Man's Best Friend",1952,6,NA,5.8,41,4.5,0,4.5,0,24.5,34.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Man's Best Friend",1993,95,6000000,4.4,511,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Man's Castle",1933,75,NA,7.3,60,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Man's Favorite Sport?",1964,120,NA,6.8,590,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Man's Genesis",1912,17,NA,6.7,5,0,0,0,0,24.5,24.5,24.5,44.5,0,0,"",0,0,0,1,0,0,1 -"Man's Gotta Do, A",2004,100,NA,4.9,17,0,4.5,0,14.5,4.5,24.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Man's Search for Happiness",1964,13,NA,6.4,5,0,24.5,0,0,0,44.5,0,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Man, Monsters and Mysteries",1973,15,NA,7.4,5,0,0,0,0,44.5,0,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Man, The",1972,93,NA,6.1,66,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Man, Woman and Child",1983,99,NA,5.7,81,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Man, a Woman and a Bank, A",1979,100,NA,5,74,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Man, taraneh, panzdah sal daram",2002,110,NA,7.9,49,0,4.5,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Man-Eater of Kumaon",1948,79,NA,6.5,9,0,0,0,0,24.5,24.5,0,45.5,0,0,"",0,0,0,0,0,0,0 -"Man-Proof",1938,75,NA,5.6,41,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Man-Thing",2005,96,30000000,3.8,163,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Man-Trap",1961,93,NA,6.9,12,0,0,0,0,4.5,24.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Managua",1996,108,NA,3.3,33,24.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,0,0,"R",0,0,0,0,0,0,0 -"Manchu Eagle Murder Caper Mystery, The",1975,80,NA,5.6,17,0,0,0,0,4.5,14.5,14.5,0,24.5,44.5,"",0,0,1,0,0,1,0 -"Manchurian Candidate, The",1962,126,NA,8.4,14232,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Manchurian Candidate, The",2004,129,NA,6.7,9896,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Manda, La",1968,13,NA,5.6,8,14.5,0,0,14.5,0,64.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Mandabi",1968,105,NA,7.7,25,0,0,0,0,0,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mandala",1981,117,NA,6.1,24,0,0,0,0,14.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Mandalay",1934,65,NA,6,36,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mandarim, O",1995,90,NA,5.7,16,14.5,4.5,0,4.5,4.5,0,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Mandarin Mystery, The",1936,66,NA,5.4,22,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Mandela",1996,118,NA,7.8,28,0,0,4.5,0,14.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Manden med tubaen",2000,22,NA,5.3,6,0,0,0,14.5,34.5,0,14.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Mandi",1983,167,NA,6.5,24,0,0,0,4.5,4.5,4.5,24.5,4.5,44.5,4.5,"",0,0,1,1,0,0,0 -"Mandingo",1975,127,NA,4.8,332,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Mandragola, La",1965,95,NA,6.9,19,0,0,0,0,0,44.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mandragora",1997,126,NA,6.7,135,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mandrake the Magician",1939,215,NA,6,11,0,0,14.5,0,4.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Mandrin",1962,126,NA,6.6,5,0,0,0,24.5,0,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Mandroid",1993,81,NA,2.8,81,14.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Mandy",1952,93,NA,7.6,61,0,0,0,4.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Manevri na petiya etazh",1985,94,NA,7.2,6,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,1,0,0,0,0 -"Manfast",2002,95,NA,4.7,27,0,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Manfish",1956,76,NA,4.6,15,4.5,0,4.5,0,24.5,24.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Mang jing",2003,95,NA,7.3,286,4.5,0,4.5,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mang quan gui shou",1981,92,NA,4.5,31,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Mangalistim, Ha-",2003,102,NA,7.3,16,0,0,0,4.5,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Manganinnie",1980,90,NA,6.4,11,0,0,4.5,4.5,4.5,0,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mangchi",2003,80,NA,4.4,5,0,24.5,0,24.5,44.5,24.5,0,0,0,0,"",1,1,0,0,0,0,0 -"Mange ta soupe",1997,70,NA,4.1,13,14.5,0,14.5,4.5,4.5,0,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Mangiati vivi",1980,87,NA,4.7,278,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mangler, The",1995,106,NA,3.2,1240,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mango Kiss",2004,84,NA,6.1,46,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Mango Souffle",2002,90,NA,7,29,0,0,4.5,4.5,24.5,24.5,4.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Mango Tree, The",1977,93,NA,5.3,14,4.5,0,0,24.5,4.5,24.5,4.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Manhandled",1924,75,NA,6.9,21,0,0,4.5,4.5,0,24.5,34.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Manhandled",1949,97,NA,6.7,27,0,4.5,0,14.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Manhandlers, The",1975,87,NA,3.2,7,24.5,14.5,14.5,0,24.5,0,0,14.5,0,0,"",1,0,0,1,0,0,0 -"Manhattan",1979,96,NA,8.2,12391,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Manhattan Baby",1982,89,300000,4,196,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Manhattan Chase",2000,97,NA,3.8,6,0,14.5,0,34.5,0,0,34.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Manhattan Love Suicides",1985,35,NA,5.9,23,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Manhattan Melodrama",1934,90,NA,6.9,308,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Manhattan Merengue!",1995,94,NA,4.1,14,14.5,24.5,0,24.5,0,0,0,0,4.5,34.5,"R",0,0,0,1,0,1,0 -"Manhattan Merry-Go-Round",1937,89,NA,6.4,10,0,0,0,0,24.5,24.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Manhattan Murder Mystery",1993,104,13500000,7.3,5044,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Manhattan Project, The",1986,117,NA,5.7,880,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Manhattan by Numbers",1993,110,NA,8,20,4.5,0,0,0,4.5,14.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Manhunt in the Jungle",1958,79,NA,4.1,9,0,14.5,14.5,0,0,0,34.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Manhunt of Mystery Island",1945,219,NA,7.1,27,0,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Manhunter",1986,124,15000000,7.2,7272,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mani",1947,103,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Mani Matter - Warum syt dir so truurig?",2002,92,NA,7.6,27,0,0,0,0,0,4.5,24.5,44.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Mani di velluto",1979,98,NA,4.8,52,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mani forti, Le",1997,95,NA,6.8,22,24.5,0,0,0,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Maniac",1934,51,5000,3,177,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Maniac",1963,86,NA,4.7,34,14.5,0,0,4.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Maniac",1980,85,350000,5.2,732,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Maniac Cop",1988,85,1100000,5,709,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Maniac Cop 2",1990,90,4000000,4.4,360,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Maniac Cop 3: Badge of Silence",1993,85,NA,3.5,229,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Maniac Nurses",1990,75,NA,1.7,104,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Maniaci sentimentali",1994,95,NA,4.1,22,14.5,0,4.5,0,4.5,34.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Maniacts",2001,92,NA,5.7,48,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,24.5,"R",1,0,1,0,0,1,0 -"Manic",2001,100,NA,7.4,427,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Manichithrathazhu",1993,169,NA,8.4,21,0,0,4.5,0,0,0,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Manifesto",1988,96,NA,6.1,90,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Manika, une vie plus tard",1989,106,NA,6,14,0,0,0,4.5,14.5,24.5,14.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Manila",1991,93,NA,5.2,5,0,0,0,24.5,24.5,24.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Manila",2000,113,NA,4.9,39,14.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Manila Calling",1942,81,NA,6.9,22,0,4.5,0,4.5,0,24.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Manila paloma blanca",1992,88,NA,7.2,5,0,24.5,0,0,0,0,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Manin densha",1957,100,NA,5.7,8,0,0,0,14.5,0,14.5,34.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Manina, la fille sans voile",1952,76,NA,5.5,10,24.5,0,0,0,34.5,14.5,0,24.5,0,24.5,"",0,0,0,0,0,1,0 -"Manipai",2003,11,NA,5.3,8,0,0,0,14.5,24.5,14.5,14.5,0,0,34.5,"",0,1,0,0,0,0,1 -"Manipulation",1991,7,NA,9.3,12,0,0,0,0,0,0,4.5,4.5,44.5,44.5,"",0,1,1,0,0,0,1 -"Manipulator and the Subservient, The",2003,11,NA,7.1,8,24.5,0,0,0,0,14.5,0,0,14.5,45.5,"",0,0,0,1,0,0,1 -"Manipulator, The",1971,85,NA,1.5,19,44.5,24.5,0,0,0,14.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Manito",2002,79,24000,7.2,145,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Manitou, The",1978,104,3000000,3.7,216,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Manji",1964,91,NA,7,62,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Manji",2001,10,NA,6.9,8,0,14.5,0,14.5,0,0,34.5,0,24.5,14.5,"",0,0,0,0,0,0,1 -"Mann auf der Mauer, Der",1982,105,NA,5.9,11,0,0,0,14.5,0,14.5,44.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Mann geht durch die Wand, Ein",1959,99,NA,6.9,69,0,4.5,4.5,0,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mann im Pyjama, Der",1981,95,NA,6,6,0,0,0,0,34.5,14.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Mann im Strom, Der",1958,95,NA,5,14,4.5,0,0,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Mann ist Mann",1931,15,NA,7,7,0,0,0,0,24.5,24.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Mann mit dem Glasauge, Der",1969,87,NA,5.3,27,0,4.5,0,4.5,34.5,34.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Mann nebenan, Der",1991,110,NA,4.8,28,14.5,0,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mann wie EVA, Ein",1984,87,NA,6.5,28,14.5,4.5,4.5,0,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mann, der Sherlock Holmes war, Der",1937,112,NA,5.9,112,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mann, der nicht nein sagen konnte, Der",1958,91,NA,6.5,7,0,0,0,0,0,44.5,44.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Mann, der sich selber sucht, Der",1950,84,NA,7.1,6,0,0,0,0,14.5,0,64.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Mann, von dem man spricht, Der",1937,83,NA,6.3,9,0,0,0,0,0,44.5,45.5,0,0,0,"",0,0,1,0,0,0,0 -"Manna From Heaven",2002,119,NA,5.9,188,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"PG",0,0,1,0,0,0,0 -"Mannaja",1977,101,NA,6.2,113,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Manneken Pis",1995,89,NA,7.3,285,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Mannen som elsket Haugesund",2004,60,NA,6.4,30,34.5,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Mannen som ikke kunne le",1968,98,NA,3.8,36,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mannequin",1937,95,NA,6.2,88,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mannequin",1987,90,NA,4.8,3980,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mannequin: On the Move",1991,95,13000000,2.9,1235,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Manners of Dying",2004,104,750000,7.4,16,0,0,0,0,0,0,24.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Mannetjesmaker, De",1983,110,NA,5.7,9,0,0,0,14.5,14.5,24.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Manny & Lo",1996,88,500000,6.9,395,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Manny's Orphans",1978,92,NA,3.6,8,0,24.5,0,0,24.5,0,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mano che nutre la morte, La",1974,87,NA,5.3,14,4.5,0,4.5,4.5,4.5,24.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Mano en la trampa, La",1961,90,NA,7.6,25,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mano negra, La",1980,88,NA,4.8,13,4.5,0,4.5,0,24.5,4.5,24.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Mano po",2002,110,NA,6.2,27,14.5,4.5,4.5,4.5,0,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mano po 2: My home",2003,130,NA,7.1,20,14.5,0,4.5,0,24.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mano po III: My love",2004,119,NA,4.4,18,24.5,0,14.5,4.5,4.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Mano spietata della legge, La",1973,88,NA,6.7,9,0,0,14.5,0,14.5,14.5,44.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Manoir du diable, Le",1896,2,NA,5.3,12,4.5,0,0,0,14.5,4.5,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Manolito Gafotas",1999,89,NA,6.1,141,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Manon",1949,100,NA,7.4,48,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Manon 70",1968,105,NA,6.2,16,0,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Manon des sources",1953,200,NA,7.6,48,0,0,0,0,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Manon des sources",1986,113,NA,8,4186,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Manor, The",1999,115,NA,4.6,35,4.5,0,4.5,4.5,24.5,14.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Manos de seda",1999,88,NA,4.8,14,4.5,0,4.5,14.5,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Manoscritto del principe, Il",2000,106,NA,6.1,12,0,0,0,14.5,0,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Manpower",1941,104,NA,7.2,141,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Manpower",1942,10,NA,6.3,7,0,0,14.5,0,14.5,0,44.5,14.5,14.5,0,"",0,0,0,0,1,0,1 -"Mansfield Park",1999,112,NA,7.2,2868,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Mansion of Madness, The",1972,88,NA,4.4,48,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mansion of the Doomed",1976,89,NA,3.9,60,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Manslaughter",1930,85,NA,7.4,10,0,0,0,14.5,14.5,14.5,24.5,24.5,0,34.5,"",0,0,0,1,0,1,0 -"Manson",1973,83,NA,6.9,96,4.5,4.5,0,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Manson Family, The",2003,95,NA,5.1,244,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Manson Massacre, The",1972,65,NA,6,7,0,24.5,0,0,0,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Manster, The",1962,72,NA,4.1,74,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Manta - Der Film",1991,90,NA,3.4,116,24.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Manta, Manta",1991,91,NA,4.6,320,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mantenuto, Il",1961,96,NA,5.6,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Manthan",1976,134,NA,7.3,22,0,0,0,0,4.5,0,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Mantis Vs the Falcon Claws",1983,90,NA,6,7,0,14.5,0,24.5,14.5,14.5,14.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Mantis in Lace",1968,68,35000,3.6,50,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mantrap",1926,66,NA,7.7,42,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Manual Labor",2002,6,NA,7.1,5,0,0,0,0,0,44.5,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Manuela",1957,87,NA,5.7,13,14.5,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Manuelita",1999,86,NA,4.4,35,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,1,1,0,0,0,0 -"Manufacturing Consent: Noam Chomsky and the Media",1992,167,NA,7.6,744,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Manula jugigi",1994,101,NA,6.2,39,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Manxman, The",1929,90,NA,6.4,163,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Many Adventures of Winnie the Pooh, The",1977,74,NA,7.6,1632,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Many Happy Returns",1934,64,NA,8.6,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Many Rivers to Cross",1955,94,NA,6.1,128,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Maohgai",1993,88,NA,3.8,5,0,0,24.5,0,84.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Map of the Human Heart",1993,109,NA,6.8,782,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Map of the World, A",1999,125,NA,6.5,1194,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Mapantsula",1988,104,NA,6.2,29,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Maplewoods",2003,87,NA,2.1,36,44.5,4.5,4.5,4.5,0,0,4.5,0,4.5,34.5,"",1,0,0,1,0,0,0 -"Mapmaker, The",2001,92,NA,5.6,25,0,0,0,4.5,24.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Maqbool",2003,132,NA,8.3,107,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Maquinista, El",2004,102,5000000,7.7,4322,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Mar Baum",1997,92,NA,6.9,40,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mar de Lucas, El",1999,97,NA,5.6,10,0,14.5,14.5,0,34.5,0,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Mar de Rosas",1977,99,NA,6,10,24.5,0,14.5,0,0,14.5,14.5,0,34.5,24.5,"",0,0,0,1,0,0,0 -"Mar y el tiempo, El",1989,102,NA,7.5,6,0,0,0,0,0,14.5,45.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Mar, El",2000,107,NA,7.6,173,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mara Maru",1952,98,NA,5.6,44,0,0,14.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mara of the Wilderness",1965,90,NA,4.3,14,0,14.5,24.5,4.5,4.5,24.5,0,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Maracaibo",1958,88,NA,4.9,9,0,0,14.5,24.5,0,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Marais, Le",2002,85,NA,5.5,76,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Marana Simhasanam",1999,61,NA,5.8,36,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Marasmo",2003,90,NA,4.6,7,0,0,24.5,24.5,0,0,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Marat/Sade",1967,116,NA,7.3,366,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Marathon",1992,105,NA,8.4,5,0,0,0,0,24.5,0,24.5,0,0,64.5,"",0,0,0,0,1,0,0 -"Marathon",2002,74,NA,4.1,43,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Marathon",2005,117,NA,9.4,9,0,0,0,0,0,0,14.5,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Marathon Man",1976,125,NA,7.4,5907,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Maratonci trce pocasni krug",1982,92,NA,8.4,1388,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,84.5,"",0,0,1,0,0,0,0 -"Marauders, The",1947,63,NA,7.2,11,0,0,0,0,4.5,0,4.5,14.5,24.5,34.5,"",1,0,0,0,0,0,0 -"Marauders, The",1955,81,NA,5.5,15,0,0,14.5,14.5,0,24.5,34.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Maravillas",1981,95,NA,5.8,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Marbella, un golpe de cinco estrellas",1985,112,NA,3.1,17,0,14.5,24.5,24.5,4.5,0,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Marc Mato, agente S. 077",1965,92,NA,8.8,11,4.5,0,0,0,0,4.5,0,0,0,84.5,"",1,0,0,0,0,0,0 -"Marca del Hombre-lobo, La",1968,78,NA,4.4,37,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Marca del muerto, La",1961,74,NA,1.1,18,45.5,4.5,14.5,0,0,0,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Marca del zorrillo, La",1950,105,NA,8.1,16,4.5,0,0,0,0,0,4.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Marcelino pan y vino",1955,90,NA,7.1,209,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Marcellino",1991,98,NA,6.2,28,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"March",2001,92,NA,7.3,19,14.5,0,0,4.5,0,0,24.5,4.5,34.5,24.5,"",0,0,0,0,0,0,0 -"March Hare",1955,85,NA,4.6,5,0,0,0,24.5,24.5,24.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"March On, America!",1942,21,NA,4.5,7,0,0,0,44.5,14.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"March of Time: Inside Nazi Germany",1938,16,NA,4.8,6,0,0,34.5,0,0,0,0,34.5,14.5,14.5,"",0,0,0,0,1,0,1 -"March or Die",1977,104,9000000,5.7,325,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"March, The",1990,100,NA,4.9,14,14.5,0,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Marcha verde, La",2002,91,NA,4.8,12,0,14.5,34.5,4.5,0,4.5,0,4.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Marchands de sable, Les",2000,102,NA,6.8,44,4.5,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Marche de l'empereur, La",2005,85,NA,7.2,90,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Marche gaie, La",1980,15,NA,8.9,6,0,0,0,0,0,0,0,34.5,64.5,0,"",0,0,0,0,1,0,1 -"Marche ou quand tous les exclus..., La",2002,13,NA,7.8,6,0,0,0,0,14.5,0,34.5,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Marches du palais, Les",1997,140,NA,2,12,24.5,0,0,0,0,0,0,0,4.5,64.5,"",0,0,1,1,0,1,0 -"Marchese del Grillo, Il",1981,135,NA,6.6,133,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Marchio di Kriminal, Il",1968,92,NA,2.5,7,14.5,0,0,0,24.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Marci X",2003,80,20000000,2.8,741,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Marcia o crepa",1962,101,NA,8.5,9,0,0,0,0,0,14.5,34.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Marcia su Roma, La",1962,90,NA,6.7,49,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Marcia trionfale",1976,118,NA,6,26,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Marciando nel buio",1995,105,NA,7.4,18,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Marciano llamado deseo, Un",2003,80,NA,2.6,10,45.5,24.5,14.5,14.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Marcides",1993,108,NA,7.5,11,14.5,0,0,0,4.5,4.5,0,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Marcie's Dowry",1999,15,NA,4.3,15,4.5,0,14.5,4.5,4.5,0,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Marco",1973,109,NA,4.9,10,24.5,0,24.5,0,34.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Marco Polo",1961,95,NA,5.3,8,0,0,0,24.5,14.5,24.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Marco Polo: Haperek Ha'aharon",1996,127,3300000,4.6,23,14.5,4.5,4.5,4.5,14.5,24.5,4.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Marco Polo: Return to Xanadu",2001,82,NA,5.5,12,14.5,4.5,0,14.5,14.5,4.5,0,0,0,34.5,"",0,1,0,0,0,0,0 -"Mard",1985,177,NA,6,36,4.5,4.5,4.5,0,14.5,4.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Mardi Gras",1958,107,NA,5.2,38,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mardi Gras Massacre",1978,97,NA,3.5,28,34.5,14.5,14.5,4.5,14.5,0,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Mare Nostrum",1926,102,NA,7.3,54,4.5,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Mare largo",1998,90,NA,7.2,8,14.5,0,0,0,0,0,34.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Mare matto",1963,121,NA,6.5,8,0,0,14.5,0,14.5,14.5,64.5,0,0,0,"",0,0,1,0,0,0,0 -"Mare nostrum",1948,90,NA,6.5,6,0,0,0,0,14.5,14.5,0,45.5,0,14.5,"",0,0,0,1,0,0,0 -"Marea suave",1992,94,NA,4.9,7,14.5,24.5,0,0,14.5,14.5,14.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Marebito",2004,92,NA,6.9,35,14.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Marg Yazdgerd",1982,120,NA,9.2,6,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,0,0,0,0,0 -"Margaret's Museum",1995,114,NA,7.1,528,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Margarit i Margarita",1989,92,NA,6.5,45,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Margarita Happy Hour",2001,98,NA,3.9,77,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Margarita se llama mi amor",1961,94,NA,5,19,14.5,14.5,0,4.5,24.5,14.5,0,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Margie",1946,94,NA,7,130,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Margin for Error",1943,74,NA,6,14,0,0,14.5,4.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Marginal, Le",1983,100,NA,5.7,245,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Marginal, O",1974,105,NA,7.6,5,0,0,0,0,0,44.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Marguerite de la nuit",1955,125,NA,5.6,6,0,0,0,0,34.5,34.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Mari de la coiffeuse, Le",1990,82,NA,7.3,1253,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Mari del sud",2001,94,NA,6,46,0,4.5,4.5,4.5,4.5,34.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mari-Cookie and the Killer Tarantula in 8 Legs to Love You",1998,85,NA,3.4,55,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Maria",1997,92,NA,2.2,15,24.5,0,4.5,0,14.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Maria",2000,18,NA,4.9,17,14.5,14.5,0,4.5,0,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,1 -"Maria",2003,97,NA,5.4,41,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Maria Chapdelaine",1983,107,4600000,6.4,40,14.5,4.5,4.5,0,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Maria Danneels (of het leven dat we droomden)",1982,72,NA,4.9,12,0,0,4.5,4.5,24.5,34.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Maria Dolores",2005,90,NA,6.7,9,0,0,0,0,0,14.5,45.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Maria Full of Grace",2004,101,NA,7.7,4131,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Maria Marten, or The Murder in the Red Barn",1935,70,NA,7.1,14,0,0,0,0,14.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Maria tis siopis, I",1973,85,NA,5.7,19,4.5,4.5,0,14.5,24.5,4.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Maria's Lovers",1984,103,NA,6,344,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Maria's Story",1990,53,NA,7.6,5,24.5,0,0,0,0,0,24.5,0,0,64.5,"",0,0,0,0,1,0,0 -"Maria, Mirabella",1981,69,NA,9,38,0,0,0,0,0,4.5,14.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Mariachi desconocido, El",1953,90,NA,8.8,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Mariachi, El",1992,81,220000,7,6817,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Mariage de Chiffon, Le",1942,103,NA,6.5,6,0,0,0,34.5,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Mariage en papier, Le",2001,27,NA,6.1,8,0,0,0,0,34.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Mariage mixte",2004,104,NA,3.9,31,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mariages",2001,95,NA,6.9,29,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Mariages!",2004,100,NA,5.8,143,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Marian",1996,109,NA,6.1,26,0,0,4.5,14.5,0,14.5,44.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Marianela",1972,105,NA,6.6,11,4.5,4.5,0,4.5,4.5,0,34.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Marianne",1997,90,NA,3.7,17,14.5,0,0,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Marianne de ma jeunesse",1955,105,NA,7.1,33,0,0,4.5,14.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Marido perfecto, El",1993,89,NA,5.2,38,4.5,0,4.5,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Maridos en vacaciones",1975,90,NA,5.7,6,0,0,0,14.5,45.5,0,0,34.5,0,0,"",0,0,1,0,0,0,0 -"Marie",1985,112,NA,6.4,149,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Marie",1994,85,NA,6.5,48,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Marie Antoinette",1938,160,2926000,7.1,255,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Marie Baie des Anges",1997,90,NA,5.6,244,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Marie Galante",1934,88,NA,6.1,28,0,0,4.5,4.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Marie and Bruce",2004,90,NA,3.7,46,14.5,4.5,4.5,4.5,4.5,0,0,0,14.5,44.5,"",0,0,1,1,0,0,0 -"Marie de Nazareth",1995,110,NA,6.6,22,14.5,4.5,4.5,4.5,14.5,0,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Marie du port, La",1950,88,NA,6.8,31,0,0,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Marie, Nonna, la vierge et moi",2000,80,NA,5.9,9,14.5,0,14.5,14.5,24.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Marie-Antoinette reine de France",1956,120,NA,5.6,13,0,0,4.5,0,14.5,34.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Marie-Chantal contre le docteur Kha",1965,113,NA,5,31,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Marie-Jo et ses 2 amours",2002,124,NA,6.4,232,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Marie-Line",2000,100,NA,5.4,60,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Marie-Louise",1944,93,NA,7.9,8,0,0,0,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Marie-Louise ou la permission",1995,85,NA,3.5,17,24.5,4.5,4.5,0,4.5,4.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Marie-Martine",1943,103,NA,6.8,10,0,0,0,0,0,24.5,0,14.5,44.5,34.5,"",0,0,0,0,0,0,0 -"Marie-Octobre",1959,119,NA,7.1,63,4.5,4.5,0,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Marienthal: State of Emergency",2002,95,NA,9.5,52,4.5,4.5,0,4.5,0,0,0,4.5,14.5,74.5,"",0,0,0,0,0,0,0 -"Marihouana stop!",1971,92,NA,6,7,24.5,0,0,0,14.5,0,44.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Marijuana",1968,34,NA,5.4,15,24.5,4.5,0,0,4.5,24.5,4.5,4.5,0,24.5,"",0,0,0,0,1,0,1 -"Marijuana mitsubai soshiki",1970,87,NA,5.7,12,4.5,0,0,44.5,0,4.5,34.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Mariken",2000,92,NA,6.3,107,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mariken van Nieumeghen",1974,80,NA,6.3,23,0,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Marilyn",1963,83,NA,6.7,20,0,0,0,4.5,14.5,14.5,34.5,0,14.5,34.5,"",0,0,0,0,1,0,0 -"Marilyn Hotchkiss' Ballroom Dancing and Charm School",1990,34,NA,4.6,6,0,0,0,14.5,14.5,0,14.5,0,0,45.5,"",0,0,1,0,0,1,1 -"Marilyn Hotchkiss' Ballroom Dancing and Charm School",2005,103,NA,5.7,77,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,1,0 -"Marilyn Monroe: Beyond the Legend",1987,60,NA,7.1,18,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Marilyn Times Five",1973,14,NA,6.5,12,0,0,0,24.5,0,4.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Marilyn's Man",2004,92,825000,7.6,24,24.5,0,4.5,4.5,0,0,0,0,0,74.5,"PG",0,0,0,0,1,0,0 -"Marine Life",2000,95,NA,5.3,40,4.5,4.5,0,14.5,24.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Marine Raiders",1944,90,NA,5.5,25,0,0,4.5,14.5,24.5,44.5,14.5,4.5,0,4.5,"",1,0,0,1,0,1,0 -"Marines Are Coming, The",1934,74,NA,6,11,0,0,0,4.5,14.5,14.5,24.5,24.5,0,0,"",1,0,0,1,0,1,0 -"Marines Fly High, The",1940,68,NA,6.3,15,0,0,24.5,14.5,4.5,4.5,34.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Marines in the Making",1942,9,NA,5.7,11,0,0,4.5,0,4.5,45.5,14.5,4.5,0,0,"",0,0,0,0,1,0,1 -"Marines, Let's Go",1961,103,NA,5.6,29,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Marins perdus, Les",2003,97,NA,5,37,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mario",1984,98,NA,5.6,29,4.5,4.5,4.5,14.5,0,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mario und der Zauberer",1994,127,NA,4.7,37,4.5,4.5,14.5,4.5,24.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mario, Maria e Mario",1993,102,NA,6,26,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Marion",1997,106,NA,6.1,35,4.5,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Marion Bridge",2002,90,NA,7.1,280,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mariona Rebull",1947,110,NA,4.6,7,0,0,14.5,14.5,24.5,14.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Mariposas en el andamio",1996,70,NA,8.1,8,0,0,0,0,0,0,0,64.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Maris, les femmes, les amants, Les",1989,117,NA,6.8,31,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Mariscal del infierno, El",1974,95,NA,2.1,11,14.5,34.5,14.5,14.5,0,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Marito, Il",1958,82,NA,5.7,13,0,0,0,4.5,24.5,4.5,34.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Marius",1931,130,NA,8.1,194,0,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,44.5,"",0,0,1,1,0,1,0 -"Marius et Jeannette",1997,105,NA,7,584,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Mariya",1988,40,NA,7.7,20,4.5,0,0,0,0,4.5,24.5,4.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Marjoe",1972,88,NA,5.8,75,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Marjorie Morningstar",1958,128,NA,6,189,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mark Twain's America in 3D",1998,52,NA,6.8,5,0,0,0,0,24.5,24.5,0,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Mark colpisce ancora",1976,102,NA,5.3,8,0,0,14.5,0,34.5,24.5,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Mark il poliziotto",1975,90,NA,3.1,5,0,24.5,24.5,0,24.5,0,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Mark il poliziotto spara per primo",1975,95,NA,5.2,7,0,0,0,14.5,24.5,0,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Mark of Cain",1985,90,1000000,4.1,12,0,0,14.5,14.5,44.5,4.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Mark of Cain, The",1947,88,NA,5.9,10,0,0,0,0,14.5,64.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Mark of Zorro, The",1920,90,NA,7.4,213,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mark of Zorro, The",1940,90,NA,7.6,1090,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mark of the Devil 666: The Moralist",1995,99,NA,1.2,10,64.5,14.5,0,0,24.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Mark of the Gorilla",1950,68,NA,4.4,31,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mark of the Hawk, The",1958,83,NA,5.3,27,0,0,24.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mark of the Phoenix",1958,64,NA,2.4,5,24.5,24.5,64.5,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Mark of the Renegade",1951,81,NA,4.7,12,0,4.5,4.5,0,24.5,14.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Mark of the Vampire",1935,60,305177,6.2,367,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mark of the Whistler, The",1944,60,NA,7.1,17,0,0,0,0,4.5,14.5,44.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Mark of the Witch",1970,84,NA,3.2,12,24.5,0,34.5,4.5,14.5,4.5,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Mark, The",1961,127,NA,7.7,69,0,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Mark, The",2003,89,NA,5.3,7,44.5,0,0,0,14.5,0,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Marked Man",1995,94,NA,5,66,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Marked Woman",1937,96,NA,7,308,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Marked for Death",1990,94,NA,5,1956,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Marked for Murder",1945,58,NA,4.7,5,0,0,24.5,24.5,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Markova: Comfort Gay",2000,97,NA,8.1,22,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Marlene",1984,94,NA,7.5,118,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Marlene",2000,125,NA,6,199,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Marlene Dietrich: Her Own Song",2001,100,NA,7.6,82,0,0,0,4.5,4.5,4.5,4.5,44.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Marlowe",1969,96,NA,6.3,370,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Marmalade",2004,91,NA,3.7,13,4.5,24.5,0,0,4.5,0,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Marmeladupproret",1980,93,NA,2.3,11,24.5,4.5,4.5,14.5,24.5,0,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Marmor, Stein & Eisen",2000,92,NA,4.2,14,14.5,24.5,4.5,4.5,0,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Marmottes, Les",1993,104,NA,5.2,94,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Marmoulak",2004,115,NA,8.5,117,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Marnie",1964,130,3000000,7.1,4373,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Maroc 7",1967,91,NA,4.3,26,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Marooned",1969,134,8000000,5.1,583,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Marquis de Sade",1995,85,NA,4.6,22,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Marquis de Sade",1996,93,NA,3.9,114,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Marquis de Sade: Justine",1969,124,NA,5.1,142,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Marquise",1997,120,NA,6.2,291,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Marquise von O..., Die",1976,102,NA,6.8,188,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Marquise von Sade, Die",1976,75,NA,5.4,48,4.5,0,4.5,14.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Marrakech express",1989,110,NA,7.2,283,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Marrana, La",1992,100,NA,5.4,34,0,4.5,4.5,14.5,4.5,24.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Marriage Circle, The",1924,92,212000,8,96,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Marriage Is a Private Affair",1944,116,NA,5.2,33,4.5,0,14.5,24.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Marriage Playground, The",1929,70,NA,4.9,6,0,14.5,0,14.5,0,0,14.5,14.5,0,34.5,"",0,0,0,1,0,1,0 -"Marriage of a Young Stockbroker, The",1971,95,NA,5.6,27,4.5,0,0,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Marriage on the Rocks",1965,109,NA,5.1,94,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Marriage-Go-Round, The",1961,98,NA,5.7,40,4.5,0,0,14.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Married Bachelor",1941,81,NA,6,18,0,0,0,0,24.5,44.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Married Before Breakfast",1937,70,NA,5.8,16,0,0,0,4.5,14.5,34.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Married Couple, A",1969,97,NA,8.8,17,0,0,0,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Married Virgin, The",1918,71,NA,6,21,4.5,0,4.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Married and in Love",1940,59,NA,5.7,11,0,0,0,24.5,4.5,4.5,14.5,34.5,0,0,"",0,0,0,1,0,1,0 -"Married to It",1991,112,NA,5.9,223,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Married to the Mob",1988,99,NA,6,3578,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Married/Unmarried",2001,102,NA,5.9,42,4.5,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Marry Me",1949,97,NA,4.8,5,0,0,24.5,0,44.5,44.5,0,0,0,0,"",0,0,1,0,0,1,0 -"Marry the Girl",1937,68,NA,5.6,9,0,14.5,14.5,14.5,34.5,24.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Marry-Go-Round, The",1943,8,NA,6.3,11,0,0,0,4.5,4.5,14.5,24.5,0,4.5,24.5,"",0,1,1,0,0,0,1 -"Marrying Kind, The",1952,92,NA,7.3,107,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Marrying Man, The",1991,115,NA,5.1,1040,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mars",1998,91,4500000,3.3,156,24.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Mars",2004,100,2000000,6.8,23,4.5,0,4.5,4.5,4.5,34.5,4.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Mars Attacks the World",1938,68,NA,7.1,83,4.5,4.5,0,4.5,14.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Mars Attacks!",1996,106,70000000,6.1,27363,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Mars Turkey",2001,90,NA,6.6,45,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,1,1,0,0,0 -"Mars na Drinu",1964,107,NA,8,32,0,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Marseillaise, La",1938,130,NA,7.4,105,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Marseille",2004,95,NA,6.8,26,4.5,0,4.5,14.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Marsh-brosok",2003,116,NA,6.2,14,0,0,14.5,4.5,4.5,24.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Marshal of Cedar Rock",1953,54,NA,5.1,8,0,0,24.5,0,24.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Marshal of Heldorado",1950,63,NA,5.1,7,0,0,0,14.5,24.5,14.5,0,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Marshal of Mesa City, The",1939,62,NA,6.3,12,0,0,4.5,0,4.5,44.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Marshal of Reno",1944,54,NA,7,5,0,0,0,0,24.5,0,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Marshal's Daughter, The",1953,71,NA,2.3,11,14.5,4.5,14.5,4.5,0,0,4.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Marta y alrededores",1999,108,NA,6.8,48,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Martelo de Vulcano, O",2003,85,NA,4.6,7,14.5,14.5,0,24.5,14.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Martha",1967,93,NA,6.9,73,4.5,0,0,4.5,4.5,14.5,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Martha & Ethel",1994,78,NA,6.6,33,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Martha et moi",1991,106,NA,5.9,19,0,0,4.5,14.5,0,14.5,14.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Martha's New Coat",2003,52,NA,5.9,8,34.5,0,14.5,0,24.5,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Martha, Meet Frank, Daniel and Laurence",1998,88,NA,6.4,1500,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Martha... Martha",2001,97,NA,6.9,81,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Martial Law",1990,89,NA,4,57,4.5,4.5,24.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Martial Law II: Undercover",1992,87,NA,3.9,41,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Martial Outlaw",1993,86,NA,3.8,43,24.5,4.5,0,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Martian Space Party",1972,28,NA,8.7,7,14.5,0,0,14.5,0,14.5,0,0,0,45.5,"",0,0,1,0,0,0,1 -"Martian Through Georgia",1962,6,NA,6.9,18,0,0,0,14.5,0,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Martians Go Home",1990,89,NA,2.5,157,34.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Martin",1977,95,800000,6.9,847,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Martin",1981,76,NA,4.3,8,0,14.5,14.5,0,45.5,0,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Martin",1999,50,NA,6.8,5,0,0,0,0,0,24.5,24.5,64.5,0,0,"",0,0,0,0,1,0,0 -"Martin & Orloff",2002,87,NA,8,115,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Martin Four",2001,21,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,1,0,0,1 -"Martin Lawrence Live: Runteldat",2002,113,3000000,4.6,504,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,1,0,0 -"Martin Luther",1953,105,NA,6.6,52,4.5,0,0,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Martin Roumagnac",1946,115,NA,5.5,23,0,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Martin Soldat",1966,91,NA,5.7,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Martin's Day",1984,98,NA,4.9,62,4.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Martins and the Coys, The",1946,8,NA,8.7,9,0,0,0,0,14.5,0,14.5,14.5,14.5,45.5,"",0,1,1,0,0,0,1 -"Martins, The",2001,86,NA,4.5,203,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Marty",1955,94,343000,7.7,2075,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Martyred Presidents, The",1901,1,NA,3.5,12,4.5,0,45.5,24.5,4.5,4.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Martyrs of the Alamo",1915,50,NA,5,6,14.5,0,0,0,34.5,0,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Maruf",2001,103,NA,6.3,11,0,4.5,24.5,0,0,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Maruhi - Shikijo mesu ichiba",1974,83,NA,7.2,10,0,0,0,0,14.5,14.5,34.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Maruhi: joro ichiba",1972,63,NA,5.7,29,0,4.5,0,4.5,24.5,44.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Marujas asesinas",2001,104,NA,5.4,57,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Marusa no onna",1987,127,NA,7.4,416,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Marusa no onna II",1988,127,NA,6.6,162,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Marvada Carne, A",1985,77,NA,8,66,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Marvin and Tige",1983,104,NA,5.9,47,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Marvin the Martian in the Third Dimension",1996,12,NA,7.1,21,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Marvin's Room",1996,98,23000000,6.5,4005,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Mary Burns, Fugitive",1935,84,NA,5.3,8,0,0,0,34.5,0,0,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mary Jane's Mishap",1903,4,NA,6.9,48,4.5,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Mary Jane's Not a Virgin Anymore",1997,98,50000,5.9,41,24.5,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mary Pickford: A Life on Film",1997,98,NA,8.4,25,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Mary Poppins",1964,140,NA,7.6,13909,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,1,0,0,0 -"Mary Reilly",1996,108,47000000,5.5,2806,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Mary Stevens, M.D.",1933,72,NA,5.6,38,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mary and Gretel",1916,7,NA,5.9,18,0,0,4.5,24.5,14.5,24.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,1 -"Mary and Joe",2002,102,NA,4.4,11,45.5,0,0,4.5,0,0,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Mary of Scotland",1936,123,NA,6.2,253,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mary! Mary!",1976,80,NA,7.2,8,0,0,0,14.5,0,14.5,0,45.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mary, La",1974,107,NA,6.1,24,14.5,4.5,4.5,0,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mary, Mary",1963,126,NA,5.8,43,0,4.5,0,0,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mary, Mary, Bloody Mary",1975,101,NA,3.9,32,4.5,4.5,14.5,34.5,14.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mary, Queen of Scots",1971,128,NA,6.9,333,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Mary/Mary",2002,93,NA,8.8,25,4.5,0,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Marya-iskusnitsa",1960,87,NA,8,15,0,0,0,0,4.5,4.5,0,4.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Maryam",2000,87,NA,6.8,105,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Maryjane",1968,95,NA,4.4,36,14.5,14.5,4.5,14.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,1,1,0,0,0 -"Maryland",1940,92,NA,5.3,18,4.5,4.5,0,0,14.5,24.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Marziani hanno dodici mani, I",1969,90,NA,3.2,10,14.5,14.5,0,14.5,14.5,0,14.5,0,14.5,44.5,"",0,0,1,0,0,0,0 -"Masa Alunkot",1977,90,NA,7.6,11,0,0,0,4.5,0,14.5,4.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Masala",1991,106,NA,6.4,89,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mascara",1987,94,NA,3.6,69,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mascara",1999,94,NA,4.9,36,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Maschenka",1987,103,NA,7.2,9,14.5,0,0,0,14.5,0,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Maschera del demonio, La",1960,83,NA,7.3,819,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Maschera, La",1988,90,NA,5.4,17,0,0,14.5,4.5,0,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Mash'd",1976,75,NA,7.2,8,14.5,0,0,0,0,14.5,0,24.5,45.5,0,"",0,0,0,0,0,0,0 -"Mashehu Totali",2000,83,NA,7.6,47,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Mashenka",1942,77,NA,7.3,9,0,0,0,0,14.5,14.5,0,34.5,34.5,14.5,"",0,0,0,0,0,1,0 -"Mashgh-e Shab",1989,86,NA,8.4,49,0,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Mask",1985,127,NA,6.9,3859,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mask of Death",1996,89,NA,4.1,82,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Mask of Diijon, The",1946,73,NA,5.3,15,0,0,24.5,4.5,44.5,4.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Mask of Dimitrios, The",1944,95,NA,7.4,312,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mask of Dust",1954,69,NA,4.5,5,0,0,44.5,24.5,0,0,24.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Mask of Fu Manchu, The",1932,68,327627,6.2,298,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mask of Murder",1985,81,NA,3.3,23,24.5,14.5,14.5,14.5,4.5,0,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mask of Zorro, The",1998,136,65000000,6.8,18220,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",1,0,1,0,0,1,0 -"Mask of the Avenger",1951,83,NA,5.5,9,14.5,0,0,0,34.5,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Mask, The",1961,83,250000,4.3,87,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mask, The",1994,97,18000000,6.4,21533,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Mask-A-Raid",1931,7,NA,6.6,14,0,0,0,4.5,4.5,34.5,4.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Maskarada",1971,86,NA,5.4,8,0,0,0,14.5,24.5,14.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Masked Marvel, The",1943,197,NA,8.1,33,0,0,0,0,4.5,4.5,4.5,14.5,44.5,24.5,"",1,0,0,0,0,0,0 -"Masked Raiders",1949,65,NA,6.1,7,0,0,0,14.5,0,14.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Masked and Anonymous",2003,112,NA,4.9,773,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Maskerade",1934,96,NA,9.1,23,0,0,0,0,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,1,0,0,1,0 -"Masks",1998,5,NA,7.4,5,0,0,0,24.5,0,0,44.5,0,24.5,24.5,"",0,1,0,0,0,0,1 -"Masks and Memories",1934,32,NA,5.6,16,0,0,4.5,4.5,24.5,34.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Maslin Beach",1997,80,NA,3.2,98,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Masmediologija na Balkanu",1989,105,NA,7.2,5,0,0,0,0,24.5,0,0,44.5,44.5,0,"",0,0,1,0,0,0,0 -"Maso et Miso vont en bateau",1975,55,NA,9.6,6,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,0,0,1,0,0 -"Masoch",1980,94,NA,3.6,8,0,24.5,24.5,34.5,0,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Masochist",1996,8,NA,9.3,18,4.5,0,0,0,4.5,0,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Masoom",1983,165,NA,7.9,126,4.5,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Masque de fer, Le",1962,127,NA,5.7,32,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Masque of the Red Death",1989,85,NA,4.4,73,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Masque of the Red Death",1990,94,NA,2.8,59,24.5,14.5,24.5,4.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Masque of the Red Death, The",1964,89,NA,6.8,917,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Masquerade",1965,102,NA,6.4,35,0,0,0,4.5,14.5,24.5,24.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Masquerade",1988,91,NA,5.9,526,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Masquerade",1998,120,NA,6.4,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,1,0,0,0,0,0 -"Masquerade in Mexico",1945,96,NA,5,12,0,0,0,24.5,24.5,4.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Masquerader, The",1914,16,NA,5.8,61,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Masquerader, The",1933,80,NA,5.6,25,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Masques",1987,100,NA,6.6,152,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mass",2004,170,NA,7.2,5,0,24.5,0,0,0,0,44.5,0,0,44.5,"",1,0,0,0,0,0,0 -"Mass Appeal",1984,99,NA,6.4,247,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mass for the Dakota Sioux",1964,24,NA,5.9,6,0,0,0,14.5,45.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Massa'ot James Be'eretz Hakodesh",2003,87,NA,8,144,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Massacre",1934,70,NA,7.1,6,0,0,0,0,0,14.5,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Massacre Canyon",1954,66,NA,6.1,12,0,4.5,4.5,0,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Massacre River",1949,78,NA,4.8,7,0,0,14.5,14.5,45.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Massacre at Central High",1976,87,NA,5.6,217,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Massacre, The",1913,20,NA,7,16,0,0,0,14.5,24.5,0,14.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Massacro al Grande Canyon",1965,89,NA,4.9,13,0,4.5,14.5,34.5,0,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Massaggiatrici, Le",1962,95,NA,5.4,5,24.5,0,0,0,44.5,24.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Massai - Les guerriers de la pluie",2004,94,NA,7.8,10,0,0,0,0,24.5,0,34.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Masseuse",1996,93,NA,2,56,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Masseuse, The",1990,85,NA,5.6,15,0,0,0,4.5,24.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Massir, al-",1997,135,NA,7,280,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Massive Retaliation",1984,90,NA,4.9,21,14.5,0,0,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Massoud, l'Afghan",1998,89,NA,8.6,32,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Mast",1999,153,NA,6,56,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Master Gunfighter, The",1975,121,3500000,3.3,72,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Master Key, The",1945,226,NA,6.4,9,0,0,0,0,14.5,24.5,14.5,44.5,0,14.5,"",1,0,0,0,0,0,0 -"Master Minds",1949,64,NA,6.6,27,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Master Race, The",1944,95,NA,6,26,0,0,0,4.5,14.5,44.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Master Spy",1964,70,NA,2.2,8,14.5,34.5,24.5,0,14.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Master Will Shakespeare",1936,11,NA,5.6,10,0,0,0,24.5,14.5,44.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Master and Commander: The Far Side of the World",2003,138,150000000,7.5,21328,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Master and His Pupil, The",2003,87,NA,7.4,11,0,0,0,0,0,0,24.5,44.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Master i Margarita",1994,125,NA,5.3,10,0,14.5,0,0,34.5,0,0,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Master of Ballantrae, The",1953,90,NA,6.2,139,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Master of Disguise, The",2002,80,16000000,2.9,3903,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Master of Dragonard Hill",1989,93,NA,2.6,28,44.5,14.5,14.5,14.5,0,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Master of the World",1961,99,NA,5.6,259,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Masterblaster",1985,94,NA,3.4,26,14.5,14.5,34.5,14.5,14.5,4.5,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Masterminds",1997,106,NA,4.6,739,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Masterpiece Monday",2003,22,NA,5.7,21,0,0,0,4.5,0,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Masters of Menace",1990,97,NA,4.3,104,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Masters of the Universe",1987,106,17000000,4.4,3288,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Masterson of Kansas",1954,73,NA,4.3,12,0,0,14.5,14.5,44.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Masumiyet",1997,110,NA,8.6,113,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Mat",1926,89,NA,7.8,175,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mat",1989,200,NA,7.8,8,0,0,0,0,0,14.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Mat i syn",1997,73,NA,7.1,355,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Mata Hari",1931,89,558000,6.8,229,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mata Hari",1985,103,NA,2.9,82,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Matador",1986,110,NA,7,1231,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Matador, El",2003,90,26000,7.1,11,14.5,0,4.5,0,0,4.5,4.5,0,0,45.5,"",0,0,1,0,0,0,0 -"Matadores, Os",1997,90,NA,7.3,146,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Matamonstruos en la mansion del terror, Los",1987,80,NA,1.9,16,24.5,0,0,4.5,0,0,0,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Matango",1963,89,NA,5.3,209,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Matanza",2002,73,NA,9.4,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,0,0,1,0,0 -"Mataperros",2002,90,NA,8.6,17,4.5,0,0,4.5,0,0,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Matar Saudades",1988,85,NA,5.4,5,0,0,0,24.5,0,44.5,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Matar al abuelito",1993,115,NA,6.3,33,4.5,0,4.5,4.5,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Matar ou Correr",1954,87,NA,6.7,9,0,0,0,0,0,14.5,44.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Matatabi",1973,100,NA,6.9,12,0,0,0,0,0,24.5,24.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Match King, The",1932,79,165000,6.6,37,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Match, The",1999,95,NA,5.7,327,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"MatchMaker, The",1997,97,NA,6.1,1742,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Matchless",1966,104,NA,4.1,24,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Matchmaker, The",1958,103,NA,6.9,137,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Matchstick Men",2003,120,NA,7.4,13684,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Matelas, Le",2004,7,NA,9.6,11,0,0,0,0,0,0,0,4.5,14.5,74.5,"",0,0,1,0,0,0,1 -"Matelot 512, Le",1984,100,NA,7.4,9,0,0,14.5,14.5,14.5,14.5,0,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Mater Dei",2000,83,NA,1.6,9,44.5,0,0,0,0,0,0,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Mater dolorosa",1917,80,NA,6.7,6,0,0,34.5,0,0,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Maternal Instincts",1996,92,NA,4.1,43,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Maternelle, La",1933,83,NA,7.6,14,0,0,0,0,0,24.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Matewan",1987,132,4000000,7.6,1877,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Math and You",2000,11,NA,8.5,11,4.5,0,0,0,0,0,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Mathe paidi mou grammata",1981,96,NA,8.4,55,4.5,0,0,4.5,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Mathias Kneissl",1970,94,NA,8.1,6,0,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,0,1,0,0,0 -"Mathias Sandorf",1962,105,NA,5,9,0,14.5,0,34.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Mathilde, la femme de Pierre",1996,15,NA,7.6,27,0,4.5,24.5,4.5,0,4.5,0,4.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Mathilukal",1990,120,NA,5.9,15,0,0,4.5,0,14.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Matia apo Nihta",2003,98,NA,6.9,7,0,0,0,14.5,0,14.5,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Matilda",1978,105,NA,3.2,65,24.5,24.5,24.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Matilda",1991,90,NA,6.5,10,0,14.5,0,0,24.5,24.5,24.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Matilda",1996,102,36000000,6.5,4351,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Matinee",1993,99,NA,6.3,1394,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Matinee Idol, The",1928,60,NA,7.8,55,0,0,0,0,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Matinee Mouse",1966,6,NA,4.5,21,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,0,"",0,1,1,0,0,0,1 -"Mating Call, The",1928,72,NA,6.9,37,0,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mating Game, The",1959,96,NA,6.8,170,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Mating Habits of the Earthbound Human, The",1999,90,NA,6.4,1266,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Mating Season, The",1951,101,NA,7.2,81,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mating of Millie, The",1948,87,NA,6.4,12,0,0,0,0,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Matir moina",2002,94,NA,7.4,64,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Matokuningas",1993,45,NA,6.6,7,14.5,0,0,0,14.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Matou, Le",1985,141,NA,5.7,38,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Matri-Phony",1942,17,NA,7.5,46,0,4.5,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Matriarca, La",1969,90,NA,6,39,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Matriarhat",1977,103,NA,9.1,7,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Matriculated",2003,16,NA,6.2,408,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Matrimaniac, The",1916,46,NA,6.6,10,0,0,0,0,24.5,34.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Matrimoni",1998,94,NA,6.5,31,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Matrimonial Bed, The",1930,69,NA,5,21,0,4.5,4.5,14.5,24.5,4.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Matrimonio all'italiana",1964,102,NA,7,317,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Matrimony's Speed Limit",1913,14,NA,6.3,19,4.5,0,0,0,14.5,34.5,14.5,34.5,4.5,0,"",0,0,1,0,0,0,1 -"Matrix Reloaded, The",2003,138,127000000,7.1,57225,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Matrix Revolutions, The",2003,125,110000000,6.3,40058,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Matrix, The",1999,136,63000000,8.5,143853,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",1,0,0,0,0,0,0 -"Matroni et moi",1999,101,NA,6.6,122,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Matroos",1998,16,NA,5.9,47,0,0,0,4.5,14.5,14.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Matrubhoomi",2003,99,NA,7,54,4.5,4.5,0,4.5,0,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mattatore, Il",1960,95,NA,7.1,37,0,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Matter of Choice, A",1988,5,NA,8.6,9,0,0,14.5,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Matter of Degrees, A",1990,95,NA,3.5,37,24.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Matter of Life and Death, A",1946,104,NA,8.1,2093,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG",0,0,1,0,0,1,0 -"Matter of Time, A",1976,97,NA,3.7,65,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Matter of Who, A",1961,90,NA,7.3,8,0,0,14.5,14.5,0,14.5,34.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Matto regiert",1947,113,NA,6.9,9,0,0,0,0,0,34.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Matusalem",1993,105,NA,5.6,68,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Matusalem II: le dernier des Beauchesne",1997,98,NA,4.5,37,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Matzor",1969,100,NA,7.4,5,0,0,0,0,0,24.5,24.5,64.5,0,0,"",0,0,0,1,0,0,0 -"Mau Mau",1992,92,NA,5.9,5,0,0,0,44.5,0,0,0,44.5,0,24.5,"",0,0,1,0,0,0,0 -"Mau Mau Sex Sex",2001,80,NA,6.8,40,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Maudite galette, La",1972,100,NA,5.9,32,0,0,0,14.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Maudits, Les",1947,105,NA,8,10,0,0,0,0,0,14.5,34.5,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Maugli",1967,90,NA,6,63,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Maulkorb, Der",1958,95,NA,7.5,7,0,0,0,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mauri",1988,101,NA,5.2,11,14.5,0,0,0,24.5,24.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Maurice",1987,140,2600000,7.3,2226,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Maurie",1973,113,NA,5.8,7,0,0,0,0,14.5,44.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Mausam",1975,156,NA,8.5,38,0,0,0,0,0,4.5,14.5,24.5,14.5,44.5,"",0,0,0,0,0,1,0 -"Mauvais esprit",2003,90,NA,4.5,116,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mauvais genre",1997,85,NA,5.7,37,4.5,0,0,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mauvais genres",2001,105,NA,4.9,53,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mauvais joueurs, Les",2005,85,NA,5.3,15,0,4.5,0,14.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Mauvais sang",1986,105,NA,7,538,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Mauvaise conduite",1984,112,NA,9.3,32,4.5,0,0,0,4.5,4.5,0,4.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Mauvaise graine",1934,77,NA,7,40,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mauvaise passe",1999,100,NA,6.6,310,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Maverick",1994,127,NA,6.7,13659,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Maverick Queen, The",1956,90,NA,5.5,51,0,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Maverick's: A Documentary Film",1998,60,NA,8.3,7,0,0,0,0,0,0,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Mavri Emmanouella",1979,78,NA,3.4,72,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mavro gala",2000,101,NA,5.7,20,14.5,4.5,4.5,4.5,0,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Max",2000,85,NA,4.3,59,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Max & Jeremie",1992,110,NA,5.7,146,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Max Dugan Returns",1983,98,NA,6.3,721,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Max Havelaar",1976,170,NA,7,130,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Max Keeble's Big Move",2001,86,12000000,5.3,587,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Max V'Morris",1994,80,NA,9,6,0,0,0,0,0,0,34.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Max and Grace",2005,91,NA,5.6,37,4.5,4.5,4.5,4.5,14.5,14.5,0,4.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Max and Mona",2004,98,NA,4.8,48,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Max and Zoe",2001,13,NA,5.6,7,0,14.5,0,0,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Max et Bobo",1998,82,NA,7,32,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Max et les ferrailleurs",1971,92,NA,7.3,150,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Max und Moritz",1956,73,NA,5.3,7,0,0,14.5,0,24.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Max und Moritz Reloaded",2005,87,NA,2.7,23,64.5,4.5,4.5,4.5,4.5,0,0,0,0,4.5,"",1,0,1,0,0,0,0 -"Max, der Taschendieb",1962,91,NA,5.1,65,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Maxie",1985,98,NA,5.1,266,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Maxime",1958,124,NA,6.7,6,0,0,14.5,0,14.5,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Maximillian Tarzan",1999,10,NA,5.2,13,14.5,4.5,0,4.5,4.5,4.5,24.5,4.5,0,24.5,"",1,0,0,0,0,0,1 -"Maximum Force",1992,90,NA,3.7,33,14.5,14.5,24.5,4.5,14.5,14.5,0,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Maximum Overdrive",1986,97,10000000,4.3,3050,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Maximum Revenge",1997,78,NA,3.2,42,14.5,4.5,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Maximum Risk",1996,100,NA,4.9,2234,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Maxwell's Demon",1999,78,NA,4.4,12,4.5,0,14.5,14.5,4.5,14.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"May",2002,93,1700000,6.8,3324,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"May Wine",1991,85,NA,4.7,36,0,14.5,4.5,24.5,24.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Maya",1966,91,NA,4.9,59,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Maya",2001,105,NA,6.7,77,4.5,0,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Maya Lin: A Strong Clear Vision",1994,105,NA,7.1,94,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Maya Memsaab",1992,130,NA,6.8,40,4.5,4.5,4.5,0,4.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,1,0 -"Maybe Baby",2000,96,NA,5.7,1017,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Maybe It's Love",1930,72,NA,5,32,4.5,4.5,4.5,24.5,14.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Maybe It's Love",1935,63,NA,4.3,8,14.5,0,14.5,0,24.5,24.5,14.5,0,0,14.5,"",0,0,1,0,0,1,0 -"Mayday - Flug in den Tod",1997,90,NA,2.6,9,14.5,24.5,24.5,0,14.5,14.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Mayerling",1936,96,NA,7.5,81,0,4.5,4.5,4.5,0,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mayerling",1968,140,5000000,5.6,154,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Mayhem",1987,20,NA,3.2,9,14.5,34.5,14.5,0,14.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Mayis sikintisi",1999,130,NA,7,186,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Maynila: Sa mga kuko ng liwanag",1975,123,NA,9,41,4.5,0,0,0,0,4.5,4.5,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Mayonaka made",1999,110,NA,5.2,21,4.5,4.5,4.5,0,4.5,0,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mayonnaise",1999,114,NA,5,5,24.5,0,0,24.5,44.5,0,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Mayor of 44th Street, The",1942,86,NA,5.1,9,0,14.5,0,0,24.5,34.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Mayor of Hell, The",1933,90,229000,6.8,80,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mayor of the Sunset Strip",2003,94,NA,7.5,319,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Mayores con reparos",1966,92,NA,4.7,6,0,14.5,0,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Mayrig",1992,157,NA,7.6,81,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Maytime",1937,132,NA,6.8,149,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Maytime in Mayfair",1949,94,NA,5,7,0,0,24.5,0,24.5,14.5,0,0,14.5,14.5,"",0,0,0,0,0,1,0 -"Maz swojej zony",1961,94,NA,6.9,18,0,0,0,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Maze",2000,97,NA,6.4,266,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,0,0,1,0 -"Maze, The",1953,80,NA,5.9,69,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mazel Tov ou le mariage",1969,87,NA,4.9,14,0,0,4.5,14.5,24.5,34.5,24.5,0,0,0,"",0,0,1,1,0,0,0 -"Mazeppa",1993,111,NA,5.1,35,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Mazhki vremena",1977,125,NA,7.5,15,0,0,0,0,0,14.5,0,24.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Mazurka",1935,91,NA,8.2,13,0,0,0,0,0,4.5,4.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Mazurka del barone, della santa e del fico fiorone, La",1975,110,NA,5.3,20,4.5,0,0,0,34.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Mazzetta, La",1978,110,NA,7,6,0,0,0,0,0,0,64.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Mboutoukou",2002,14,NA,9.1,13,0,0,4.5,0,0,4.5,0,0,4.5,74.5,"",0,0,0,0,0,0,1 -"McBain",1991,99,NA,4,232,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"McCabe & Mrs. Miller",1971,121,NA,7.6,2295,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"McCarthy: Death of a Witch Hunter",1975,55,NA,5,7,44.5,0,0,0,0,0,0,45.5,0,0,"",0,0,0,0,1,0,0 -"McCinsey's Island",1998,95,NA,2.5,117,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"McConnell Story, The",1955,106,NA,6.3,92,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"McDull, prince de la bun",2004,84,NA,7.4,67,4.5,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"McGuffin, The",1985,100,NA,4.5,17,0,0,4.5,24.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"McHale's Navy",1964,93,NA,5.7,141,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"McHale's Navy",1997,108,42000000,3.7,1758,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"McHale's Navy Joins the Air Force",1965,90,NA,5,63,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"McKenzie Break, The",1970,108,NA,6.4,192,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",1,0,0,1,0,0,0 -"McLibel",1998,53,NA,7.4,14,4.5,0,0,0,0,4.5,34.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"McLintock!",1963,127,2000000,7,1289,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"McMasters, The",1970,90,NA,6,33,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"McQ",1974,111,NA,5.5,523,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"McVicar",1980,90,NA,6,164,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Me Feelins Is Hurt",1940,6,NA,6.2,13,0,0,4.5,0,14.5,34.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Me Musical Nephews",1942,7,NA,6.4,16,0,0,0,14.5,14.5,14.5,14.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Me Myself I",1999,100,NA,6.7,964,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Me Without You",2001,107,NA,6.6,678,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Me and Daphne",2002,22,NA,6.2,6,14.5,14.5,0,14.5,0,0,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Me and Marlborough",1935,84,NA,6.7,6,0,0,0,0,0,34.5,45.5,0,14.5,0,"",0,0,1,0,0,1,0 -"Me and Mrs. Jones",2001,99,NA,6.9,11,0,0,4.5,0,4.5,4.5,4.5,4.5,0,45.5,"",0,0,1,0,0,1,0 -"Me and My Brother",1969,91,NA,4.4,23,4.5,14.5,4.5,14.5,14.5,14.5,0,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Me and My Gal",1932,79,NA,7.2,40,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Me and My Matchmaker",1996,55,NA,6.4,7,24.5,0,0,0,0,14.5,0,0,24.5,24.5,"",0,0,0,0,1,0,0 -"Me and My Pal",1933,20,NA,7.8,107,4.5,0,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Me and Rubyfruit",1989,4,NA,6.2,11,0,0,4.5,0,14.5,34.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Me and Veronica",1992,95,NA,5,45,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Me and Will",1999,101,NA,5.3,106,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Me and You and Everyone We Know",2005,90,NA,5.7,103,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Me and the Big Guy",1999,10,NA,6.4,41,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Me and the Colonel",1958,109,NA,6.9,86,0,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Me and the Kid",1993,94,NA,4.8,58,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Me da igual",2000,98,NA,2.8,14,44.5,4.5,4.5,0,24.5,14.5,4.5,0,0,0,"",0,0,1,1,0,0,0 -"Me la debes",2001,12,NA,7,106,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Me mage sandai",2000,104,NA,4.9,12,24.5,4.5,4.5,4.5,0,34.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Me permites matarte?",1994,90,NA,4.6,7,24.5,0,0,0,0,74.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Me sobra un marido",1987,100,NA,1.7,5,44.5,0,24.5,0,24.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Me tulemme taas",1953,66,NA,6.3,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Me'Ahorei Hasoragim",1984,103,NA,6.4,54,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Me'ahev, Ha-",1985,90,NA,6.2,6,0,0,14.5,0,14.5,0,34.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Me'ever Layam",1992,91,NA,5.4,15,4.5,0,0,0,0,14.5,4.5,24.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Me, Myself & Irene",2000,116,51000000,6,21305,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Me, Myself and I",1992,97,NA,5.4,23,0,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Me, Natalie",1969,111,NA,6.2,133,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Me, bebia, Iliko da Ilarioni",1963,90,NA,8.9,8,0,0,0,0,0,0,14.5,14.5,45.5,24.5,"",0,0,1,0,0,1,0 -"Meal, The",1975,90,NA,4,9,14.5,24.5,0,34.5,24.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Mean Creek",2004,89,500000,7.3,2094,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Mean Dog Blues",1978,108,NA,6,50,0,4.5,4.5,4.5,14.5,14.5,44.5,0,4.5,24.5,"",1,0,0,1,0,0,0 -"Mean Girls",2004,97,17000000,7,11591,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Mean Guns",1997,110,NA,4.8,736,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Mean Johnny Barrows",1976,90,NA,3.9,33,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mean Machine",2001,101,NA,6.1,2812,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Mean Mother",1974,88,NA,1.5,24,45.5,24.5,14.5,14.5,0,0,0,0,0,4.5,"",1,0,0,1,0,0,0 -"Mean People Suck",2003,8,10000,4.7,48,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Mean Season, The",1985,103,NA,6,555,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mean Streets",1973,107,150000,7.5,8008,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Meanest Gal in Town, The",1934,62,NA,5.2,27,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Meanest Man in the World, The",1943,57,NA,7,41,0,0,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Meaning of Life, The",1983,112,9000000,7.3,12351,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Meaning of Life, The",2005,12,NA,7.2,24,0,4.5,0,0,4.5,4.5,24.5,4.5,4.5,44.5,"",0,1,0,1,0,0,1 -"Meanwhile, Back at the Ranch",1997,70,NA,2.5,9,24.5,0,0,0,14.5,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Meat",1976,112,NA,5.7,21,14.5,4.5,0,0,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Meat",1997,17,NA,2.3,16,14.5,0,0,4.5,0,0,0,14.5,34.5,34.5,"",0,0,1,0,0,0,1 -"Meat Fucker",1999,32,NA,7.8,10,24.5,0,0,0,0,14.5,0,0,0,74.5,"",0,0,0,0,0,0,1 -"Meat Love",1989,1,NA,7.1,41,0,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Meatballs",1979,99,NA,5.7,2529,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Meatballs 4",1992,84,NA,2.5,310,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Meatballs III: Summer Job",1987,96,NA,2.4,542,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Meatballs Part II",1984,87,NA,2.8,371,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Meatcleaver Massacre",1977,85,NA,1.6,41,44.5,14.5,4.5,4.5,0,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Meateater, The",1979,85,NA,1.6,35,45.5,14.5,4.5,4.5,0,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Meatless Flyday",1944,6,NA,5.9,20,0,0,4.5,4.5,24.5,34.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Meatrack, The",1970,65,NA,2.4,13,14.5,34.5,14.5,4.5,14.5,0,4.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Mecava",1977,88,NA,6.4,9,0,0,0,0,0,34.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Mechanic, The",1972,100,NA,6.6,861,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Mechanical Monsters",1941,9,NA,7.2,68,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Mechanized Death",1961,28,NA,7.4,7,0,0,0,0,0,14.5,24.5,24.5,24.5,0,"",0,0,0,0,1,0,1 -"Mechta",1943,100,NA,8.2,6,0,0,0,0,0,0,34.5,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Med livet som insats",1940,81,NA,5.8,7,0,14.5,0,14.5,24.5,44.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Medaglione insanguinato, Il",1975,90,NA,5.7,18,4.5,0,0,14.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Medal for Benny, A",1945,77,NA,8,18,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Medal for the General",1944,84,NA,5.4,5,0,24.5,0,0,24.5,24.5,0,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Medallion, The",2003,88,41000000,4.5,2765,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Medan staden sover",1950,102,NA,8.4,15,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Medea",1969,107,NA,6.9,322,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Medeni mjesec",1983,114,NA,2,5,44.5,0,0,24.5,0,0,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Media Whore",2002,9,NA,7.3,14,0,14.5,0,0,4.5,0,4.5,44.5,24.5,4.5,"",0,0,1,0,0,0,1 -"Medicine Ball Caravan",1971,88,NA,6,9,0,14.5,0,14.5,0,24.5,0,0,14.5,44.5,"",0,0,0,0,1,0,0 -"Medicine Man",1992,106,40000000,5.7,4190,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Medicine Man, The",1930,66,NA,5.7,27,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Medicine Show, The",2001,100,NA,6.3,81,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Medico dei pazzi, Il",1954,91,NA,7.7,23,0,0,0,4.5,4.5,14.5,14.5,34.5,0,24.5,"",0,0,1,0,0,0,0 -"Medico della mutua, Il",1968,98,NA,6.7,68,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Medico e lo stregone, Il",1957,102,NA,5.5,9,0,0,0,0,24.5,24.5,34.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Medina, El",2000,90,NA,6.7,39,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mediocren, Die",1995,85,NA,6.2,46,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Meditation on Violence",1948,12,NA,5.2,62,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Mediterraneo",1991,90,NA,7.2,2073,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Medium",1985,98,NA,7,22,0,4.5,0,0,14.5,0,4.5,34.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Medium Cool",1969,110,800000,7.2,480,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Medley - Brandelli di scuola",2000,76,NA,3.3,32,44.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Medurat Hashevet",2004,96,NA,7.6,40,0,0,0,0,4.5,14.5,14.5,44.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Medusa",1997,80,NA,5.1,9,0,14.5,0,14.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Medusa Touch, The",1978,105,NA,6.5,511,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mee Pok Man",1995,105,NA,4.6,39,14.5,14.5,4.5,0,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Meeksville Ghost, The",2001,95,NA,4.8,35,14.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Meera",1979,155,NA,7.4,5,0,0,0,24.5,0,0,24.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Meet Boston Blackie",1941,58,NA,7.2,20,0,4.5,0,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Meet Danny Wilson",1952,88,NA,6.1,74,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Meet Joe Black",1998,178,90000000,6.6,16796,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Meet John Doe",1941,122,NA,7.5,1783,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Meet John Doughboy",1941,7,NA,6.5,6,0,0,0,0,0,34.5,0,34.5,0,34.5,"",0,1,1,0,0,0,1 -"Meet Marlon Brando",1966,28,NA,6.8,31,0,0,4.5,0,0,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Meet Me After the Show",1951,87,NA,5.9,17,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Meet Me Tonight",1952,81,NA,6.7,15,0,4.5,4.5,0,4.5,14.5,64.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Meet Me at the Fair",1953,87,NA,5.3,22,0,0,4.5,14.5,14.5,44.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Meet Me in Las Vegas",1956,112,NA,5.5,90,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Meet Me in St. Louis",1944,113,1707561,7.7,2480,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Meet Mr. Lucifer",1953,83,NA,6,8,0,0,14.5,14.5,0,24.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Meet Nero Wolfe",1936,73,NA,6.2,7,0,0,0,0,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Meet Prince Charming",1999,94,NA,4.7,174,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"Meet Wally Sparks",1997,105,NA,4.5,677,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Meet the Applegates",1991,90,1000,5,464,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Meet the Baron",1933,68,NA,6.2,15,4.5,0,0,14.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Meet the Deedles",1998,93,24000000,3.4,443,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Meet the Feebles",1989,94,750000,6.5,3812,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Meet the Fleet",1940,20,NA,7.2,5,0,0,0,0,0,0,24.5,0,44.5,44.5,"",0,0,0,0,0,0,1 -"Meet the Fockers",2004,115,80000000,6.5,11950,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Meet the Hollowheads",1989,86,4800000,5,70,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Meet the Mob",1942,62,NA,5.8,6,0,0,0,0,34.5,14.5,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Meet the Parents",1992,75,NA,4.6,49,14.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Meet the Parents",2000,108,55000000,7,30804,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Meet the People",1944,100,NA,5.8,40,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Meet the Stars: Meet Roy Rogers",1941,10,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,1,0,1 -"Meet the Stewarts",1942,73,NA,7.1,6,0,0,0,0,0,0,34.5,34.5,0,34.5,"",0,0,1,0,0,0,0 -"Meetin' WA",1986,26,NA,4.7,24,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,1,0,1 -"Meeting Agnus",2002,12,NA,6.4,12,0,4.5,0,0,0,0,34.5,34.5,14.5,4.5,"",0,0,0,1,0,1,1 -"Meeting Che Guevara & the Man from Maybury Hill",2003,18,NA,5.6,13,0,0,0,14.5,24.5,14.5,0,4.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Meeting Daddy",2000,96,NA,5.4,93,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Meeting People Is Easy",1999,99,NA,7.5,733,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Meeting Venus",1991,119,NA,6.6,335,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Meeting, The",1999,8,NA,5.5,27,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Meeting, The",2001,6,NA,1.2,16,34.5,14.5,0,0,0,0,0,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Meeuwen sterven in de haven",1955,94,NA,6.8,9,0,0,14.5,24.5,24.5,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Megacities",1998,90,NA,7.2,47,4.5,4.5,4.5,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Megaforce",1982,99,20000000,2.7,562,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Megaleksandros",1980,235,NA,8,46,4.5,4.5,0,0,0,4.5,24.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Megalo kanoni, To",1981,84,NA,7.2,5,0,0,24.5,0,0,24.5,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Megalodon",2004,90,NA,3.5,227,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Megalos Erotikos, O",1973,70,NA,8.5,10,0,0,14.5,0,0,0,24.5,0,24.5,45.5,"",0,0,0,1,1,0,0 -"Megaville",1990,88,NA,4.6,60,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Meghe Dhaka Tara",1960,134,NA,7.3,73,4.5,0,4.5,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Megiddo: The Omega Code 2",2001,104,22000000,3.8,729,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"PG-13",0,0,0,0,0,0,0 -"Mehanizam",2000,94,NA,5.6,59,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Mehmet",2002,7,NA,7.7,10,0,0,0,14.5,0,14.5,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Mehr Licht",2004,3,NA,8.2,8,0,0,0,0,14.5,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Mehr-E Madari",1997,90,NA,6.1,10,14.5,0,0,0,24.5,0,44.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Mei gui mei gui wo ai ni",1993,94,NA,4.8,16,4.5,4.5,0,0,0,14.5,34.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Mei li de xi yi ji",2004,118,NA,6.6,30,14.5,4.5,4.5,14.5,4.5,0,34.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Mei li zai chang ge",1997,106,NA,7.1,46,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Meier",1985,96,NA,7.4,18,0,0,0,0,0,24.5,44.5,4.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Meier 19",2001,100,NA,7.7,6,0,0,0,0,0,0,45.5,34.5,14.5,0,"",0,0,0,0,1,0,0 -"Meili shiguang",2002,109,NA,6.4,82,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Meili xin shijie",1999,100,300000,5.3,40,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Meilleure part, La",1956,90,NA,3.4,7,0,44.5,0,24.5,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Mein Bruder ist ein Hund",2004,96,NA,5.4,11,0,0,0,0,34.5,24.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Mein Bruder, der Vampir",2001,94,NA,7.2,196,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Mein Krieg",1990,90,NA,7.9,22,0,0,0,0,0,0,34.5,44.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Mein Mann, das Wirtschaftswunder",1961,90,NA,5,20,0,0,0,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mein Name ist Bach",2003,97,NA,6,37,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Mein Russland",2002,70,NA,5.2,15,4.5,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mein Schatz ist aus Tirol",1958,89,NA,3.8,7,14.5,14.5,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,1,0,0,1,0 -"Mein Schulfreund",1960,94,NA,6.5,49,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Mein Stern",2001,65,NA,6.2,34,0,0,4.5,4.5,14.5,34.5,0,24.5,24.5,4.5,"",0,0,0,0,0,1,0 -"Mein Vater, der Affe und ich",1971,88,NA,3,5,44.5,0,24.5,24.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Mein erstes Wunder",2002,93,NA,6.9,42,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mein langsames Leben",2001,85,NA,6.6,26,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Mein letzter Film",2002,90,NA,7.5,40,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mein liebster Feind - Klaus Kinski",1999,95,NA,7.6,861,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Meine Eltern",2004,18,NA,8,10,14.5,0,0,14.5,0,0,24.5,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Meine Freundin Barbara",1937,80,NA,3.1,12,0,14.5,14.5,34.5,0,24.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Meine Schwester Maria",2002,90,NA,6.7,43,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,1,1,0,0 -"Meine Stunde Null",1970,92,NA,6.8,8,0,0,0,14.5,0,0,14.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Meine Tochter und ich",1963,90,NA,4.4,19,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Meine polnische Jungfrau",2001,103,NA,2.9,54,34.5,34.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Meineidbauer, Der",1956,100,NA,6.1,7,24.5,0,0,14.5,14.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Meishaonian zhi lian",1998,111,NA,6.6,124,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Meisje",2002,93,NA,6.5,172,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Meisje met den blauwe hoed, Het",1934,117,NA,6.7,5,0,0,0,0,24.5,24.5,0,44.5,24.5,0,"",0,0,1,0,0,0,0 -"Meisje met het rode haar, Het",1981,121,NA,6.5,138,0,4.5,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Meister Eder und sein Pumuckl",1982,84,NA,7.8,16,0,0,0,0,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Meisterspiel, Das",1998,106,NA,6.9,7,14.5,0,14.5,0,0,0,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Mekagojira no gyakushu",1975,79,NA,4.8,285,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mekhanicheskaya syuita",2001,100,NA,6.4,15,0,4.5,0,0,14.5,4.5,34.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Mekhanikha golovnovo mozga",1926,60,NA,5,5,0,0,0,24.5,24.5,24.5,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Mektoub",1997,90,NA,6.2,23,4.5,0,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Mekura no oichi monogatari: Makkana nagaradori",1969,87,NA,3.2,13,14.5,0,0,0,4.5,24.5,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Mekurano Oichi midaregasa",1969,87,NA,7,5,24.5,0,0,0,0,0,24.5,24.5,0,44.5,"",1,0,0,1,0,0,0 -"Mel",1998,97,NA,4.2,52,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Melancholia",1989,87,NA,6.1,12,0,0,0,0,0,34.5,44.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Melancholian kolme huonetta",2004,106,NA,7.5,44,4.5,4.5,4.5,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Melancolicas, Las",1971,96,NA,4,7,0,14.5,14.5,14.5,14.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Melanie",1982,95,NA,6,74,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Melba",1953,112,NA,6.6,6,0,0,0,14.5,14.5,0,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Melech Hasalim",1988,90,NA,7.5,6,14.5,0,0,14.5,0,0,0,0,0,64.5,"",0,0,0,1,0,0,0 -"Melinda",1972,109,NA,6.2,22,0,0,4.5,4.5,4.5,4.5,14.5,34.5,0,24.5,"",1,0,0,1,0,0,0 -"Melinda and Melinda",2004,100,NA,6.8,1567,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Melissokomos, O",1986,122,NA,7.1,160,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Melkiy bes",1995,107,NA,8,5,0,0,24.5,0,0,0,24.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Mellem os",2003,36,NA,6.9,45,4.5,0,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,"",0,0,0,1,0,0,1 -"Melodies Old and New",1942,11,NA,7,6,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,0,1,0,0,0,1 -"Melodrama",1995,56,NA,7.6,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Melody",1953,10,NA,7.2,30,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,24.5,"",0,1,0,0,1,0,1 -"Melody",1971,103,NA,7.5,397,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Melody Cruise",1933,76,NA,5.1,17,0,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Melody Ranch",1940,84,NA,6.7,26,0,0,4.5,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Melody Time",1948,75,NA,6.7,239,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Melody Trail",1935,60,NA,7.4,8,0,0,0,0,34.5,0,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Melody for Two",1937,60,NA,6.5,10,0,0,0,24.5,14.5,24.5,14.5,14.5,0,34.5,"",0,0,0,0,0,1,0 -"Melody in Love",1978,90,NA,3.1,44,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Melting Pot",1997,104,NA,5,35,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Melvin Goes to Dinner",2003,83,NA,7.3,595,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Melvin and Howard",1980,95,NA,7.1,780,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Melvin, Son of Alvin",1984,85,NA,4.7,24,14.5,0,0,4.5,24.5,4.5,0,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Melvyn Schmatzman: Freudian Dentist",1997,20,NA,8.7,7,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Member",2001,16,NA,7.8,54,4.5,4.5,0,0,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Member of the Wedding, The",1952,93,NA,7.9,143,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Memed My Hawk",1984,110,NA,5.9,20,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Memento",1996,15,NA,8.1,32,4.5,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Memento",2000,113,5000000,8.7,90317,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Mementos",2004,23,NA,2.2,15,14.5,0,0,0,0,0,4.5,14.5,0,64.5,"",0,0,1,0,0,0,1 -"Memoirs of a Survivor",1981,115,NA,5.4,23,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Memoirs of an Evil Stepmother",2004,18,20000,8,6,0,0,0,0,14.5,0,14.5,34.5,0,34.5,"",0,0,1,0,0,0,1 -"Memoirs of an Invisible Man",1992,99,40000000,5.6,3038,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Memoria del agua, La",1994,82,NA,5.7,6,14.5,0,0,0,14.5,45.5,14.5,0,0,0,"",0,0,0,1,1,0,0 -"Memoria del saqueo",2004,120,NA,8.1,81,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Memorial Day",1998,95,NA,3.5,52,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Memorial Day",1999,79,NA,2.2,7,14.5,14.5,0,24.5,0,14.5,0,0,0,24.5,"R",0,0,0,0,0,0,0 -"Memorias del subdesarrollo",1968,97,NA,8.2,268,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Memories",1995,113,NA,7.9,800,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"PG-13",0,1,0,0,0,0,0 -"Memories Within Miss Aggie",1974,78,NA,5.7,17,0,0,0,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Memories and Melodies",1935,16,NA,6.2,5,0,0,0,0,24.5,44.5,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Memories of Famous Hollywood Comedians",1952,10,NA,6.2,6,0,0,0,0,14.5,34.5,14.5,0,0,34.5,"",0,0,0,0,1,0,1 -"Memories of Me",1988,105,NA,5.2,178,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Memories of War",1983,16,NA,9.7,5,0,0,0,0,0,0,0,24.5,44.5,44.5,"",0,1,0,0,0,0,1 -"Memory & Desire",1997,89,NA,6.7,46,4.5,4.5,4.5,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Memory Lane",1995,16,NA,6.8,17,0,0,0,0,14.5,0,0,14.5,34.5,44.5,"",0,0,0,0,0,0,1 -"Memory Run",1996,90,NA,4.5,90,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Memory of Justice, The",1976,278,NA,9.1,28,4.5,0,0,0,0,0,4.5,4.5,4.5,84.5,"",0,0,0,0,1,0,0 -"Memory of Us",1974,93,NA,5,7,0,0,0,0,24.5,45.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Memory of the Camps",1985,56,NA,8.4,39,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Memphis Belle",1990,107,NA,6.7,3882,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Memphis Belle: A Story of a Flying Fortress, The",1944,45,NA,7.8,144,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Memphis Cathouse Blues",1982,76,NA,6.4,13,0,0,0,4.5,0,24.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Memron",2004,79,65000,9,11,0,0,0,0,4.5,0,4.5,4.5,4.5,64.5,"",0,0,1,0,0,0,0 -"Men",1997,92,NA,4.9,105,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Men Against the Sky",1940,75,NA,5.6,13,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Men Are Like That",1930,59,NA,4.2,16,14.5,4.5,14.5,4.5,34.5,34.5,0,0,0,0,"",0,0,1,1,0,0,0 -"Men Are Not Gods",1936,90,NA,5.7,17,0,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Men Are Such Fools",1938,69,NA,6,58,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Men Cry Bullets",1997,105,NA,4.6,59,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Men Don't Leave",1990,115,NA,6.5,640,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Men Lie",1994,87,NA,3,14,24.5,14.5,0,0,0,24.5,4.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Men Must Fight",1933,72,NA,6.2,41,4.5,0,4.5,4.5,4.5,24.5,34.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Men Named Milo, Women Named Greta",2000,16,NA,5.6,27,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,14.5,"",0,0,1,1,0,0,1 -"Men O'War",1929,19,NA,7.5,100,0,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Men Seeking Women",1997,92,NA,3.7,69,24.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Men Who Would Conquer China, The",2004,78,NA,6.6,5,0,0,0,24.5,24.5,24.5,0,0,44.5,0,"",0,0,0,0,1,0,0 -"Men Without Jobs",2004,108,NA,5.9,9,34.5,14.5,0,0,0,0,0,0,24.5,34.5,"",0,0,1,0,0,0,0 -"Men Without Women",1930,77,NA,4.9,43,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Men at Work",1990,98,NA,5.3,2720,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Men in Black",1934,19,NA,7.6,198,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Men in Black",1997,98,90000000,6.8,53231,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Men in Black II",2002,88,140000000,5.6,21580,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Men in Exile",1937,58,NA,4.7,9,0,14.5,0,24.5,24.5,34.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Men in Her Life, The",1941,89,NA,5.1,6,0,0,0,0,14.5,14.5,0,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Men in Love",1989,85,350000,2.9,23,45.5,4.5,0,4.5,14.5,0,0,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Men in War",1957,102,NA,7.1,195,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Men in White",1934,74,NA,6.1,68,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Men of Action",2003,15,30000,8.6,13,0,0,4.5,4.5,0,0,0,14.5,4.5,64.5,"",1,0,1,0,0,0,1 -"Men of America",1932,58,NA,6.7,15,0,4.5,0,4.5,14.5,14.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Men of Arnhem",1946,82,NA,6.4,20,0,0,0,0,4.5,14.5,34.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Men of Boys Town",1941,106,NA,5.6,111,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Men of Honor",2000,129,32000000,6.6,9684,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Men of Ireland",1938,64,NA,1,7,100,0,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Men of Means",1999,80,NA,5.7,49,14.5,0,0,14.5,4.5,14.5,4.5,4.5,4.5,44.5,"",1,0,0,1,0,0,0 -"Men of Respect",1991,113,NA,4.9,201,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Men of Sherwood Forest",1954,77,NA,4.5,18,0,0,4.5,24.5,14.5,4.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Men of Two Worlds",1946,90,NA,5.3,12,0,0,4.5,4.5,44.5,4.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Men of War",1994,99,12000000,4.6,397,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Men of the Fighting Lady",1954,79,NA,6.2,94,4.5,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Men of the Lightship",1940,10,NA,7.2,12,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Men with Brooms",2002,102,7500000,5.9,1096,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Men with Steel Faces",1940,70,NA,6.9,9,0,0,14.5,14.5,14.5,0,24.5,14.5,24.5,14.5,"",1,0,0,0,0,0,0 -"Men with Wings",1938,105,NA,5.8,18,0,0,0,14.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Men's Club, The",1986,101,NA,4.2,200,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Men, The",1950,85,NA,7.4,456,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Men: A Passion Playground",1985,7,NA,1.9,10,45.5,34.5,14.5,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Menace II Society",1993,97,3500000,7.3,4704,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Menace, La",1977,117,NA,6.6,45,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Menace, The",1932,64,NA,6.2,85,4.5,4.5,4.5,4.5,4.5,14.5,45.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mendel",1997,95,NA,7.4,82,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mendelssohn's Wedding March",1939,9,NA,4.8,6,0,0,0,34.5,45.5,0,14.5,0,0,0,"",0,0,0,1,0,0,1 -"Mender of Nets, The",1912,16,NA,5.6,12,0,0,4.5,0,14.5,44.5,24.5,0,0,4.5,"",0,0,0,0,0,1,1 -"Mendy",2003,90,NA,8.2,8,0,14.5,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Meng gui da sha",1987,93,NA,7,15,0,0,0,14.5,4.5,0,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Meng long guojiang",1972,90,130000,6.6,1775,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Meng ying tong nian",2004,93,NA,7.7,32,0,0,0,0,0,4.5,14.5,34.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Meng zhong ren",1986,95,NA,7.6,40,0,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Menina do Lado, A",1987,95,NA,5.8,15,0,0,0,4.5,14.5,14.5,24.5,24.5,24.5,0,"",0,0,0,1,0,1,0 -"Meninas, As",1995,92,NA,7.1,8,0,0,0,0,34.5,0,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Meningen med Flemming",2001,14,NA,4.2,5,0,0,0,44.5,0,44.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Menino Maluquinho - O Filme",1994,83,NA,7.5,54,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Menino Maluquinho 2: A Aventura",1998,85,NA,4.1,27,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Menino de Engenho",1965,90,NA,6.1,7,14.5,0,0,0,0,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Menino do Rio",1982,85,NA,5.9,23,14.5,0,0,0,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Menino e o Vento, O",1967,104,NA,8.4,8,0,0,0,0,0,0,14.5,45.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Menmaniacs - The Legacy of Leather",1995,86,NA,8.4,10,0,0,0,0,0,14.5,14.5,34.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Menneskedyret",1995,79,NA,6.5,32,14.5,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Menno's Mind",1996,95,NA,4.6,125,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Menolippu Mombasaan",2002,88,NA,6,311,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Menos que cero",1996,90,NA,8.5,8,0,0,0,0,14.5,0,14.5,24.5,45.5,0,"",0,0,0,0,0,0,0 -"Menq",1969,27,NA,7,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Menq enq, mer sarere",1970,94,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,1,1,0,0,0 -"Mensaka",1998,105,NA,6.7,95,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Menschen am Sonntag",1930,74,NA,8.4,87,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,1,1,0 -"Menschen im Hotel",1959,106,NA,5.6,14,0,4.5,0,0,14.5,44.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Mensonge",1993,89,NA,5.4,21,14.5,0,0,14.5,14.5,14.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Mentale, La",2002,106,NA,5.2,175,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Menthe - la bienheureuse",1979,31,NA,1.1,49,74.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,1 -"Mentiras piadosas",1987,111,NA,6.4,10,14.5,0,0,14.5,14.5,14.5,34.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Menu",1933,10,NA,7.1,25,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Menu total",1986,81,NA,8.5,10,14.5,14.5,0,0,0,0,0,34.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Menuet",1982,86,NA,6.7,10,14.5,0,0,0,14.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Menya zovut Arlekino",1988,134,NA,5.8,10,0,0,14.5,14.5,0,14.5,0,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Menyaly",1992,93,NA,6.3,10,0,0,0,0,24.5,24.5,44.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Meoto zenzai",1955,121,NA,6.1,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Mephisto",1981,144,NA,7.5,1091,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mephisto Waltz, The",1971,109,NA,5.5,276,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mer dare",1983,47,NA,7.2,6,0,0,0,0,0,0,45.5,0,14.5,34.5,"",0,0,0,0,1,0,0 -"Mer enn et bryllup",2003,50,NA,6,7,24.5,0,0,0,0,14.5,0,44.5,0,14.5,"",0,0,0,0,1,0,0 -"Mer om oss barn i Bullerbyn",1987,89,NA,6,73,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mer, La",2002,14,NA,5.9,20,0,14.5,0,14.5,14.5,4.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Mera Naam Joker",1970,244,NA,6.2,75,4.5,4.5,0,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Mera spored mera",1981,288,NA,4.8,35,4.5,0,4.5,4.5,0,4.5,0,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Meraviglie di Aladino, Le",1961,93,NA,4.4,25,14.5,0,4.5,4.5,24.5,24.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Merbabies",1938,9,NA,7.1,22,4.5,0,0,0,4.5,24.5,14.5,14.5,0,24.5,"",0,1,0,0,0,0,1 -"Mercado de abasto",1955,90,NA,7.1,10,0,0,0,0,14.5,14.5,24.5,14.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Mercano, el marciano",2002,72,600000,6.2,110,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Mercante di Venezia, Il",1910,10,NA,6.7,12,4.5,4.5,0,0,14.5,14.5,14.5,4.5,24.5,0,"",0,0,0,1,0,0,1 -"Mercenaries, The",1968,100,NA,6.4,234,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Mercenario, Il",1968,111,NA,6.2,142,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mercenary Fighters",1987,95,NA,1.6,20,44.5,34.5,4.5,4.5,14.5,0,4.5,0,4.5,0,"",1,0,0,0,0,0,0 -"Merchant of Death",1997,96,NA,3.3,66,24.5,14.5,14.5,4.5,14.5,14.5,0,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Merchant of Evil",1991,90,NA,2.1,5,0,44.5,24.5,0,0,0,0,24.5,0,24.5,"",1,0,0,0,0,0,0 -"Merchant of Venice, The",2004,138,30000000,7.3,1400,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Merchants of Venus",1998,87,NA,4.4,13,4.5,4.5,4.5,0,34.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Merchants of War",1988,87,NA,4,14,0,34.5,4.5,4.5,14.5,14.5,14.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Merci Docteur Rey",2002,91,NA,5.3,104,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Merci mon chien",1999,90,NA,5.2,12,0,14.5,0,4.5,0,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Merci pour le chocolat",2000,99,NA,6.5,1115,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Merci pour le geste",2000,90,NA,6.4,8,0,0,0,0,14.5,64.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Merci!",2003,8,NA,5.6,7,0,0,0,24.5,14.5,14.5,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Mercury Rising",1998,108,60000000,5.6,8202,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Mercy",2000,94,NA,5.2,617,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Mercy",2003,112,5000,5.8,6,0,0,0,14.5,34.5,0,45.5,0,0,0,"",0,0,0,1,0,0,0 -"Mercy Streets",2000,106,600000,4.6,149,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"PG-13",1,0,0,1,0,0,0 -"Mere Apne",1971,164,NA,8.9,31,0,0,0,0,0,0,4.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Mere Yaar Ki Shaadi Hai",2002,158,NA,7,54,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Meres Tou 36",1972,100,NA,6.8,23,4.5,0,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Merika",1984,102,NA,9.5,6,0,0,0,0,0,0,0,0,45.5,45.5,"",0,0,0,1,0,1,0 -"Merikoi to protimoun kryo",1963,89,NA,7.8,21,0,0,0,4.5,0,14.5,24.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Merisairas",1996,94,NA,4.3,20,14.5,14.5,0,14.5,34.5,4.5,4.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Merle, Le",1958,4,NA,7.2,25,0,0,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Merlin",1992,115,NA,3.8,70,24.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Merlin the Magic Mouse",1967,6,NA,7.4,5,24.5,0,24.5,0,0,0,24.5,0,0,44.5,"",0,1,1,0,0,0,1 -"Merlin's Shop of Mystical Wonders",1996,92,NA,1.5,601,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Merlin: The Return",1999,90,NA,4.1,101,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Merlo maschio, Il",1971,110,NA,6.3,37,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mermaid",1964,8,NA,7,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,1,0,0,0,0,1 -"Mermaids",1990,110,NA,6.3,4249,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mermaids of Tiburon",1962,85,NA,5.1,13,0,0,0,14.5,14.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Merrill's Marauders",1962,98,NA,6.4,235,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Merrily We Go to Hell",1932,78,NA,5.9,25,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Merrily We Live",1938,90,NA,7.2,37,0,0,0,0,0,14.5,4.5,4.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Merry Andrew",1958,103,NA,6.1,137,0,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Merry Christmas Deutschland",1984,20,NA,1,7,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Merry Christmas Mr. Lawrence",1983,124,NA,7,1589,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Merry Dwarfs, The",1929,6,NA,6.3,10,0,0,0,14.5,24.5,24.5,44.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Merry Frinks, The",1934,68,NA,6.2,9,0,0,14.5,14.5,14.5,14.5,44.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Merry Mavericks",1951,16,NA,6.6,51,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Merry Monahans, The",1944,91,NA,7.2,12,0,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Merry Old Soul, The",1935,7,NA,5.8,6,0,0,14.5,0,14.5,34.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Merry Widow, The",1925,137,608016,7.6,91,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Merry Widow, The",1934,99,NA,7.7,267,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Merry Widow, The",1952,105,NA,5.6,85,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Merry Wives of Reno",1934,64,NA,6.5,6,0,0,0,0,34.5,14.5,14.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Merry-Go-Round",1923,110,NA,7.1,29,0,0,4.5,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Merton of the Movies",1947,82,NA,6.6,30,4.5,0,0,0,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Mery per sempre",1989,102,NA,6.9,104,0,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mes amis",1999,97,NA,5.1,26,4.5,4.5,4.5,24.5,4.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Mes enfants ne sont pas comme les autres",2003,86,NA,4.9,30,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mes meilleurs copains",1989,110,NA,7.2,158,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mes nuits sont plus belles que vos jours",1989,86,NA,5.7,144,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Mes petites amoureuses",1974,123,NA,7.5,52,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mes, Het",1961,89,NA,6.3,22,0,4.5,0,4.5,4.5,34.5,34.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Mesa of Lost Women",1953,70,NA,2.5,110,44.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mesa servida, La",2001,15,NA,6,12,4.5,0,0,34.5,0,4.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Meschugge",1998,105,NA,6.7,155,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Meshes of the Afternoon",1943,18,NA,8.1,459,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Meshi",1951,97,NA,7.3,27,0,0,0,4.5,0,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Meska sprawa",2001,26,NA,8.1,133,0,0,4.5,4.5,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Mesmer",1994,107,NA,5.7,161,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mesmerist, The",2002,95,NA,5.4,17,4.5,0,0,0,14.5,0,4.5,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Mesmerized",1986,94,5654930,4.7,147,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mesrine",1984,110,NA,3.9,13,4.5,0,14.5,14.5,14.5,0,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Message From Moonbase Alpha",1999,7,NA,9.5,8,0,0,0,0,0,0,0,14.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Message from Outer Space, A",2004,10,NA,7.4,8,0,0,0,0,24.5,24.5,14.5,0,0,34.5,"",0,0,0,0,0,0,1 -"Message in a Bottle",1999,126,30000000,5.4,5582,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Message in a Cell Phone",2000,85,NA,5.3,50,14.5,4.5,0,14.5,24.5,14.5,24.5,4.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Message to Garcia, A",1936,77,NA,6.6,20,0,0,0,14.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Message to Gracias, A",1964,6,NA,6.4,14,0,0,0,0,24.5,34.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Message, The",1909,10,NA,5.5,6,14.5,0,0,0,14.5,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Message, The",1976,177,10000000,7.5,743,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Message, The",2000,6,NA,6.7,6,0,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Messaggi quasi segreti",1997,103,NA,6.9,11,0,0,4.5,4.5,0,0,34.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Messalina",1951,116,NA,5.7,8,24.5,14.5,0,0,24.5,24.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Messalina, Messalina!",1977,86,NA,3.4,32,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Messe pour un corps",1975,21,NA,9.1,6,0,0,0,0,0,0,0,0,64.5,34.5,"",0,0,0,0,1,0,1 -"Messenger of Death",1988,91,NA,4.9,209,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Messenger, The",2003,14,NA,6.7,20,4.5,0,0,0,4.5,24.5,44.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Messenger: The Story of Joan of Arc, The",1999,148,NA,6.2,10476,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Messengers",1999,118,NA,7.1,61,0,0,0,4.5,4.5,14.5,4.5,14.5,24.5,34.5,"",1,0,1,1,0,1,0 -"Messengers",2004,96,NA,7.4,16,0,0,4.5,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Messer im Kopf",1978,108,NA,7.6,83,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Messia, Il",1976,140,NA,5.3,20,0,0,0,34.5,4.5,14.5,0,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Messidor",1979,123,NA,7.5,69,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Messieurs les enfants",1997,100,NA,2.1,11,24.5,4.5,0,0,24.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Mest kinematograficheskogo operatora",1912,12,NA,8.4,76,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Mestari",1992,109,NA,3.4,10,14.5,14.5,24.5,24.5,24.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Mesteren",2000,17,NA,7.3,6,0,0,0,0,45.5,0,0,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Mestiere delle armi, Il",2001,105,NA,6.8,310,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Mesto na zemle",2001,126,NA,7.6,20,4.5,0,0,0,14.5,4.5,0,44.5,0,34.5,"",0,0,0,1,0,0,0 -"Met State",2001,10,NA,8.3,6,0,0,0,0,0,14.5,0,45.5,0,34.5,"",0,1,0,0,0,0,1 -"Met grote blijdschap",2001,90,NA,7.2,140,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Metaal en melancholie",1993,80,NA,8.8,16,4.5,0,0,0,0,0,4.5,14.5,14.5,45.5,"",0,0,0,1,1,0,0 -"Metal",1999,89,NA,3.1,16,14.5,4.5,4.5,0,4.5,14.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Metal Skin",1994,112,NA,6.2,97,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Metallic Blues",2004,90,NA,6.5,18,0,0,0,4.5,0,24.5,34.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Metallica: Some Kind of Monster",2004,135,NA,7.5,1499,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Metalmeccanico e parrucchiera in un turbine di sesso e di politica",1996,101,NA,5.7,39,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Metalstasis",2001,8,NA,6.5,12,0,0,0,0,14.5,45.5,24.5,4.5,0,0,"",0,1,0,0,0,0,1 -"Metalstorm: The Destruction of Jared-Syn",1983,84,NA,2.9,335,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Metamorphosis",1990,92,NA,3.2,33,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Metamorphosis of Mr. Samsa, The",1977,10,NA,7.8,15,0,0,0,0,4.5,0,24.5,34.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Metamorphosis: The Alien Factor",1993,98,NA,4.5,80,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Metechmio",1994,85,NA,7,12,0,14.5,4.5,0,0,0,4.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Metello",1970,110,NA,7.1,26,0,0,0,4.5,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Metempsycho",1963,88,NA,6,5,0,0,0,24.5,44.5,0,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Meteo",1990,98,NA,9.1,31,0,0,4.5,0,0,0,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Meteor",1979,107,16000000,4.5,1116,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Meteor Man, The",1993,100,NA,4.3,681,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Meteoro kai Skia",1985,101,NA,4.8,15,24.5,0,0,4.5,24.5,24.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Meteoro vima tou pelargou, To",1991,143,NA,7.7,155,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Methistakas, O",1950,105,NA,7.8,9,0,0,0,0,0,0,34.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Method to Madness",2004,76,NA,4.6,5,44.5,0,0,0,24.5,0,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Method, The",1995,15,NA,8.8,6,0,0,0,0,0,0,0,45.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Method, The",1997,97,NA,5.1,35,24.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Metoroporisu",2001,107,14500000,7.3,3380,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,1,0,1,0,1,0 -"Metro",1997,117,55000000,5.2,3560,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,1,1,0,0,0 -"Metro",2000,13,NA,8.4,8,0,0,0,0,14.5,14.5,14.5,0,14.5,45.5,"",0,1,0,0,0,0,1 -"Metro-Goldwyn-Mayer Story, The",1950,57,NA,6.7,9,0,0,0,0,24.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Metroland",1997,101,NA,6.5,620,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Metronotte",2000,105,NA,6.2,20,0,0,4.5,4.5,14.5,34.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Metropolis",1927,117,NA,8.4,11988,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Metropolis Apocalypse",1988,11,20000,2,7,14.5,24.5,0,0,0,0,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Metropolitan",1935,79,NA,5.5,18,0,14.5,0,14.5,14.5,4.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Metropolitan",1990,98,430000,7.1,1379,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Metropolitan",2001,94,NA,9.4,15,4.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,0,0,0,0 -"Mettetemi in galera",1976,89,NA,2.9,8,34.5,0,0,0,14.5,0,0,0,0,45.5,"",1,0,1,0,0,0,0 -"Metti una sera a cena",1969,125,NA,3.4,14,24.5,4.5,0,0,4.5,0,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Metzitzim",1972,90,NA,7.8,52,0,4.5,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Meu Tio Matou um Cara",2004,87,NA,7.8,95,4.5,0,0,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Meurtre en 45 tours",1959,99,NA,5.9,8,0,0,0,0,24.5,34.5,0,34.5,0,0,"",0,0,0,0,0,0,0 -"Meurtres",1950,120,NA,6,7,0,0,0,0,14.5,14.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Meurtrier, Le",1963,104,NA,3.7,9,24.5,0,24.5,0,0,0,24.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Mewy",1986,88,NA,4,5,0,0,24.5,24.5,24.5,0,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Mexicali Rose",1939,60,NA,6.3,10,0,0,14.5,14.5,14.5,24.5,0,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Mexican Cat Dance",1963,6,NA,6.2,10,14.5,0,14.5,0,14.5,0,45.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Mexican Dream, The",2003,28,19000,6,44,0,4.5,0,0,0,4.5,4.5,4.5,34.5,45.5,"",0,0,1,1,0,0,1 -"Mexican Hayride",1948,77,NA,5,87,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Mexican Joyride",1947,7,NA,7.5,24,0,0,0,4.5,0,4.5,24.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Mexican Mousepiece",1966,6,NA,6,13,0,0,4.5,4.5,4.5,34.5,4.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Mexican Spitfire",1940,67,NA,6.3,28,0,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mexican Spitfire Out West",1940,76,NA,6.2,20,0,0,0,0,14.5,34.5,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Mexican Spitfire Sees a Ghost",1942,69,NA,5.3,22,4.5,0,4.5,14.5,14.5,24.5,4.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Mexican Spitfire at Sea",1942,72,NA,6.1,25,0,0,4.5,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mexican Spitfire's Baby",1941,69,NA,5.9,27,0,0,4.5,0,14.5,34.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Mexican Spitfire's Blessed Event",1943,63,NA,6,13,0,0,4.5,0,24.5,34.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Mexican Spitfire's Elephant",1942,64,NA,6.1,15,0,0,4.5,0,14.5,24.5,24.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Mexican, The",2001,123,38000000,6,13935,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Mexicano",2002,15,NA,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Meyer aus Berlin",1919,57,NA,6.6,16,0,0,0,4.5,14.5,14.5,24.5,34.5,4.5,0,"",0,0,1,0,0,0,0 -"Meztelen diplomata",1963,81,NA,7.3,15,0,0,0,4.5,24.5,0,4.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mezzo destro, mezzo sinistro",1985,104,NA,4.1,23,4.5,4.5,14.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mi Casa, Su Casa",2003,94,NA,5.1,105,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Mi Marilyn",1975,15,NA,6.2,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Mi Puerto Rico",1995,90,NA,9.7,7,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,0,0,1,0,0 -"Mi calle",1960,91,NA,5,11,0,0,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mi casa es tu casa",2002,92,NA,7.2,6,0,0,14.5,0,0,14.5,34.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Mi faccio la barca",1980,85,NA,4.8,13,0,24.5,4.5,4.5,44.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Mi fai un favore",1996,105,NA,6.8,10,0,14.5,0,14.5,0,24.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Mi famosa desconocida",2000,85,NA,7,8,14.5,14.5,24.5,0,0,14.5,0,0,34.5,0,"",0,0,1,0,0,0,0 -"Mi general",1987,106,NA,5.1,9,0,0,14.5,0,14.5,34.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Mi hermano del alma",1994,93,NA,5.7,26,0,0,0,14.5,4.5,24.5,24.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Mi manda Picone",1984,122,NA,7,36,0,0,4.5,4.5,0,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mi mou aptou",1996,96,NA,4,11,4.5,14.5,4.5,0,0,34.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Mi nismo andjeli",1992,98,NA,8.3,330,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Mi nismo andjeli 2",2005,89,NA,6.4,136,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mi nombre es sombra",1996,90,NA,7.2,21,4.5,4.5,0,0,4.5,14.5,4.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Mi novia el...",1975,90,NA,4.1,23,14.5,0,0,14.5,4.5,34.5,4.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Mi piace lavorare - Mobbing",2004,89,NA,6.6,44,4.5,0,0,0,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mi querido Tom Mix",1991,90,NA,4.5,7,0,14.5,24.5,0,0,14.5,0,24.5,0,14.5,"",1,0,0,0,0,0,0 -"Mi suegra es un zombie",2002,84,NA,5.4,15,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Mi vida loca",1993,92,NA,5.9,416,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mi yu shi ki xiao shi",2001,91,NA,5.9,25,4.5,4.5,0,4.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Mi-temps",2002,17,NA,6.6,7,0,14.5,0,0,0,24.5,44.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Mia Ellinida sto haremi",1971,105,NA,6.2,20,0,0,4.5,4.5,14.5,14.5,24.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Mia aioniotita kai mia mera",1998,132,NA,7.2,743,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mia generazione, La",1996,95,NA,6.5,44,4.5,4.5,0,0,0,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mia gynaika stin Antistasi",1970,92,NA,6.1,5,0,0,0,24.5,24.5,24.5,0,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Mia italida ap' tin Kipseli",1968,105,NA,5.6,13,0,0,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Mia kyria sta bouzoukia",1968,96,NA,6.7,12,0,4.5,0,14.5,0,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mia moglie torna a scuola",1981,82,NA,3.2,8,24.5,14.5,24.5,24.5,14.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Mia signora, La",1964,100,NA,7.1,8,14.5,0,0,0,0,0,24.5,45.5,0,14.5,"",0,0,1,0,0,0,0 -"Mia trelli, trelli sarantara",1970,88,NA,6.1,12,0,0,4.5,4.5,14.5,0,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mia trelli... trelli oikogeneia",1965,105,NA,8.7,43,0,0,0,0,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Mia zoi tin echome",1958,111,NA,8.8,61,0,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Miami",2004,16,NA,9.7,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,0,0,0,1 -"Miami Beach Cops",1992,83,NA,1.3,10,44.5,34.5,0,0,0,0,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Miami Blues",1990,97,NA,6.2,1258,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Miami Connection",1986,120,NA,3.7,12,14.5,14.5,4.5,14.5,0,4.5,4.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Miami Cops",1989,95,NA,2.4,10,34.5,14.5,44.5,14.5,0,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Miami Expose",1956,73,NA,6.6,6,0,0,0,0,0,34.5,34.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Miami Golem",1985,85,NA,3,25,34.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Miami Rhapsody",1995,105,NA,5.6,987,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Miami Spice",1986,83,NA,5.8,29,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Miami Supercops",1985,93,NA,5.3,286,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Miao jie huang hou",1990,110,NA,6.7,7,0,0,14.5,0,0,14.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Miao tan shuang jiao",1992,86,NA,4.5,11,4.5,0,4.5,4.5,14.5,44.5,0,4.5,0,0,"",1,0,0,0,0,0,0 -"Miao tan shuang long",1992,92,NA,5.1,16,14.5,4.5,0,4.5,14.5,34.5,14.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Mias pedaras niata",1967,93,NA,8.8,5,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Mibu gishi den",2003,143,NA,7.6,443,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mice Follies",1954,7,NA,7.1,46,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Mice Follies",1960,6,NA,6.6,12,0,0,0,0,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mice Will Play, The",1938,7,NA,5.9,13,0,0,4.5,0,34.5,24.5,14.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Michael",1996,105,NA,5.5,6846,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Michael Blanco",2004,80,NA,6.6,21,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Michael Collins",1996,133,25000000,6.8,5009,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Michael Jordan to the Max",2000,46,NA,6.8,307,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Michael Kael contre la World News Company",1998,90,NA,4.3,71,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Michael Kohlhaas - Der Rebell",1969,99,NA,7.5,29,4.5,0,0,4.5,4.5,4.5,4.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Michael Laudrup - en fodboldspiller",1993,74,NA,6.5,15,0,0,0,0,14.5,24.5,34.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Michael Moore Hates America",2004,125,200000,4.2,629,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"R",0,0,0,0,1,0,0 -"Michael Nyman Songbook, The",1992,55,NA,8.8,17,4.5,0,0,0,0,4.5,0,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Michael Shayne: Private Detective",1940,77,NA,5.9,18,0,0,0,4.5,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Michael Sheli",1975,95,NA,7.7,9,0,0,0,0,14.5,24.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Michel J",2002,16,NA,9.1,6,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,0,0,0,0,1 -"Michel Strogoff",1926,168,NA,8,10,0,0,0,0,0,14.5,14.5,44.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Michel Strogoff",1956,111,NA,6.4,41,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Michel Vaillant",2003,103,NA,4.9,496,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Michelangelo: A Self Portrait",1989,85,NA,6.6,5,0,0,0,0,0,24.5,64.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Michelle Apts., The",1995,91,NA,4.8,30,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Mickey",1918,93,125000,7.1,18,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Mickey",1948,87,NA,3,7,0,14.5,14.5,0,0,0,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Mickey",2004,90,6000000,5.4,52,4.5,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Mickey Blue Eyes",1999,102,40000000,5.8,7247,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Mickey Cuts Up",1931,7,NA,6.1,32,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mickey Down Under",1948,7,NA,5.5,43,4.5,0,4.5,4.5,24.5,24.5,24.5,0,4.5,4.5,"",0,1,1,0,0,0,1 -"Mickey Mouse Anniversary Show, The",1968,84,NA,6.8,5,0,0,0,0,0,44.5,24.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Mickey Mouse Disco",1979,7,NA,5,11,14.5,0,0,0,0,14.5,4.5,4.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Mickey One",1965,93,NA,6.4,162,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mickey Plays Papa",1934,8,NA,7.1,9,0,14.5,0,0,24.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Mickey Steps Out",1931,7,NA,6.1,33,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mickey and the Beanstalk",1947,29,NA,7.7,182,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Mickey and the Seal",1948,7,NA,7.1,60,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Amateurs",1937,7,NA,7,46,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Birthday Party",1942,8,NA,6,48,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Choo-Choo",1929,7,NA,5.4,25,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Christmas Carol",1983,25,NA,7.3,635,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Mickey's Circus",1936,8,NA,6.8,47,4.5,0,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Delayed Date",1947,7,NA,6.2,31,4.5,0,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mickey's Elephant",1936,8,NA,6.3,38,0,0,0,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mickey's Fire Brigade",1935,8,NA,7.7,88,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Mickey's Follies",1929,7,NA,6.1,31,0,0,0,4.5,14.5,34.5,34.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Mickey's Gala Premier",1933,7,NA,6.7,31,0,0,4.5,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Garden",1935,9,NA,7.8,52,0,0,4.5,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Good Deed",1932,8,NA,7.6,19,0,0,0,0,14.5,14.5,34.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Mickey's Grand Opera",1936,8,NA,7.1,55,0,0,4.5,0,14.5,24.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Kangaroo",1935,9,NA,6.5,17,0,0,4.5,4.5,4.5,44.5,4.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Mechanical Man",1933,7,NA,5.8,19,0,14.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Nightmare",1932,7,NA,6.5,32,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Orphans",1931,7,NA,6.3,41,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mickey's Pal Pluto",1933,8,NA,7.1,16,0,0,0,0,4.5,14.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Parrot",1938,8,NA,6.9,40,0,0,0,0,14.5,24.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mickey's Polo Team",1936,8,NA,7.8,56,0,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Mickey's Revue",1932,7,NA,6.3,32,4.5,0,0,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mickey's Rival",1936,8,NA,6.7,42,0,0,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mickey's Service Station",1935,7,NA,7.5,41,4.5,0,0,4.5,0,4.5,34.5,4.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Mickey's Steamroller",1934,7,NA,5.7,14,0,4.5,0,4.5,24.5,24.5,14.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Mickey's Trailer",1938,7,NA,8.5,136,0,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Micki + Maude",1984,118,NA,5.7,486,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Micro-Gerbil 2001",2001,1,NA,6.3,10,34.5,14.5,0,0,0,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Micro-Phonies",1945,17,NA,8.2,112,4.5,0,4.5,4.5,0,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Micro-loup",2003,7,NA,7.4,7,0,14.5,0,0,0,0,24.5,24.5,24.5,0,"",0,1,1,0,0,0,1 -"Microcosmos",1978,14,NA,7.3,26,4.5,0,0,0,4.5,0,34.5,14.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Microcosmos: Le peuple de l'herbe",1996,73,NA,7.6,2018,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Microscopic Liquid Subway to Oblivion",1970,85,NA,6.6,5,0,0,0,24.5,0,0,24.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Microwave Massacre",1983,76,NA,3.3,107,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Midaregumo",1967,108,NA,9,37,4.5,0,0,0,0,0,14.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Midareru",1964,98,NA,7.6,17,4.5,0,0,4.5,14.5,0,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Midas Run",1969,106,NA,4.5,22,4.5,4.5,4.5,24.5,24.5,4.5,24.5,0,0,0,"",0,0,1,1,0,0,0 -"Middle Age Crazy",1980,97,NA,5.3,86,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Middle Age Spread",1979,98,NA,4.4,11,0,14.5,4.5,0,0,4.5,14.5,4.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Middle of the Moment",1995,80,NA,9.2,15,0,0,0,0,0,4.5,0,24.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Middle of the Night",1959,118,NA,6.3,43,0,0,0,0,14.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Middleton Family at the New York World's Fair, The",1939,55,NA,9,6,0,0,0,0,0,14.5,0,14.5,0,64.5,"",0,0,0,1,0,0,0 -"Middleton's Changeling",1998,97,NA,2.2,17,24.5,0,14.5,14.5,4.5,0,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Middletown",1996,48,NA,9,7,0,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Midnight",1934,76,NA,5.7,116,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Midnight",1939,94,NA,8.2,483,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Midnight",1981,91,NA,3.8,65,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Midnight",1989,86,NA,3.6,27,14.5,4.5,24.5,14.5,14.5,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Midnight Alibi",1934,58,NA,6.1,36,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Midnight Blue",1997,94,NA,3.9,59,24.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Midnight Cabaret",1990,94,NA,4.2,18,14.5,4.5,4.5,4.5,14.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Midnight Clear, A",1992,107,5000000,7.5,2147,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Midnight Confessions",1995,81,NA,3.8,27,14.5,14.5,14.5,14.5,14.5,0,4.5,4.5,4.5,0,"R",1,0,0,1,0,0,0 -"Midnight Cowboy",1969,113,3600000,7.9,13091,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Midnight Crossing",1988,104,NA,4.8,127,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Midnight Dance",1996,6,NA,7,15,0,4.5,14.5,0,4.5,4.5,4.5,44.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Midnight Days",2001,60,10000,2.8,14,24.5,0,0,14.5,4.5,0,24.5,4.5,0,24.5,"",0,0,0,1,0,1,0 -"Midnight Edition",1993,97,NA,4,20,4.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Midnight Express",1978,121,2300000,7.6,7617,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Midnight Express, The",2002,6,NA,5.5,15,34.5,0,0,4.5,0,0,4.5,14.5,0,44.5,"",0,0,0,0,0,0,1 -"Midnight Faces",1926,55,NA,4.6,8,0,24.5,0,14.5,0,64.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Midnight Hour, The",2000,91,NA,2.5,57,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Midnight Kiss",1993,85,NA,3.3,35,14.5,14.5,14.5,14.5,14.5,4.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Midnight Lace",1960,108,NA,6.8,519,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Midnight Limited",1940,61,NA,4.2,7,0,0,14.5,44.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Midnight Madness",1980,110,NA,6.1,828,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Midnight Man",1995,87,NA,5.9,52,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Midnight Man, The",1974,117,NA,6.1,99,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Midnight Manhunt",1945,64,NA,6,22,0,0,4.5,4.5,14.5,44.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Midnight Mary",1933,74,NA,7.1,62,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Midnight Mass",2003,98,NA,2.2,84,45.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"R",0,0,0,0,0,0,0 -"Midnight Movie Massacre",1988,85,NA,1.8,30,64.5,4.5,14.5,4.5,14.5,0,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Midnight Panther",1998,60,NA,4.1,28,14.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,0,0,"",1,1,0,0,0,0,0 -"Midnight Patrol, The",1933,20,NA,7.1,106,4.5,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Midnight Ride",1990,93,NA,4.6,147,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Midnight Run",1988,126,30000000,7.5,9196,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Midnight Shadow",1939,54,NA,2.8,11,4.5,14.5,24.5,34.5,0,0,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Midnight Snack, The",1941,9,NA,6.9,41,0,0,0,4.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Midnight Story, The",1957,89,NA,6.8,44,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Midnight Sun",2003,18,4000,1.6,12,34.5,0,0,0,0,0,4.5,0,14.5,44.5,"",0,0,0,0,0,0,1 -"Midnight Tease",1994,83,NA,2.7,65,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Midnight Tease II",1995,91,NA,3,69,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Midnight Temptations 2",1997,81,NA,2.6,15,34.5,14.5,4.5,24.5,24.5,4.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Midnight Witness",1993,90,NA,3.5,24,4.5,4.5,14.5,24.5,4.5,4.5,4.5,0,14.5,14.5,"",1,0,0,0,0,0,0 -"Midnight in St. Petersburg",1996,86,NA,5,150,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Midnight in a Toy Shop",1930,7,NA,8.2,6,0,0,0,0,14.5,0,34.5,34.5,0,14.5,"",0,1,0,0,0,0,1 -"Midnight in the Garden of Good and Evil",1997,155,30000000,6.4,8517,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Midnite Spares",1983,87,NA,3.3,20,14.5,14.5,14.5,0,14.5,14.5,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Midshipman Jack",1933,73,NA,4.6,5,0,0,24.5,24.5,0,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Midsommardansen",1971,90,NA,4,5,0,24.5,0,64.5,0,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Midsommer",2003,94,NA,6.2,468,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Midsummer Mush",1933,21,NA,7,8,0,0,0,0,24.5,14.5,14.5,14.5,34.5,0,"",0,0,1,0,0,0,1 -"Midsummer Night's Dream, A",1909,12,NA,6,23,4.5,0,4.5,0,24.5,4.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,1,1 -"Midsummer Night's Dream, A",1935,142,NA,6.9,367,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Midsummer Night's Dream, A",1967,93,NA,6.8,8,0,0,0,14.5,14.5,14.5,34.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Midsummer Night's Dream, A",1968,124,NA,6.1,117,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Midsummer Night's Dream, A",1996,105,NA,5.8,89,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Midsummer Night's Dream, A",1999,116,NA,6.3,4987,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Midsummer Night's Sex Comedy, A",1982,88,NA,6.3,2101,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Midt i en jazztid",1969,97,NA,7.4,7,0,0,0,0,14.5,14.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Midt om natten",1984,131,NA,6.8,194,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Midway",1976,132,NA,6.5,2118,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Midwestern Myth",2003,89,250000,7.1,9,24.5,14.5,0,0,0,0,0,0,0,64.5,"",0,0,1,1,0,1,0 -"Midwife's Tale, A",1996,89,NA,6.1,27,0,0,0,4.5,4.5,0,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Midwife's Tale, The",1995,75,NA,5.2,5,24.5,24.5,0,0,0,0,44.5,0,24.5,0,"",0,0,0,0,0,1,0 -"Mie men can an zhi nie sha",1993,96,NA,5.8,48,4.5,4.5,14.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mieheke",1936,80,NA,7.7,7,0,0,0,0,14.5,0,44.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Miehen tie",1940,93,NA,6.5,9,0,0,0,24.5,14.5,0,34.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Miei primi quarant'anni, I",1987,107,NA,3.6,36,34.5,14.5,0,24.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Miel et cendres",1996,80,NA,6,30,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Miele del diavolo, Il",1986,84,NA,4.5,61,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Miele di donna",1981,85,NA,5.7,34,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Mies joka ei osannut sanoa ei",1975,103,NA,6.3,40,4.5,4.5,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Miffo",2003,105,NA,5.8,325,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mifunes sidste sang",1999,98,NA,7.1,2696,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"Mig og Charly",1978,98,NA,6.4,70,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mig og mafiaen",1973,97,NA,6.2,32,0,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mig og min lillebror",1967,95,NA,5.3,33,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"Mig og min lillebror og storsmuglerne",1968,106,NA,4.9,17,0,0,14.5,14.5,44.5,4.5,24.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Mighty Aphrodite",1995,95,15000000,7,7083,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Mighty Barnum, The",1934,105,NA,5.7,18,0,4.5,14.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mighty Ducks, The",1992,100,NA,5.7,4410,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Mighty Gorga, The",1969,84,NA,2.1,39,34.5,24.5,14.5,4.5,4.5,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Mighty Hunters",1940,8,NA,5.4,13,0,14.5,14.5,0,4.5,14.5,34.5,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Mighty Joe Young",1949,84,NA,6.8,540,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mighty Joe Young",1998,114,49000000,5.6,2873,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Mighty Jungle, The",1964,88,NA,3,9,45.5,0,14.5,14.5,0,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Mighty Like a Moose",1926,23,NA,7.1,62,4.5,0,4.5,0,0,4.5,4.5,24.5,14.5,24.5,"",0,0,1,0,0,1,1 -"Mighty Manhattan, New York's Wonder City",1949,20,NA,5.9,21,0,4.5,0,4.5,24.5,4.5,34.5,4.5,0,14.5,"",0,0,0,0,1,0,1 -"Mighty McGurk, The",1947,85,NA,6.5,17,0,0,0,14.5,14.5,4.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Mighty Mo: The Battleship USS Missouri",1998,150,NA,7.5,8,14.5,0,14.5,0,0,0,0,24.5,0,45.5,"",0,0,0,0,1,0,0 -"Mighty Morphin Power Rangers: The Movie",1995,95,NA,3.1,2250,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",1,0,0,0,0,0,0 -"Mighty Mouse in the Great Space Chase",1982,86,NA,6.2,7,0,0,0,0,14.5,0,0,44.5,24.5,14.5,"",0,1,0,0,0,0,0 -"Mighty Navy, The",1941,7,NA,6.1,9,0,0,14.5,0,0,44.5,14.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Mighty Quinn, The",1989,94,NA,6,562,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mighty Times: The Children's March",2004,40,NA,8.6,15,4.5,0,0,4.5,0,14.5,4.5,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Mighty Times: The Legacy of Rosa Parks",2002,40,NA,9.1,23,4.5,4.5,4.5,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,1,0,1 -"Mighty Wind, A",2003,91,NA,7.3,5941,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Mighty, The",1998,100,NA,7.1,2577,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",1,0,1,1,0,0,0 -"Migrating Forms",2000,80,NA,4.2,20,44.5,4.5,14.5,4.5,0,4.5,4.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Migrations",1997,4,NA,7,10,0,0,0,0,24.5,14.5,34.5,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Miguel/Michelle",1998,107,NA,5.5,5,0,0,0,0,64.5,0,24.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Mihai Viteazul",1970,107,NA,8.2,218,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Mihai Viteazul - Unirea",1970,96,NA,7,15,24.5,0,0,0,0,0,0,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Mihalios tou 14ou sintagmatos",1962,90,NA,7.2,5,0,0,0,24.5,0,0,44.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Mijn Nachten met Susan, Olga, Albert, Julie, Piet & Sandra",1975,85,NA,5.7,19,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Mijn eerste Sjeekspier",2000,14,NA,4.4,14,14.5,4.5,4.5,24.5,4.5,4.5,4.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Mijn moeder heeft ook een pistool",1996,22,NA,4.8,9,0,24.5,0,14.5,14.5,0,0,24.5,34.5,0,"",0,0,0,0,0,0,1 -"Mijn vader woont in Rio",1989,100,NA,6.2,25,4.5,0,0,0,4.5,34.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Mijn vriend",1979,126,NA,4.5,16,4.5,4.5,4.5,14.5,4.5,24.5,14.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Mikado, The",1939,90,NA,7.1,53,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mikado, The",1967,122,NA,7,21,4.5,0,4.5,4.5,0,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mikado-Projekt, Das",1983,75,NA,8,8,14.5,0,0,0,0,0,14.5,24.5,0,45.5,"",0,0,1,0,0,0,0 -"Mikan no taikyoku",1982,123,NA,8.3,56,0,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Mike Bassett: England Manager",2001,89,NA,6.1,713,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mike's Murder",1984,109,NA,4.8,184,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mikey",1992,90,NA,4.3,210,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mikey and Nicky",1976,119,NA,6.7,157,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mikres Aphrodites",1963,88,NA,6.7,50,4.5,4.5,4.5,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mikroi kai megaloi en drasei",1963,95,NA,6.1,9,0,0,0,14.5,24.5,34.5,24.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Mikros drapetis, O",1969,92,NA,7.8,6,0,14.5,0,0,0,0,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Mil amores, El",1954,104,NA,7,11,0,0,0,4.5,0,4.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mil e Uma",1994,73,NA,9.3,6,14.5,0,0,0,0,14.5,14.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Mil sexos tiene la noche",1984,93,NA,6.4,8,24.5,0,0,0,0,14.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Mil usos, El",1981,113,NA,8.4,7,0,0,0,0,0,14.5,0,14.5,74.5,0,"",0,0,1,1,0,0,0 -"Mila ot Mars",2004,91,NA,8.5,98,4.5,0,4.5,4.5,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Milagro Beanfield War, The",1988,117,NA,6.8,1601,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Milagro de Candeal, El",2004,124,NA,7.2,18,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Milagro de P. Tinto, El",1998,106,NA,7.3,464,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Milagro en Roma",1988,90,NA,6.4,44,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Milagro of Boyle Heights, The",2001,30,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Milan",1967,170,NA,8,12,0,0,0,0,0,0,14.5,4.5,44.5,34.5,"",0,0,0,0,0,1,0 -"Milan Hlavsa a Plastic People of the Universe",2001,74,NA,6.6,8,0,0,0,0,0,14.5,64.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Milano calibro 9",1972,97,NA,8.3,125,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",1,0,0,0,0,0,0 -"Milano rovente",1973,90,NA,6.1,8,0,0,14.5,0,14.5,14.5,24.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Milano trema - la polizia vuole giustizia",1973,104,NA,5.8,69,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Milano, morte sospetta di una minorenne",1975,100,NA,6.7,7,0,0,0,0,24.5,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Milchwald",2003,94,NA,5.9,61,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Milczenie",1963,100,NA,8.1,5,0,0,24.5,0,0,0,0,0,24.5,64.5,"",0,0,0,0,0,0,0 -"Mildred Pierce",1945,111,1500000,7.7,2348,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Mile Zero",2001,92,NA,6.2,43,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Milena",1991,139,NA,5.1,23,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Miles Ahead",2004,83,55000,6.1,17,24.5,4.5,4.5,0,0,0,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Miles Electric: A Different Kind of Blue",2004,87,NA,8.7,9,0,0,0,0,0,0,14.5,34.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Miles from Home",1988,108,NA,5.4,264,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Milhama A'Heret",2004,14,NA,7,7,0,0,0,0,14.5,0,24.5,24.5,0,24.5,"",0,0,0,1,0,0,1 -"Miliardi",1991,110,NA,3.9,50,24.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Milieu du monde, Le",1974,115,NA,6.9,41,4.5,0,0,4.5,0,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Milionari de weekend",2004,90,NA,6.1,114,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Militia",2000,89,NA,3.6,162,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Militia II",2002,29,NA,8.5,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Milk & Money",1996,86,NA,5.3,72,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Milk Money",1994,110,NA,5.2,2236,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Milk and Honey",1988,89,NA,5.4,6,0,0,0,14.5,0,45.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Milk and Honey",2003,90,NA,7.3,21,0,0,4.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Milka - elokuva tabuista",1980,110,NA,5.9,25,0,0,14.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Milking the Chicken",2003,35,1000,6.2,13,24.5,0,0,24.5,4.5,0,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Milkman, The",1950,87,NA,6.4,53,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Milkman, The",2001,8,NA,5.8,10,44.5,0,0,0,14.5,0,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Milky Waif, The",1946,7,NA,6.7,25,0,0,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Milky Way, The",1936,89,1032000,6.9,151,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Milky Way, The",1940,8,NA,6.7,38,0,4.5,4.5,4.5,0,14.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Mill on the Floss, The",1937,77,NA,5.3,7,0,0,14.5,44.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Mill on the Floss, The",1997,90,NA,6.4,98,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mille bolle blu",1993,87,NA,7.2,63,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Mille bornes",1999,103,NA,6.4,48,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mille dollari sul nero",1966,102,NA,6.2,17,0,0,0,14.5,0,14.5,4.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Mille et une perversions de Felicia, Les",1975,96,NA,4.6,11,24.5,0,0,0,0,4.5,4.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Mille merveilles de l'univers, Les",1997,83,NA,4.9,67,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mille milliards de dollars",1982,132,NA,6.2,63,0,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mille mois",2003,124,NA,6.1,58,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mille, Marie og mig",1937,99,NA,4.9,16,0,0,24.5,0,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Mille-pattes fait des claquettes, Le",1977,105,NA,5.7,7,14.5,0,0,0,0,44.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Millennium",1989,108,NA,5,940,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Miller and the Sweep, The",1898,1,NA,5.5,28,4.5,0,0,14.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Miller's Crossing",1990,115,14000000,8,14575,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Millhouse",1971,92,NA,6.7,52,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Millie",1931,85,NA,6.4,44,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Million Dollar Baby",1941,100,NA,4.7,44,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Million Dollar Baby",2004,132,30000000,8.3,20195,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Million Dollar Cat, The",1944,7,NA,7.3,41,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Million Dollar Duck, The",1971,89,NA,5.1,238,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Million Dollar Hotel, The",2000,122,8000000,5.5,4746,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Million Dollar Kid",1944,65,NA,6.7,67,4.5,0,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Million Dollar Kid, The",2000,91,NA,4.5,73,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",1,0,1,0,0,0,0 -"Million Dollar Legs",1932,64,NA,7.2,121,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Million Dollar Legs",1939,65,NA,6.4,22,0,0,0,4.5,4.5,34.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Million Dollar Mermaid",1952,115,NA,6.3,136,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Million Dollar Mystery",1987,95,NA,4.3,71,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Million Dollar Nickel, The",1952,10,NA,5.3,9,0,0,14.5,24.5,44.5,0,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Million Eyes of Sumuru, The",1967,95,NA,3.7,45,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Million Hare, The",1963,7,NA,6.1,36,0,4.5,0,14.5,14.5,14.5,34.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Million Miles, A",2000,85,NA,7.1,14,4.5,0,0,0,4.5,24.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Million Pound Note, The",1953,90,NA,6.4,313,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Million v brachnoy korzine",1986,94,NA,6.5,8,0,0,0,0,14.5,14.5,45.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Million, Le",1931,83,NA,8,294,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Millionaire Droopy",1956,7,NA,6.7,21,0,0,0,4.5,14.5,14.5,4.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Millionaire Playboy",1940,64,NA,4.4,5,0,0,0,24.5,64.5,0,0,0,24.5,0,"",0,0,1,0,0,0,0 -"Millionaire for Christy, A",1951,91,NA,6.2,26,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Millionaire, The",1931,80,NA,7.5,44,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Millionaires in Prison",1940,64,NA,6.1,14,0,0,4.5,4.5,14.5,24.5,4.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Millionairess, The",1960,90,NA,5.5,186,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Millioner Betzarot",1978,85,NA,7.8,5,0,24.5,0,0,0,0,24.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Millions",2004,98,NA,7.9,938,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Millions Like Us",1943,103,NA,7.1,56,0,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Millipilleri",1966,117,NA,8.1,10,0,0,24.5,0,14.5,14.5,24.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Milly, Maria och jag",1938,87,NA,5,5,0,0,24.5,0,44.5,0,24.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Milo",1998,91,NA,3.2,216,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Milo 55160",2004,20,NA,8.3,7,0,0,0,0,0,0,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Milo-Milo",1979,103,NA,7,5,0,0,0,0,24.5,0,84.5,0,0,0,"",0,0,0,0,0,0,0 -"Milonga",1999,89,NA,4.1,7,0,24.5,0,0,24.5,0,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Milosc ci wszystko wybaczy",1981,106,NA,4,5,0,24.5,44.5,24.5,0,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Milost mora",2003,90,NA,6.1,18,24.5,0,0,0,14.5,0,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Milou en mai",1990,107,NA,7.3,364,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Milpa, La",2002,27,NA,5,18,14.5,0,4.5,0,4.5,14.5,14.5,0,4.5,44.5,"",0,0,0,1,0,1,1 -"Milpitas Monster, The",1975,80,11000,3.4,33,24.5,4.5,4.5,4.5,4.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Milton Is a Shitbag",2004,4,NA,9.8,12,0,0,0,0,0,0,0,4.5,0,94.5,"",0,1,0,0,0,0,1 -"Milwaukee, Minnesota",2003,95,NA,6.6,91,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Milwr Bychan",1986,105,NA,4.8,18,14.5,0,0,14.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mima",1991,84,NA,5.7,19,0,0,0,14.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Mimi",1935,94,NA,5.4,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Mimi",2003,105,NA,6.2,6,14.5,0,0,14.5,0,0,14.5,34.5,14.5,0,"",0,0,0,0,1,0,0 -"Mimi og madammerne",1998,87,NA,2.6,16,14.5,14.5,4.5,24.5,14.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Mimi wo sumaseba",1995,111,NA,7.9,1025,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,0,1,0,1,0 -"Mimic",1997,105,25000000,5.6,6052,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Mimino",1977,97,NA,8.8,241,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Mimmo & Paulie",2004,29,12000,9.8,13,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,1,0,0,1 -"Min",2003,80,NA,6.6,5,0,0,24.5,0,24.5,0,0,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Min Marion",1975,106,NA,4.6,5,24.5,0,24.5,24.5,44.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Min and Bill",1930,69,NA,6.8,106,0,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Min bedstefar er en stok",1967,40,NA,9,8,14.5,0,0,0,0,0,0,0,64.5,24.5,"",0,0,0,0,0,0,1 -"Min eidate ton Panai?",1962,78,NA,7.9,11,0,0,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Min farmors hus",1984,83,NA,4.2,19,4.5,0,4.5,4.5,44.5,14.5,0,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Min fynske barndom",1994,125,NA,5.7,36,4.5,0,0,0,14.5,34.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Min jing gu shi",1995,102,NA,6.4,44,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Min kones ferie",1967,75,NA,5,9,0,0,34.5,24.5,0,24.5,0,24.5,0,0,"",0,0,1,0,0,1,0 -"Min mamma hade fjorton barn",2000,80,NA,8.4,12,0,0,0,14.5,14.5,0,34.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Min morfars morder",2004,59,NA,7.1,14,0,0,0,0,14.5,0,34.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Min smukke nabo",1999,15,NA,6.1,6,0,0,0,0,34.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Min store tjocke far",1992,102,NA,4.7,79,4.5,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Min syster och jag",1950,106,NA,5.6,10,0,0,0,34.5,34.5,34.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Mina Tannenbaum",1994,128,NA,7.5,383,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Mina, La",2004,90,NA,3,6,14.5,0,34.5,0,0,0,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Minaccia d'amore",1988,94,NA,4.1,54,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Minazuki",1999,114,NA,6.4,12,0,0,0,14.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Minbo no onna",1992,123,NA,7,209,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mind Benders, The",1963,99,NA,6.4,54,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Mind Forest",2003,61,NA,5.9,34,0,0,0,4.5,0,0,4.5,34.5,45.5,4.5,"",0,0,0,1,0,0,0 -"Mind Game",2004,104,NA,9.1,20,0,0,0,0,0,0,14.5,24.5,14.5,64.5,"",0,1,1,0,0,0,0 -"Mind Games",1989,86,NA,4.6,34,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mind Games",1996,104,NA,5,54,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Mind Games",2003,96,NA,3.9,72,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mind Rage",2000,90,NA,4.6,17,4.5,24.5,14.5,24.5,0,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Mind Reader, The",1933,69,NA,6.4,45,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mind Twister",1994,94,NA,3.4,43,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mind of Mr. Soames, The",1970,92,NA,5.6,54,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mind the Gap",2004,134,NA,4.5,23,4.5,14.5,0,0,0,0,4.5,4.5,14.5,45.5,"R",0,0,1,1,0,0,0 -"Mind's Eye, The",2005,96,750000,6.7,7,14.5,0,0,0,0,0,24.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Mind's I, A",2003,16,NA,3.3,19,34.5,4.5,4.5,14.5,0,0,0,4.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Mind, Body & Soul",1992,90,NA,2,27,44.5,24.5,14.5,4.5,4.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"MindField",2003,63,6000,9,5,0,0,0,0,24.5,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"Mindbender",1996,93,NA,3.9,53,34.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Minder dood dan de anderen",1992,100,NA,5.5,6,0,0,14.5,0,14.5,34.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Minder gelukkige terugkeer van Joszef Katus naar het land van Rembrandt, de",1966,94,NA,7.6,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Mindfield",1989,92,NA,4,42,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mindgame",2005,23,NA,7.2,6,0,14.5,14.5,0,0,0,0,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Mindhunters",2004,102,27000000,6.3,3925,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Minding the Baby",1931,7,NA,5.2,7,0,0,14.5,14.5,24.5,44.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Mindkiller",1987,84,NA,4.1,22,14.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Mindstorm",2000,91,NA,3,60,34.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Mindstorm",2001,97,NA,4.2,128,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Mindwalk",1990,112,NA,7.2,554,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Mindwarp",1990,91,NA,4.7,173,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mine Own Executioner",1947,108,NA,6.8,32,0,0,0,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mine tossede drenge",1961,100,NA,3.7,5,0,44.5,0,0,44.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Mineirinho Vivo ou Morto",1967,90,NA,6,5,24.5,0,0,0,0,0,44.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Minerva",1997,57,NA,4.4,5,0,0,0,44.5,44.5,0,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Minestrone, Il",1981,104,NA,4,19,4.5,4.5,0,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Minesweeper",1943,67,NA,5.7,10,0,0,0,24.5,24.5,24.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Ming dai zhui zhu",2000,92,NA,6.6,20,0,0,0,4.5,14.5,24.5,34.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Mingo y Anibal, dos pelotazos en contra",1984,103,NA,2.3,5,44.5,0,0,24.5,0,0,0,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Mingus: Charlie Mingus 1968",1968,58,NA,7.9,9,0,0,0,0,0,0,14.5,14.5,44.5,34.5,"",0,0,0,0,1,0,0 -"Minha Namorada",1970,82,NA,7.8,20,4.5,0,0,0,0,0,24.5,45.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Mini-Skirt Mob, The",1968,82,NA,3.2,51,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Minion, The",1998,95,12000000,3.2,338,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Ministro y yo, El",1976,109,NA,6.7,18,4.5,0,0,0,14.5,14.5,24.5,14.5,0,34.5,"",0,0,1,1,0,0,0 -"Ministry of Fear",1944,87,NA,7.3,401,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ministry of Vengeance",1989,96,NA,2.8,33,24.5,14.5,14.5,14.5,4.5,0,4.5,4.5,0,24.5,"",1,0,0,0,0,0,0 -"Miniver Story, The",1950,104,NA,5.8,98,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Minkkiturkki",1961,91,NA,7.5,7,0,0,0,0,0,0,24.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Minna no ie",2001,116,NA,8,23,0,0,0,0,14.5,14.5,4.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Minnamurra",1989,92,NA,5.5,27,0,4.5,14.5,4.5,4.5,14.5,24.5,24.5,4.5,0,"",1,0,0,1,0,0,0 -"Minnesota Clay",1965,90,NA,5.8,24,4.5,0,0,0,14.5,34.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Minnie and Moskowitz",1971,114,900000,7,287,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Minnie the Moocher",1932,8,NA,8.1,61,0,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,0,0,0,0,1 -"Minnie's Yoo Hoo",1930,5,NA,5.7,16,0,0,0,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Minoes",2001,86,NA,7.1,678,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Minority Report",2002,145,102000000,7.8,51199,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Minotaur",1997,91,NA,4.6,42,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Minotaur and Little Nerkin",1999,2,NA,4.3,28,14.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,0,"",0,1,0,0,0,0,1 -"Minsaara Kanavu",1997,153,NA,8.2,8,0,0,0,0,14.5,0,24.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Minsan, minahal kita",2000,110,NA,9,6,0,0,0,0,0,0,0,45.5,0,45.5,"",0,0,0,1,0,1,0 -"Minu Leninid",1997,99,NA,6.7,63,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Minus Man, The",1999,111,NA,6.2,1921,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Minuto per pregare, un istante per morire, Un",1968,118,NA,6.1,59,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mio Dio come sono caduta in basso!",1974,110,NA,5.7,43,4.5,4.5,4.5,24.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mio West, Il",1998,95,10000000,4.1,75,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Mio caro assassino",1972,105,NA,6.4,61,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mio cognato",2003,90,NA,5.3,51,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mio corpo per un poker, Il",1968,103,NA,5.2,9,0,0,44.5,14.5,14.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Mio figlio Nerone",1956,104,NA,5.8,21,0,4.5,0,14.5,0,34.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Mio min Mio",1987,99,NA,6.1,400,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mio viaggio in Italia, Il",1999,246,NA,8.2,360,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"PG-13",0,0,0,0,1,0,0 -"Mir nach, Canaillen!",1964,103,NA,6,6,0,0,0,0,0,84.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Mira",1971,95,NA,6.3,65,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Miracle",2004,135,NA,7.7,5785,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Miracle Beach",1992,88,NA,4.7,315,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Miracle Goes On, The",1976,97,850000,9.4,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,0,1,0,1,0 -"Miracle Man, The",1932,85,NA,5.8,8,0,14.5,0,0,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Miracle Mile",1988,87,3000000,6.8,1086,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Miracle Money",1938,21,NA,6.5,8,0,0,0,14.5,14.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Miracle Rider, The",1935,306,80000,7.4,22,0,0,0,0,4.5,4.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Miracle Woman, The",1931,90,NA,7.3,165,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Miracle Worker, The",1962,106,500000,7.9,2130,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Miracle des loups, Le",1924,73,NA,9.8,7,0,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Miracle des loups, Le",1961,126,NA,5.9,24,4.5,4.5,4.5,0,14.5,24.5,24.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Miracle in Harlem",1948,71,NA,5.3,8,0,0,14.5,24.5,0,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Miracle in the Rain",1956,108,NA,6.8,159,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Miracle of Morgan's Creek, The",1944,99,NA,7.8,992,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Miracle of Our Lady of Fatima, The",1952,102,NA,6.5,131,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Miracle of Sound, The",1940,11,NA,5.9,16,0,0,0,14.5,14.5,34.5,14.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"Miracle of Todd-AO, The",1956,11,NA,6.9,6,0,0,0,0,14.5,0,45.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Miracle of the Bells, The",1948,120,NA,6.2,141,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Miracle of the White Stallions",1963,93,NA,5.9,79,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Miracle on 34th Street",1947,96,NA,7.9,5677,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Miracle on 34th Street",1994,114,NA,6.2,2020,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Miracle, The",1959,121,NA,5.6,49,4.5,4.5,0,4.5,4.5,24.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Miracles",1986,87,NA,4.7,137,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Miracles for Sale",1939,71,NA,5.3,51,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Miracles n'ont lieu qu'une fois, Les",1951,98,NA,6.1,5,0,0,24.5,0,24.5,24.5,0,0,44.5,0,"",0,0,0,0,0,0,0 -"Miracolo a Milano",1951,100,NA,7.9,398,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Miracolo italiano",1994,104,NA,2.9,16,34.5,4.5,14.5,24.5,4.5,0,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Miracolo, Il",2003,92,NA,5.7,41,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Miracoloni, I",1981,88,NA,8.6,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,1,0,0,0,0 -"Mirada del otro, La",1998,104,NA,5.1,91,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mirada violeta, La",2004,110,NA,4.7,13,0,0,4.5,14.5,4.5,34.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Miradas",2001,93,NA,3.4,7,14.5,44.5,0,14.5,0,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Mirage",1965,108,NA,7.6,518,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Mirage",1995,92,NA,5,51,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,0,4.5,"R",1,0,0,0,0,0,0 -"Mirai no omoide: Last Christmas",1992,118,NA,6.3,8,14.5,0,0,0,0,24.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Mirakel",2000,90,NA,6.3,122,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Miraklet i Valby",1989,85,NA,6.1,45,0,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Miramar",1997,82,NA,4,13,34.5,0,0,0,4.5,14.5,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Miranda",1948,80,NA,6.3,76,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Miranda",1985,90,NA,5.1,143,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Miranda",2002,90,NA,5.7,443,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"Mirch Masala",1985,128,NA,8.3,78,4.5,4.5,4.5,0,4.5,0,4.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Miriam",1957,88,NA,7,10,0,0,14.5,0,14.5,34.5,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Miris dunja",1982,97,NA,7.1,10,0,0,0,0,14.5,14.5,34.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Miris poljskog cveca",1977,106,NA,7.7,15,0,0,0,0,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Mirka",2000,107,NA,5.9,45,4.5,0,4.5,14.5,4.5,14.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Miroslava",1993,100,NA,4.9,30,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mirror Crack'd, The",1980,105,NA,6,731,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mirror Has Two Faces, The",1996,122,42000000,5.7,2775,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Mirror Images",1992,93,NA,4.3,59,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mirror Man",2003,16,NA,5.5,15,0,0,4.5,4.5,4.5,14.5,14.5,14.5,0,44.5,"",0,0,1,0,0,0,1 -"Mirror, Mirror",1990,104,NA,4.9,93,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mirror, Mirror 2: Raven Dance",1994,91,NA,2.9,40,44.5,4.5,14.5,14.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Mirror, Mirror III: The Voyeur",1995,91,NA,2.8,16,34.5,14.5,34.5,0,4.5,0,0,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Mirror, Mirror IV: Reflection",2000,86,NA,4.2,5,0,0,44.5,24.5,24.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Mirrors",1934,12,NA,8.4,13,0,0,0,0,0,4.5,34.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Mirrors",1978,88,NA,3.5,19,14.5,0,34.5,14.5,14.5,14.5,4.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Mirrors of Time",1991,23,NA,6.1,5,0,0,0,0,0,64.5,24.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Mirt Sost Shi Amit",1975,150,NA,9.1,7,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Mis",1981,111,NA,9.3,385,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,74.5,"",0,0,1,0,0,0,0 -"Mis vacaciones",1999,12,NA,4.9,18,4.5,4.5,14.5,0,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Misa mi",2003,80,NA,6.1,13,0,0,0,14.5,4.5,14.5,24.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Misadventures of Margaret, The",1998,80,5000000,5.4,217,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Misadventures of Merlin Jones, The",1964,91,NA,5.5,79,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Misbegotten",1998,95,NA,3.9,130,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Misbehavers, The",2004,120,10000,7.7,21,24.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Misbehavin'",1979,85,NA,4.2,5,0,24.5,0,0,0,24.5,0,0,64.5,0,"",0,0,0,0,0,0,0 -"Mischief",1985,93,NA,6,617,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Mischievous",1996,97,NA,2.8,35,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Mischka",2002,116,NA,5.8,92,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Misdemeanor",2002,13,16000,8.9,17,0,14.5,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,0,0,1 -"Miser's Heart, The",1911,18,NA,6.1,9,14.5,0,0,0,24.5,34.5,14.5,24.5,0,0,"",0,0,0,1,0,0,1 -"Miser, The",2000,22,NA,8.4,16,4.5,0,4.5,0,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Miserabili, I",1948,118,NA,6.2,9,14.5,0,14.5,0,14.5,14.5,0,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Miserables, Les",1952,105,NA,6.8,84,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Misery",1990,107,20000000,7.5,13120,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Misery Brothers, The",1995,87,NA,3,14,64.5,4.5,0,0,4.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Misfit Brigade, The",1987,99,NA,4.6,168,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Misfit Patrol",1998,101,NA,5.6,7,24.5,0,14.5,14.5,0,0,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Misfits - 30 Years of Fluxus, The",1993,80,NA,5.7,7,14.5,0,0,24.5,14.5,0,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Misfits, The",1961,120,4000000,7.3,1905,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Mishima: A Life in Four Chapters",1985,121,5000000,7.5,772,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mismo amor, la misma lluvia, El",1999,100,NA,7.8,263,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Miso",2003,100,NA,5,11,4.5,4.5,0,4.5,14.5,14.5,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Misplaced",1989,98,NA,6.7,24,0,0,0,0,0,14.5,4.5,14.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Miss",1986,95,NA,2.8,6,0,34.5,0,14.5,14.5,0,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Miss Annie Rooney",1942,82,NA,6.3,19,4.5,0,0,14.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Miss Arizona",1987,95,NA,5.9,12,0,0,14.5,0,14.5,0,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Miss Bluebeard",1925,62,NA,5.3,5,0,0,0,0,64.5,24.5,0,24.5,0,0,"",0,0,1,0,0,1,0 -"Miss Bohrloch",1970,14,NA,7.9,7,0,0,14.5,0,0,0,14.5,14.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Miss Bolero",1993,80,NA,1.7,10,64.5,14.5,0,0,0,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Miss Caribe",1988,90,NA,6.3,19,14.5,0,0,4.5,14.5,0,24.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Miss Cast Away",2004,90,2000000,4,27,14.5,4.5,4.5,4.5,0,0,0,0,14.5,45.5,"",0,0,1,0,0,0,0 -"Miss Congeniality",2000,109,45000000,6.2,16235,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Miss Congeniality 2: Armed and Fabulous",2005,115,NA,5,1555,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Miss Directed",1990,75,NA,4.6,12,14.5,0,4.5,4.5,0,14.5,14.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Miss Entebbe",2003,80,NA,6.4,19,4.5,0,14.5,14.5,0,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Miss Fatty's Seaside Lovers",1915,11,NA,5.4,16,4.5,0,0,24.5,24.5,14.5,4.5,4.5,14.5,0,"",0,0,1,0,0,0,1 -"Miss Firecracker",1989,102,NA,6.1,469,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Miss Grant Takes Richmond",1949,87,NA,6.7,53,0,0,0,0,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Miss Julie",1999,103,NA,6,380,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Miss Mary",1986,100,NA,6.6,38,0,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Miss Missouri",1990,103,NA,8.1,10,14.5,14.5,0,0,14.5,0,0,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Miss Mona",1987,98,NA,6.3,10,0,0,0,14.5,14.5,14.5,0,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Miss Monday",1998,90,NA,6.4,80,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Miss Muerte",1966,86,NA,7.3,61,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Miss Nude America",1976,82,NA,6.6,16,4.5,0,4.5,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,1,0,0 -"Miss Nymphet's Zap-In",1970,76,NA,1.5,10,45.5,14.5,0,0,0,0,14.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Miss Pacific Fleet",1935,66,202798,5.7,9,0,0,0,0,44.5,24.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Miss Pinkerton",1932,66,NA,6,32,0,4.5,4.5,4.5,14.5,24.5,4.5,34.5,4.5,0,"",0,0,1,0,0,0,0 -"Miss Polly",1941,45,NA,6.5,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Miss Robin Hood",1952,76,NA,4.9,9,0,14.5,0,14.5,34.5,14.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Miss Sadie Thompson",1953,91,NA,5.9,185,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Miss Ston",1958,96,NA,8.5,11,0,4.5,0,0,0,4.5,0,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Miss Supreme Queen",1999,24,50000,5.6,9,0,14.5,0,24.5,0,14.5,0,14.5,34.5,14.5,"",0,0,1,1,0,0,1 -"Miss Susie Slagle's",1946,88,NA,5.9,9,0,0,14.5,14.5,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Miss Tatlock's Millions",1948,101,NA,7.1,56,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Miss Wonton",2001,87,NA,5.1,17,0,4.5,0,4.5,14.5,24.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Miss and Mrs Sweden",1969,94,NA,4.5,19,4.5,4.5,0,14.5,4.5,0,4.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Miss... or Myth?",1987,60,NA,8.6,5,0,0,0,0,0,24.5,24.5,0,0,64.5,"",0,0,0,0,1,0,0 -"Missamma",1955,181,NA,6.9,17,4.5,0,0,0,4.5,0,0,0,4.5,84.5,"",0,0,1,1,0,0,0 -"Missed Call",2003,3,NA,9.7,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,1,0,0,1 -"Missed Fortune, A",1952,17,NA,7.3,31,0,0,0,0,4.5,4.5,34.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Missile",1987,115,NA,6.5,12,4.5,4.5,0,0,0,14.5,0,34.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Missile Monsters",1958,75,NA,2.8,5,24.5,24.5,24.5,0,0,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Missile X - Geheimauftrag Neutronenbombe",1981,88,NA,2.6,13,34.5,4.5,24.5,4.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Missile to the Moon",1958,78,65000,3.5,58,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Missing",1982,122,NA,7.6,1786,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Missing Allen - Wo ist Allen Ross?",2001,90,NA,8.4,52,4.5,0,0,0,0,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Missing Brendan",2003,100,NA,5.5,35,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Missing Corpse, The",1945,62,NA,5.3,7,0,44.5,0,0,14.5,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Missing Guest, The",1938,68,NA,7.2,6,0,0,0,0,14.5,14.5,0,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Missing Juror, The",1944,66,NA,5.5,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Missing Lady, The",1946,60,NA,4.3,7,0,14.5,0,0,44.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Missing Link",1999,88,NA,5.7,58,4.5,0,4.5,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Missing Moscow",2004,19,NA,3.1,6,34.5,0,14.5,0,0,0,0,14.5,0,34.5,"",0,0,1,0,0,0,1 -"Missing Mouse, The",1953,6,NA,7,23,0,0,0,4.5,0,24.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Missing Peace",2003,92,NA,6.6,15,0,0,4.5,0,4.5,14.5,24.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Missing Persons",2002,85,NA,4.2,20,14.5,4.5,14.5,4.5,0,0,14.5,14.5,24.5,24.5,"",1,1,0,0,0,0,0 -"Missing Pieces",1991,94,NA,5.5,60,4.5,14.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Missing Rembrandt, The",1932,84,NA,6,10,0,0,0,14.5,34.5,24.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Missing in Action",1984,101,NA,4.5,1284,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Missing in Action 2: The Beginning",1985,100,NA,3.9,750,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Mission Batangas",1968,100,NA,4.2,9,0,34.5,0,24.5,24.5,14.5,14.5,0,0,0,"",1,0,0,0,0,0,0 -"Mission Kashmir",2000,160,NA,7.2,289,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Mission Manila",1987,90,NA,3.4,5,24.5,24.5,24.5,0,24.5,24.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Mission Mars",1968,95,NA,4.5,28,14.5,0,14.5,14.5,14.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mission Over Korea",1953,85,NA,5.8,18,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Mission in Morocco",1959,85,NA,2.3,10,14.5,24.5,14.5,0,14.5,14.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Mission of Danger",1959,80,NA,5.7,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Mission to Glory: A True Story",1977,116,NA,4.7,7,0,0,14.5,24.5,0,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Mission to Mars",2000,113,90000000,4.9,15018,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mission to Mir",1997,40,NA,6.3,58,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Mission to Moscow",1943,124,1516000,6.6,89,24.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mission, The",1986,126,NA,7.3,6910,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mission: Africa",1968,91,NA,1,5,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Mission: Impossible",1996,110,75000000,6.6,33496,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Mission: Impossible II",2000,123,125000000,5.7,35958,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Mission: Monte Carlo",1974,102,NA,6,20,0,0,14.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Mission: Space",2003,5,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",1,0,0,0,0,0,1 -"Missionary Positions",2005,80,NA,9.5,20,0,0,0,0,0,0,0,14.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Missionary, The",1982,90,NA,6.1,416,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Missione Eroica. I pompieri 2",1987,89,NA,3.2,34,4.5,14.5,14.5,24.5,24.5,4.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Missione finale",1988,84,NA,4.8,5,24.5,44.5,0,0,0,0,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Missione mortale Molo 83",1965,78,NA,6.3,6,0,0,0,14.5,0,0,14.5,34.5,34.5,0,"",0,0,0,0,0,0,0 -"Missione speciale Lady Chaplin",1966,101,NA,5.1,5,0,0,0,24.5,44.5,24.5,0,0,24.5,0,"",1,0,0,0,0,0,0 -"Mississippi",1935,80,NA,6.8,70,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mississippi Blues",1983,96,NA,7.2,24,0,0,4.5,4.5,0,24.5,24.5,14.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Mississippi Burning",1988,128,15000000,7.6,8084,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mississippi Gambler, The",1953,99,NA,6.3,93,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Mississippi Hare",1949,8,NA,7.2,43,0,4.5,0,4.5,4.5,24.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mississippi Masala",1991,118,NA,6.7,889,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Mississippi One",1991,90,NA,5.8,6,0,0,14.5,0,0,14.5,34.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Missouri Breaks, The",1976,126,NA,5.8,857,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Missouri Traveler, The",1958,103,NA,6.5,26,0,0,4.5,4.5,14.5,4.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Missy",2001,71,5000,9.6,19,0,0,4.5,0,0,0,0,0,0,94.5,"",0,0,0,1,0,0,0 -"Mister 880",1950,90,NA,6.9,118,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mister Buddwing",1966,100,NA,5.8,140,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mister Cory",1957,92,NA,6.2,75,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mister Drake's Duck",1951,75,NA,6.3,15,0,0,4.5,4.5,4.5,44.5,34.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Mister Frost",1990,104,NA,5.6,485,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mister Gardenia Jones",1942,13,NA,1.5,10,45.5,24.5,14.5,14.5,0,0,0,0,0,14.5,"",0,0,0,0,1,0,1 -"Mister Johnson",1990,97,NA,6.3,174,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mister Mama",1992,102,NA,7.1,10,14.5,0,0,0,24.5,0,34.5,14.5,34.5,0,"",0,0,1,1,0,0,0 -"Mister Moses",1965,113,NA,5.6,64,4.5,4.5,0,4.5,14.5,24.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mister Roberts",1955,123,NA,8,3932,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Mister Rock and Roll",1957,86,NA,4.9,26,4.5,0,4.5,14.5,14.5,24.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Mister Scoutmaster",1953,87,NA,6.4,70,0,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mister Smile",2000,8,NA,5.3,12,0,4.5,0,0,44.5,14.5,0,0,4.5,24.5,"",0,1,0,0,0,0,1 -"Mister V.",2003,90,NA,5.5,15,0,0,0,14.5,24.5,44.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Mister X",1968,90,NA,3.8,9,14.5,14.5,14.5,24.5,14.5,0,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Mister and Mistletoe",1955,5,NA,5.9,11,0,0,0,4.5,34.5,4.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Misteri della giungla nera, I",1965,96,NA,3.7,11,0,24.5,4.5,14.5,4.5,0,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Misterio",1980,90,NA,6.9,9,14.5,0,0,0,0,45.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Misterios de ultratumba",1959,71,NA,4.7,18,4.5,0,0,24.5,14.5,4.5,14.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Mistero del tempio indiano, Il",1963,105,NA,3.8,14,0,14.5,14.5,14.5,24.5,14.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Mistero di Bellavista, Il",1984,102,NA,6.5,11,0,0,4.5,4.5,0,14.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Mistero di Oberwald, Il",1981,129,NA,5.6,60,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Mistertao",1989,3,NA,6.6,6,0,14.5,0,0,0,34.5,14.5,0,34.5,0,"",0,1,0,0,0,0,1 -"Mistiko tou Noemvri, To",2003,100,NA,2.2,6,0,64.5,14.5,0,0,0,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Mistkerl, Der",2001,88,NA,7.9,15,0,0,4.5,0,4.5,0,4.5,45.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Mistons, Les",1958,23,NA,7.5,381,4.5,0,0,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Mistral, Le",1965,30,NA,6.7,5,0,0,0,0,0,24.5,64.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Mistress",1992,110,NA,5.4,402,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Mistress of Atlantis, The",1932,87,NA,5.9,8,0,0,24.5,14.5,14.5,24.5,14.5,0,14.5,0,"",0,0,0,0,0,1,0 -"Mistress of Seduction",1998,92,NA,3.1,51,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Mistress of the Apes",1979,84,NA,2.5,30,34.5,14.5,4.5,4.5,4.5,14.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Mistri",2004,83,NA,6.6,60,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Misty",1961,91,NA,6,41,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Misulgwan yup dongmulwon",1998,108,NA,7.1,126,4.5,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Misunderstood",1984,91,NA,5.4,100,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Misunnelse",2000,9,NA,6.4,7,14.5,0,0,0,0,0,74.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Mit Himbeergeist geht alles besser",1960,105,NA,6.4,11,0,0,0,0,0,14.5,0,64.5,14.5,0,"",0,0,1,0,0,0,0 -"Mit Ikea nach Moskau",2001,90,NA,8.4,11,0,0,0,0,4.5,4.5,0,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Mit Verlust ist zu rechnen",1992,118,NA,8.2,13,0,0,0,0,4.5,0,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Mit mir",2000,3,NA,5,9,14.5,0,0,44.5,14.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Mitad del cielo, La",1986,127,NA,6.6,50,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mitahat La'af",1982,95,NA,7,12,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Mitchell",1975,97,NA,2.5,1253,45.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Mitchellville",2004,83,NA,8,6,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Mitici, I",1994,100,NA,4.6,49,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mitr, My Friend",2002,104,NA,6.4,33,4.5,4.5,4.5,14.5,0,24.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mitt liv som hund",1985,101,NA,7.6,3448,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Mitte, Die",2004,85,NA,7,23,0,0,4.5,0,4.5,34.5,14.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Mivtsa Yonatan",1977,124,NA,6.2,104,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Mix",2004,97,1000000,5.9,96,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Mix Me a Person",1962,116,NA,4.8,8,0,0,14.5,0,45.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Mix Tape",2003,97,15000,7.7,7,14.5,0,0,0,0,0,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Mixed Blood",1985,98,NA,6.3,68,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Mixed Company",1974,109,NA,5.1,36,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mixed Magic",1936,18,NA,7.3,9,0,0,0,0,34.5,14.5,44.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Mixed Master",1956,7,NA,5.7,8,0,0,0,0,34.5,24.5,14.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Mixed Nuts",1934,19,NA,7.2,8,0,0,0,0,14.5,24.5,14.5,45.5,0,0,"",0,0,0,0,0,0,1 -"Mixed Nuts",1994,97,NA,4.7,1769,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Mixed Signals",1997,87,NA,4.8,56,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mixing Nia",1998,92,NA,6.1,64,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Miyamoto Musashi",1944,53,NA,6.1,9,0,0,0,0,0,44.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Miyazawa Kenji - Ginga-tetsudo no yoru/Kokto de la galaksia fervojo de Miyazawa Kenji",1985,113,NA,7.2,98,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Miyazawa Kenji sono ai",1996,116,NA,6.6,11,0,14.5,0,0,0,34.5,4.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Mizaldo, Kraj Teatra",1994,71,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,1,0,0 -"Mizu no nai puuru",1982,103,NA,7.2,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Mizu no naka no hachigatsu",1995,117,NA,5.4,32,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Mizu no naka no hachigatsu",1998,90,NA,6.7,15,4.5,0,0,4.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Mizu no onna",2002,115,NA,6.1,68,4.5,4.5,4.5,14.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mlode wilki",1995,94,NA,5.6,34,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mnasidika",1969,70,NA,5.7,5,0,0,24.5,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Mne dvadtsat let",1964,189,NA,8.8,38,0,0,0,0,0,0,14.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Mnemonista, Il",2000,95,NA,7,9,14.5,0,0,0,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Mo",1983,105,NA,6.9,11,0,0,0,0,4.5,14.5,24.5,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Mo deng bao biao",1981,90,NA,8.6,30,4.5,0,0,0,0,4.5,14.5,24.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Mo deng tian shi",1981,88,NA,3.2,22,24.5,14.5,14.5,0,4.5,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Mo him wong",1996,87,NA,5.8,237,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Mo hozue wa tsukanai",1979,103,NA,6.8,5,0,0,0,0,44.5,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Mo neuih",1970,94,NA,3.9,5,0,24.5,44.5,24.5,0,0,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Mo yan ka sai",2000,91,NA,8.2,20,0,0,0,0,0,14.5,24.5,24.5,24.5,24.5,"",0,0,0,1,1,0,0 -"Mo'",1996,82,NA,4.9,7,24.5,0,0,0,0,0,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Mo' Better Blues",1990,130,10000000,6.1,1408,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mo' Money",1992,97,15000000,4.9,1109,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Moana",1926,85,NA,7.5,18,0,0,0,0,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Mob Law: A Film Portrait of Oscar Goodman",1998,90,NA,8,7,0,14.5,0,0,0,0,0,14.5,45.5,14.5,"",0,0,0,0,0,0,0 -"Mob Queen",1998,87,NA,5.6,38,0,0,14.5,0,0,14.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Mob Story",1990,94,NA,3.5,18,34.5,24.5,0,14.5,24.5,4.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Mob Town",1941,60,NA,5.6,5,0,0,0,44.5,0,24.5,0,24.5,0,24.5,"",0,0,1,1,0,0,0 -"Mob War",1989,96,NA,1.8,30,34.5,24.5,24.5,4.5,4.5,4.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Mob, The",1951,87,NA,6.6,37,4.5,0,4.5,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mobilising the Troupes",2004,20,NA,8.8,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Mobster's Wife, The",1997,131,NA,3.9,17,14.5,0,4.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mobsters",1991,121,NA,5.3,1188,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Moby Dick",1930,77,NA,6,58,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Moby Dick",1956,115,4500000,7.3,1887,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Moby Duck",1965,6,NA,5.6,22,14.5,0,4.5,0,14.5,24.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Moby Presents: Alien Sex Party",2003,87,NA,1.7,28,34.5,4.5,4.5,0,4.5,0,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mockery",1927,75,NA,5.7,9,0,0,0,14.5,24.5,0,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Mocking the Cosmos",1996,25,NA,5.3,40,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Mockingbird Don't Sing",2001,99,3000000,6.3,195,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mod Fuck Explosion",1994,76,NA,3.9,49,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mod Squad, The",1999,92,NA,3.9,2969,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Model Wife",1990,76,NA,4.7,9,0,0,14.5,14.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Model and the Marriage Broker, The",1951,103,NA,6.8,42,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Modelo antiguo",1992,95,NA,7,7,0,0,0,0,24.5,0,0,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Models",1999,118,NA,5.8,65,4.5,4.5,0,4.5,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Moderato cantabile",1960,95,NA,6.5,93,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Modern Affair, A",1995,90,NA,5.4,45,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,0,0,"R",0,0,1,1,0,1,0 -"Modern Crimes",1992,82,NA,5.9,13,0,0,0,4.5,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Modern Daydreams",2001,16,NA,6.5,10,0,0,0,0,14.5,14.5,0,34.5,14.5,44.5,"",0,0,1,1,0,0,1 -"Modern Girls",1986,84,NA,4.6,150,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Modern Hero, A",1934,71,NA,5.8,15,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Modern Inventions",1937,9,NA,7.9,58,0,0,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Modern Love",1990,105,NA,4.5,64,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Modern New Orleans",1940,8,NA,6.5,7,0,0,0,0,14.5,0,74.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Modern Problems",1981,93,NA,4.6,874,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Modern Romance",1981,93,NA,6.5,313,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Modern Things, The",2003,75,NA,9,9,0,0,0,0,14.5,0,0,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Modern Times",1936,87,1500000,8.5,10326,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Modern Vampires",1998,91,2000000,4.1,700,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Modern Warriors",2002,56,NA,5.8,32,0,0,4.5,14.5,14.5,4.5,4.5,14.5,14.5,24.5,"",1,0,0,0,1,0,0 -"Moderna stahtopouta",1965,103,NA,6.5,19,4.5,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Moderno Barba Azul, El",1946,90,NA,2.7,15,24.5,24.5,14.5,4.5,14.5,0,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Moderns, The",1988,126,NA,6.4,375,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Modesty Blaise",1966,119,3000000,5,452,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Modigliani",2004,128,12000000,7,155,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"R",0,0,0,1,0,0,0 -"Mods",2002,59,NA,6.1,44,24.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Modulations",1998,75,NA,6.8,96,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Moe no suzaku",1997,95,NA,7.4,54,0,0,0,4.5,0,14.5,4.5,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Moebius",1996,88,NA,7.6,278,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Moeder Dao, de schildpadgelijkende",1995,90,NA,6.2,16,0,4.5,0,0,4.5,4.5,0,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Moetsukita chizu",1968,118,NA,6.7,6,0,0,0,0,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mogambo",1953,115,NA,6.5,734,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Mogliamante",1977,106,NA,6.7,67,0,0,0,14.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Moglie americana, Una",1965,114,NA,6,9,14.5,0,0,14.5,14.5,34.5,0,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Moglie del prete, La",1971,103,NA,5.1,42,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Moglie in bianco... l'amante al pepe, La",1980,96,NA,4.7,12,0,4.5,24.5,0,0,24.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Moglie molto infedele, Una",1987,81,NA,2.6,7,24.5,0,14.5,0,0,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Moglie vergine, La",1975,98,NA,4.1,30,14.5,4.5,14.5,14.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Mohabbatein",2000,216,NA,6.8,346,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Mohager, al-",1994,129,NA,5.4,54,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mohajer",1990,90,NA,5.7,6,0,0,0,0,34.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Mohawk",1956,80,NA,5.4,42,0,4.5,14.5,4.5,24.5,24.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Mohou-han",2002,124,NA,5.5,33,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mohra",1994,177,NA,5.1,66,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Moi Ivan, toi Abraham",1993,105,NA,7.5,66,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Moi et mon blanc",2003,97,NA,7,11,4.5,0,0,0,0,4.5,44.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Moi un noir",1958,70,NA,7.5,24,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Moi universitety",1940,120,NA,5.8,12,0,0,0,14.5,4.5,14.5,14.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Moi vouloir toi",1985,90,NA,3.5,12,34.5,4.5,4.5,24.5,14.5,0,0,4.5,0,0,"",0,0,1,1,0,1,0 -"Moi, fleur bleue",1977,100,NA,5.3,14,4.5,0,0,14.5,0,4.5,24.5,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Moianacht",2000,20,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,0,0,0,1 -"Moindre des choses, La",1997,105,NA,4.7,28,14.5,4.5,0,4.5,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Moine et le poisson, Le",1994,6,NA,8.2,46,4.5,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Moine, Le",1973,94,NA,4.8,37,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mois d'avril sont meurtriers, Les",1987,88,NA,7,18,0,0,4.5,0,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Moj tata na odredjeno vreme",1982,89,NA,6.6,13,0,0,0,4.5,34.5,14.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Mojados: Through the Night",2004,65,NA,9,107,4.5,0,4.5,0,0,4.5,4.5,24.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Mojave Firebrand",1944,55,NA,5.9,6,0,0,0,34.5,0,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Mojave Moon",1996,95,NA,5.5,361,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Mojo",1997,90,NA,5.4,74,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mokey",1942,88,NA,3.3,25,0,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Molchaniye doktora Ivensa",1973,90,NA,5.3,7,0,0,24.5,0,14.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Mole People, The",1956,77,200000,4.2,380,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Molitva za getmana Mazepu",2002,152,NA,3.9,30,34.5,14.5,0,4.5,4.5,0,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Moljac",1984,85,NA,6.2,6,14.5,0,0,14.5,0,0,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Moll Flanders",1996,113,NA,5.9,784,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Mollo tutto",1995,100,NA,3.5,11,4.5,4.5,4.5,0,0,14.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Molly",1977,101,NA,5.2,8,14.5,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Molly",1983,88,NA,4.3,5,0,24.5,0,0,0,44.5,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Molly",1999,102,21000000,5.5,610,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Molly & Gina",1994,93,NA,2.8,29,24.5,14.5,4.5,14.5,14.5,4.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Molly & Mobarak",2003,85,NA,8.3,9,0,0,0,0,0,0,24.5,34.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Molly Maguires, The",1970,124,11000000,6.6,455,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Molly Moo Cow and the Butterflies",1935,7,NA,4.2,5,0,24.5,0,0,64.5,24.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Molly O'",1921,80,NA,2.6,6,14.5,0,0,0,14.5,0,0,64.5,0,0,"",0,0,1,0,0,0,0 -"Molly and Lawless John",1972,98,NA,4.9,47,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Molly and Me",1945,77,NA,6.8,23,0,0,0,0,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Molly and the Ghost",1991,87,NA,3.2,6,45.5,0,34.5,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Molly's Pilgrim",1985,24,NA,9.3,8,14.5,0,0,0,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,1 -"Mollycoddle, The",1920,86,NA,6.9,10,0,0,0,0,14.5,34.5,24.5,34.5,0,14.5,"",0,0,1,0,0,1,0 -"Moloch",2001,18,NA,3,10,24.5,0,0,14.5,24.5,14.5,14.5,14.5,0,24.5,"",0,1,0,0,0,0,1 -"Molodaya gvardiya",1948,135,NA,5,25,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Molokai, la isla maldita",1959,104,NA,2.2,11,24.5,4.5,0,0,4.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Molokai: The Story of Father Damien",1999,113,NA,6.1,250,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Molokh",1999,108,NA,6.4,266,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Molom: A Legend of Mongolia",1995,93,NA,6.2,9,0,0,0,14.5,0,14.5,0,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Mom",1990,95,NA,4,28,14.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Mom and Dad Save the World",1992,88,NA,4.2,709,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mom, Can I Keep Her?",1998,90,NA,3.5,46,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Momcheto si otiva",1972,101,NA,5.9,28,4.5,0,0,0,4.5,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Moment After, The",1999,89,NA,3.3,48,24.5,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Moment After, The",2002,13,NA,5.1,45,4.5,4.5,0,0,4.5,0,14.5,4.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Moment Passing, A",1997,6,NA,8,5,0,0,0,0,0,0,24.5,64.5,24.5,0,"",0,0,0,0,0,0,1 -"Moment by Moment",1978,102,NA,2.3,219,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Moment of Danger",1960,97,NA,5.1,6,0,0,0,0,34.5,0,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Moment of Grace, A",2004,20,50000,8.6,14,4.5,4.5,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,0,0,1 -"Moment of Impact",1998,117,NA,7.7,6,0,0,0,14.5,0,0,14.5,64.5,0,0,"",0,0,0,0,1,0,0 -"Moment of Silence, A",2000,15,NA,4.4,8,14.5,34.5,0,0,14.5,0,14.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Moment to Moment",1965,108,NA,5.5,41,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Momento di uccidere, Il",1968,92,NA,6.6,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",1,0,0,0,0,0,0 -"Momento magico, Il",1984,110,NA,5.4,9,0,0,24.5,0,24.5,24.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Momentos robados",1997,100,NA,2.7,7,44.5,0,0,14.5,0,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Moments de la vie d'une femme",1979,89,NA,5.8,11,0,0,0,4.5,0,14.5,24.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Moments in Music",1950,10,NA,7.9,11,0,0,0,4.5,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Momentum",1992,20,NA,5.5,6,0,0,0,14.5,14.5,14.5,14.5,34.5,0,0,"",0,0,0,0,1,0,1 -"Momia azteca contra el robot humano, La",1958,65,NA,1.6,215,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Momia azteca, La",1957,80,NA,4.8,11,4.5,0,4.5,4.5,4.5,24.5,0,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Momias de Guanajuato, Las",1972,85,NA,5.3,17,4.5,0,0,0,4.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Momma Don't Allow",1955,22,NA,6,8,0,0,0,0,14.5,34.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,1 -"Mommie Dearest",1981,129,5000000,6.2,1696,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mommy",1995,89,700000,5.2,62,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Momo",1986,101,NA,6.7,224,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Momo alla conquista del tempo",2001,80,NA,7.1,46,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Mon",2001,12,NA,6.5,19,4.5,4.5,4.5,14.5,34.5,14.5,14.5,0,14.5,4.5,"",0,0,0,1,0,0,1 -"Mon amie Max",1994,106,NA,5.7,26,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mon amour mon parapluie",2001,10,NA,4.3,7,0,0,0,14.5,14.5,14.5,0,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Mon ange",2004,94,NA,5.1,20,14.5,14.5,4.5,0,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mon cas",1986,92,NA,5.2,18,24.5,0,4.5,14.5,0,0,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mon cher sujet",1988,96,NA,4.4,8,0,14.5,0,0,24.5,0,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Mon coeur t'appelle",1934,84,NA,4.1,6,14.5,0,0,0,34.5,0,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Mon copain Rachid",1997,19,NA,4.7,17,14.5,4.5,0,4.5,4.5,24.5,4.5,4.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Mon homme",1996,99,NA,6.5,336,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mon huan buo luo",2002,93,NA,7.4,13,0,0,0,0,0,14.5,24.5,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Mon idole",2002,108,NA,6.3,234,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mon oncle",1958,120,NA,7.7,1775,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mon oncle Antoine",1971,110,NA,7.2,218,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mon oncle Benjamin",1969,90,NA,7.3,205,4.5,0,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Mon petit doigt m'a dit...",2005,105,NA,6.5,68,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mon placard",1998,8,NA,5.5,5,0,0,0,24.5,0,44.5,24.5,24.5,0,0,"",0,1,0,1,0,0,1 -"Mon voyage d'hiver",2003,104,NA,7.1,7,0,0,14.5,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mona Lisa",1986,104,NA,7.1,1819,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Mona Lisa Descending a Staircase",1992,7,NA,9.1,19,14.5,0,0,0,4.5,0,4.5,34.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Mona Lisa Smile",2003,117,65000000,6.1,6838,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Mona Must Die",1994,91,NA,3.2,17,44.5,24.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Mona et moi",1989,90,NA,7.9,6,0,0,0,14.5,0,14.5,0,14.5,34.5,14.5,"",0,0,1,1,0,1,0 -"Monaca di Monza, La",1969,105,NA,5.5,19,14.5,0,0,4.5,24.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Monache di Sant'Arcangelo, Le",1973,100,NA,5.8,35,14.5,4.5,14.5,0,4.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Monaco Forever",1984,48,NA,3.3,68,44.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Monaco di Monza, Il",1963,91,NA,7.3,22,0,0,0,0,4.5,14.5,4.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Mond im Skorpion",1997,47,NA,9.5,7,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,1,0,0 -"Monday",2000,100,NA,7.4,441,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Monde de Marty, Le",2000,89,NA,6.4,59,4.5,0,4.5,14.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Monde du silence, Le",1956,86,NA,7.7,54,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Monde sans soleil, Le",1964,93,NA,7.4,14,0,0,0,4.5,0,14.5,24.5,14.5,0,44.5,"",0,0,0,0,1,0,0 -"Monde tremblera, Le",1939,108,NA,4.5,8,0,24.5,0,0,14.5,24.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Monde vivant, Le",2003,75,NA,5.9,51,4.5,4.5,14.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mondialito",1999,90,NA,4.7,13,4.5,0,14.5,4.5,4.5,34.5,0,24.5,4.5,0,"",1,0,1,0,0,0,0 -"Mondo",1996,80,NA,6.8,120,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Mondo Freudo",1966,80,NA,4,17,14.5,4.5,4.5,24.5,4.5,0,14.5,14.5,0,4.5,"",0,0,0,0,1,0,0 -"Mondo Hollywood",1967,91,NA,7.2,9,14.5,14.5,0,0,0,0,24.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Mondo Keyhole",1966,70,NA,1.1,5,44.5,24.5,0,0,0,24.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Mondo Meyer Upakhyan",2002,90,NA,6.2,71,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mondo Mod",1967,147,NA,4.5,15,0,4.5,14.5,14.5,4.5,24.5,4.5,0,14.5,24.5,"",0,0,0,0,1,0,0 -"Mondo New York",1988,83,NA,4.3,46,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mondo Plympton",1997,53,NA,5.3,27,14.5,0,0,4.5,14.5,4.5,44.5,14.5,0,14.5,"",0,1,0,0,0,0,0 -"Mondo Topless",1966,60,12000,3.9,117,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Mondo Trasho",1969,95,2100,6,161,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mondo balordo",1964,93,NA,4.1,17,4.5,14.5,14.5,14.5,24.5,24.5,0,0,4.5,0,"",0,0,0,0,1,0,0 -"Mondo candido",1975,107,NA,6,21,4.5,0,14.5,0,4.5,4.5,0,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Mondo cane",1962,97,NA,5.7,312,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Mondo cane 2",1964,94,NA,6,78,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Mondo cane 2000 l'incredibile",1988,80,NA,4.3,6,34.5,14.5,0,14.5,14.5,0,0,0,0,14.5,"",0,0,0,0,1,0,0 -"Mondo d'amore, Un",2002,86,NA,6.3,19,0,4.5,0,4.5,4.5,44.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Mondo dei sensi di Emy Wong, Il",1976,106,NA,4.3,18,4.5,24.5,14.5,14.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Mondo dell'orrore di Dario Argento, Il",1985,76,NA,5.2,115,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Mondo di notte numero 3",1963,100,NA,3.9,7,14.5,14.5,0,0,0,24.5,14.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Mondo di notte, Il",1959,95,NA,7,6,0,0,0,0,0,14.5,14.5,0,14.5,45.5,"",0,0,0,0,1,0,0 -"Mondo porno di due sorelle, Il",1978,98,NA,1.9,16,34.5,0,14.5,4.5,0,14.5,0,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Mondovino",2004,159,NA,7.2,135,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"PG-13",0,0,0,0,1,0,0 -"Mondscheintarif",2001,93,NA,7,234,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Monella",1998,105,NA,4.7,210,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mones com la Becky",1999,97,NA,7.4,22,4.5,0,0,4.5,4.5,4.5,4.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Money Buys Happiness",1999,109,NA,5.2,16,0,4.5,4.5,0,24.5,14.5,14.5,0,14.5,24.5,"R",0,0,0,1,0,0,0 -"Money Love",1990,1,NA,3.5,19,24.5,14.5,14.5,0,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Money Madness",1948,73,NA,3.9,7,14.5,14.5,0,0,14.5,0,14.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Money Means Nothing",1934,70,NA,4.6,7,0,14.5,14.5,14.5,24.5,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Money Movers",1979,92,NA,5.3,48,4.5,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Money Pit, The",1986,91,10000000,5.6,6392,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Money Talks",1972,81,NA,4.6,11,14.5,0,4.5,0,0,24.5,14.5,14.5,0,4.5,"",0,0,1,0,1,0,0 -"Money Talks",1997,97,25000000,5.5,2720,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Money Talks!",1951,12,NA,1.6,11,64.5,24.5,0,0,0,0,0,0,0,4.5,"",0,0,0,0,0,0,1 -"Money Train",1995,103,68000000,5.1,5081,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,1,1,0,0,0 -"Money Trap, The",1965,91,NA,6.2,69,0,0,4.5,4.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Money and the Woman",1940,67,NA,5.9,25,0,0,0,4.5,14.5,44.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Money from Home",1953,100,NA,5.4,98,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Money to Loan",1939,20,NA,6.3,6,0,0,0,0,14.5,64.5,0,14.5,0,0,"",0,0,0,1,0,0,1 -"Money, The",1976,88,NA,4.6,8,0,24.5,14.5,14.5,24.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Money, Women and Guns",1959,80,NA,5.5,9,0,0,0,24.5,0,44.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Mong fu sek",1966,24,NA,9,5,0,0,0,0,0,0,0,24.5,64.5,24.5,"",0,0,0,0,0,0,1 -"Monge e a Filha do Carrasco, O",1995,90,NA,7.8,34,0,4.5,0,4.5,4.5,4.5,24.5,45.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mongjunggi",2002,98,NA,5.5,72,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mongoland",2001,84,NA,7.2,312,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mongoli, I",1961,105,NA,4.4,32,0,4.5,4.5,24.5,4.5,14.5,14.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Mongoloid",1978,4,NA,6.5,37,4.5,4.5,0,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Mongolpiparen",2004,88,NA,3.5,21,24.5,4.5,4.5,24.5,24.5,4.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Mongrel",1982,88,NA,2.9,13,24.5,14.5,4.5,0,24.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Mongreloid, The",1978,10,NA,7.2,16,0,0,0,0,4.5,24.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Monica la mitraille",2004,122,NA,6.4,60,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Monica y el profesor",2002,110,NA,4.7,6,45.5,0,0,0,0,0,0,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Monique",1969,88,NA,4.4,14,4.5,24.5,0,4.5,4.5,24.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Monique",2002,92,NA,6.2,158,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Monique et Christiane",1976,30,NA,9,5,0,0,0,0,0,0,0,0,100,0,"",0,0,0,0,1,0,1 -"Monique, Lip I",1973,20,NA,9.2,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,0,0,1,0,1 -"Monitors, The",1969,92,NA,4.9,47,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Monk Dawson",1998,104,NA,6.9,37,24.5,4.5,0,4.5,0,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Monkey Business",1931,77,NA,7.6,1742,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Monkey Business",1952,97,NA,7.1,1381,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Monkey Businessmen",1946,17,NA,6.7,46,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Monkey Grip",1982,99,NA,6.2,32,0,0,4.5,0,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Monkey Hu$tle, The",1976,90,NA,3.1,31,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Monkey Kid, The",1995,95,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Monkey Love",2002,96,NA,5.2,14,44.5,0,4.5,0,4.5,0,0,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Monkey Melodies",1930,7,NA,5.4,10,14.5,0,0,24.5,14.5,44.5,14.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Monkey Shines",1988,113,7000000,5.8,834,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Monkey Trouble",1994,96,NA,4.6,589,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Monkey Versus Robot",1999,3,NA,4.8,25,14.5,4.5,4.5,14.5,0,14.5,4.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Monkey on My Back",1957,94,NA,7.4,31,0,0,0,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Monkey's Mask, The",2000,94,NA,5.5,305,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Monkey's Paw, The",1933,58,NA,5.8,6,0,14.5,0,0,0,0,0,14.5,64.5,0,"",0,0,0,0,0,0,0 -"Monkey's Uncle, The",1965,87,NA,5.1,114,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Monkeybone",2001,92,75000000,4.7,3112,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,1,1,0,0,0,0 -"Monkeys in the Attic",1974,80,NA,4.5,7,14.5,0,14.5,24.5,0,0,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Monkeys, Go Home!",1967,101,NA,5,51,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Monocle noir, Le",1961,88,NA,6.5,24,0,0,4.5,0,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Monocle rit jaune, Le",1964,100,NA,6,21,4.5,0,4.5,0,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Monolith",1993,95,NA,3.8,180,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Monolith Monsters, The",1957,77,NA,5.8,254,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Monolog",1972,100,NA,9,18,0,0,0,0,0,0,0,14.5,44.5,34.5,"",0,0,0,1,0,0,0 -"Monon, tis zois tou taxidion, To",2001,85,NA,6.7,10,0,0,0,24.5,24.5,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Mononoke-hime",1997,134,NA,8.3,19350,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG-13",1,1,0,1,0,0,0 -"Monopol",1996,106,NA,5.6,121,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Monpleng luktung F.M.",2002,115,NA,5.5,6,0,0,0,14.5,14.5,0,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Monpti",1957,97,NA,6.5,55,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Monrak Transistor",2001,116,NA,7.1,169,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Monroe Doctrine, The",1939,16,NA,6.2,13,14.5,0,0,0,0,24.5,24.5,34.5,0,4.5,"",0,0,0,1,0,0,1 -"Monsieur",1990,90,NA,3.6,13,14.5,0,0,14.5,14.5,4.5,4.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Monsieur Batignole",2002,100,NA,7.1,426,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Monsieur Beaucaire",1924,106,NA,6,15,0,4.5,4.5,24.5,0,4.5,34.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Monsieur Beaucaire",1946,93,NA,6.9,90,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Monsieur Hawarden",1969,109,NA,6.5,32,0,4.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Monsieur Hire",1989,81,NA,7.5,811,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Monsieur Ibrahim et les fleurs du Coran",2003,96,NA,7.4,1247,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Monsieur Klein",1976,123,3500000,7.3,390,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Monsieur Leguignon, lampiste",1952,105,NA,7.9,5,0,0,0,0,0,24.5,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Monsieur N.",2003,120,NA,6.3,158,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Monsieur Naphtali",1999,85,NA,3.8,10,0,0,44.5,24.5,34.5,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Monsieur Papa",1977,105,NA,5.2,9,0,0,0,24.5,0,24.5,34.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Monsieur Pointu",1975,12,NA,6.6,8,0,0,14.5,0,0,14.5,64.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Monsieur Ripois",1954,85,NA,8.4,15,0,0,0,0,4.5,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Monsieur Taxi",1952,78,NA,6.6,9,0,0,14.5,0,24.5,24.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Monsieur Verdoux",1947,114,2000000,7.5,1254,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Monsieur Vincent",1947,111,NA,7.3,35,0,4.5,4.5,0,4.5,4.5,24.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Monsieur, monsieur",2000,12,NA,7.8,5,0,0,0,0,0,0,24.5,84.5,0,0,"",0,0,0,1,0,0,1 -"Monsignor",1982,121,NA,4.4,202,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Monsoon Wedding",2001,114,NA,7.4,5241,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Monsoon Wife",2004,92,1000000,4.7,15,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Monster",1979,98,NA,2.9,36,34.5,14.5,14.5,24.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Monster",2003,109,8000000,7.4,12306,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Monster Club, The",1980,104,NA,4.9,245,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Monster High",1989,84,NA,3.2,51,14.5,4.5,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Monster Island",1981,100,NA,3,95,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Monster Maker, The",1944,62,NA,4.4,57,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Monster Mash: The Movie",1995,82,NA,3.3,46,24.5,14.5,4.5,4.5,0,0,4.5,4.5,14.5,24.5,"PG",0,0,1,0,0,0,0 -"Monster Road",2004,80,NA,9.5,8,0,0,0,0,0,0,0,14.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Monster Squad, The",1987,82,NA,5.9,1363,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Monster That Challenged the World, The",1957,83,254000,5.2,231,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Monster Walks, The",1932,63,NA,4.1,50,14.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Monster a-Go Go",1965,70,NA,1.4,518,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Monster and the Girl, The",1941,65,NA,6.5,35,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Monster and the Peanut, The",2004,18,10000,8.9,8,0,0,0,0,14.5,0,0,14.5,24.5,45.5,"",0,0,0,1,0,0,1 -"Monster and the Stripper, The",1968,89,NA,5.3,14,14.5,4.5,0,14.5,14.5,14.5,0,0,14.5,24.5,"",1,0,1,0,0,0,0 -"Monster from Green Hell",1958,71,NA,3.4,95,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Monster from the Ocean Floor",1954,51,12000,2.6,49,24.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Monster in a Box",1992,87,NA,7.1,250,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Monster in the Closet",1987,90,NA,4.5,268,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Monster of Camp Sunshine",1964,74,NA,3.2,46,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Monster of Piedras Blancas, The",1959,71,NA,4.3,71,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Monster on the Campus",1958,77,NA,5.1,126,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Monster's Ball",2001,112,4000000,7.3,15037,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,1,0 -"Monster's Calling, A",2001,5,NA,6.2,5,0,0,24.5,24.5,24.5,0,44.5,0,0,0,"",0,1,0,0,0,0,1 -"Monster, The",1925,86,NA,6.7,88,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Monster-in-Law",2005,102,60000000,5.6,147,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"PG-13",0,0,1,0,0,1,0 -"Monsteret",2002,22,130000,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Monsters",2004,17,NA,5.2,17,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Monsters Crash the Pajama Party",1965,45,NA,4.4,34,4.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Monsters, Inc.",2001,92,115000000,8,38712,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,1,1,0,0,0,0 -"Monstre, Le",1903,2,NA,6.4,34,4.5,0,0,4.5,4.5,14.5,44.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Monstrosity",1964,64,NA,2,279,44.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Monstrosity",1989,89,NA,1.6,21,44.5,14.5,0,4.5,0,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Monstrum, Das",2001,90,NA,7,14,24.5,0,0,14.5,0,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Monstruos del terror, Los",1970,87,NA,3,40,24.5,24.5,14.5,4.5,14.5,4.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Mont Blanc",2001,11,NA,7.9,7,0,0,0,0,24.5,0,0,45.5,14.5,0,"",0,1,0,0,0,0,1 -"Montagna del dio cannibale, La",1978,86,NA,4.8,278,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Montana",1950,76,NA,6,80,0,0,4.5,4.5,24.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Montana",1998,92,4000000,6.1,417,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"R",1,0,0,1,0,0,0 -"Montana Belle",1952,82,NA,6,31,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Montana Moon",1930,89,NA,4.9,30,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Montana Territory",1952,64,NA,5.4,7,0,0,0,14.5,14.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Montand",1994,135,NA,6.5,15,0,0,0,0,14.5,24.5,34.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Monte Carlo",1930,90,726465,6.8,83,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Monte Carlo",2001,85,NA,6.7,26,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Monte Carlo Baby",1951,70,NA,4.9,14,14.5,0,4.5,14.5,14.5,4.5,4.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Monte Carlo or Bust",1969,122,NA,5.6,270,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Monte Hellman: American Auteur",1997,14,NA,3.2,22,14.5,4.5,4.5,4.5,14.5,4.5,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Monte Walsh",1970,106,NA,6.7,204,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Monte de las brujas, El",1972,80,NA,3.6,10,0,0,34.5,24.5,0,0,44.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Montecarlo",1956,96,NA,5.6,46,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Montecarlo!",2004,80,NA,5.6,33,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Montenegro",1981,96,NA,6.6,373,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Monterey Pop",1968,78,NA,7.7,332,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Montessori Sword Fight",2001,8,NA,8.2,6,0,0,0,0,0,14.5,45.5,0,34.5,0,"",0,0,0,0,0,0,1 -"Montgomery Clift",1983,122,NA,6.2,19,4.5,0,0,4.5,0,4.5,4.5,14.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Month by the Lake, A",1995,85,NA,6.4,480,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,1,1,0,1,0 -"Month in the Country, A",1987,96,NA,6.6,272,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Month of Sundays, A",2001,92,NA,6.8,27,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Montreal Main",1974,88,NA,4.4,8,0,0,14.5,0,14.5,0,14.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Monty Python & the Holy Grail in Lego",2001,2,NA,8.2,239,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Monty Python Live at the Hollywood Bowl",1982,77,NA,7.5,2158,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Monty Python and the Holy Grail",1975,91,250000,8.4,60565,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Moo(n)",2003,3,NA,6.6,14,0,0,4.5,4.5,14.5,4.5,4.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Mooch Goes to Hollywood",1971,55,NA,8.3,9,24.5,0,14.5,0,0,14.5,0,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Moochie of Pop Warner Football",1960,47,NA,7,10,0,0,0,0,0,14.5,24.5,44.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Moods of the Sea",1941,10,NA,7.3,6,0,0,0,0,0,34.5,14.5,0,34.5,14.5,"",0,0,0,0,0,0,1 -"Moog",2004,72,NA,7.2,16,0,0,14.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Mookie",1998,87,NA,3.4,51,24.5,4.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Moon 44",1990,98,NA,4.3,671,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Moon Is Blue, The",1953,99,NA,6.2,149,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Moon Is Down, The",1943,90,NA,6.6,32,0,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Moon Over Broadway",1997,97,NA,6.5,48,0,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Moon Over Burma",1940,76,NA,5.4,6,0,0,34.5,0,0,0,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Moon Over Harlem",1939,70,8000,4.9,20,4.5,0,4.5,14.5,24.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Moon Over Miami",1941,91,NA,6.8,138,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Moon Over Parador",1988,96,NA,5.7,1365,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Moon Palace",2000,26,NA,8.2,30,4.5,0,0,0,4.5,0,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Moon Pilot",1962,98,NA,5.2,56,4.5,4.5,14.5,4.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Moon Streams",2000,6,NA,8.8,5,0,0,0,0,0,0,24.5,24.5,64.5,0,"",0,0,0,0,0,0,1 -"Moon Zero Two",1969,100,2000000,3.9,118,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Moon and Sixpence, The",1943,89,401000,6.7,34,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Moon in Scorpio",1987,90,NA,4.1,34,14.5,14.5,14.5,4.5,4.5,4.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Moon's Our Home, The",1936,80,NA,5.9,25,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Moon-Spinners, The",1964,118,NA,6.6,314,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Moonbase",1998,89,NA,3.5,67,24.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,4.5,"R",0,0,0,0,0,0,0 -"Moonbird",1959,10,NA,6.8,24,4.5,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Moonchild",1974,90,NA,1.6,9,34.5,14.5,14.5,14.5,0,0,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Moondance",1992,81,NA,8,6,0,0,0,0,14.5,14.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Moondance",1995,92,NA,6,64,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Moondram Pirai",1983,143,NA,9.5,15,0,0,0,0,0,0,4.5,4.5,24.5,64.5,"",0,0,0,1,0,1,0 -"Moonfire",1972,107,NA,7.3,7,0,0,0,0,14.5,14.5,14.5,0,24.5,24.5,"",1,0,0,1,0,0,0 -"Moonfleet",1955,87,NA,6.8,341,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Moonlight",2002,91,NA,5.9,131,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Moonlight Mile",2002,117,20000000,6.9,3479,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Moonlight Murder",1936,65,NA,6.5,16,0,0,4.5,0,14.5,34.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Moonlight Resurrection",1988,11,25000,2,6,0,34.5,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Moonlight Sonata",1937,86,NA,5,14,0,4.5,0,24.5,4.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Moonlight and Pretzels",1933,83,NA,6.9,13,0,0,0,0,4.5,34.5,24.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Moonlight and Valentino",1995,105,NA,5.7,957,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Moonlight by the Sea",2003,92,10000,8,9,14.5,0,0,14.5,0,0,0,0,34.5,44.5,"",0,0,0,0,0,0,0 -"Moonlight for Two",1932,7,NA,3.6,6,0,14.5,14.5,14.5,34.5,14.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Moonlight in Vermont",1943,62,NA,9.8,6,14.5,0,0,0,0,0,34.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Moonlighter, The",1953,77,NA,5.7,21,0,4.5,4.5,14.5,14.5,24.5,14.5,0,4.5,4.5,"",0,0,0,0,0,1,0 -"Moonlighting",1982,97,NA,7.5,277,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Moonlusting",1987,83,NA,4.6,7,0,0,0,14.5,24.5,14.5,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Moonraker",1979,126,34000000,5.9,9318,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Moonraker, The",1958,82,NA,5.9,53,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Moonrise",1948,90,849452,7.3,86,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Moonrunners",1975,110,NA,4.9,50,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Moonshine",1918,23,NA,6.2,36,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Moonshine County Express",1977,95,NA,5,28,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Moonshine Mountain",1964,90,45000,1.8,20,44.5,0,4.5,4.5,0,14.5,4.5,4.5,0,34.5,"",0,0,1,1,0,0,0 -"Moonshine War, The",1970,100,NA,5.7,65,4.5,4.5,4.5,4.5,24.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Moonstalker",1988,92,NA,4.6,25,24.5,24.5,4.5,4.5,4.5,14.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Moonstone, The",1934,62,NA,6.6,22,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Moonstroked",1988,80,NA,5.5,5,0,0,24.5,0,24.5,0,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Moonstruck",1987,102,NA,7.1,6644,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Moontide",1942,94,NA,7.2,58,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Moontrap",1989,92,NA,4.3,364,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Moonzund",1987,142,NA,7.9,19,0,0,0,0,4.5,14.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Moord in extase",1984,99,NA,5.2,21,4.5,4.5,0,14.5,4.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Moose Hunt, The",1931,7,NA,6.2,22,0,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Moose Hunters",1937,8,NA,6.9,50,4.5,0,4.5,4.5,4.5,24.5,14.5,44.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Moosh",2000,28,NA,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,1,1,0,1,1 -"Mooshak e Kaghazi",1997,90,NA,4.3,10,34.5,0,0,0,0,0,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Mor bag rattet",1965,90,NA,6.8,5,0,0,0,0,0,84.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Mor, jeg har patienter",1972,80,NA,7.6,5,0,0,0,44.5,0,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Moral 63",1963,95,NA,6.1,5,0,0,24.5,0,0,0,0,44.5,0,44.5,"",0,0,1,1,0,0,0 -"Moral der Ruth Halbfass, Die",1972,89,NA,7.7,11,0,0,0,0,0,4.5,14.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Moralista, Il",1959,120,NA,6.2,16,0,0,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Moran of the Lady Letty",1922,71,NA,7.7,11,0,0,0,4.5,0,4.5,34.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Morbo",1972,88,NA,2.3,8,14.5,24.5,14.5,0,14.5,0,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Mord i Paradis",1988,91,NA,5.7,27,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Mord und Totschlag",1967,87,NA,9.3,9,0,0,0,0,0,0,14.5,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Mordashka",1990,92,NA,3.6,7,24.5,0,0,14.5,44.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Morderstwo",1957,2,NA,6.4,115,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Mordets melodi",1944,100,NA,7.1,18,0,0,0,0,0,14.5,4.5,45.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mordi e fuggi",1973,100,NA,5.7,22,4.5,0,0,4.5,4.5,0,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mordnacht in Manhattan",1965,89,NA,5.4,16,0,0,4.5,14.5,34.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"More",1998,6,NA,8.8,408,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,64.5,"",0,1,0,0,0,0,1 -"More About Nostradamus",1941,11,NA,4.3,8,0,14.5,24.5,0,24.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"More American Graffiti",1979,110,3000000,4.6,624,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"More Dead Than Alive",1968,96,NA,6.7,54,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"More Dogs Than Bones",2000,99,NA,4.8,101,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"More Kittens",1936,8,NA,7.1,12,0,0,0,0,4.5,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"More Pep",1936,6,NA,5.2,12,0,0,4.5,4.5,24.5,14.5,34.5,0,0,4.5,"",0,1,0,0,0,0,1 -"More Perfect Union, A",1995,105,NA,7.4,8,14.5,0,0,0,14.5,14.5,0,0,34.5,24.5,"",0,0,0,0,0,0,0 -"More Perfect Union: America Becomes a Nation, A",1989,111,NA,9,7,0,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"More Sex and Violence",1998,6,NA,6.3,29,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"More Than Famous",2002,70,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",1,0,0,1,1,0,0 -"More Than a Messiah",1992,43,NA,7.1,10,0,14.5,0,14.5,14.5,14.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"More Than a Secretary",1936,80,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"More Things Change..., The",1986,94,NA,5.6,12,0,0,0,4.5,4.5,14.5,44.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"More the Merrier, The",1943,104,NA,7.9,345,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"More to Love",1999,90,NA,5.4,32,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Morella",1997,90,NA,2.6,36,34.5,24.5,14.5,14.5,4.5,0,4.5,0,0,4.5,"R",0,0,0,0,0,0,0 -"Morena Clara",1936,105,NA,8.7,9,0,0,0,0,0,0,24.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Morena Clara",1954,91,NA,5.7,9,0,0,0,0,34.5,44.5,0,24.5,0,0,"",0,0,1,0,0,1,0 -"Morenga",1985,260,NA,8.6,5,0,0,0,0,0,0,0,44.5,64.5,0,"",0,0,0,0,0,0,0 -"Moreninha, A",1970,96,NA,8.2,6,0,0,0,0,0,0,45.5,0,0,45.5,"",0,0,0,0,0,1,0 -"Morfalous, Les",1984,95,NA,5.5,205,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Morfars resa",1993,82,NA,5.6,8,14.5,0,0,0,14.5,34.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Morgan Stewart's Coming Home",1987,96,NA,4.4,236,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Morgan il pirata",1961,93,NA,5,36,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Morgan's Ferry",1999,91,NA,6,223,34.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Morgan: A Suitable Case for Treatment",1966,97,NA,7.5,272,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Morgane et ses nymphes",1971,79,NA,5.1,13,0,0,4.5,14.5,34.5,4.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Morgen gaat 't beter",1939,101,NA,6.6,8,0,0,0,0,0,24.5,24.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Morgen in Alabama",1984,126,NA,7.5,9,0,0,0,0,0,14.5,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Morgenrot",1933,75,NA,7,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Morgens um Sieben ist die Welt noch in Ordnung",1968,96,NA,5.8,16,0,4.5,4.5,0,14.5,44.5,4.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Morir (o no)",2000,89,NA,7.4,112,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Morir en el golfo",1990,93,NA,4.3,11,0,0,4.5,4.5,14.5,14.5,0,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Morirai a mezzanotte",1986,88,NA,5.3,17,14.5,0,4.5,0,14.5,14.5,34.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Morire gratis",1968,87,NA,7,6,0,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Morituri",1948,88,NA,8.1,9,0,14.5,0,0,14.5,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Morituri",1965,123,NA,6.5,238,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Morlang",2001,94,NA,5.5,101,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mormor, Hitler och jag",2001,17,NA,8,24,0,0,0,0,0,4.5,34.5,14.5,34.5,4.5,"",0,0,0,0,1,0,1 -"Morning After, The",1986,103,NA,5.6,907,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Morning Breath",2002,17,NA,7.2,18,0,0,0,4.5,14.5,14.5,4.5,44.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Morning Departure",1950,102,NA,6.7,56,0,0,4.5,4.5,4.5,24.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Morning Glory",1933,74,NA,6.6,295,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Morning Guy, The",2003,5,5000,8.6,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Morning Raga",2004,110,NA,7.7,7,0,0,0,14.5,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Morning, Noon and Night",1933,8,NA,6.4,16,0,0,0,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Morning, Noon and Night Club",1937,8,NA,6.1,9,0,14.5,0,14.5,14.5,24.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Moro No Brasil",2002,105,NA,6.6,78,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Morocco",1930,91,NA,7.4,530,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Morometii",1988,142,NA,9.1,131,4.5,0,4.5,0,0,0,4.5,4.5,4.5,84.5,"",0,0,0,0,0,0,0 -"Morons from Outer Space",1985,90,NA,4.2,351,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Moros y cristianos",1987,116,NA,5.5,55,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Morozko",1964,84,NA,4.1,590,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Morph Files, The",1995,10,NA,5.1,10,14.5,0,0,0,0,24.5,44.5,14.5,24.5,0,"",0,0,0,0,0,0,1 -"Morphin(e)",2005,20,8000,9.7,7,0,0,0,0,0,0,0,0,24.5,74.5,"",1,0,0,1,0,0,1 -"Morris the Midget Moose",1950,8,NA,8.2,16,0,0,0,4.5,0,24.5,14.5,4.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Mors Elling",2003,78,NA,6.1,209,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mors hus",1974,84,NA,3.9,18,4.5,14.5,14.5,4.5,24.5,14.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Morsiusseppele",1954,105,NA,6.2,8,0,0,14.5,14.5,0,14.5,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Morsures de l'aube, Les",2001,93,NA,5.2,297,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mort d'un pourri",1977,120,NA,6.5,193,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mort de Belle, La",1961,91,NA,7.5,8,0,0,0,14.5,0,0,24.5,34.5,24.5,0,"",0,0,0,1,0,0,0 -"Mort de Mario Ricci, La",1983,100,NA,6.2,12,4.5,0,0,14.5,0,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mort des malades, souffrance des familles",1993,30,NA,9,5,0,0,0,0,0,0,0,24.5,64.5,24.5,"",0,0,0,0,1,0,1 -"Mort des malades, souffrance des soignants",1991,31,NA,9,5,0,0,0,0,0,0,0,0,84.5,24.5,"",0,0,0,0,1,0,1 -"Mort du chinois, La",1998,85,NA,3.2,15,34.5,14.5,24.5,4.5,4.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Mort du jeune aviateur anglais, La",1993,36,NA,7.3,7,0,0,0,0,0,14.5,44.5,24.5,14.5,0,"",0,0,0,0,1,0,1 -"Mort en ce jardin, La",1956,104,NA,6.4,111,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mort en direct, La",1980,128,NA,6.7,290,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mort en fuite, Le",1936,85,NA,7,9,0,0,0,0,0,34.5,44.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Mort qui tue, Le",1913,90,NA,8.1,32,0,0,0,0,0,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Mort un dimanche de pluie",1986,109,NA,7,25,0,0,0,4.5,14.5,14.5,4.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Mortadella, La",1971,97,NA,4.9,43,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Mortal Kombat",1995,101,20000000,5,8779,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Mortal Kombat: Annihilation",1997,91,30000000,3,5799,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Mortal Passions",1989,92,NA,5,54,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mortal Sins",1990,83,NA,1.9,11,45.5,14.5,4.5,0,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Mortal Storm, The",1940,100,NA,7.8,456,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mortal Thoughts",1991,102,NA,5.6,1670,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Morte",2002,15,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Morte Densa",2003,55,NA,8,5,0,0,0,0,0,0,0,100,0,0,"",0,0,0,0,1,0,0 -"Morte a Venezia",1971,130,NA,7.5,1966,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Morte accarezza a mezzanotte, La",1972,96,NA,6.1,42,4.5,4.5,0,4.5,14.5,24.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Morte cammina con i tacchi alti, La",1971,98,NA,5.6,11,4.5,0,0,0,14.5,34.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Morte di un amico",1959,95,NA,7,9,0,0,0,0,0,24.5,24.5,34.5,24.5,0,"",0,0,0,1,0,0,0 -"Morte di un matematico napoletano",1992,108,NA,6.3,58,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Morte ha fatto l'uovo, La",1968,101,NA,6.4,54,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Morte ha sorriso all'assassino, La",1973,92,NA,6.5,62,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Morte in Vaticano",1982,105,NA,4.3,14,4.5,4.5,14.5,14.5,24.5,14.5,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Morte non ha sesso, La",1968,95,NA,3.9,9,0,14.5,0,24.5,34.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Morte risale a ieri sera, La",1970,93,NA,5.7,10,0,14.5,0,24.5,0,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Morte viene dallo spazio, La",1958,82,NA,5,23,0,14.5,4.5,4.5,34.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Morte vivante, La",1982,85,NA,5.6,192,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mortel transfert",2001,122,NA,6.3,276,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Morten Korch - Solskin kan man altid finde",1999,52,NA,1,44,84.5,0,0,0,4.5,0,4.5,0,4.5,0,"",0,0,0,0,1,0,1 -"Morto the Magician",2001,4,NA,5.6,19,0,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Mortu Nega",1988,85,NA,7.6,5,0,0,0,0,0,44.5,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Mortuary Academy",1988,87,NA,4,53,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Morula",1994,25,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Morvern Callar",2002,97,NA,6.3,1580,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Mosaferan",1992,90,NA,8.6,22,0,0,0,0,4.5,4.5,4.5,4.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Mosafere jonub",1997,90,NA,8.2,5,0,0,0,0,24.5,0,24.5,0,64.5,0,"",0,0,0,0,0,0,0 -"Mosaic",1965,5,NA,7.3,28,0,4.5,0,0,0,14.5,24.5,34.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Mosaic Project, The",1994,95,NA,3,22,14.5,14.5,4.5,14.5,0,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Mosby's Marauders",1967,132,NA,6.7,21,0,0,0,0,14.5,14.5,14.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Moscou sous la neige",1908,7,NA,7.2,34,0,0,4.5,4.5,0,14.5,34.5,24.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Moscow In Madrid",1965,5,NA,5.3,15,4.5,0,0,4.5,44.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Moscow Nights",1935,100,NA,5.9,16,0,0,0,14.5,14.5,44.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Moscow on the Hudson",1984,115,NA,6.2,2086,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mosekongen",1950,92,NA,4.9,11,0,0,14.5,14.5,4.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Moses und Aron",1974,105,NA,5.2,23,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Moskovskaya elegiya",1987,88,NA,8.7,17,0,4.5,0,0,0,4.5,0,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Moskovskiye kanikuly",1995,90,NA,6.3,23,0,0,0,0,24.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mosku - lajinsa viimeinen",2003,169,NA,6.6,66,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Moskva",1999,139,NA,5.8,60,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Moskva slezam ne verit",1979,140,NA,7.7,565,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,1,1,0,1,0 -"Moskva-Kassiopeya",1973,85,NA,6.3,44,0,4.5,0,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mosquito",1995,92,200000,3.3,312,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Mosquito Coast, The",1986,117,16000000,6.4,4643,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mosquito Squadron",1969,90,NA,5,126,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Moss Rose",1947,82,NA,6.7,28,0,0,0,0,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Most",1969,105,NA,7.4,26,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Most",2003,32,NA,9.3,39,4.5,0,0,0,0,4.5,4.5,4.5,14.5,74.5,"",0,0,0,1,0,0,1 -"Most Beautiful Man in the World, The",2002,5,NA,5.6,10,14.5,0,0,14.5,34.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Most Boring Woman in the World, The",2003,15,NA,9.2,6,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Most Dangerous Game, The",1932,63,NA,7.4,728,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Most Dangerous Man Alive",1961,82,NA,5.6,28,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Most Fertile Man In Ireland, The",1999,96,NA,4,140,14.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Most High",2004,101,NA,7.4,18,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Most Precious Thing in Life, The",1934,67,NA,7.5,6,14.5,0,0,0,34.5,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Most Wanted",1997,99,NA,5.3,1052,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Mostri, I",1963,117,NA,7.7,134,0,0,4.5,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mostro dell'isola, Il",1954,87,NA,2.3,8,24.5,34.5,0,14.5,14.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Mostro di Firenze, Il",1986,92,NA,3.2,6,34.5,0,0,14.5,0,0,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Mostro di Venezia, Il",1965,83,NA,2.8,17,24.5,14.5,14.5,24.5,0,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Mostro, Il",1994,112,NA,7.1,1084,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Mosura",1961,91,NA,6.1,241,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Mosura",1996,104,NA,5.9,100,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Mosura 2",1997,97,NA,5.7,86,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mosura 3",1998,99,NA,5.9,54,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mosura tai Gojira",1964,89,NA,5.8,594,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mot Moskva",2003,84,NA,5.6,9,0,0,24.5,14.5,0,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Motel",1989,87,NA,6.3,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Motel",1998,98,NA,5,21,4.5,4.5,0,14.5,0,4.5,4.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Motel Blue",1999,87,NA,4.7,55,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Motel Confidential",1967,85,NA,1,5,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Motel Hell",1980,102,3000000,5.2,791,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Motel Seoninjang",1997,91,NA,5.1,35,0,4.5,14.5,4.5,34.5,14.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Motel, The",2005,7,NA,5.5,34,24.5,4.5,4.5,4.5,0,4.5,0,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Motello",1998,105,NA,5.5,52,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Motevalede mahe mehr",2001,94,NA,6.2,7,0,0,24.5,0,0,14.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Moth and the Flame",1938,8,NA,6.3,11,0,0,0,4.5,24.5,4.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mother",1970,89,NA,3.3,7,14.5,14.5,0,14.5,0,0,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Mother Carey's Chickens",1938,82,NA,6.4,15,0,0,0,0,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mother Didn't Tell Me",1950,88,NA,7.6,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Mother Ghost",2002,76,NA,5.5,24,14.5,0,4.5,4.5,4.5,4.5,4.5,0,14.5,44.5,"",0,0,1,1,0,0,0 -"Mother Goose Goes Hollywood",1938,8,NA,7.4,22,0,0,0,14.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mother Goose Land",1933,7,NA,5.1,8,0,0,14.5,14.5,24.5,14.5,24.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Mother Goose Melodies",1931,8,NA,6.3,56,0,0,4.5,4.5,14.5,34.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mother Ignacia - Ang uliran",1998,100,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Mother India",1957,172,NA,7.1,206,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Mother Ireland",1998,52,NA,2.8,10,44.5,24.5,0,14.5,0,0,0,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Mother Is a Freshman",1949,81,NA,6.4,39,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mother Lode",1982,101,NA,5,154,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mother Machree",1928,75,750000,3.9,23,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Mother Night",1996,114,5500000,7.1,1232,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Mother Pluto",1936,9,NA,7.3,50,0,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Mother Riley Meets the Vampire",1952,74,NA,3.4,54,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mother Teresa",1986,81,NA,7.1,18,14.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Mother Teresa: In the Name of God's Poor",1997,95,NA,5.3,29,0,0,0,4.5,24.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mother Was a Rooster",1962,6,NA,6.4,22,0,0,0,4.5,14.5,4.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mother Wore Tights",1947,107,NA,6.3,82,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Mother's Boys",1994,96,NA,4.8,433,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mother's Day",1948,22,NA,5.9,9,0,0,0,24.5,0,24.5,24.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Mother's Day",1980,98,150000,4.6,487,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mother's Joy",1923,20,NA,5.2,8,0,0,0,14.5,34.5,34.5,0,14.5,0,0,"",0,0,1,0,0,0,1 -"Mother's Meat Freuds Flesh",1984,93,NA,5.4,8,24.5,14.5,0,0,0,0,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Mother, Jugs & Speed",1976,95,NA,5.4,604,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mother, Mother",1989,30,NA,3.7,9,0,0,14.5,14.5,0,24.5,0,0,24.5,34.5,"",0,0,0,1,0,0,1 -"Mothering Heart, The",1913,23,1800,7.1,35,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Mothers Cry",1930,76,NA,6,14,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Mothers and Daughters",1992,90,NA,7.8,5,0,0,0,0,24.5,24.5,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Mothers and Daughters",2004,83,NA,9.4,22,0,0,0,0,0,4.5,4.5,4.5,44.5,44.5,"",0,0,0,1,0,0,0 -"Mothers, Fathers, and Other Strangers",2004,17,NA,7.5,6,0,0,0,0,0,0,45.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Mothlight",1963,4,NA,6.9,155,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Mothman Prophecies, The",2002,119,42000000,6.5,11073,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Motion",2001,65,NA,6.3,12,24.5,0,4.5,0,0,4.5,0,4.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Motion & Emotion",1990,90,NA,5.9,6,0,14.5,0,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Motion Painting No. 1",1947,11,NA,7.3,18,0,0,14.5,0,0,0,14.5,34.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Motives",2004,87,NA,4.5,135,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Motivos de Luz, Los",1985,96,NA,4.8,7,0,0,14.5,0,24.5,0,14.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Motor Mania",1950,7,NA,7.8,49,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Motor Patrol",1950,67,NA,5.6,5,0,24.5,0,24.5,0,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Motor Psycho",1965,74,38000,4.9,151,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Motorama",1991,90,NA,5.4,377,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Motorcycle",2000,14,NA,7,7,0,0,0,0,14.5,14.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,1 -"Motorcycle Gang",1957,78,NA,4.5,18,14.5,14.5,0,4.5,14.5,24.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Motorizzate, Le",1963,90,NA,7.2,5,0,0,0,0,24.5,24.5,24.5,0,44.5,0,"",0,0,1,0,0,0,0 -"Motown",2003,94,NA,4.6,31,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Mots bleus, Les",2005,114,NA,7.3,29,0,0,4.5,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Mots magiques, Les",1998,21,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Motsurave",1981,105,NA,6.4,7,0,0,0,0,0,14.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Mou man tai",1999,105,NA,5.1,26,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Mou mian bi",1994,90,NA,7.2,15,4.5,0,0,0,4.5,14.5,44.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Mouchette",1967,90,NA,8.2,405,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Moulin Rouge",1928,137,NA,8.6,19,14.5,4.5,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Moulin Rouge",1934,70,NA,7,12,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Moulin Rouge",1952,119,1500000,7.4,630,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Moulin Rouge!",2001,127,52500000,7.7,47689,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"PG-13",0,0,0,1,0,1,0 -"Mouna Ragam",1986,146,NA,8.7,64,0,4.5,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Mountain Family Robinson",1980,100,NA,5.3,52,14.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Mountain Gorilla",1992,40,NA,5.6,10,0,14.5,24.5,0,14.5,24.5,24.5,0,14.5,14.5,"",0,0,0,0,1,0,1 -"Mountain Justice",1937,83,NA,6.7,13,0,0,0,0,4.5,34.5,24.5,34.5,0,4.5,"",0,0,0,1,0,1,0 -"Mountain King, The",2000,20,NA,5.8,18,14.5,14.5,0,0,14.5,0,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Mountain Men, The",1980,102,NA,5.7,211,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mountain Rhythm",1939,61,NA,7.4,6,0,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mountain Road, The",1960,102,NA,5.8,77,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mountain of Fire: The Search for the True Mount Sinai",2002,46,NA,3.8,9,24.5,0,0,0,0,0,0,0,24.5,45.5,"",0,0,0,0,1,0,0 -"Mountain, The",1956,105,NA,6.5,245,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mountains of the Moon",1990,136,NA,7.3,648,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mountaintop Motel Massacre",1986,95,NA,2.9,99,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mourir d'aimer",1970,120,NA,6.3,31,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mourning Becomes Electra",1947,121,NA,6.1,107,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mouse Cleaning",1948,7,NA,7.8,33,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Mouse Comes to Dinner, The",1945,7,NA,6.6,34,0,0,0,4.5,4.5,14.5,24.5,44.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mouse Divided, A",1953,7,NA,7,30,0,0,0,4.5,0,24.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mouse Into Space",1962,7,NA,3.5,26,14.5,4.5,14.5,14.5,14.5,14.5,4.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Mouse Mazurka",1949,7,NA,7.1,22,0,0,0,0,4.5,14.5,44.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mouse Menace",1946,7,NA,6.5,23,0,0,4.5,4.5,14.5,24.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Mouse That Jack Built, The",1959,7,NA,8.2,39,0,0,4.5,0,14.5,0,14.5,24.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Mouse That Roared, The",1959,83,NA,7,1407,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mouse Trouble",1944,7,NA,7.9,51,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Mouse Wreckers",1948,7,NA,7.9,67,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Mouse and Garden",1960,6,NA,7.6,24,0,0,4.5,0,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mouse and His Child, The",1977,83,NA,6.7,68,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,44.5,"",0,1,0,0,0,0,0 -"Mouse for Sale",1955,7,NA,6,24,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mouse from H.U.N.G.E.R., The",1967,7,NA,6.1,18,0,14.5,4.5,0,4.5,24.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Mouse in Manhattan",1945,8,NA,7.6,52,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Mouse on 57th Street, The",1961,6,NA,6.7,24,4.5,0,0,4.5,4.5,14.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Mouse on the Moon, The",1963,82,NA,6.3,208,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mouse, The",1996,98,NA,4.4,23,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Mouse-Merized Cat, The",1946,6,NA,6.2,25,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mouse-Placed Kitten",1959,6,NA,7.1,22,0,0,0,0,14.5,14.5,34.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Mouse-Taken Identity",1957,7,NA,6.6,21,0,0,0,4.5,4.5,4.5,34.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Mouse-Warming",1952,7,NA,7.4,9,0,0,0,0,24.5,24.5,14.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Mousehunt",1997,99,38000000,5.8,4637,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Mousitsa, I",1959,83,NA,5.4,7,0,0,14.5,14.5,24.5,24.5,14.5,0,0,0,"",0,0,1,0,0,1,0 -"Moustachu, Le",1987,90,NA,5.7,17,0,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Moutarde me monte au nez, La",1974,92,NA,5.6,96,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mouth to Mouth",1978,96,NA,8.1,6,0,0,0,0,14.5,14.5,0,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Mouthpiece, The",1932,86,NA,7.3,22,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Move",1970,90,NA,4.6,25,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Move On",1903,1,NA,5,22,0,0,4.5,24.5,34.5,4.5,4.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Move Over, Darling",1963,99,NA,6.8,525,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Movers & Shakers",1985,79,NA,4.3,68,14.5,4.5,24.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Movie Album Featurettes",1935,10,NA,4.9,7,0,0,0,45.5,0,24.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Movie Album, The",1931,10,NA,6.3,19,0,4.5,0,0,24.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,1,0,1 -"Movie Crazy",1932,98,675000,7.4,129,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Movie Hero, The",2003,98,NA,6.1,59,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Movie House Massacre, The",1984,75,NA,4,25,24.5,14.5,24.5,4.5,0,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Movie Maniacs",1936,18,NA,7.7,68,4.5,4.5,4.5,4.5,0,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Movie Movie",1978,105,NA,6.3,196,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Movie Night",1929,20,NA,7.7,15,0,4.5,0,0,4.5,14.5,14.5,4.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Movie Pests",1944,11,NA,7.6,20,0,0,0,0,0,14.5,14.5,34.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Movie Star, A",1916,24,NA,5.7,15,0,0,0,24.5,4.5,44.5,24.5,4.5,0,0,"",0,0,1,0,0,0,1 -"Movie, A",1958,12,NA,7.4,130,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Moviemakers, The",1971,13,NA,6.4,8,0,0,0,0,24.5,24.5,0,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Moving",1988,89,NA,5.3,659,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Moving",2002,97,9000,7.9,9,0,0,24.5,0,0,0,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Moving Alan",2003,85,NA,4.8,17,4.5,0,0,24.5,0,4.5,14.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Moving August",2002,96,NA,5.8,32,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Moving Day",1936,9,NA,8.1,57,0,0,0,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Moving Malcolm",2003,83,1000000,4.3,40,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Moving Out",1983,91,NA,5,11,0,0,4.5,24.5,14.5,0,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Moving Pyramid, The",2001,9,NA,6.1,7,0,14.5,0,0,0,0,0,24.5,44.5,14.5,"",0,1,0,0,0,0,1 -"Moving Target",1997,106,NA,4.9,56,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,0,4.5,"R",1,0,0,1,0,0,0 -"Moving Targets",1998,90,NA,3.4,26,34.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"PG-13",0,0,0,0,0,0,0 -"Moving Violation",1976,91,NA,4.5,26,4.5,4.5,14.5,4.5,34.5,14.5,0,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Moving Violations",1985,90,NA,4.4,616,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Moving the Mountain",1994,83,NA,6.4,38,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Mowaten we Mokhber we Haramy",2001,135,NA,6.1,16,14.5,14.5,0,0,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Moy drug Ivan Lapshin",1984,100,NA,8,95,0,4.5,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Moy lyubimyy kloun",1986,86,NA,8.5,18,0,0,0,0,0,0,14.5,24.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Moy mladshiy brat",1962,104,NA,7,6,0,0,0,0,0,0,64.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Moya moryachka",1990,80,NA,4.8,10,14.5,24.5,0,0,0,0,34.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mozambique",1965,98,NA,4.8,13,14.5,0,4.5,34.5,4.5,14.5,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Mozart",1955,87,NA,6.9,9,0,0,0,0,14.5,0,34.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Mozart Story, The",1948,91,NA,6.2,11,0,0,4.5,0,14.5,4.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Mozart in Turkey",2000,90,NA,8,6,0,0,0,0,0,14.5,0,45.5,34.5,0,"",0,0,0,0,1,0,0 -"Moziklip",1987,75,NA,8.1,14,0,0,0,0,0,4.5,4.5,0,24.5,64.5,"",0,0,0,0,0,0,0 -"Moznosti dialogu",1982,14,NA,8.2,114,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Mr 3000",2004,104,30000000,5.7,1459,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Mr Firecul",2004,15,NA,9.6,19,0,0,0,0,0,4.5,0,0,14.5,74.5,"",0,0,1,0,0,0,1 -"Mr In-Between",2001,98,NA,5.9,178,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Mr India",1987,179,NA,7.7,96,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",1,0,1,1,0,0,0 -"Mr Jinnah: The Making of Pakistan",1997,90,NA,8.6,8,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,1,0,0 -"Mr Wrong",1985,88,NA,5,47,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Mr. & Mrs. '55",1955,157,NA,6.3,23,0,0,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,1,0 -"Mr. & Mrs. Bridge",1990,126,NA,6.4,540,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mr. & Mrs. Smith",1941,95,NA,6.5,848,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mr. Accident",2000,88,NA,3.8,213,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Mr. Ace",1946,84,NA,5,13,4.5,4.5,4.5,14.5,24.5,24.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Mr. Arkadin",1955,95,NA,7.3,575,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mr. Atlas",1997,99,NA,3.2,25,24.5,4.5,24.5,4.5,24.5,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Mr. B Natural",1957,29,NA,3.3,106,45.5,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Mr. Barrington",2003,100,NA,5.8,14,14.5,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Mr. Baseball",1992,108,NA,5.4,1592,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mr. Belvedere Goes to College",1949,83,NA,6.6,77,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mr. Belvedere Rings the Bell",1951,87,NA,6.7,70,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mr. Billion",1977,89,NA,5,100,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,1,0 -"Mr. Blabbermouth!",1942,19,NA,6,32,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Mr. Blandings Builds His Dream House",1948,94,NA,7.2,1499,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mr. Bluesman",1993,101,NA,4.6,26,34.5,0,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mr. Boggs Steps Out",1938,68,NA,6,6,14.5,0,0,0,0,34.5,0,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Mr. Bones",2001,101,NA,3,304,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Mr. Chedworth Steps Out",1939,92,NA,5.7,7,0,0,0,14.5,0,14.5,74.5,0,0,0,"",0,0,0,1,0,0,0 -"Mr. Condom",1997,98,NA,5,10,14.5,14.5,0,24.5,24.5,0,14.5,0,0,34.5,"",0,0,1,0,0,1,0 -"Mr. Death: The Rise and Fall of Fred A. Leuchter, Jr.",1999,91,NA,7.3,1181,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,0,1,0,0 -"Mr. Deeds",2002,96,50000000,5.5,11729,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Mr. Deeds Goes to Town",1936,115,NA,7.9,2282,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Mr. Denning Drives North",1952,93,NA,6.6,41,0,4.5,0,4.5,4.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mr. Destiny",1990,110,NA,5.9,2264,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mr. Dodd Takes the Air",1937,87,NA,5.4,16,0,0,0,14.5,34.5,34.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Mr. Duck Steps Out",1940,8,NA,7.6,41,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Mr. Edison at Work in His Chemical Laboratory",1897,1,NA,4.6,15,4.5,0,4.5,24.5,24.5,24.5,14.5,0,4.5,4.5,"",0,0,0,0,1,0,0 -"Mr. Emmanuel",1944,94,NA,6.2,12,0,0,4.5,4.5,4.5,14.5,24.5,4.5,24.5,0,"",0,0,0,1,0,0,0 -"Mr. Flip",1909,4,NA,2.9,15,14.5,24.5,4.5,34.5,4.5,14.5,4.5,0,0,0,"",0,0,1,0,0,0,1 -"Mr. Forbush and the Penguins",1971,101,NA,7.2,42,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mr. Freedom",1969,95,NA,5.8,39,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mr. Hex",1946,63,NA,5.7,27,4.5,0,0,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mr. Hobbs Takes a Vacation",1962,116,NA,6.6,577,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mr. Holland's Opus",1995,143,NA,7.1,9273,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Mr. Hoover and I",1989,90,NA,5.2,10,14.5,0,14.5,0,0,34.5,14.5,0,34.5,14.5,"",0,0,0,0,1,0,0 -"Mr. Horatio Knibbles",1971,60,NA,7.1,11,0,0,0,0,4.5,14.5,4.5,0,4.5,45.5,"",0,0,1,0,0,0,0 -"Mr. Hurry-up",1907,7,NA,4.4,5,24.5,0,24.5,0,44.5,0,0,0,0,24.5,"",0,0,1,0,0,0,1 -"Mr. Imperium",1951,87,NA,4.6,37,4.5,4.5,4.5,24.5,4.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Mr. James and the Plug of Mystery",2004,5,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,1,0,0,0,1 -"Mr. Jealousy",1997,103,NA,6,477,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Mr. Jones",1993,114,NA,5.5,1140,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Mr. Kingstreet's War",1973,92,NA,5.9,13,4.5,0,0,4.5,0,14.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mr. Love",1985,91,NA,6.8,25,4.5,4.5,0,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mr. Lucky",1943,100,NA,7.1,311,4.5,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Mr. Magoo",1997,87,NA,3.3,2744,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,1,0 -"Mr. Majestyk",1974,103,NA,6.2,626,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Mr. Mari's Girls",1967,63,NA,6.2,9,14.5,0,24.5,0,14.5,0,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Mr. McAllister's Cigarette Holder",1994,20,NA,5.9,7,0,0,14.5,0,24.5,0,14.5,24.5,0,14.5,"",0,0,0,1,0,0,1 -"Mr. Mean",1977,98,NA,4.9,10,14.5,0,0,14.5,14.5,14.5,0,0,0,64.5,"",1,0,0,1,0,0,0 -"Mr. Mike's Mondo Video",1979,75,NA,4.1,125,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mr. Mom",1983,92,NA,6.2,3787,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mr. Moto Takes a Chance",1938,63,NA,6.4,38,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mr. Moto Takes a Vacation",1939,65,NA,6.1,43,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mr. Moto in Danger Island",1939,64,NA,6.5,44,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mr. Moto's Gamble",1938,60,NA,6,51,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mr. Moto's Last Warning",1939,71,NA,6.4,120,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mr. Mouse Takes a Trip",1940,8,NA,6.4,41,4.5,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Mr. Muggs Rides Again",1945,63,NA,7.4,62,4.5,4.5,4.5,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Mr. Muggs Steps Out",1943,63,NA,8,55,0,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Mr. Music",1950,110,NA,5.9,43,4.5,0,0,4.5,14.5,34.5,24.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Mr. Nanny",1993,84,NA,3,1607,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mr. Nice Guy",1987,92,NA,4.3,46,4.5,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mr. No Legs",1981,90,NA,4.8,10,34.5,14.5,0,0,24.5,0,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Mr. Nobody Holme Buys a Jitney",1916,1,NA,4.2,21,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,0,"",0,1,1,0,0,0,1 -"Mr. Noisy",1946,17,NA,8.1,6,0,0,0,0,0,0,34.5,45.5,14.5,0,"",0,0,1,0,0,0,1 -"Mr. North",1988,93,NA,5.6,299,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mr. P's Dancing Sushi Bar",1997,90,NA,6.7,15,4.5,0,0,4.5,0,4.5,14.5,4.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Mr. Patman",1980,97,NA,4.2,16,4.5,0,0,45.5,4.5,0,14.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Mr. Peabody and the Mermaid",1948,89,NA,6.4,141,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mr. Perrin and Mr. Traill",1948,92,NA,5.1,9,0,0,0,14.5,44.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Mr. Reliable",1996,112,NA,6.6,161,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Mr. Resistor",1993,8,NA,7.9,38,0,0,0,0,4.5,14.5,14.5,24.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Mr. Ricco",1975,98,NA,5.2,147,0,0,0,4.5,14.5,24.5,44.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Mr. Rice's Secret",2000,113,NA,5.6,157,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Mr. Robinson Crusoe",1932,76,NA,5.6,41,0,0,4.5,24.5,14.5,44.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mr. Rookie",2002,118,NA,5.7,9,0,0,0,14.5,0,14.5,34.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Mr. Sardonicus",1961,89,NA,6.5,210,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mr. Saturday Night",1992,119,NA,5.6,1176,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mr. Skeffington",1944,145,NA,7.5,485,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Mr. Skitch",1933,70,NA,5.8,14,0,0,0,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mr. Smith Gets a Hustler",2002,83,NA,4.8,53,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"R",0,0,0,1,0,0,0 -"Mr. Smith Goes to Washington",1939,129,1500000,8.4,11565,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Mr. Soft Touch",1949,93,NA,7.2,13,0,0,0,0,14.5,24.5,4.5,34.5,0,24.5,"",0,0,0,1,0,1,0 -"Mr. Soogy",1996,45,NA,8,6,14.5,0,0,0,0,0,14.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Mr. Suave hoy! hoy! hoy! hoy! hoy! hoy!",2003,100,NA,5.7,5,0,0,0,44.5,0,0,44.5,24.5,0,0,"",0,0,1,0,0,1,0 -"Mr. Sycamore",1975,87,NA,4.5,19,0,4.5,4.5,0,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Mr. Topaze",1961,97,NA,6.1,19,14.5,0,0,4.5,4.5,24.5,0,14.5,0,44.5,"",0,0,1,1,0,0,0 -"Mr. Universe",1951,79,NA,8.9,7,0,14.5,0,0,0,0,0,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Mr. Universe",1988,98,NA,5.9,7,0,0,0,0,45.5,0,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Mr. Vincent",1997,90,NA,6.6,43,4.5,0,0,4.5,4.5,4.5,34.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Mr. Whitney Had a Notion",1949,11,NA,7.3,7,0,0,0,0,24.5,0,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Mr. Winkle Goes to War",1944,80,NA,6.3,37,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Mr. Wise Guy",1942,70,NA,6.1,67,0,0,4.5,4.5,14.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Mr. Wonderful",1993,98,NA,5.7,729,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Mr. Wong in Chinatown",1939,71,NA,5.2,69,0,4.5,4.5,4.5,34.5,24.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Mr. Wong, Detective",1938,70,NA,5.5,103,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mr. Write",1994,89,NA,3.2,81,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mr. Wrong",1996,96,NA,3.4,1772,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Mr. Wu",1927,91,NA,7,54,4.5,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mr. and Mrs. Is the Name",1935,7,NA,7,6,0,14.5,0,0,14.5,14.5,0,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Mr. and Mrs. Iyer",2002,123,NA,7.8,204,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mr. and Mrs. North",1942,67,NA,7,20,0,0,0,0,24.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mrigayaa",1976,119,NA,6.5,13,0,0,0,0,0,14.5,0,34.5,0,45.5,"",0,0,0,0,0,0,0 -"Mrs Caldicot's Cabbage War",2000,110,NA,6.6,117,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mrs Craddock's Complaint",1997,18,NA,8.4,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Mrs Meitlemeihr",2002,30,NA,8.7,19,0,0,0,0,0,4.5,14.5,24.5,14.5,44.5,"",0,0,1,1,0,0,1 -"Mrs. Barrington",1974,86,NA,5.6,8,0,0,0,0,14.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Mrs. Brown",1997,103,NA,7.3,2761,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"PG",0,0,0,1,0,1,0 -"Mrs. Brown, You've Got a Lovely Daughter",1968,95,NA,4.9,56,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mrs. Dalloway",1997,97,NA,6.8,665,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Mrs. Doubtfire",1993,125,NA,6.4,19744,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mrs. Jones' Lover; or, 'I Want My Hat'",1909,5,NA,3.1,5,24.5,0,24.5,44.5,24.5,0,0,0,0,0,"",0,0,1,0,0,0,1 -"Mrs. Mike",1949,99,NA,5.2,32,4.5,4.5,0,0,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mrs. Miniver",1942,134,NA,7.6,1668,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Mrs. Munck",1995,96,NA,4,29,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,0,4.5,"R",0,0,1,1,0,0,0 -"Mrs. O'Malley and Mr. Malone",1951,69,NA,6.7,43,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mrs. Parker and the Vicious Circle",1994,126,NA,6.3,1396,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mrs. Parkington",1944,124,NA,7.1,103,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Mrs. Pollifax -- Spy",1971,110,NA,4.7,32,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Mrs. Soffel",1984,112,NA,6,629,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Mrs. Wiggs of the Cabbage Patch",1934,80,NA,5.7,55,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mrs. Winterbourne",1996,105,25000000,5.8,1310,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Mrtav 'ladan",2002,90,NA,8.2,70,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Ms. 45",1981,81,62000,6.3,500,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ms. Bear",1997,102,NA,5,33,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mu Ma Ren",1982,106,NA,6.1,12,0,0,0,0,34.5,0,4.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Mu Sa Do",2002,93,NA,3.6,24,24.5,4.5,4.5,0,4.5,0,14.5,24.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Mu di di Shanghai",2003,86,NA,5.2,10,14.5,14.5,44.5,0,0,14.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Mu mien jia sha",1985,98,NA,6.2,16,0,0,0,4.5,34.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mu-Mu",1998,101,NA,3.1,25,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"MuM",1999,7,NA,4.4,22,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,0,34.5,"",0,1,0,1,0,0,1 -"Mua he chieu thang dung",2000,112,NA,7,1021,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Mua len trau",2004,102,NA,6,20,0,0,0,14.5,4.5,14.5,24.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mua oi",2000,100,NA,7.5,24,4.5,0,0,4.5,0,14.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Much Ado",2003,86,10000,6,11,4.5,4.5,0,0,0,14.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Much Ado About Mousing",1964,7,NA,5.7,24,0,0,24.5,14.5,4.5,24.5,14.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Much Ado About Nothing",1993,111,8000000,7.5,12491,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Much Ado About Nutting",1953,7,NA,8.1,24,4.5,4.5,0,0,0,4.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Mucha sangre",2002,82,NA,4.3,63,14.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Muchacha de las bragas de oro, La",1980,105,NA,6.6,22,4.5,0,4.5,4.5,14.5,4.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Muchachos de antes no usaban gomina, Los",1937,90,NA,8.1,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,1,1,0,0,0 -"Muchachos de antes no usaban gomina, Los",1969,115,NA,5.7,6,0,0,0,0,14.5,34.5,14.5,0,34.5,0,"",0,0,1,0,0,0,0 -"Muchachos de mi barrio, Los",1970,97,NA,7.6,5,0,0,0,24.5,0,0,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Mucho Locos",1966,6,NA,6,15,0,0,4.5,0,14.5,34.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mucho Mouse",1957,7,NA,6.1,27,4.5,0,14.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Mud Season",1999,102,NA,5.9,19,0,0,0,0,4.5,4.5,34.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Mud and Sand",1922,40,NA,5.4,39,4.5,0,0,4.5,14.5,14.5,34.5,4.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Mudar de Vida",1966,94,NA,8.9,7,0,0,0,0,0,0,14.5,0,74.5,14.5,"",0,0,0,1,0,0,0 -"Muddy Romance, A",1913,11,NA,4.8,16,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,0,0,"",0,0,1,0,0,0,1 -"Mudge Boy, The",2003,94,800000,6.8,204,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Mudhalvan",1999,169,NA,5.3,27,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Mudhoney",1965,92,60000,5.6,140,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mudjima Family",2002,99,NA,6.9,24,0,0,4.5,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mudlark, The",1950,99,NA,7.2,101,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mudo mundo",2000,12,NA,7.8,18,14.5,0,4.5,0,4.5,0,0,0,0,74.5,"",0,0,0,0,0,0,1 -"Mue puen",1983,140,NA,8.1,12,4.5,0,0,0,4.5,0,14.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Muerte busca un hombre, La",1970,99,NA,4.9,5,0,0,24.5,0,64.5,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Muerte de Mikel, La",1984,90,NA,6,15,4.5,0,4.5,0,0,34.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Muerte de un ciclista",1955,88,NA,7.7,107,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Muerte en la carretera",1976,8,NA,4.6,5,44.5,24.5,0,0,0,0,0,0,24.5,24.5,"",0,0,0,1,0,0,1 -"Muerte llama a las diez, La",1974,90,NA,5.3,6,0,0,14.5,0,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Muerte silba un blues, La",1964,76,NA,7.6,5,0,0,0,0,44.5,0,0,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Muerto de amor",2002,133,NA,4.9,9,24.5,0,0,14.5,45.5,14.5,0,0,0,0,"",0,0,1,0,0,1,0 -"Muerto hace las maletas, El",1972,81,NA,4,31,14.5,4.5,24.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Muertos comunes",2004,99,NA,6.1,15,0,4.5,4.5,0,0,44.5,4.5,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Muertos de risa",1999,111,3500000,6.3,334,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Muertos no perdonan, Los",1963,84,NA,3,5,24.5,24.5,0,24.5,0,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Muertos, Los",2004,78,NA,5.4,67,14.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Muffin Man",2003,93,NA,3.5,21,14.5,4.5,0,4.5,0,0,14.5,4.5,24.5,14.5,"",0,0,1,0,0,0,0 -"MugShot",1995,136,NA,5.6,7,14.5,0,0,14.5,0,0,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Mugger, The",1958,74,NA,4.8,12,14.5,4.5,0,4.5,24.5,14.5,0,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Muggers",2000,97,NA,6.3,101,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mughal-E-Azam",1960,173,NA,6.9,138,4.5,0,0,0,0,4.5,4.5,14.5,14.5,64.5,"",0,0,0,1,0,1,0 -"Mugunghwaggoti pieotseubnida",1995,152,NA,1.4,5,64.5,44.5,0,0,0,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Muhammad Ali, the Greatest",1969,94,NA,6.9,26,4.5,4.5,0,4.5,0,14.5,14.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Muhomatsu no issho",1958,103,NA,7.4,43,0,0,0,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Muhsin Bey",1987,145,NA,8.6,177,4.5,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Mui du du xanh",1993,104,NA,7.3,1195,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mujer bajo la lluvia, Una",1992,89,NA,6.2,24,4.5,0,4.5,14.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mujer de la tierra caliente, La",1979,79,NA,4.8,12,4.5,4.5,14.5,34.5,0,4.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Mujer de mi padre, La",1968,84,NA,1.3,8,24.5,0,0,0,0,0,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mujer de mi vida, La",2001,103,NA,4.6,13,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Mujer de todos, La",1946,95,NA,7.8,10,0,0,0,0,0,0,14.5,34.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Mujer del gato, La",1970,92,NA,3.5,6,34.5,0,0,14.5,0,0,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Mujer del juez, La",1984,90,NA,4.8,5,24.5,0,24.5,24.5,24.5,0,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Mujer del puerto, La",1991,110,NA,7.5,49,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Mujer es un buen negocio, La",1977,107,NA,7.2,5,24.5,0,0,0,0,24.5,0,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Mujer que llegaba a las seis, La",1991,10,NA,8.1,18,14.5,0,0,0,0,0,0,4.5,34.5,44.5,"",0,0,0,1,0,0,1 -"Mujer sin alma, La",1944,129,NA,8.1,6,0,0,0,0,14.5,0,0,45.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mujer sin amor, Una",1952,85,NA,6.9,53,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mujer, Una",1975,98,NA,4.5,5,0,24.5,24.5,24.5,24.5,0,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Mujeres al borde de un ataque de nervios",1988,90,700000,7.5,3894,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Mujeres infieles",1995,90,NA,5.8,17,4.5,0,14.5,14.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mujeres infieles",2004,107,NA,3.9,18,4.5,14.5,4.5,4.5,14.5,34.5,0,0,0,14.5,"",0,0,1,1,0,0,0 -"Mujeres insumisas",1995,120,NA,6.3,24,14.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Mujeres que trabajan",1938,90,NA,8.3,6,0,0,0,0,0,14.5,14.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Mujeres son cosa de guapos, Las",1981,90,NA,5.4,16,0,0,4.5,14.5,0,0,14.5,44.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mujhse Dosti Karoge!",2002,149,NA,6,133,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Muk lau hung gwong",1999,90,NA,6.6,139,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Mukhamukham",1984,107,NA,6.3,6,14.5,0,0,0,14.5,0,14.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Mukta",1994,154,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,0,0,0,0,0 -"Mulan",1998,88,70000000,7.2,11192,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Mule Skinner Blues",2001,93,NA,6.3,37,4.5,4.5,4.5,0,14.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Mule Train",1950,69,NA,6.7,13,0,0,4.5,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mule, La",2000,8,NA,4.4,10,0,0,0,34.5,14.5,34.5,14.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Muleupgwa muleupsai",1984,97,NA,7.5,6,14.5,0,0,14.5,0,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Mulher Objeto",1981,125,NA,6,32,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mulher Sensual, A",1981,112,NA,2.3,6,45.5,0,0,0,14.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Mulher de Todos, A",1970,93,NA,8.2,11,0,4.5,0,0,0,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Mulher que Acreditava Ser Presidente Dos EUA, A",2003,114,NA,4.7,35,14.5,0,14.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mulholland Dr.",2001,147,15000000,7.9,35504,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Mulholland Falls",1996,107,NA,5.8,3155,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Mulino del Po, Il",1948,96,NA,7.6,6,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Mulino delle donne di pietra, Il",1960,94,NA,6.7,75,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mulit",2003,10,NA,6.2,19,4.5,0,14.5,0,0,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Mull",1989,90,NA,6.1,17,0,0,14.5,4.5,4.5,14.5,45.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Mullet",2001,89,1000000,5.9,164,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Mulletville",2002,93,NA,6.6,27,24.5,14.5,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Mulligans!",1997,23,NA,3.1,11,24.5,0,0,14.5,4.5,4.5,0,4.5,0,24.5,"",0,0,1,1,0,0,1 -"Mullin mallin",1961,71,NA,4.2,10,14.5,14.5,0,34.5,34.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Multi-Facial",1994,20,3000,6.7,175,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Multiple Futures",1995,108,NA,5.4,7,14.5,24.5,14.5,0,0,0,0,0,0,44.5,"",0,0,1,1,0,0,0 -"Multiple Maniacs",1970,90,5000,6.6,238,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Multiple Sidosis",1970,10,NA,8.9,6,0,14.5,0,0,0,14.5,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Multiplicity",1996,117,45000000,5.7,5241,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Mum's the Word",1926,24,NA,6.7,26,0,14.5,4.5,0,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Mumbai Express",2005,152,NA,6.5,30,4.5,4.5,14.5,4.5,0,4.5,24.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Mumbai Matinee",2003,125,NA,4.6,20,4.5,4.5,14.5,14.5,34.5,0,0,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Mumbai Se Aaya Mera Dost",2003,146,NA,3.6,19,14.5,24.5,14.5,4.5,24.5,0,14.5,4.5,0,14.5,"",1,0,1,0,0,1,0 -"Mumbo Jumbo, The",2000,82,NA,2.5,20,14.5,14.5,0,14.5,0,0,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Mumford",1999,112,28000000,6.9,3384,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Mumi-troll i drugie",1978,21,NA,9.8,5,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,1,0,0,0,0,1 -"Mumia Abu-Jamal: A Case for Reasonable Doubt?",1997,75,NA,6.3,27,24.5,0,0,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Mummia, al-",1969,102,NA,6.2,31,4.5,0,0,4.5,14.5,4.5,4.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Mummie",2003,7,NA,3.4,16,4.5,0,14.5,0,14.5,14.5,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Mummy Lives, The",1993,97,NA,3.2,55,14.5,14.5,24.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mummy Returns, The",2001,130,98000000,6.1,23551,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Mummy Strikes, The",1943,8,NA,6.1,45,0,4.5,4.5,4.5,4.5,44.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Mummy Theme Park, The",2000,88,NA,4.1,8,34.5,0,14.5,0,24.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Mummy an' the Armadillo",2004,100,NA,8,36,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Mummy and the Curse of the Jackals, The",1969,86,NA,1.1,9,44.5,24.5,0,0,14.5,0,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Mummy's Boys",1936,68,NA,6.5,11,4.5,0,0,4.5,14.5,0,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mummy's Curse, The",1944,62,NA,5.1,183,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mummy's Dummies",1948,15,NA,7.3,49,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Mummy's Ghost, The",1944,61,NA,5,192,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mummy's Hand, The",1940,67,NA,5.9,249,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mummy's Kiss, The",2003,88,NA,2.5,79,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Mummy's Shroud, The",1967,90,NA,4.8,115,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mummy's Tomb, The",1942,71,NA,5.3,189,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mummy, The",1932,73,196000,7.2,2001,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mummy, The",1959,88,NA,6.6,635,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mummy, The",1999,124,76000000,6.5,36216,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Mumsy, Nanny, Sonny and Girly",1969,101,NA,5.8,34,4.5,4.5,4.5,0,4.5,0,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Mumya firarda",2002,105,NA,2.6,31,44.5,4.5,14.5,4.5,4.5,0,4.5,4.5,0,4.5,"",1,0,1,0,0,0,0 -"Munchie",1992,81,NA,3.4,77,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Munchie Strikes Back",1994,94,NA,2.5,50,34.5,14.5,14.5,4.5,4.5,0,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Munchies",1987,83,NA,2.6,175,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mundl - Ein echter Wiener geht nicht unter",1975,100,NA,8.5,80,4.5,0,0,4.5,4.5,4.5,4.5,4.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Mundo de los vampiros, El",1961,83,NA,3.1,16,14.5,4.5,14.5,4.5,14.5,14.5,0,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mundo depravados",1967,73,NA,2.8,11,24.5,24.5,0,0,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Mundo menos peor, Un",2004,90,NA,6.6,23,4.5,0,0,4.5,4.5,4.5,24.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Mundo raro, Un",2001,100,NA,6.1,43,4.5,4.5,0,0,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mundo sigue, El",1965,124,NA,8,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Munekata kyoudai",1950,112,NA,7.5,71,0,0,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mungsing Sifan",1992,97,NA,6.3,16,4.5,0,0,4.5,0,24.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Munje!",2001,90,NA,6.7,261,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Munkbrogreven",1935,83,NA,5.9,43,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Muno no hito",1991,107,NA,7.9,15,4.5,0,0,4.5,0,4.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Munster, Go Home",1966,96,NA,5.4,232,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Munting tinig, Mga",2002,109,NA,6.1,42,4.5,0,0,14.5,4.5,4.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Muppet Christmas Carol, The",1992,89,NA,6.9,3356,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Muppet Movie, The",1979,95,NA,7.3,5890,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Muppet Musicians of Bremen, The",1972,50,NA,7.2,29,0,0,0,4.5,0,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Muppet Treasure Island",1996,99,NA,6.1,2004,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Muppet*vision 3-D",1991,20,NA,8.5,286,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Muppets From Space",1999,88,24000000,6,2766,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Muppets Take Manhattan, The",1984,94,NA,6.4,2441,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Muqaddar Ka Sikandar",1978,189,NA,7,97,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,1,0 -"Mur",2004,100,NA,8.2,22,0,0,0,0,4.5,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Mur de l'Atlantique, Le",1970,135,NA,5.2,73,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mur, Le",1998,67,NA,6.4,59,0,0,0,14.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Mura di Sana, Le",1964,13,NA,6.5,9,0,0,0,0,14.5,14.5,44.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Muralla verde, La",1970,110,NA,7.8,44,0,0,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Muraren",2002,95,NA,6.6,44,0,4.5,0,4.5,0,24.5,24.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Murarz",1973,18,NA,6.6,17,4.5,0,0,0,14.5,4.5,44.5,24.5,4.5,0,"",0,0,0,0,1,0,1 -"Murasaki Shikibu: Genji monogatari",1987,110,NA,6.2,8,14.5,0,24.5,0,14.5,14.5,14.5,0,0,24.5,"",0,1,0,1,0,1,0 -"Murbah Swamp Beer",2002,7,3000,6.7,13,14.5,0,4.5,0,0,14.5,14.5,14.5,0,34.5,"",0,0,1,0,1,0,1 -"Murder Act One",2003,11,NA,9.2,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,0,0,0,0,0,1 -"Murder Ahoy",1964,93,NA,6.7,492,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Murder Blues",1990,90,NA,3.2,12,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Murder Elite",1985,98,NA,4.7,9,0,0,14.5,24.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Murder In Soho",1939,70,NA,5.1,11,0,0,14.5,14.5,24.5,4.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Murder Is My Beat",1955,77,NA,5.9,18,4.5,14.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Murder Man, The",1935,69,NA,7,113,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Murder Men, The",1961,73,NA,6.1,7,0,0,0,14.5,0,24.5,44.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Murder Most Foul",1964,90,NA,6.9,443,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Murder One",1988,82,NA,5.2,66,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Murder Over New York",1940,65,NA,6.9,96,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Murder Psalm",1980,16,NA,8.1,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,0,0,0,0,0,1 -"Murder She Said",1961,87,NA,7.2,593,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Murder Story",1989,89,NA,4.6,16,4.5,14.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Murder Weapon",1990,90,NA,1.7,26,34.5,14.5,24.5,0,4.5,0,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Murder Without Tears",1953,65,NA,3.4,5,0,0,44.5,0,24.5,0,0,24.5,0,24.5,"",1,0,0,0,0,0,0 -"Murder at 1600",1997,108,NA,5.9,4458,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Murder at Glen Athol",1936,64,NA,6.8,15,0,24.5,0,0,4.5,34.5,4.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Murder at Midnight",1931,69,NA,5.2,21,0,0,4.5,24.5,4.5,34.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Murder at the Gallop",1963,81,NA,7,496,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Murder at the Vanities",1934,89,NA,5.8,37,4.5,0,4.5,14.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Murder by Contract",1958,81,NA,7,69,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Murder by Death",1976,94,NA,7.1,3746,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Murder by Decree",1979,124,NA,6.9,497,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Murder by Invitation",1941,67,NA,5.5,11,0,0,4.5,4.5,4.5,45.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Murder by Numbers",1990,85,NA,3.7,11,14.5,0,24.5,34.5,4.5,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Murder by Numbers",2001,51,NA,4.7,24,4.5,14.5,0,24.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,1,0,0 -"Murder by Numbers",2002,120,50000000,6,8358,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Murder by Phone",1982,79,NA,4.9,71,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Murder by Proxy",1954,87,NA,5.2,9,0,14.5,0,24.5,34.5,0,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Murder by Television",1935,60,NA,3.8,63,14.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Murder by an Aristocrat",1936,60,NA,6.3,20,0,4.5,14.5,4.5,24.5,34.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Murder by the Clock",1931,76,NA,6.3,14,0,0,0,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Murder in China Basin, The",1999,89,NA,4.7,18,4.5,0,14.5,14.5,0,0,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Murder in Harlem",1935,102,NA,3.2,10,24.5,0,14.5,14.5,0,34.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Murder in the Air",1940,55,NA,4.1,43,14.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Murder in the Big House",1942,59,NA,6.2,15,0,0,0,14.5,14.5,24.5,34.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Murder in the Blue Room",1944,61,NA,7,27,0,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Murder in the Cathedral",1952,114,NA,8.3,7,0,0,0,0,0,14.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Murder in the Clouds",1934,61,NA,5.5,8,0,0,0,14.5,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Murder in the First",1995,122,NA,7,4555,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Murder in the Fleet",1935,69,NA,6,19,0,0,4.5,4.5,14.5,24.5,34.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Murder in the Museum, The",1934,65,NA,6,8,0,14.5,14.5,0,14.5,24.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Murder in the Music Hall",1946,60,NA,6.8,9,0,0,0,0,14.5,34.5,0,44.5,14.5,0,"",0,0,0,0,0,0,0 -"Murder in the Private Car",1934,63,NA,8,25,0,0,0,0,14.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Murder of Emmett Till, The",2003,53,NA,6.3,39,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Murder of Fred Hampton, The",1971,88,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Murder on a Bridle Path",1936,66,NA,6.4,40,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Murder on a Honeymoon",1935,74,NA,6.9,74,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Murder on the Blackboard",1934,71,NA,6.8,68,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Murder on the Campus",1933,73,NA,6.1,10,0,0,0,14.5,44.5,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Murder on the Orient Express",1974,128,NA,7.1,4038,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Murder on the Waterfront",1943,49,NA,5.2,21,4.5,0,14.5,14.5,34.5,14.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Murder with Pictures",1936,69,NA,5.5,12,0,0,0,0,24.5,4.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Murder!",1930,102,NA,6.6,588,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Murder, He Says",1945,91,NA,7,162,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Murder, Inc.",1960,99,NA,6.1,121,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Murder, My Sweet",1944,90,NA,7.5,948,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Murder-Set-Pieces",2004,105,2000000,4.9,37,24.5,4.5,4.5,0,4.5,0,0,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Murder: Ultimate Grounds for Divorce",1984,95,NA,4.8,6,14.5,34.5,0,14.5,0,0,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Murdercycle",1999,90,NA,2.3,122,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Murdered Innocence",1995,80,NA,5.4,20,0,14.5,0,4.5,14.5,24.5,14.5,14.5,0,24.5,"R",0,0,0,0,0,0,0 -"Murderers' Row",1966,105,NA,5.3,187,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Murderock - uccide a passo di danza",1984,90,NA,5,83,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Murderous Camouflage",2002,84,NA,6.8,8,24.5,0,0,0,0,0,24.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Murders in the Rue Morgue",1932,61,190000,6.1,189,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Murders in the Rue Morgue",1971,87,700000,4.9,137,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Murders in the Zoo",1933,62,NA,6.9,85,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Muriel ou Le temps d'un retour",1963,115,NA,7.5,158,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Muriel's Wedding",1994,106,3000000,7.1,6685,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Muro de silencio, Un",1993,107,NA,4.1,10,14.5,0,0,0,14.5,24.5,0,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Muro del silencio, El",1971,105,NA,8,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Muro di gomma, Il",1991,120,NA,7.3,47,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Muro-ami",1999,120,NA,5.5,38,4.5,4.5,0,4.5,14.5,4.5,34.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Murph the Surf",1975,101,NA,5.4,28,0,0,4.5,14.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Murphy's Law",1986,100,NA,5.1,428,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Murphy's Romance",1985,107,NA,6.6,962,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Murphy's War",1971,107,NA,6.6,415,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Murs du silence, Les",1998,30,NA,9.2,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,0,0,1,0,1 -"Musa",2001,132,60000000,7.5,1730,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Musafir",1957,149,NA,8.2,6,0,0,0,0,0,0,14.5,64.5,0,14.5,"",0,0,0,0,0,0,0 -"Musashino fujin",1951,88,NA,7.2,40,4.5,0,0,0,0,14.5,34.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Muscle Beach Party",1964,94,NA,4.7,135,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Muscle Beach Tom",1956,7,NA,6.3,26,4.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Muscle Tussle",1953,7,NA,6.7,21,0,0,0,4.5,4.5,4.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Muscle Up a Little Closer",1957,17,NA,5.4,47,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Muse, The",1999,97,15000000,5.6,3513,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Muses orphelines, Les",2000,107,NA,6.3,61,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Mush and Milk",1933,20,NA,7.8,38,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Mushrooms",1995,103,NA,7.1,22,0,4.5,0,0,4.5,4.5,0,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Music Box",1989,124,NA,7.1,985,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Music Box Kid, The",1960,75,NA,2.7,6,14.5,0,14.5,14.5,0,14.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Music Box, The",1932,30,NA,8.1,773,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Music From Another Room",1998,104,NA,6.5,1025,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,0,0,1,0 -"Music Is Magic",1935,66,NA,5.9,14,0,0,4.5,14.5,14.5,24.5,24.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Music Land",1935,10,NA,8.1,61,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Music Lovers, The",1970,123,NA,6.7,302,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Music Machine, The",1979,93,NA,2,5,0,44.5,0,0,0,24.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Music Man",1948,66,NA,7.8,28,4.5,4.5,0,0,4.5,14.5,24.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Music Man, The",1962,151,NA,7.5,3943,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Music Mice-Tro, The",1967,6,NA,6.8,10,0,0,14.5,0,0,44.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Music for Madame",1937,81,NA,7,18,0,4.5,0,14.5,14.5,0,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Music for Millions",1944,115,NA,6.5,79,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Music for One Apartment and Six Drummers",2001,10,NA,7.7,137,0,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Music for the Movies: Toru Takemitsu",1994,58,NA,4.9,13,4.5,0,0,0,0,4.5,0,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Music from the Inside Out",2004,89,NA,8.2,9,0,0,0,0,14.5,0,34.5,0,24.5,34.5,"",0,0,0,0,1,0,0 -"Music in Manhattan",1944,81,NA,5.6,13,0,0,0,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Music in My Heart",1940,70,NA,6.2,40,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Music in the Air",1934,85,NA,6.3,17,0,14.5,4.5,4.5,14.5,14.5,4.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Music of Chance, The",1993,98,NA,6.8,596,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Music of Erich Zann, The",1980,17,NA,6.7,17,4.5,0,0,0,0,0,4.5,24.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Music of the Heart",1999,124,27000000,6.6,2348,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Music of the Spheres",1984,72,NA,6,10,0,0,0,0,24.5,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Musica per vecchi animali",1989,109,NA,8.7,19,0,0,0,0,0,0,24.5,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Musica, La",1967,95,NA,5.3,6,14.5,0,0,0,0,0,0,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Musical Doctor, The",1932,10,NA,6.6,8,0,0,0,0,14.5,34.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Musical Farmer",1932,7,NA,5.9,10,0,0,0,0,24.5,45.5,0,0,0,34.5,"",0,1,1,0,0,0,1 -"Musical Justice",1931,11,NA,7.5,9,0,0,0,0,14.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Musical Masterpieces",1946,10,NA,6.4,6,0,0,0,14.5,0,14.5,45.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Musical Moments from Chopin",1946,8,NA,7.7,6,0,0,14.5,0,0,14.5,0,34.5,34.5,0,"",0,1,1,0,0,0,1 -"Musical Mountaineers",1939,6,NA,5.4,21,0,0,4.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Musical Movieland",1944,21,NA,5.4,14,4.5,0,4.5,0,24.5,34.5,14.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Musik im Blut",1955,107,NA,6.3,6,0,0,0,0,0,64.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Musikk for bryllup og begravelser",2002,97,NA,6.6,98,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Musikparade",1956,89,NA,4.3,6,0,0,14.5,0,14.5,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Musketeer, The",2001,104,40000000,4.4,3966,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,1,0 -"Musketeers Forever",1998,99,NA,4.1,41,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Musketeers of Pig Alley, The",1912,17,NA,7,102,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Musorshchik",2001,95,NA,4,79,34.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Muss 'em Up",1936,70,NA,7,26,4.5,0,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mussolini: Ultimo atto",1974,91,NA,6.1,55,4.5,4.5,4.5,14.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Must Be the Music",1996,20,NA,7.4,38,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Mustaa valkoisella",1968,95,NA,6.6,15,0,4.5,0,4.5,14.5,24.5,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Mustafa hakkinda hersey",2004,119,NA,8.7,215,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Mustang",1975,94,NA,6.3,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Mustang Country",1976,79,NA,5.7,24,0,0,4.5,4.5,24.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mustard Bath",1993,110,NA,2.4,31,4.5,14.5,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Mustergatte, Der",1937,95,NA,5.9,21,0,0,0,0,24.5,4.5,44.5,14.5,4.5,0,"",0,0,1,0,0,1,0 -"Musty Musketeers",1954,16,NA,6.5,24,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Musuko",1991,121,NA,8,26,0,0,4.5,0,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Musulmanin",1995,110,NA,6.6,48,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mutande pazze",1992,97,NA,4.4,26,34.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Mutant Aliens",2001,81,200000,6.4,223,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,1,1,0,0,0,0 -"Mutant Man",1996,77,NA,2.7,37,74.5,4.5,4.5,4.5,4.5,0,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Mutant Species",1995,100,1750000,2.8,42,34.5,14.5,14.5,14.5,4.5,4.5,0,0,0,4.5,"R",0,0,0,0,0,0,0 -"Mutanten",2002,95,NA,5.7,19,0,0,4.5,0,24.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Mutantes, Os",1998,113,NA,7.3,129,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Mutations, The",1973,92,NA,4,94,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mutator",1989,91,NA,3.1,18,24.5,24.5,14.5,14.5,0,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Mute Love",1999,59,NA,3.7,15,14.5,24.5,0,14.5,4.5,0,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Mute Witness",1994,95,2000000,6.8,1202,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Muthal Mariyathai",1985,160,NA,8.9,16,0,0,0,0,4.5,0,4.5,34.5,0,45.5,"",0,0,0,0,0,0,0 -"Muthers, The",1976,101,NA,4.7,27,14.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Muthyala Muggu",1975,165,NA,8.4,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Mutilator",1991,5,NA,7,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,1,0,0,0,0,1 -"Mutilator, The",1985,86,NA,3.6,127,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mutiny",1952,77,NA,4.5,23,4.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Mutiny",1998,27,NA,5.2,11,0,0,4.5,0,0,4.5,0,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Mutiny Ain't Nice",1938,6,NA,5.2,7,0,0,0,44.5,0,24.5,0,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Mutiny On the Buses",1972,89,NA,5.4,85,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Mutiny in Outer Space",1965,80,NA,3.5,13,14.5,4.5,4.5,0,24.5,4.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mutiny on the Bounty",1935,127,1950000,7.8,2548,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Mutiny on the Bounty",1962,178,19000000,6.9,1397,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Mutiny on the Bunny",1950,7,NA,7.2,61,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Mutt in a Rut, A",1959,6,NA,6.7,21,0,0,0,0,4.5,24.5,14.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Mutter Courage und ihre Kinder",1961,151,NA,6.8,9,0,0,0,14.5,34.5,0,0,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mutter des Killers, Die",1996,72,NA,6.3,28,0,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Mutters Courage",1995,93,NA,6.9,56,0,4.5,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mutters Maske",1988,85,NA,6.9,19,14.5,14.5,4.5,0,0,0,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Muttertag",1993,95,NA,7.7,298,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Mutts About Racing",1958,7,NA,5.1,11,0,24.5,0,4.5,14.5,34.5,0,0,0,4.5,"",0,1,1,0,0,0,1 -"Mutts to You",1938,18,NA,7,60,0,4.5,4.5,14.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Mutual Admiration Society",2002,89,NA,9.6,9,0,0,0,0,0,0,0,14.5,24.5,64.5,"",0,0,1,1,0,0,0 -"Mutual Appreciation",2005,110,NA,7.8,12,0,4.5,0,0,0,4.5,24.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Mutual Love Life",1999,11,NA,6.5,40,4.5,4.5,14.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Mutual Needs",1997,94,NA,3.7,65,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Muuttolinnun aika",1991,95,NA,4.7,10,0,24.5,0,14.5,14.5,34.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Muvtal Batito, Ha-",1987,80,NA,8.3,6,0,0,0,0,14.5,0,14.5,14.5,0,45.5,"",0,0,1,0,0,0,0 -"Muzhiki!",1981,94,NA,8.2,9,0,0,0,0,0,24.5,0,0,45.5,24.5,"",0,0,0,1,0,0,0 -"Muzi v offsidu",1931,95,NA,6.1,11,0,0,0,4.5,24.5,4.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Muzungu",1999,100,NA,6.9,30,4.5,0,4.5,0,4.5,14.5,34.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Muzykalnaya istoriya",1940,84,NA,8,6,0,0,0,0,0,0,14.5,45.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Muzzle Tough",1954,7,NA,7.1,26,0,0,0,4.5,0,14.5,45.5,24.5,4.5,0,"",0,1,1,0,0,0,1 -"My 5 Wives",2000,100,NA,4.4,245,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"My Ain Folk",1973,55,NA,6.8,22,0,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"My American Cousin",1985,90,NA,6,152,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"My American Vacation",1999,89,NA,4.9,19,14.5,4.5,14.5,0,14.5,14.5,4.5,0,14.5,34.5,"",0,0,1,1,0,0,0 -"My Architect: A Son's Journey",2003,116,NA,7.5,445,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"My Baby Just Cares for Me",1987,5,NA,6.7,21,0,0,0,0,0,24.5,14.5,34.5,14.5,0,"",0,1,0,0,0,0,1 -"My Baby's Daddy",2004,88,NA,3.8,632,24.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"My Beautiful Laundrette",1985,97,400000,6.9,2152,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"My Best Friend Is a Vampire",1988,89,NA,5.2,427,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"My Best Friend's Wedding",1997,105,46000000,6.4,16648,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"My Best Girl",1927,80,483103,8,143,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,1,0 -"My Big Fat Greek Wedding",2002,95,5000000,6.9,21675,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,0,0,1,0 -"My Big Fat Independent Movie",2005,80,NA,6,62,44.5,0,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"My Bill",1938,64,NA,6.9,32,0,0,0,4.5,0,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"My Blind Brother",2003,14,NA,5.8,22,0,4.5,4.5,0,24.5,4.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"My Blood Runs Cold",1965,104,NA,5.8,29,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"My Bloody Valentine",1981,91,NA,4.8,588,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"My Blue Heaven",1950,96,NA,5.7,40,14.5,4.5,0,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"My Blue Heaven",1990,97,NA,6,3331,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"My Body",1997,30,NA,5,16,14.5,4.5,0,4.5,0,0,34.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"My Body's Revolting",2002,15,12260,7.4,5,24.5,0,0,0,0,0,24.5,0,24.5,44.5,"",0,0,1,0,0,0,1 -"My Bodyguard",1980,102,NA,6.5,1564,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"My Boss's Daughter",2003,90,14000000,4.1,2765,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"My Boy",1921,55,NA,5.7,29,0,0,14.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"My Boyfriend's Back",1993,85,NA,4.4,637,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"My Boys Are Good Boys",1978,90,NA,6.6,5,0,0,0,24.5,0,44.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"My Breakfast with Blassie",1983,60,NA,6.8,127,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"My Brilliant Career",1979,100,NA,7.6,452,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"My Brother Jack",1998,92,NA,8.8,10,0,14.5,0,0,0,0,0,14.5,24.5,64.5,"",0,0,0,1,0,0,0 -"My Brother Talks to Horses",1947,92,NA,6.6,39,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"My Brother Tom",2001,111,NA,6.8,175,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"My Brother the Pig",1999,92,NA,5,108,14.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"My Brother's Keeper",1948,96,NA,5.8,25,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"My Brother's Light",2002,90,NA,8.8,23,0,4.5,0,4.5,4.5,4.5,0,0,4.5,74.5,"",0,0,1,1,0,0,0 -"My Brother's Wedding",1983,115,NA,8.2,12,0,0,0,0,4.5,4.5,0,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"My Brother's Wife",1966,71,NA,3.7,9,24.5,0,0,0,14.5,14.5,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"My Bunny Lies Over the Sea",1948,7,NA,7.1,94,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"My Chauffeur",1986,97,NA,4.9,326,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"My Child, My Land",1998,4,NA,7.4,6,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,1,0,0,0,0,1 -"My Childhood",1972,46,NA,7,22,0,0,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"My Chorus",2000,14,NA,6.5,47,4.5,0,4.5,0,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,1,0,0,0,1 -"My Cousin Rachel",1952,98,NA,7,190,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"My Cousin Vinny",1992,120,11000000,7.2,10877,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"My Crasy Life",1992,95,NA,8.6,7,0,0,0,0,0,14.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"My Daddy Can Lick Your Daddy",1962,22,NA,8.3,7,0,0,0,0,14.5,0,24.5,14.5,0,44.5,"",0,0,0,0,0,0,1 -"My Dark Days",2001,90,NA,8.4,12,4.5,4.5,0,0,0,0,0,4.5,0,74.5,"",0,0,0,0,0,0,0 -"My Darling Clementine",1946,102,NA,8,2488,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"My Daughter's Keeper",1993,89,NA,6.2,10,14.5,0,0,0,0,44.5,34.5,0,24.5,0,"",0,0,0,0,0,0,0 -"My Daughter's Tears",2002,92,NA,8.3,7,0,14.5,0,0,14.5,0,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"My Dear Miss Aldrich",1937,74,NA,6.3,33,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"My Dear Secretary",1949,94,NA,5.7,103,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"My Dear Uncle Sherlock",1977,24,NA,1,7,84.5,0,0,14.5,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"My Demon Lover",1987,90,NA,3.2,198,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"My Dinner with Andre",1981,110,NA,7.3,1829,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"My Dinner with Jimi",2003,90,NA,6.1,21,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"My Dinner with Ovitz",2002,12,NA,6,5,0,0,0,44.5,24.5,0,0,24.5,24.5,0,"",0,0,1,0,0,0,1 -"My Dog Shep",1946,62,NA,6,5,0,0,0,0,44.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"My Dog Skip",2000,95,7000000,7.1,3109,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"My Dream Is Yours",1949,101,NA,6.5,112,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"My Engagement Party",1998,94,NA,1.4,16,34.5,14.5,0,0,0,4.5,0,0,14.5,34.5,"",0,0,1,0,0,1,0 -"My Fair Lady",1964,170,17000000,7.8,12721,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"My Family",1995,128,5500000,7,859,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"My Family Treasure",1993,95,NA,7.3,16,4.5,4.5,14.5,0,0,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"My Father Eduardo",2004,15,NA,8.8,5,0,0,0,0,24.5,0,0,0,24.5,64.5,"",0,0,0,1,0,0,1 -"My Father Is Coming",1991,82,NA,5.5,37,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"My Father the Hero",1994,90,NA,5.1,1724,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"My Father's Angel",1999,86,NA,6.1,34,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"My Father's Hands",1999,27,NA,4.7,14,0,0,0,14.5,24.5,14.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"My Father's Son",2002,80,60000,8.4,9,0,0,0,0,0,0,0,24.5,34.5,44.5,"",0,0,0,0,1,0,0 -"My Father's Story",1999,11,NA,3.7,14,4.5,4.5,24.5,24.5,14.5,0,0,0,14.5,14.5,"",0,0,0,0,0,0,1 -"My Father, Rua Alguem 5555",2003,100,NA,6.6,20,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"My Father, the Genius",2002,84,NA,7,28,0,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"My Favorite Blonde",1942,78,NA,7.2,208,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"My Favorite Brunette",1947,87,NA,6.9,357,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"My Favorite Duck",1942,7,NA,7,42,0,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"My Favorite Martian",1999,93,60000000,4.5,1942,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"My Favorite Spy",1942,86,NA,6.1,35,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"My Favorite Spy",1951,93,NA,6.8,148,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"My Favorite Wife",1940,75,NA,7.3,1102,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"My Favorite Year",1982,92,NA,7.3,1775,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"My Fellow Americans",1996,101,21500000,6.3,2752,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"My Feminism",1997,55,NA,4.3,6,14.5,0,0,14.5,0,0,14.5,0,0,45.5,"",0,0,0,0,1,0,0 -"My Financial Career",1962,7,NA,8.1,14,0,0,0,0,4.5,0,14.5,24.5,24.5,34.5,"",0,1,0,0,0,0,1 -"My First Mister",2001,109,NA,7.2,1593,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"My First Suit",1985,30,NA,7.7,7,0,0,0,0,14.5,0,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"My First Wife",1984,96,NA,6.8,42,0,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"My Flesh and Blood",2003,83,NA,8.8,239,4.5,0,4.5,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"My Foolish Heart",1949,99,NA,6.9,94,4.5,0,4.5,0,4.5,14.5,14.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"My Forbidden Past",1951,70,NA,5.9,85,4.5,4.5,0,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"My Friend Flicka",1943,89,NA,6.4,92,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"My Friend Irma",1949,103,NA,6,177,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"My Friend Irma Goes West",1950,91,NA,5.5,62,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"My Friend Joe",1996,102,NA,7.6,59,4.5,4.5,0,0,4.5,14.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"My Friend Paul",1999,58,NA,6.3,23,0,0,0,0,24.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,1,0,0 -"My Friend the Monkey",1939,7,NA,4.7,11,0,0,4.5,24.5,34.5,14.5,0,0,0,4.5,"",0,1,1,0,0,0,1 -"My Friend's Love Affair",2001,25,NA,6,6,0,0,0,0,14.5,14.5,0,34.5,0,34.5,"",0,0,1,0,0,1,1 -"My Friends Need Killing",1976,73,NA,3.5,7,14.5,0,24.5,0,0,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"My Gal Sal",1942,103,NA,6.3,70,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"My Geisha",1962,119,NA,5.8,235,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"My Generation",2000,103,NA,6.9,66,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"My Giant",1998,103,NA,4.9,1246,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,1,0,0,0 -"My Girl",1991,102,16500000,6.3,5591,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"My Girl 2",1994,99,NA,4.8,2040,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"My Girl Tisa",1948,95,NA,6.7,17,0,0,0,0,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"My Grandfather Is a Vampire",1991,95,NA,4.6,27,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"My Grandfather's Clock",1934,17,NA,6.4,15,4.5,0,4.5,0,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"My Grandmother Ironed the King's Shirts",1999,11,NA,6.1,43,4.5,0,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,"",0,1,0,0,0,0,1 -"My Green Fedora",1935,7,NA,6.9,14,0,0,0,0,4.5,44.5,0,44.5,0,4.5,"",0,1,1,0,0,0,1 -"My Gun Is Quick",1957,90,NA,5.3,19,0,4.5,14.5,14.5,34.5,4.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"My Horny Valentine",1997,90,NA,5.9,9,0,0,24.5,0,14.5,0,14.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"My Hustler",1965,79,0,7,39,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"My Josephine",2003,9,NA,7.4,7,0,0,14.5,0,0,0,0,14.5,24.5,44.5,"",0,0,0,1,0,0,1 -"My Khmer Heart",2000,95,NA,6.4,11,4.5,0,0,0,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"My Kingdom",2001,117,NA,6.1,149,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"My Knees Were Jumping: Remembering the Kindertransports",1996,76,NA,7.3,7,0,0,0,0,0,0,24.5,24.5,44.5,0,"",0,0,0,0,1,0,0 -"My Learned Friend",1943,74,NA,8.7,40,0,0,0,0,0,0,14.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"My Left Foot",1989,98,NA,7.6,5011,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"My Life So Far",1999,98,NA,6.6,665,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"My Life Without Me",2003,107,NA,7.6,3017,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,1,0 -"My Life as a Troll",2001,88,NA,5.6,11,4.5,0,14.5,0,0,0,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"My Life with Caroline",1941,81,NA,6.1,41,0,4.5,0,4.5,4.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"My Life with Count Dracula",2003,74,NA,1.1,23,34.5,4.5,0,0,0,0,0,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"My Life's in Turnaround",1993,84,22000,3.9,196,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"My Little Chickadee",1940,83,NA,7.3,335,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"My Little Duckaroo",1954,7,NA,7.4,33,0,0,0,4.5,4.5,0,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"My Little Eye",2002,92,3000000,5.9,2244,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"My Little Girl",1986,118,NA,4.3,84,34.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"My Little Pony: The Movie",1986,89,NA,5.1,157,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,1,0,0,0,0,0 -"My Love Came Back",1940,85,NA,6.1,39,0,0,4.5,0,24.5,24.5,24.5,14.5,4.5,0,"",0,0,1,1,0,0,0 -"My Lover My Son",1970,96,NA,4.4,39,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"My Lucky Star",1938,90,NA,6.2,20,4.5,0,4.5,14.5,14.5,14.5,34.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"My Man Godfrey",1936,94,NA,8,2390,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"My Man Godfrey",1957,92,NA,5.9,167,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"My Man and I",1952,99,NA,5.1,34,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"My Mom's a Werewolf",1989,80,NA,3.2,117,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"My Mother Dreams the Satan's Disciples in New York",1998,30,NA,6.9,44,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,"",0,0,0,0,0,0,1 -"My Mother Frank",2000,95,NA,6.9,189,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"My Mother India",2001,52,NA,6.2,11,0,0,0,14.5,0,24.5,0,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"My Name Is Joe",1998,105,NA,7.4,1810,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"R",0,0,0,1,0,1,0 -"My Name Is Julia Ross",1945,65,NA,7.9,42,0,0,0,0,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"My Name Is Modesty: A Modesty Blaise Adventure",2003,78,NA,4.3,203,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"My Name Is Tanino",2002,124,NA,6.9,171,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"My New Gun",1992,99,NA,5.4,202,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"My Nightmare",1993,5,NA,6,21,4.5,0,4.5,14.5,4.5,4.5,14.5,34.5,0,4.5,"",0,0,0,0,0,0,1 -"My Old Man's Place",1971,93,NA,5,6,0,0,0,14.5,0,34.5,0,14.5,0,34.5,"",0,0,0,1,0,0,0 -"My Old Town",1948,10,NA,5.5,7,0,0,0,14.5,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"My Other Wheelchair Is a Porsche",2002,12,NA,4.9,9,0,24.5,0,44.5,0,14.5,24.5,0,0,0,"",0,0,0,1,0,0,1 -"My Outlaw Brother",1951,82,NA,5.2,13,14.5,0,4.5,4.5,34.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"My Own Private Idaho",1991,102,2500000,6.7,5619,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"My Pal Gus",1952,83,NA,6.4,28,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"My Pal Trigger",1946,79,NA,6.2,66,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"My Pal Wolf",1944,75,NA,5.3,10,0,0,0,14.5,14.5,64.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"My Past",1931,72,NA,5.6,11,0,0,0,44.5,14.5,4.5,4.5,4.5,4.5,0,"",0,0,0,1,0,1,0 -"My Pleasure Is My Business",1975,94,NA,2.9,16,4.5,34.5,14.5,14.5,14.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"My Polish Waiter",1995,12,NA,5.2,24,24.5,4.5,0,4.5,0,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"My Pop, My Pop",1940,7,NA,5.6,5,0,0,0,24.5,0,0,24.5,64.5,0,0,"",0,1,1,0,0,0,1 -"My Reputation",1946,94,NA,6.4,76,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"My Samurai",1992,87,700000,3.8,20,24.5,14.5,14.5,24.5,14.5,0,0,4.5,0,14.5,"",1,0,0,0,0,0,0 -"My Science Project",1985,94,NA,5.1,729,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"My Side of the Mountain",1969,100,NA,6,136,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"My Sin",1931,80,NA,6.1,10,14.5,0,0,0,24.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"My Sister Eileen",1942,96,NA,7.2,60,0,4.5,0,4.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"My Sister Eileen",1955,108,NA,7,184,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,1,0 -"My Six Convicts",1952,104,NA,6.4,17,4.5,0,0,0,14.5,24.5,24.5,24.5,0,4.5,"",0,0,1,1,0,0,0 -"My Six Loves",1963,101,NA,6,91,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"My Son the Fanatic",1997,87,NA,7,494,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"My Son, My Son",1940,115,NA,5.9,6,0,0,0,14.5,14.5,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"My Song for You",1934,85,NA,4.5,7,0,14.5,0,44.5,14.5,24.5,0,0,0,0,"",0,0,1,0,0,1,0 -"My Stepmother Is an Alien",1988,105,16000000,4.7,4080,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"My Summer of Love",2004,86,NA,7.3,222,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"My Sweet Home",2001,86,NA,4.5,37,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"My Sweet Killer",1999,77,NA,6.1,88,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"My Sweet Satan",1994,19,NA,5.4,84,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"My Tango with Porn",2003,40,NA,2,11,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,0,0,"",0,0,0,0,1,0,1 -"My Teacher's Wife",1995,89,NA,5.2,224,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"My Teenage Daughter",1956,100,NA,4.5,16,14.5,0,14.5,14.5,4.5,14.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"My Tomato",1943,8,NA,6.4,14,0,0,0,0,34.5,14.5,24.5,4.5,14.5,0,"",0,0,1,0,0,0,1 -"My Tutor",1983,97,NA,4.5,386,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"My Uncle Berns",2003,88,NA,6.1,8,0,0,0,0,14.5,0,34.5,0,24.5,24.5,"",0,0,0,0,1,0,0 -"My Way Home",1978,71,NA,6.1,21,0,0,0,4.5,14.5,0,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"My Wife's Best Friend",1952,87,NA,6.4,14,0,0,0,4.5,4.5,24.5,0,0,44.5,24.5,"",0,0,1,0,0,0,0 -"My Wife's Relations",1922,25,NA,6.8,109,4.5,4.5,4.5,4.5,4.5,14.5,44.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"My Wild Irish Rose",1947,101,NA,5.3,70,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"My World Dies Screaming",1958,85,NA,4.2,52,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"My Wrongs 8245-8249 and 117",2002,12,NA,6.8,144,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"My X-Girlfriend's Wedding Reception",2001,88,500000,5.8,24,24.5,0,4.5,4.5,0,4.5,4.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"My iz Kronshtadta",1936,88,NA,7.4,11,0,0,0,0,0,34.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"My iz dzhaza",1983,89,NA,6,43,0,0,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Myeongja aggiggo sonya",1992,150,NA,1.9,7,74.5,24.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Myortvyy sezon",1968,138,NA,8.9,11,0,0,0,0,0,4.5,14.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Myra Breckinridge",1970,91,5000000,4,431,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Myrt and Marge",1933,62,NA,6.1,7,0,14.5,0,0,14.5,14.5,44.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Myster General, The",2002,53,NA,9.1,7,0,0,0,0,0,14.5,0,14.5,0,74.5,"",0,0,1,0,1,0,0 -"Mysterien eines Frisiersalons",1923,25,NA,8.5,10,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Mysteries",1978,97,NA,4.4,35,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mysteries from Beyond Earth",1975,105,NA,4.2,10,14.5,14.5,14.5,34.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Mysteries of Egypt",1998,38,NA,6.5,151,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Mysterious Cafe, or Mr. and Mrs. Spoopendyke Have Troubles with a Waiter",1901,2,NA,5,13,0,0,0,24.5,34.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Mysterious Desperado, The",1949,61,NA,6.6,12,4.5,0,0,0,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Mysterious Doctor Satan",1940,267,NA,7.8,40,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Mysterious Doctor, The",1943,57,NA,5.5,61,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mysterious Dr. Fu Manchu, The",1929,80,NA,7.4,18,4.5,0,14.5,0,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mysterious Intruder",1946,61,NA,7.3,7,0,0,0,0,0,14.5,44.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Mysterious Island",1961,101,NA,6.7,593,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mysterious Island, The",1929,95,1130000,5.9,51,4.5,0,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mysterious Lady, The",1928,89,337000,7,78,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Mysterious Monsters, The",1976,86,NA,5.1,43,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Mysterious Moon Men of Canada, The",1989,22,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Mysterious Mose",1930,6,NA,6.8,14,0,0,0,0,4.5,24.5,24.5,4.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Mysterious Mr. Moto",1938,62,NA,5.9,44,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Mysterious Mr. Valentine, The",1946,56,NA,7.3,6,0,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Mysterious Mr. Wong, The",1934,63,NA,4.5,95,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mysterious Pilot, The",1937,300,NA,4.3,7,44.5,0,14.5,0,0,0,24.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Mysterious Rider, The",1938,74,NA,7,6,0,0,0,14.5,14.5,0,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Mysterious Skin",2004,99,NA,7.8,279,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Mysterium Occupation",2004,90,NA,8.7,17,0,0,0,0,0,0,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Mystery Date",1991,99,NA,5.6,459,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Mystery House",1938,56,NA,5.2,20,0,14.5,14.5,14.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Mystery In Swing",1940,68,NA,5.9,6,0,0,0,0,14.5,45.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Mystery Liner",1934,62,NA,4,20,4.5,4.5,34.5,34.5,24.5,4.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Mystery Man",1935,65,NA,5.4,5,0,0,0,64.5,0,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Mystery Man",1944,58,NA,7.3,18,0,0,0,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Mystery Men",1999,121,68000000,5.8,13331,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Mystery Monsters",1997,55,NA,2.5,31,24.5,4.5,14.5,24.5,4.5,4.5,4.5,0,0,0,"PG",0,0,0,0,0,0,0 -"Mystery Mountain",1934,223,80000,5.4,11,0,0,14.5,4.5,4.5,4.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Mystery Ranch",1932,56,NA,7.4,11,0,0,0,0,4.5,14.5,4.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mystery Science Theater 3000: The Movie",1996,73,NA,7,4738,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Mystery Squadron, The",1933,220,NA,6,11,0,0,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Mystery Street",1950,93,NA,6.8,133,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mystery Submarine",1950,78,NA,5.1,8,0,0,14.5,0,14.5,45.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Mystery Submarine",1963,92,NA,6.3,7,0,0,0,0,0,14.5,44.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Mystery Train",1931,62,NA,6.6,6,0,0,0,0,0,34.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Mystery Train",1989,113,2800000,7.2,2469,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Mystery at Castle House, The",1982,80,NA,4.3,17,4.5,4.5,0,14.5,14.5,24.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Mystery in Mexico",1948,66,NA,5.6,31,0,0,4.5,4.5,14.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Mystery of Edwin Drood",1935,87,NA,6.1,32,0,4.5,0,14.5,4.5,14.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Mystery of Edwin Drood, The",1993,112,NA,6.5,12,4.5,0,4.5,0,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Mystery of Marie Roget",1942,91,NA,4.4,8,0,14.5,0,14.5,24.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Mystery of Mr. Wong, The",1939,68,NA,5.7,52,0,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mystery of Mr. X, The",1934,84,NA,6.6,40,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Mystery of the 13th Guest",1943,60,NA,4.4,14,4.5,0,4.5,14.5,4.5,14.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Mystery of the Hooded Horsemen, The",1937,60,NA,6,11,0,0,0,14.5,24.5,24.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Mystery of the Leaping Fish, The",1916,20,NA,7.4,62,0,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Mystery of the Marie Celeste, The",1935,62,NA,6.1,51,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Mystery of the Maya",1995,38,NA,6.3,28,0,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Mystery of the Millon Dollar Hockey Puck, The",1975,83,NA,5.8,17,0,0,0,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Mystery of the River Boat",1944,218,NA,8.4,10,0,0,14.5,0,14.5,34.5,14.5,14.5,34.5,0,"",1,0,0,0,0,0,0 -"Mystery of the Wax Museum",1933,77,NA,6.8,321,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Mystery, Alaska",1999,119,28000000,6.4,5440,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Mystic India",2004,40,NA,9,9,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,1 -"Mystic Masseur, The",2001,117,2500000,5.2,157,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Mystic Motel, The",2003,27,NA,9.2,13,0,0,0,0,0,0,0,4.5,64.5,24.5,"",0,0,0,1,0,0,1 -"Mystic Pizza",1988,104,6000000,6.1,3767,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Mystic River",2003,137,30000000,8,28969,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Mystification ou L'histoire des portraits",2003,56,NA,6.4,21,14.5,14.5,0,0,0,4.5,0,4.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Mystique",1979,77,NA,6.8,5,0,0,0,0,0,24.5,24.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Myth of Fingerprints, The",1997,93,NA,6.2,926,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Myth of the Liberal Media, The",1998,60,NA,6.8,28,34.5,4.5,0,0,0,4.5,0,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Myth of the Male Orgasm, The",1993,90,NA,5.4,76,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Mythic Hero",2000,80,NA,6.6,14,24.5,0,0,14.5,0,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"N Is a Number",1993,57,NA,8.5,10,0,0,0,0,14.5,0,24.5,24.5,0,45.5,"",0,0,0,0,1,0,0 -"N!ai, the Story of a K!ung Woman",1980,59,NA,7.2,5,0,0,0,0,0,24.5,64.5,24.5,0,0,"",0,0,0,0,1,0,0 -"N'oublie pas que tu vas mourir",1995,122,NA,7.1,102,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"N-Word, The",2004,86,NA,5,15,4.5,4.5,0,4.5,0,4.5,4.5,24.5,0,44.5,"",0,0,0,0,1,0,0 -"N.B.T.",2003,90,65000,6.8,8,24.5,14.5,0,0,0,0,0,0,0,64.5,"",1,0,0,1,0,0,0 -"N.Y., N.Y.",1957,15,NA,7.4,5,0,0,24.5,0,0,0,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"NASCAR 3D: The IMAX Experience",2004,40,NA,7,167,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG",0,0,0,0,1,0,1 -"NYC 3/94",1994,9,NA,7.7,5,0,24.5,0,0,0,0,24.5,64.5,0,0,"",0,0,0,0,0,0,1 -"Na Boca da Noite",1971,68,NA,8.7,5,0,0,24.5,0,0,0,0,24.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Na Deribasovskoy khoroshaya pogoda, ili na Brayton Bich opyat idut dozhdi",1992,96,NA,5,82,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Na Garganta do Diabo",1960,100,NA,8.2,5,0,0,0,0,0,24.5,0,44.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Na Senda do Crime",1954,66,NA,8,7,0,0,0,0,0,0,44.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Na cidade vazia",2004,90,NA,9,20,0,4.5,0,0,0,14.5,4.5,24.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Na klancu",1971,97,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Na komete",1970,74,NA,7.1,51,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Na koniec swiata",1999,104,NA,4.2,12,14.5,4.5,14.5,24.5,4.5,14.5,0,0,0,4.5,"",0,0,0,1,0,1,0 -"Na malkiya ostrov",1958,94,NA,7.7,15,0,0,0,0,0,4.5,0,14.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Na mo naku mazushiku utsukushiku",1961,114,NA,7.7,6,0,0,0,0,0,0,14.5,0,45.5,34.5,"",0,0,0,1,0,0,0 -"Na putu za Katangu",1987,106,NA,7.2,7,0,0,0,0,0,0,45.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Na pytlacke stezce",1979,73,NA,3.8,14,14.5,0,0,0,24.5,14.5,44.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Na samote u lesa",1976,92,NA,7.8,97,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Na svoji vesni",2002,92,NA,3.1,37,44.5,4.5,4.5,0,4.5,4.5,0,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Na svoji zemlji",1948,110,NA,7.7,21,4.5,0,0,0,0,4.5,4.5,14.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Na voyne, kak na voyne",1968,90,NA,9.1,10,14.5,0,0,0,0,0,14.5,0,0,84.5,"",0,0,1,0,0,0,0 -"Na wylot",1973,94,NA,3.3,15,4.5,4.5,0,4.5,0,0,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Na zei kaneis i na mi zei",1966,96,NA,6.1,6,14.5,0,0,0,34.5,0,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Naach",2004,150,NA,6.3,23,0,0,0,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Naakt over de schutting",1973,98,NA,5.6,27,0,4.5,0,24.5,14.5,14.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Naam hoi sap saam long",1997,110,NA,8.4,24,0,0,0,0,0,0,4.5,24.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Naar de klote!",1996,104,NA,5.1,256,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Nabbeun namja",2001,100,NA,6.7,518,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Nabbie no koi",1999,92,NA,7.3,78,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Nabi",2001,106,NA,6.3,74,4.5,4.5,14.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Naboer",2005,75,NA,6.5,78,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Nabonga",1944,75,NA,3.8,19,14.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Nach Mitternacht",1981,110,NA,4.2,7,14.5,0,0,14.5,24.5,0,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Nach Saison",1997,125,NA,3.1,10,24.5,0,0,0,0,0,0,24.5,0,64.5,"",0,0,0,0,1,0,0 -"Nach dem Fall",1999,85,NA,7.9,27,0,4.5,0,4.5,0,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Nachalo",1970,91,NA,7.8,40,4.5,0,0,0,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Nachbar, Der",1993,92,NA,7.1,6,0,0,0,0,0,0,45.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Nachbarinnen",2004,88,NA,7,9,0,14.5,0,0,0,24.5,34.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Nachbarn",1999,15,NA,8.2,6,0,0,0,14.5,0,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Nacht der Gaukler",1996,90,NA,6.3,31,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Nacht der lebenden Loser, Die",2004,89,NA,6.2,108,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nacht im Mai, Eine",1938,88,NA,6.6,7,0,0,0,14.5,14.5,0,14.5,44.5,14.5,0,"",0,0,1,0,0,0,0 -"Nacht singt ihre Lieder, Die",2004,95,NA,5.6,36,14.5,14.5,4.5,0,14.5,4.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nacht van de wilde ezels, De",1990,102,NA,5,6,34.5,0,0,0,34.5,0,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Nacht vor der Premiere, Die",1959,99,NA,6.6,12,0,0,0,0,24.5,0,44.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Nachtfalter",2001,81,NA,3.1,18,34.5,14.5,0,4.5,0,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Nachtgestalten",1999,101,NA,7.7,228,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nachts, wenn der Teufel kam",1957,97,NA,7.1,95,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Nachtschatten",1972,96,NA,2.9,7,24.5,0,0,0,24.5,0,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Nachtschwester, Die",2000,28,NA,5,7,0,0,14.5,24.5,0,44.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Nachtvlinder",1999,92,NA,3.7,25,34.5,14.5,4.5,0,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nacional III",1982,102,NA,6.2,35,0,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nacionalna klasa",1979,105,NA,7.9,75,4.5,0,0,0,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Nackt",2002,100,NA,6.8,438,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Nackte Bovary, Die",1969,91,NA,3.1,11,14.5,14.5,4.5,14.5,4.5,4.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Nackte Mann auf dem Sportplatz, Der",1974,101,NA,9.1,13,0,0,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Nackte und der Satan, Die",1959,97,NA,3.2,24,4.5,0,14.5,14.5,14.5,4.5,4.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Nacktschnecken",2004,86,NA,5.7,60,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nad Niemnem",1987,174,NA,5.2,18,24.5,0,4.5,0,0,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Nad rzeka, ktorej nie ma",1991,85,NA,8.9,8,0,0,0,0,0,0,14.5,0,24.5,64.5,"",0,0,0,0,0,0,0 -"Nad tyomnoy vodoy",1993,95,NA,4.4,11,4.5,0,4.5,0,0,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nada",1947,120,NA,5.8,12,0,0,0,0,24.5,4.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Nada",1974,133,NA,6.4,101,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nada en la nevera",1998,92,NA,6.7,77,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Nada mas",2001,90,NA,5.1,101,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Nada que perder",2001,21,NA,7,6,0,0,0,0,14.5,14.5,34.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Nada x perder",2001,120,NA,3.9,17,24.5,14.5,0,14.5,14.5,0,0,24.5,0,4.5,"",1,0,0,0,0,0,0 -"Nadando em Dinheiro",1952,90,NA,7.7,6,0,0,0,0,14.5,14.5,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Nadar solo",2003,94,20000,7.5,86,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Nadare",1937,59,NA,9.3,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Nadia",1986,90,NA,5.4,8,0,0,0,24.5,0,14.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Nadia et les hippopotames",1999,102,NA,4.3,18,14.5,14.5,0,4.5,4.5,34.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Nadia: The Secret of Fuzzy",1991,85,NA,4.9,11,0,0,0,24.5,14.5,14.5,4.5,4.5,0,14.5,"",0,1,0,0,0,0,0 -"Nadie conoce a nadie",1999,108,3000000,6.3,565,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Nadie escuchaba",1984,117,NA,8.2,24,4.5,0,0,4.5,0,0,4.5,4.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Nadie te oye: Perfume de violetas",2001,110,NA,7.1,168,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Nadine",1987,78,NA,5.2,683,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nadja",1994,93,1000000,5.7,781,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Nadja",1995,25,NA,6.1,6,0,0,0,14.5,45.5,0,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Nado anaega isseosseumyeon johgessda",2001,123,NA,6.8,51,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Nadodikkattu",1987,158,NA,9.5,13,0,0,0,0,0,0,4.5,0,34.5,64.5,"",0,0,1,0,0,0,0 -"Nae maeumui punggeum",1998,116,NA,7.8,66,4.5,0,4.5,0,4.5,0,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nae yeojachingureul sogae habnida",2004,123,NA,6.8,316,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Naege ola",1996,114,NA,7.5,9,0,0,0,14.5,0,24.5,0,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Naerata ometi",1985,85,NA,7.4,14,0,0,0,0,14.5,0,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Nafas-e amigh",2003,86,NA,7.3,30,4.5,0,0,0,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Naga bonar",1987,95,NA,8.4,5,0,0,0,0,24.5,0,0,0,64.5,24.5,"",0,0,1,0,0,0,0 -"Nagagutsu o haita neko",1969,80,NA,6.8,30,4.5,4.5,0,4.5,0,4.5,4.5,24.5,4.5,44.5,"",0,1,0,0,0,0,0 -"Nagareru",1956,117,NA,8,6,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Nagarik",1952,127,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Nagasaki burabura bushi",2000,115,NA,6.2,9,0,0,0,0,0,14.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Nagaya shinshiroku",1947,72,NA,7.7,91,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nage indienne, La",1993,92,NA,6.3,16,0,0,0,4.5,4.5,4.5,34.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Nageuneneun kileseodo swiji anhneunda",1987,117,NA,7.1,8,14.5,0,0,0,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nagger at Breakfast, The",1930,10,NA,4.7,16,4.5,14.5,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Nagisa no Shindobaddo",1995,129,NA,7.2,86,4.5,0,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Nagu'a",1982,25,NA,7.4,9,0,0,14.5,0,14.5,0,44.5,34.5,0,0,"",0,0,0,1,0,0,1 -"Nahapet",1977,92,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,1,0,0,0 -"Nahf",2004,85,NA,4.8,5,24.5,24.5,0,0,24.5,24.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Nahota na prodej",1993,102,NA,4.2,11,24.5,14.5,14.5,14.5,0,4.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Nail Gun Massacre, The",1985,90,NA,2.6,152,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Nailed",2001,90,NA,4.2,110,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Nails",1979,13,NA,7.8,8,0,0,0,0,0,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Nain rouge, Le",1998,101,NA,6.4,91,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Naisenkaari",1997,52,NA,5.1,11,4.5,0,4.5,4.5,4.5,14.5,14.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Naisenkuvia",1970,86,NA,6.4,16,0,0,0,4.5,14.5,14.5,14.5,44.5,0,4.5,"",0,0,0,0,0,0,0 -"Naissance d'un Golem",1991,60,NA,1.4,5,44.5,24.5,24.5,0,0,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Naissance de l'amour, La",1993,94,NA,6.1,23,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Naito heddo",1995,107,NA,5,9,0,14.5,0,0,24.5,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Naja",1997,101,NA,3.5,16,14.5,14.5,0,0,14.5,0,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Najbolji",1989,122,NA,7,5,0,0,24.5,0,0,0,44.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Naked",1993,131,NA,7.5,3339,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Naked",1999,40,3000,5.3,21,14.5,0,0,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,1,0,1 -"Naked Afternoon",1976,86,NA,5.7,5,0,0,0,24.5,24.5,44.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Naked Alibi",1954,86,NA,6.6,36,0,4.5,0,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Naked Angels",1969,89,NA,2.2,17,44.5,4.5,4.5,0,14.5,0,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Naked Ape, The",1973,85,NA,4.4,21,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Naked Cage, The",1986,97,NA,4.1,44,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Naked Came the Stranger",1975,89,NA,6,11,0,0,0,14.5,0,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Naked Camera, The",1961,10,NA,1.1,7,74.5,14.5,0,0,0,0,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Naked City, The",1948,96,NA,7.6,556,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Naked Country, The",1984,90,NA,4.3,15,4.5,4.5,4.5,24.5,24.5,14.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Naked Dawn, The",1955,82,NA,7.1,37,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,1,0 -"Naked Detective, The",1996,84,NA,3.5,59,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Naked Earth, The",1958,96,NA,4.1,5,0,0,24.5,0,0,24.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Naked Edge, The",1961,97,NA,6.3,107,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Naked Evil",1966,80,NA,3.1,9,34.5,24.5,14.5,0,24.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Naked Face, The",1984,103,NA,4.8,142,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Naked Fame",2004,84,NA,6.1,9,0,24.5,0,14.5,0,24.5,0,34.5,0,14.5,"",0,0,0,0,1,0,0 -"Naked Frailties",1998,91,NA,6.3,8,24.5,0,0,0,24.5,0,0,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Naked Fury",1959,73,NA,2.8,8,14.5,24.5,0,0,14.5,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Naked Gun",1956,69,NA,7,92,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Naked Gun 2 1/2: The Smell of Fear, The",1991,85,NA,6.3,9833,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Naked Gun 33 1/3: The Final Insult",1994,83,30000000,5.8,8918,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Naked Gun: From the Files of Police Squad!, The",1988,85,NA,7.4,13010,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Naked Hills, The",1956,72,NA,5.7,6,0,0,14.5,0,0,14.5,45.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Naked Instinct",1993,90,NA,2.8,17,14.5,14.5,14.5,4.5,0,4.5,0,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Naked Jane",1995,111,NA,6.9,23,4.5,0,14.5,0,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Naked Jungle, The",1954,95,NA,6.8,442,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Naked Kiss, The",1964,90,NA,7.4,535,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Naked Laura",2002,10,NA,8.7,9,14.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,0,0,0,0,1 -"Naked Lies",1998,93,NA,3.2,81,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Naked Lunch",1991,115,NA,6.5,4919,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Naked Maja, The",1959,111,NA,4.6,42,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Naked Making Lunch",1992,52,NA,7.6,26,0,0,0,0,4.5,4.5,24.5,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Naked Man, The",1998,93,NA,5.2,227,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Naked Man, The",1999,15,NA,4.6,16,4.5,0,14.5,0,34.5,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Naked Obsession",1991,93,NA,4.4,71,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Naked Paradise",1957,68,90000,1.9,8,45.5,14.5,14.5,14.5,14.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Naked Pavement",1998,17,NA,5.6,15,0,4.5,4.5,0,0,24.5,0,14.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Naked Prey, The",1966,96,900000,7.5,489,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Naked Proof, The",2003,108,NA,6.5,7,14.5,0,14.5,0,0,0,24.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Naked Runner, The",1967,101,NA,5.3,100,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Naked Souls",1995,85,NA,2.7,433,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Naked Spur, The",1953,91,NA,7.4,920,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Naked States",2000,80,NA,6.6,151,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Naked Street, The",1955,84,NA,5.7,29,0,0,4.5,4.5,14.5,24.5,34.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Naked Tango",1991,90,NA,5.7,145,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Naked Truth, The",1957,91,NA,6.7,168,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Naked Truth, The",1992,92,NA,2.8,57,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Naked Vengeance",1985,97,NA,4.8,32,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Naked Yoga",1974,24,NA,8.4,5,0,0,0,0,0,24.5,24.5,0,24.5,44.5,"",0,0,0,0,1,0,1 -"Naked Zoo, The",1971,78,250000,1.3,5,44.5,0,0,0,0,0,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Naked and the Dead, The",1958,131,NA,6.4,162,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Naked as Nature Intended",1961,60,NA,4.1,8,0,24.5,0,34.5,0,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Naked in New York",1993,95,NA,5.6,429,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Naked in the Sun",1957,78,NA,4.5,12,4.5,0,0,4.5,34.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Naken",2000,94,25000,4.8,420,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nakhoda Khorshid",1987,117,NA,6.9,13,14.5,0,0,4.5,0,0,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Nakreceni, czyli szolbiznes po polsku",2003,78,NA,5.7,7,14.5,0,14.5,0,14.5,14.5,24.5,14.5,0,0,"",0,0,0,0,1,0,0 -"Nakta(dul)",2002,90,75000,6.5,26,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nala Damayanthi",2003,122,NA,6,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Nam Angels",1989,91,NA,4.2,21,24.5,4.5,4.5,4.5,4.5,14.5,4.5,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Nam's Angels",1970,95,350000,4,39,24.5,14.5,4.5,14.5,14.5,4.5,0,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Namak Haraam",1973,146,NA,7.7,47,0,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,34.5,"",0,0,1,1,0,1,0 -"Nambugun",1990,157,NA,5.9,11,4.5,0,0,4.5,4.5,44.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Name der Rose, Der",1986,130,20000000,7.7,11654,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Name for Evil, A",1973,74,NA,2.3,55,24.5,34.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Name of the Game Is Kill, The",1968,84,NA,6.2,11,4.5,0,4.5,4.5,14.5,4.5,34.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Name of the Rose",2003,25,NA,4.2,22,0,14.5,14.5,4.5,0,4.5,4.5,14.5,14.5,14.5,"",1,0,0,1,0,0,1 -"Name of this Film Is Dogme95, The",2000,50,NA,3.3,74,44.5,0,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Namehay bad",2002,75,NA,7.3,6,0,0,0,14.5,0,34.5,0,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Names of Sin",1975,22,35000,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,0,0,1 -"Nami",2001,111,NA,5.8,13,0,0,4.5,4.5,4.5,45.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Namjaui goerowe",1995,110,NA,5.1,6,0,34.5,0,0,14.5,34.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Namjaui hyanggi",1998,106,NA,3.5,11,14.5,4.5,44.5,4.5,0,0,14.5,0,0,0,"",0,0,0,1,0,1,0 -"Nammavar",1995,178,NA,6.2,9,14.5,14.5,0,24.5,14.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Namu, the Killer Whale",1966,89,NA,5.8,36,4.5,14.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Namukku Parkkan Munthiri Thoppukal",1986,137,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Nan bei Shao Lin",1986,99,NA,6.1,170,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Nan bei tui wang",1980,90,NA,6.1,12,0,0,0,4.5,4.5,4.5,44.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Nan quan wang zhi qi zhuang shan he",1984,96,NA,6.4,5,0,0,0,24.5,24.5,0,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Nan yang shi da xie shu",1995,89,NA,6,55,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nana",1926,150,NA,7.1,50,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Nana",1934,90,NA,4.9,27,4.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nana",1955,120,NA,6.6,17,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nana",1970,105,NA,1.8,6,14.5,14.5,0,0,0,0,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Nana",1982,92,NA,2.7,34,14.5,14.5,24.5,4.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Nanak Naam Jahaz Hai",1969,140,NA,8.6,10,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Nancy & Frank - A Manhattan Love Story",2002,94,NA,4.2,12,34.5,24.5,0,0,0,4.5,14.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Nancy Drew -- Detective",1938,66,NA,6.4,81,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nancy Drew and the Hidden Staircase",1939,60,NA,6.7,63,4.5,0,0,0,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Nancy Drew... Reporter",1939,68,NA,6.5,82,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nancy Drew... Trouble Shooter",1939,68,NA,6.1,56,0,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nancy Goes to Rio",1950,100,NA,6.1,50,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Nancy Steele Is Missing!",1937,84,NA,6.4,15,4.5,0,0,0,14.5,4.5,34.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Nanette",1940,97,NA,4.3,7,0,0,0,44.5,44.5,0,0,14.5,0,0,"",0,0,0,0,0,1,0 -"Naneun somanghanda naege geumjidoin geoseul",1994,115,NA,2.5,8,64.5,14.5,0,14.5,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Nang nak",1999,100,NA,6.3,265,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Nanguo zaijan, nanguo",1996,116,NA,6.7,176,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Naniwa no koi no monogatari",1959,105,NA,7.4,5,0,0,0,0,0,24.5,24.5,64.5,0,0,"",0,0,0,0,0,1,0 -"Nankyoku monogatari",1983,143,NA,6.9,134,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Nanny, The",1965,91,1300000,7.1,544,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Nanook Taxi",1977,90,NA,9,5,0,0,0,0,0,24.5,0,0,24.5,64.5,"",0,0,1,1,0,0,0 -"Nanook of the North",1922,79,53000,7.6,846,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Nanou",1986,101,NA,6.4,27,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Nanu, Sie kennen Korff noch nicht?",1938,95,NA,6.2,27,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Napoleon Blown-Aparte",1966,60,NA,5.4,8,0,0,14.5,0,24.5,45.5,0,14.5,0,0,"",0,1,0,0,0,0,1 -"Napoleon Bunny-Part",1956,7,NA,6.7,40,4.5,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Napoleon Dynamite",2004,86,400000,7.2,17524,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG",0,0,1,0,0,0,0 -"Napoleon and Samantha",1972,92,NA,5.7,156,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Napoleon's Barber",1928,32,NA,1.1,8,74.5,14.5,0,0,0,14.5,0,0,0,0,"",0,0,0,1,0,0,1 -"Napoli milionaria",1950,84,NA,7.1,23,0,0,14.5,4.5,0,4.5,0,4.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Napoli si ribella",1977,88,NA,4.6,6,0,0,0,14.5,14.5,0,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Napoli spara",1977,85,NA,5.9,14,0,4.5,0,0,14.5,4.5,24.5,14.5,24.5,4.5,"",1,0,0,0,0,0,0 -"Napoli violenta",1976,95,NA,6.5,67,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Nappun yeonghwa",1998,144,NA,5.9,44,14.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Naqoyqatsi",2002,89,3000000,6.9,575,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG",0,0,0,0,1,0,0 -"Nar-o-nay",1989,100,NA,8.8,6,0,0,0,0,14.5,0,0,14.5,0,64.5,"",0,0,0,1,0,0,0 -"Narasimha",1991,214,NA,6.9,15,0,0,0,24.5,0,14.5,24.5,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Narayama bushiko",1958,98,NA,7.8,54,4.5,0,0,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Narayama bushiko",1983,130,NA,6.8,1041,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Narc",2002,105,7500000,7.3,7185,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Narcissus",1983,22,NA,6.2,16,4.5,0,0,14.5,4.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Narco",2004,105,NA,5.9,147,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Narcos",1992,105,NA,6.4,5,0,0,0,0,44.5,44.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Narcosys",2000,85,NA,1.3,10,64.5,24.5,0,0,0,0,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Narcotic",1933,57,NA,2.9,37,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Narcotics: Pit of Despair",1967,29,NA,5.5,19,4.5,0,14.5,14.5,14.5,14.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,1 -"Narcovision",1996,16,NA,8.6,7,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,0,0,1 -"Nargess",1992,100,NA,5.2,13,0,4.5,0,0,4.5,24.5,0,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Narren",2003,93,NA,7.4,7,0,14.5,0,0,14.5,0,24.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Narrow Corner, The",1933,69,240000,5.6,29,4.5,4.5,0,14.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Narrow Margin",1990,97,NA,6.3,1372,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Narrow Margin, The",1952,71,NA,7.9,387,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Narrow Road, The",1912,17,NA,6.8,24,0,0,4.5,0,24.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Narrow Trail, The",1917,68,NA,9.3,10,0,0,0,0,0,14.5,0,24.5,44.5,34.5,"",0,0,0,0,0,0,0 -"Naseeb",1981,197,NA,7.9,85,0,0,4.5,0,4.5,4.5,24.5,24.5,24.5,24.5,"",1,0,0,0,0,1,0 -"Naseem",1995,89,NA,8.8,5,0,0,0,0,0,0,0,24.5,84.5,0,"",0,0,0,0,0,0,0 -"Naser Salah el Dine, El",1963,90,NA,7.3,69,0,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",1,0,0,1,0,1,0 -"Nash chelovek v San-Remo",1990,107,NA,7,5,24.5,0,0,0,0,0,0,64.5,0,24.5,"",0,0,1,0,0,0,0 -"Nash dom",1965,99,NA,6.6,5,0,0,0,0,24.5,24.5,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Nashan naren nagou",1999,93,NA,8,208,4.5,4.5,4.5,0,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Nashim",1996,98,NA,4.4,14,14.5,0,0,14.5,0,14.5,0,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nashville",1975,159,NA,7.7,3632,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Nashville Girl",1976,90,NA,5,14,0,0,4.5,4.5,14.5,24.5,4.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Nashville Rebel",1966,95,NA,3.6,22,4.5,0,0,0,4.5,0,4.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Nasreddin v Bukhare",1943,80,NA,6,5,0,0,0,0,0,64.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Nasser 56",1996,142,NA,5.6,21,4.5,0,4.5,4.5,14.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,1,0,0 -"Nasser Asphalt",1958,90,NA,9,9,0,0,0,0,0,0,24.5,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Nassereddin Shah, Actor-e Cinema",1992,90,NA,7.2,58,0,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Nassrasur",2003,10,NA,7.3,8,0,0,0,0,0,0,14.5,34.5,0,45.5,"",0,0,0,0,0,0,1 -"Nastroyshchik",2004,154,NA,7.1,24,14.5,0,0,4.5,4.5,24.5,0,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Nasty Burgers",1993,70,50000,6.2,17,0,4.5,4.5,0,14.5,24.5,24.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Nasty Habits",1977,96,NA,5.7,71,4.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nasty Neighbours",2000,89,NA,5.9,52,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nasty Nurses",1983,81,NA,6.5,21,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Nasty Quacks",1945,7,NA,7,32,0,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Nasty Rabbit, The",1964,90,NA,2.2,40,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nastya",1993,89,NA,6,27,0,0,0,4.5,4.5,24.5,4.5,24.5,24.5,4.5,"",0,0,1,0,0,1,0 -"Nasu: Andalusia no natsu",2003,47,NA,7.4,13,0,0,4.5,0,0,14.5,14.5,34.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Nat Turner: A Troublesome Property",2003,58,NA,7.2,6,0,0,0,14.5,0,14.5,34.5,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Nata di marzo",1957,110,NA,6.4,11,0,0,0,0,14.5,24.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Natale in India",2003,96,NA,3.1,56,45.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Natale sul Nilo",2002,110,NA,3.3,105,44.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Natalia",1979,102,NA,6.1,11,4.5,0,0,14.5,24.5,4.5,0,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Natas: The Reflection",1983,90,NA,1,7,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Natasa",2001,92,NA,7,47,4.5,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Nate Dogg",2003,74,NA,8,5,24.5,0,0,0,0,0,0,44.5,0,44.5,"",0,0,0,1,0,0,0 -"Nate and Hayes",1983,99,NA,5.8,304,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Natekspressen P903",1942,90,NA,5.8,5,0,0,0,24.5,44.5,0,0,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Nathalie",1957,95,NA,5.6,7,0,0,14.5,0,14.5,14.5,44.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Nathalie",1982,93,NA,2.6,10,24.5,14.5,14.5,14.5,24.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Nathalie Granger",1972,83,NA,5.5,25,14.5,4.5,0,4.5,4.5,0,0,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Nathalie...",2003,105,NA,6.4,534,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nathan Grimm",1998,30,NA,8.4,7,0,0,0,0,0,14.5,0,44.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Nation Aflame",1937,74,NA,5.9,5,0,0,0,0,24.5,84.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Nation Builds Under Fire, A",1967,40,NA,2.1,8,45.5,0,0,0,24.5,0,0,0,0,24.5,"",0,0,0,0,1,0,1 -"National Achievement Day",1995,27,NA,8.9,9,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,0,0,1 -"National Health, The",1973,95,NA,5,21,4.5,4.5,0,4.5,14.5,4.5,4.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"National Lampoon Goes to the Movies",1983,89,NA,2.9,162,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"National Lampoon Presents Dorm Daze",2003,96,NA,4.2,803,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"National Scream, The",1980,28,NA,5.6,7,0,0,14.5,0,14.5,24.5,14.5,24.5,0,0,"",0,1,1,0,0,0,1 -"National Security",2003,88,NA,4.6,3762,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"National Treasure",2004,131,100000000,6.6,12361,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"PG",1,0,0,0,0,0,0 -"National Velvet",1944,123,NA,7.4,802,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nationale 7",2000,90,NA,7,194,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Native",1999,10,NA,8.4,9,0,0,0,0,0,0,24.5,34.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Native Land",1942,80,NA,6.9,12,0,0,0,0,24.5,4.5,4.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Native Son",1951,104,NA,4.8,12,0,0,14.5,0,4.5,24.5,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Native Son",1986,111,2000000,5.9,125,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nativity, The",1986,30,NA,4.3,8,34.5,14.5,0,0,0,0,34.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Natsionalnaya bomba",2004,104,NA,7.8,8,24.5,0,0,0,0,0,0,0,0,74.5,"",0,0,1,0,0,0,0 -"Natsu jikan no otonatachi",1997,73,NA,6.7,38,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Natsu no imoto",1972,96,NA,6.9,10,0,0,0,0,14.5,24.5,45.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Natsu no niwa",1994,113,NA,6.8,9,0,0,0,0,0,34.5,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Nattbuss 807",1997,106,NA,3.3,255,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nattens engel",1998,98,700000,4.9,209,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Nattevagten",1994,107,NA,7.4,2404,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Nattflykt",1999,28,NA,5.4,7,0,0,0,24.5,0,0,14.5,14.5,0,44.5,"",0,0,0,1,0,0,1 -"Nattlek",1966,105,NA,3.8,38,14.5,0,0,14.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Nattliga toner",1918,61,NA,6,5,0,24.5,0,0,24.5,64.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Nattseilere",1986,113,NA,6.8,40,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Natura contro",1988,85,NA,3.6,25,14.5,14.5,4.5,4.5,24.5,4.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Natural Born Gambler, A",1916,22,NA,6,22,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Natural Born Killers",1994,122,50000000,6.6,25596,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,1,0 -"Natural City",2003,104,NA,5.7,381,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Natural Disasters: Forces of Nature",2003,40,NA,5.8,22,0,0,4.5,0,14.5,24.5,24.5,24.5,0,4.5,"",0,0,0,0,1,0,0 -"Natural Enemies",1979,100,NA,4.6,14,0,0,14.5,24.5,4.5,0,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Natural History of Parking Lots, The",1990,89,NA,6.1,32,14.5,4.5,0,4.5,14.5,0,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Natural History of the Chicken, The",2000,60,NA,7.5,86,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Natural Wonders of the West",1938,9,NA,6.2,5,0,0,24.5,24.5,0,0,24.5,44.5,0,0,"",0,0,0,0,1,0,1 -"Natural, The",1984,134,28000000,7.4,7353,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Naturally Native",1998,107,700000,8.5,26,4.5,0,0,0,0,14.5,14.5,14.5,4.5,44.5,"PG-13",0,0,0,0,0,0,0 -"Nature in the Wrong",1933,20,NA,7.3,13,0,0,0,14.5,0,4.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Nature of Nicholas, The",2002,102,NA,5.7,50,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nature of the Beast",1995,91,NA,5.7,272,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Nature of the Beast, The",1988,95,NA,4.2,8,14.5,0,14.5,14.5,14.5,14.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Nature's Playmates",1962,62,NA,1.1,10,64.5,14.5,0,0,0,0,14.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Naturellement",2001,28,NA,8.2,24,0,4.5,4.5,4.5,0,0,14.5,4.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Naturlige briller",2001,1,NA,6.7,52,34.5,4.5,4.5,4.5,4.5,0,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Natvris khe",1977,107,NA,7.3,38,4.5,4.5,0,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Nau Do Gyarah",1957,170,NA,7.7,7,14.5,0,0,0,0,0,0,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Nauchnaya sektsiya pilotov",1996,113,NA,7.1,14,0,4.5,0,4.5,0,4.5,34.5,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Naufragio",1978,101,NA,8.7,6,0,0,0,0,14.5,0,0,0,45.5,34.5,"",0,0,0,1,0,0,0 -"Naughty Boys",1983,105,NA,6.7,7,0,0,24.5,0,0,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Naughty But Mice",1939,8,NA,6.2,12,0,14.5,4.5,14.5,0,14.5,4.5,0,0,34.5,"",0,1,1,0,0,0,1 -"Naughty But Nice",1939,89,NA,3.9,28,24.5,4.5,4.5,4.5,0,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Naughty Dallas",1964,72,NA,1.5,12,45.5,14.5,4.5,0,14.5,4.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Naughty Flirt, The",1931,56,NA,5.3,46,4.5,4.5,4.5,14.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Naughty Girls Need Love Too",1983,96,NA,6.6,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Naughty Marietta",1935,105,NA,7.2,155,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Naughty Neighbors",1939,6,NA,6.3,10,0,0,0,0,14.5,34.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Naughty Neighbors",1989,80,NA,7.4,6,0,0,0,0,0,14.5,64.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Naughty Nineties, The",1945,76,NA,6.5,176,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Naughty Nurse",1969,9,NA,2.1,13,34.5,14.5,4.5,0,4.5,0,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Naughty Stewardesses",1975,102,NA,2.1,24,24.5,24.5,24.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,1,1,0,0,0 -"Naui sarang naui shinbu",1990,108,NA,6.1,31,4.5,0,4.5,0,4.5,14.5,34.5,24.5,0,14.5,"",0,0,1,0,0,1,0 -"Naukar Ki Kameez",1999,104,NA,5.2,5,0,0,24.5,0,0,44.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Nauru: Land of Smiles and Sunshine",2004,7,NA,7.7,6,0,14.5,0,0,14.5,0,0,0,14.5,45.5,"",0,0,1,0,0,0,1 -"Naustet",1997,29,NA,5.8,5,24.5,0,0,0,0,44.5,24.5,0,24.5,0,"",0,0,0,1,0,0,1 -"Nautilus",2000,97,NA,4.1,52,14.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Navajeros",1981,95,NA,3.8,19,14.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Navajo",1952,70,NA,5.1,7,0,0,0,24.5,0,14.5,14.5,44.5,0,0,"",0,0,0,1,1,0,0 -"Navajo Blues",1996,90,NA,3,30,24.5,24.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Navajo Joe",1966,93,NA,5.4,103,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Navajo Kid, The",1945,59,NA,4.6,7,0,14.5,0,14.5,24.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Naval Apprentices at Sail Drill on Historic Ship 'Constellation'",1900,2,NA,2.9,6,0,14.5,45.5,14.5,14.5,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Navalha na Carne",1997,105,NA,6,32,24.5,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Navalha na Carne, A",1969,90,NA,7.3,14,14.5,0,0,0,0,14.5,4.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Nave bianca, La",1942,77,NA,6.5,9,0,0,0,14.5,24.5,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Nave de los locos, La",1995,104,NA,8,28,0,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nave de los monstruos, La",1960,81,NA,7.2,12,0,0,4.5,0,0,4.5,4.5,4.5,34.5,34.5,"",0,0,1,0,0,0,0 -"Navigator, The",1924,75,220000,7.8,647,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Navigator: A Mediaeval Odyssey, The",1988,90,NA,7,685,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Navigatori dello spazio",1993,102,NA,3,12,64.5,0,0,4.5,0,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Navigators, The",2001,96,NA,6.8,591,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Navire Night, Le",1979,95,NA,7.5,15,14.5,0,0,0,4.5,4.5,0,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Navodneniye",1994,99,NA,8.1,21,0,0,0,0,0,0,4.5,64.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Navy Blue and Gold",1937,94,NA,6.9,65,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Navy Blues",1929,77,NA,6.2,21,0,0,0,14.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Navy Blues",1941,108,1200000,7.1,25,0,0,4.5,4.5,24.5,4.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Navy Comes Through, The",1942,82,NA,5.8,33,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Navy Lark, The",1959,82,NA,5.6,7,0,0,0,0,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Navy SEALS",1990,113,NA,4.8,2834,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Navy Way, The",1944,74,NA,5.9,6,0,0,0,0,45.5,14.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Navy vs. the Night Monsters, The",1966,87,178000,2.2,90,34.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Naya Daur",1957,173,NA,8.6,13,0,0,0,0,0,0,4.5,4.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Nayak",1966,120,NA,8.1,48,0,0,0,0,0,4.5,4.5,24.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Nayakan",1987,145,NA,8.7,149,4.5,4.5,0,0,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Nazareno Cruz y el lobo",1975,92,NA,6.2,27,0,0,0,0,14.5,24.5,0,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Nazi",1991,2,NA,4.9,9,34.5,14.5,0,0,0,0,34.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Nazi Agent",1942,83,NA,6.9,14,0,0,14.5,0,0,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nazi Officer's Wife, The",2003,90,NA,7.5,42,0,0,4.5,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Nazi, The",2002,14,NA,7.7,10,24.5,0,0,0,0,14.5,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Nazis Strike, The",1943,41,NA,7.8,68,0,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Nazis: The Occult Conspiracy",1998,104,NA,6.6,23,4.5,0,0,4.5,4.5,4.5,14.5,44.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Nazo no tenkousei",1998,95,NA,6,12,0,0,0,4.5,4.5,14.5,44.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Ndeysaan",2002,90,NA,6.5,19,0,0,4.5,4.5,14.5,14.5,44.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Ne cakaj na maj",1957,107,NA,6.6,30,0,0,4.5,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Ne dis rien",2001,84,NA,4.4,16,0,14.5,0,4.5,4.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Ne mozhet byt!",1975,100,NA,7.4,51,0,0,0,4.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Ne naginji se van",1977,103,NA,6.7,5,0,0,0,0,0,44.5,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Ne okreci se sine",1956,111,NA,8.1,12,0,0,0,0,0,0,24.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Ne quittez pas!",2004,102,NA,6.1,11,0,0,0,0,14.5,14.5,0,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Ne si otivay!",1976,95,NA,7.7,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Ne valyai duraka...",1997,98,NA,7.3,7,0,0,0,0,14.5,14.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Neak sre",1994,125,NA,6.1,26,4.5,0,4.5,0,4.5,14.5,14.5,14.5,44.5,4.5,"",0,0,0,1,0,0,0 -"Neanderthal Man, The",1953,78,NA,3.6,34,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Neapolitan Mouse",1954,7,NA,5.7,39,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Near Dark",1987,90,5000000,7,3288,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Near Death",1989,358,NA,8.8,8,0,0,0,0,0,0,0,24.5,64.5,14.5,"",0,0,0,0,1,0,0 -"Near Death",2004,95,NA,2.3,55,64.5,14.5,4.5,4.5,4.5,4.5,0,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Near Dublin",1924,20,NA,3.3,8,14.5,0,14.5,0,34.5,14.5,14.5,0,14.5,0,"",0,0,1,0,0,0,1 -"Near Mrs.",1990,93,NA,5.3,35,14.5,4.5,0,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Near Room, The",1995,90,NA,4.9,27,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Near the Rainbow's End",1930,58,NA,6.7,5,0,0,0,0,0,44.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Nearest and Dearest",1972,86,NA,5.8,12,0,4.5,14.5,0,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nearly Unadventurous Life of Zoe Cadwaulder, The",2004,13,NA,9.3,21,0,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,1,0,0,1,1 -"Nearly a Nasty Accident",1961,86,NA,5.3,8,0,0,0,0,24.5,0,14.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Nebe a dudy",1941,95,NA,8.5,6,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,1,0,0,1,0 -"Nebel",2000,12,NA,8.5,5,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Nebesa obetovannyye",1991,125,NA,7.7,114,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Nebeska udica",1999,95,NA,5.7,93,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nebo v almazakh",1999,110,NA,6.3,16,4.5,4.5,4.5,0,4.5,4.5,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Nebo zovyot",1960,77,NA,3.4,23,14.5,4.5,14.5,0,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nebo. Samolyot. Devushka.",2002,91,NA,6.2,70,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Nebraska Supersonic",2001,75,NA,4.4,11,0,0,0,4.5,0,4.5,14.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Nebraskan, The",1953,68,NA,4.7,25,14.5,0,4.5,24.5,24.5,24.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Nebyvalshchina",1983,72,NA,7.9,7,0,0,0,0,14.5,0,0,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Necessary Roughness",1991,108,NA,5.5,1541,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Necista krv",1996,125,NA,6.1,5,0,0,0,0,0,64.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Neckin' Party, A",1937,11,NA,5.5,8,0,0,14.5,0,24.5,45.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Neco z Alenky",1988,86,NA,7.5,590,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Necro Files, The",1997,72,NA,2.9,84,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Necromancer",1988,88,NA,3.9,41,14.5,4.5,14.5,24.5,0,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Necromancy",1972,83,NA,3.5,82,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Necromania: A Tale of Weird Love",1971,54,7000,3.3,70,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Necronomicon",1994,96,4000000,4.8,571,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Necrophobia",1995,60,NA,6.9,11,4.5,0,0,0,4.5,0,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Necropolis",1986,77,NA,2.9,49,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ned",2003,81,NA,6.2,54,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",1,0,1,0,0,0,0 -"Ned Kelly",1970,99,NA,4.6,145,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ned Kelly",2003,110,NA,6.3,2208,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Nederlands in 7 lessen",1948,79,NA,7.5,23,4.5,0,4.5,0,4.5,0,0,0,4.5,74.5,"",0,0,0,0,1,0,0 -"Need vanad armastuskirjad",1992,127,NA,6.5,26,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Needful Things",1993,115,NA,5.7,3010,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Neel Kamal",1968,160,NA,7.4,16,0,0,0,0,4.5,14.5,34.5,34.5,0,0,"",0,0,0,1,0,1,0 -"Nefertiti, regina del Nilo",1961,97,NA,5.6,18,0,0,4.5,34.5,24.5,4.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Negatives",1968,98,NA,2.8,9,24.5,0,34.5,14.5,14.5,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Negerkys og labre larver",1987,62,NA,5.5,10,24.5,0,0,0,44.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Negocio redondo",2001,94,NA,6.3,19,14.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Negocios son negocios",2004,94,NA,5.4,12,14.5,0,0,14.5,14.5,14.5,4.5,4.5,14.5,0,"",0,0,1,0,0,1,0 -"Negotiator, The",1998,139,50000000,7.2,19100,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",1,0,0,1,0,0,0 -"Negro Leagues Baseball",1946,8,NA,6.2,11,0,0,0,0,24.5,34.5,4.5,4.5,14.5,0,"",0,0,0,0,1,0,1 -"Negro Soldier, The",1944,43,NA,6.8,29,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,1,0,1 -"Negro con un saxo, Un",1989,95,NA,4.8,8,0,0,24.5,14.5,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Negroes with Guns: Rob Williams and Black Power",2004,67,NA,8.6,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Nei er ekkert svar",1995,75,NA,2.5,25,44.5,24.5,4.5,0,14.5,4.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Neige",1981,90,NA,6.3,9,14.5,0,0,14.5,0,14.5,45.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Neige et le feu, La",1991,100,NA,6.6,23,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Neighbor, The",1993,93,NA,5.5,82,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Neighbors",1920,18,NA,7.6,159,0,0,4.5,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,1 -"Neighbors",1981,94,8500000,4.9,1419,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Neighbours",1952,8,NA,8.5,99,4.5,0,4.5,0,0,4.5,4.5,24.5,14.5,44.5,"",0,1,0,0,1,0,1 -"Neil Young: Human Highway",1982,88,NA,4.2,135,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Neither the Sea Nor the Sand",1972,110,NA,6.1,11,4.5,0,4.5,0,14.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,1,0 -"Neitoperho",1997,97,NA,6.9,106,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Neka druga zena",1981,95,NA,7.3,8,0,0,0,0,0,14.5,34.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Neko no ongaeshi",2002,75,NA,7.4,690,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Nekojiru-so",2001,34,NA,7.6,103,0,0,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Nekrolog",2000,34,NA,3.6,5,24.5,0,0,0,44.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Nekromantik",1987,74,NA,5.1,625,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Nekromantik 2",1991,104,NA,5.2,299,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nel continente nero",1993,110,NA,4.8,22,4.5,0,4.5,4.5,14.5,44.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Nel gorgo del peccato",1954,92,NA,6.7,7,0,0,0,0,14.5,14.5,74.5,0,0,0,"",0,0,0,1,0,0,0 -"Nel labirinto del sesso (Psichidion)",1969,95,NA,4.5,7,14.5,14.5,0,24.5,0,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Nel mirino di Black Aphrodite",1978,90,NA,5.8,7,0,44.5,0,0,0,0,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Nel profondo paese straniero",1997,100,NA,5.4,7,0,0,0,14.5,14.5,44.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Nel segno di Roma",1959,98,NA,5,26,4.5,4.5,14.5,4.5,14.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Nel sole",1967,107,NA,5,7,0,0,14.5,14.5,24.5,14.5,0,0,14.5,14.5,"",0,0,1,0,0,1,0 -"Nelken in Aspik",1976,90,NA,8.4,5,0,0,0,0,0,24.5,0,44.5,0,44.5,"",0,0,1,0,0,0,0 -"Nell",1994,113,NA,6.3,5752,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nell Gwyn",1934,85,NA,7.6,9,0,0,0,0,24.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Nell'anno del Signore",1969,100,NA,7,40,4.5,0,0,0,4.5,4.5,34.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Nella stretta morsa del ragno",1971,109,NA,5.1,69,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nelle pieghe della carne",1970,88,NA,3.7,17,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Nelligan",1991,104,NA,5.7,23,24.5,0,0,0,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Nelly & Monsieur Arnaud",1995,106,NA,7.4,1030,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nelly's Folly",1961,7,NA,7.7,29,0,0,0,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,1,0,1,0,0,1 -"Nelson Freire",2003,102,NA,7.7,28,0,0,0,0,0,14.5,14.5,44.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Nem Gravata, Nem Honra",2001,70,NA,7.7,7,0,0,0,0,0,0,24.5,44.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Nema problema",2004,85,NA,7,22,4.5,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Nema-ye Nazdik",1990,100,NA,8.6,361,4.5,4.5,0,0,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,1,0,0 -"Nemesis",1993,95,NA,4.7,577,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Nemesis 4: Death Angel",1995,65,NA,1.7,181,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Nemesis Game",2003,92,3000000,5.5,339,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Nemmeno il destino",2004,110,NA,7.1,17,0,4.5,4.5,4.5,0,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nemo",1984,97,NA,4.8,43,14.5,4.5,4.5,14.5,14.5,4.5,0,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nemo",1998,5,NA,6.2,10,34.5,0,14.5,0,0,24.5,0,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Nemuri Kyoshiro 1: Sappocho",1963,82,NA,6.9,17,0,0,4.5,14.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Nemuri Kyoshiro 3: Engetsugiri",1964,86,NA,9.5,7,0,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Nemuri Kyoshiro 4: Joyoken",1964,87,NA,8.3,9,0,24.5,0,0,0,14.5,14.5,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Nemuru otoko",1996,103,NA,7.7,44,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Neo-Noir",2003,10,NA,6.5,31,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Neobychainye priklyucheniya mistera Vesta v strane bolshevikov",1924,94,NA,7.4,68,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Neoege narul bonaenda",1994,107,NA,4.6,42,4.5,4.5,0,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Neokonchennaya pyesa dlya mekhanicheskogo pianino",1977,103,NA,7.5,201,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Neon Bible, The",1995,91,NA,5.3,152,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Neon City",1992,99,NA,4.3,150,14.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Neon Maniacs",1986,91,1500000,4,142,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Neon Signs",1996,86,NA,6.2,12,0,0,4.5,0,0,24.5,14.5,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Neophytes and Neon Lights",2001,90,NA,6.7,14,4.5,4.5,0,14.5,0,14.5,4.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Neotpravlennoye pismo",1959,80,NA,8.8,22,4.5,0,0,4.5,0,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Nephew, The",1998,106,NA,6.3,551,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Nepoddayushchiyesya",1959,80,NA,8.5,17,0,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Neptune Factor, The",1973,98,NA,3.8,94,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Neptune Nonsense",1936,7,NA,7.3,15,0,0,0,4.5,0,34.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Neptune's Daughter",1949,95,NA,5.8,126,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Neptune's Rocking Horse",1997,100,NA,6.4,5,0,0,0,24.5,0,0,24.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Neraida kai to palikari, I",1969,102,NA,6.2,22,0,0,4.5,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Neraka perut bumi",1987,90,NA,5.9,6,0,0,14.5,14.5,14.5,34.5,14.5,0,0,0,"",1,0,0,0,0,0,0 -"Nerawareta gakuen",1981,90,NA,7,6,0,14.5,0,0,0,14.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Neredesin Firuze",2004,128,1500000,7.9,216,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Neria",1993,103,NA,8.6,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Nerolio",1996,90,NA,6.2,14,0,0,0,14.5,4.5,14.5,24.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Nerone",1909,14,NA,5.1,67,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,1 -"Nertsery Rhymes",1933,20,NA,6,34,0,0,4.5,14.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Nervous Energy",1995,113,NA,6.7,22,0,0,0,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Nervous Ticks",1992,95,NA,4.9,186,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,64.5,"",0,0,1,0,0,1,0 -"Neshika Bametzach",1990,95,NA,6.5,9,14.5,14.5,0,0,14.5,14.5,24.5,0,34.5,0,"",0,0,0,1,0,0,0 -"Neskolko dney iz zhizni I.I. Oblomova",1979,143,NA,7.2,160,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Nest of Tens",2005,27,NA,7.1,9,0,0,14.5,0,0,0,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Nest, The",1988,89,NA,4.7,124,4.5,4.5,4.5,24.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nest, The",1999,26,NA,6.2,102,34.5,4.5,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,"",0,0,0,1,0,0,1 -"Nesting, The",1982,99,NA,4,58,4.5,14.5,14.5,24.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Nesto izmedju",1983,105,NA,6.5,37,4.5,4.5,4.5,4.5,4.5,0,14.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Nestore l'ultima corsa",1994,105,NA,5.7,12,0,4.5,0,14.5,14.5,4.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Net Keeper",2003,7,NA,8.8,9,0,0,14.5,0,0,14.5,0,0,0,74.5,"",0,0,0,0,0,0,1 -"Net Worth",2000,94,NA,5.1,93,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Net, The",1953,86,NA,6.1,9,0,0,0,0,14.5,45.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Net, The",1995,114,22000000,5.6,12201,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Netherbeast of Berm-Tech Industries, Inc., The",2004,5,3000,4.2,19,14.5,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,1,0,0,0,1 -"Netherworld",1992,87,NA,3.4,120,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Neto's Run",1998,16,NA,4.7,18,0,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Nettezza urbana",1948,9,NA,7.3,14,4.5,0,0,0,0,24.5,4.5,34.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Netto",2005,87,NA,6.8,13,14.5,0,0,4.5,0,4.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Netto Perde Sua Alma",2001,102,1300000,6.9,29,4.5,0,0,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Network",1976,121,3800000,8,9501,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Netz, Das",2004,121,NA,5.5,8,14.5,0,14.5,14.5,0,0,45.5,14.5,0,0,"",0,0,0,0,1,0,0 -"NeuFundLand",2003,95,NA,8.1,26,0,0,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Neue Freiheit - keine Jobs",1998,81,NA,5.4,8,14.5,14.5,0,14.5,24.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Neue Schreibtisch, Der",1913,8,NA,8.7,11,0,0,0,0,4.5,0,4.5,0,34.5,44.5,"",0,0,0,0,0,0,1 -"Neues vom Hexer",1965,95,NA,6.3,65,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Neuf mois",1994,110,NA,5.7,143,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Neulich 3",2002,6,NA,7.1,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,1,0,0,0,0,1 -"Neulovimyye mstiteli",1966,78,NA,7.9,54,0,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Neuner",1990,93,NA,7,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Neunte Tag, Der",2004,98,NA,7.2,74,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Neurosia - 50 Jahre pervers",1995,89,NA,9.5,41,4.5,4.5,0,0,4.5,0,4.5,4.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Neurotic Cabaret",1990,84,NA,3.6,12,4.5,0,4.5,14.5,0,4.5,0,4.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Neutral Port",1940,89,NA,5.5,9,0,0,0,14.5,44.5,24.5,24.5,0,0,0,"",1,0,0,1,0,0,0 -"Neutre",2001,92,NA,6.8,33,4.5,4.5,0,4.5,0,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nevada",1944,62,NA,5.5,22,4.5,0,0,4.5,34.5,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Nevada",1997,108,NA,4.6,131,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nevada City",1941,56,NA,5.9,13,0,0,4.5,14.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nevada Smith",1966,128,NA,6.8,626,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nevadan, The",1950,81,NA,5.4,48,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Never Again",2001,98,500000,5.7,309,24.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Never Again! The Story of a Speeder Cop.",1916,2,NA,4.4,24,14.5,4.5,4.5,34.5,14.5,4.5,4.5,0,4.5,4.5,"",0,1,1,0,0,0,1 -"Never Among Friends",2002,78,7000,6.4,73,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Never Been Kissed",1999,107,NA,5.7,10767,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Never Been Thawed",2005,87,35000,5.3,40,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Never Cry Wolf",1983,91,NA,7.3,1225,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Never Die Alone",2004,88,NA,5.1,845,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Never Ever",1996,110,NA,4.8,49,14.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Never Fear",1949,82,NA,6.5,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Never Get Outta the Boat",2002,97,NA,4.7,34,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,4.5,44.5,"R",0,0,0,1,0,0,0 -"Never Give a Sucker an Even Break",1941,71,NA,7.8,299,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Never Kick a Woman",1936,6,NA,6.4,18,0,0,14.5,0,0,24.5,14.5,4.5,0,45.5,"",0,1,1,0,0,0,1 -"Never Let Go",1960,90,NA,6.6,55,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Never Let Me Go",1953,69,1500000,5.4,76,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Never Met Picasso",1996,97,NA,5.6,45,14.5,0,4.5,14.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,1,0 -"Never Play with the Dead",2001,80,NA,3.8,6,14.5,0,14.5,14.5,0,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Never Say Die",1939,82,NA,6.7,42,0,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Never Say Die",1988,90,NA,4.9,43,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Never Say Die",1995,96,NA,3.4,45,14.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Never Say Goodbye",1946,94,NA,6,65,0,4.5,0,4.5,4.5,34.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Never Say Goodbye",1956,96,NA,5.7,73,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Never Say Never Again",1983,121,36000000,6.1,7537,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Never Say Pink Furry Die",1992,11,NA,6.1,6,0,14.5,0,14.5,14.5,0,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Never So Deep",1981,87,NA,5.6,35,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Never So Few",1959,125,NA,5.8,251,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Never Sock a Baby",1939,6,NA,5.9,8,0,0,24.5,0,14.5,14.5,24.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Never Steal Anything Small",1959,94,NA,5.7,48,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Never Take Sweets from a Stranger",1960,81,NA,4.8,17,14.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Never Talk to Strangers",1995,86,NA,4.7,1132,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Never Too Late",1965,105,NA,5.9,69,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Never Too Late",1997,96,NA,6,39,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,0,14.5,"PG",0,0,1,1,0,0,0 -"Never Too Young to Die",1986,92,NA,3.2,162,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Never Too Young to Rock",1975,99,NA,4.8,6,14.5,34.5,0,14.5,0,0,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Never Wave at a WAC",1952,87,NA,6.6,21,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Never Weaken",1921,19,NA,8.3,91,4.5,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Never a Dull Moment",1950,89,NA,5.6,49,4.5,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Never a Dull Moment",1968,99,NA,5.4,69,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Never a Tender Moment",1979,28,NA,6.7,5,0,0,0,24.5,0,0,24.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Never on Tuesday",1988,90,NA,4.4,122,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"NeverEnding Story II: The Next Chapter, The",1990,89,36000000,4.3,1873,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"NeverEnding Story III, The",1994,95,17000000,3,674,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nevera po slovensky I-II",1981,143,NA,6.1,27,0,0,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Neverland",2003,83,NA,6.3,91,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Neverland: The Rise and Fall of the Symbionese Liberation Army",2004,86,NA,7,88,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Neveroyatnye priklyucheniya italyantsev v Rossii",1973,104,NA,7.3,153,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Neverthought",2003,10,NA,8.5,6,0,0,0,0,0,0,0,45.5,45.5,0,"",0,0,0,0,0,0,1 -"Neveu de Beethoven, Le",1985,103,NA,5,28,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Nevinost bez zastite",1968,75,NA,6.8,31,4.5,4.5,4.5,0,14.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"New Adventures of Get Rich Quick Wallingford",1931,95,NA,6.3,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"New Adventures of Pinocchio, The",1999,94,10000000,4.7,106,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"New Adventures of Pippi Longstocking, The",1988,100,NA,4.5,376,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"New Age, The",1994,112,NA,5.7,328,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"New Alcatraz",2002,96,NA,3.3,268,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"New Apartment.",2000,2,NA,4.5,10,24.5,0,0,14.5,14.5,34.5,0,0,14.5,24.5,"",0,0,1,0,0,0,1 -"New Barbarians",1990,79,NA,5.2,10,0,0,14.5,0,14.5,34.5,0,44.5,0,14.5,"",0,0,0,0,0,0,0 -"New Barbarians 2, The",1990,79,NA,6.7,7,0,0,0,0,14.5,14.5,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"New Best Friend",2002,91,NA,5.2,730,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"New Blood",1999,98,NA,5.3,282,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"New Centurions, The",1972,103,NA,6.6,225,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"New Crime City",1994,86,NA,2.8,38,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"New Delhi",1956,176,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,1,0,0,0,0 -"New Delhi Times",1986,123,NA,8.4,13,0,0,0,0,0,0,24.5,0,34.5,44.5,"",0,0,0,1,0,0,0 -"New Face of Debbie Harry, A",1982,30,NA,9,9,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,1 -"New Faces",1954,98,NA,5.1,24,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"New Faces of 1937",1937,100,NA,4.9,32,0,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"New Frontier",1939,57,NA,4.3,40,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"New Frontier, The",1934,10,NA,5,9,14.5,14.5,14.5,14.5,14.5,14.5,34.5,0,0,0,"",0,0,0,0,1,0,1 -"New Frontier, The",1935,60,NA,4,38,14.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"New Gods, The",1997,97,NA,1.4,17,24.5,4.5,0,0,0,0,14.5,0,14.5,44.5,"",0,0,0,1,0,0,0 -"New Guy",2003,85,55000,7.5,47,4.5,4.5,0,0,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"New Guy, The",2002,89,13000000,5.2,4266,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"New Interns, The",1964,123,NA,5.7,37,0,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"New Jack City",1991,97,8500000,6.1,3360,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"New Janitor, The",1914,16,NA,6,22,0,0,4.5,0,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"New Jersey Drive",1995,98,5000000,5.4,348,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"New Kids, The",1985,110,NA,5,188,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"New Kind of Love, A",1963,110,NA,5.7,185,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"New Leaf, A",1971,102,NA,7.1,480,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,1,0 -"New Life, A",1988,104,NA,5.5,126,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"New Mexico",1951,76,NA,5.9,12,4.5,0,4.5,0,24.5,24.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"New Moon",1931,78,NA,5.9,34,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"New Moon",1940,105,NA,6.8,96,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"New Morals for Old",1932,75,NA,5.8,23,0,4.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"New Neighbor, The",1953,7,NA,8.5,33,4.5,0,0,0,0,4.5,24.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"New Nightmare",1994,107,NA,6.1,4189,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"New Orleans",1947,90,NA,6.6,62,0,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"New Orleans Uncensored",1955,76,NA,4.7,6,0,14.5,0,14.5,14.5,0,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"New Port South",2001,95,NA,5,123,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"New Romance of Celluloid: We Must Have Music, A",1942,11,NA,5.7,21,0,4.5,0,24.5,4.5,14.5,4.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"New Rose Hotel",1998,92,NA,4.3,929,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"New Spirit, The",1942,7,NA,6.6,32,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,1,1,0,1 -"New Suit",2002,94,NA,5.8,66,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"New Swiss Family Robinson, The",1998,90,NA,4.6,142,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"New Town Original",2005,86,NA,4.7,15,14.5,24.5,14.5,24.5,0,0,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"New Waterford Girl",1999,90,NA,6.7,562,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"New Way Home, A",2001,15,NA,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,0,0,0,0,1 -"New Women, The",2001,89,NA,4.9,26,4.5,4.5,4.5,14.5,14.5,4.5,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"New World Disorder",1999,92,NA,4.1,305,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"New World, The",1982,30,NA,9.9,24,4.5,0,4.5,0,0,0,4.5,4.5,4.5,74.5,"",0,0,0,0,0,0,1 -"New Year's Day",1989,89,NA,5.1,70,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"New Year's Eve",2002,16,NA,7.9,8,0,14.5,0,0,14.5,0,14.5,0,14.5,45.5,"",0,0,0,0,0,1,1 -"New Year's Evil",1981,90,NA,2.8,92,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"New York Beat Movie",1981,75,NA,6.4,110,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"New York City 'Ghetto' Fish Market",1903,2,NA,4.4,17,14.5,0,14.5,14.5,24.5,14.5,14.5,4.5,0,0,"",0,0,0,0,1,0,1 -"New York City... Come Visit the World",1998,14,NA,3.8,10,24.5,0,14.5,24.5,0,14.5,24.5,0,0,24.5,"",0,0,0,0,1,0,1 -"New York Confidential",1955,87,NA,6.9,15,0,0,4.5,0,0,34.5,4.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"New York Eye and Ear Control",1964,34,NA,5.5,6,14.5,0,0,34.5,0,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"New York Harbor Police Boat Patrol Capturing Pirates",1903,2,NA,3.9,8,0,0,24.5,34.5,0,14.5,24.5,0,0,0,"",1,0,0,0,0,0,1 -"New York Hat, The",1912,16,NA,7.2,55,0,0,4.5,4.5,4.5,14.5,14.5,44.5,4.5,14.5,"",0,0,0,1,0,0,1 -"New York Lightboard Record",1961,9,NA,5.9,9,0,0,0,0,34.5,44.5,14.5,14.5,0,0,"",0,1,0,0,1,0,1 -"New York Nights",1929,82,NA,7.9,6,0,0,0,0,0,14.5,34.5,14.5,34.5,0,"",0,0,0,1,0,0,0 -"New York Nights",1984,103,NA,3.1,31,14.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"New York Nights",1994,89,NA,2.8,33,14.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"New York Stories",1989,124,15000000,6.1,2699,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"New York Subway",1905,5,NA,5.2,31,4.5,4.5,0,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"New York Vampire",1991,73,NA,7.4,7,24.5,0,0,0,0,0,0,0,0,74.5,"",0,0,0,0,0,0,0 -"New York Yankees (The Movie)",1987,96,NA,8.4,24,14.5,0,0,4.5,0,4.5,24.5,0,14.5,34.5,"",0,0,0,0,1,0,0 -"New York chiama Superdrago",1966,95,NA,1.9,111,45.5,24.5,14.5,4.5,4.5,4.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"New York in the 50's",2001,72,NA,5.9,16,0,4.5,14.5,4.5,4.5,14.5,24.5,14.5,4.5,0,"",0,0,0,0,1,0,0 -"New York, Broadway et Union Square",1896,1,NA,6,69,0,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"New York, N.Y.",1986,10,NA,6.5,9,0,0,0,24.5,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"New York, New York",1977,163,14000000,6.3,1616,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"New York, pont de Brooklyn",1896,1,NA,5.1,24,0,0,4.5,14.5,34.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"New Yorker, Le",1998,75,NA,5.7,6,34.5,0,0,0,0,34.5,0,0,0,34.5,"",0,0,1,1,0,0,0 -"New! Improved! Real-life American Fairy Tale",1992,90,NA,8.2,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Newcomers, The",2000,90,NA,4.7,61,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Newly Rich",1931,77,NA,6.3,10,0,0,0,14.5,14.5,14.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Newman Shame, The",1977,93,NA,7.9,17,14.5,0,0,0,0,0,14.5,4.5,0,64.5,"",0,0,0,0,0,0,0 -"Newman Shower, The",2001,25,NA,7.4,7,14.5,0,0,14.5,0,0,0,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Newman's Law",1974,98,NA,5,30,4.5,4.5,14.5,4.5,24.5,34.5,14.5,4.5,0,0,"",1,0,0,0,0,0,0 -"News From Home",1977,85,NA,7,27,14.5,4.5,0,4.5,4.5,0,4.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"News Hounds",1947,68,NA,6.3,23,0,0,0,0,14.5,14.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"News Parade of 1934!, The",1934,10,NA,6.2,9,0,0,14.5,0,14.5,14.5,45.5,14.5,0,0,"",0,0,0,0,1,0,1 -"News for the Church",2004,19,50000,8.7,15,0,14.5,0,0,0,0,4.5,0,0,84.5,"",0,0,0,1,0,0,1 -"NewsBreak",2000,94,NA,3.7,44,14.5,4.5,4.5,24.5,24.5,4.5,0,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Newsfront",1978,110,NA,6.8,105,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Newsies",1992,121,15000000,5.7,2997,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Newton Boys, The",1998,113,27000000,5.7,2003,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Next",1989,5,NA,6.7,47,4.5,0,4.5,0,4.5,4.5,24.5,14.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Next Afternoon",2000,27,NA,4.6,5,44.5,0,0,24.5,0,0,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Next Best Thing, The",2000,108,25000000,4.7,3131,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Next Big Thing, The",2001,87,NA,6,72,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"Next Friday",2000,98,9500000,5.2,3457,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Next Karate Kid, The",1994,107,NA,3.9,2019,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Next Man, The",1976,103,NA,4.6,109,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Next One, The",1984,105,NA,4.8,39,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Next Step, The",1997,96,450000,4,21,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Next Stop Wonderland",1998,104,1000000,6.7,1467,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"Next Stop, Greenwich Village",1976,111,NA,6.6,305,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Next Time",1998,97,NA,6.7,30,4.5,0,4.5,4.5,0,0,34.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Next Time I Marry",1938,65,NA,6.4,31,0,0,0,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Next Time We Love",1936,87,NA,6.7,32,0,0,0,0,14.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Next Voice You Hear..., The",1950,83,NA,6.1,126,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Next of Kin",1942,102,NA,7.1,8,0,0,0,0,0,14.5,34.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Next of Kin",1982,89,NA,4.4,42,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Next of Kin",1984,65,NA,7.3,158,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Next of Kin",1989,108,NA,4.9,1147,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Next to No Time",1959,93,NA,6.3,10,0,0,0,0,14.5,44.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Nexxt",2001,116,NA,5.9,23,4.5,4.5,4.5,0,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Nez rouge",2003,110,NA,6.4,104,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Nez, Le",1963,11,NA,8,7,0,0,14.5,0,0,0,0,24.5,44.5,14.5,"",0,1,0,0,0,0,1 -"Nezha nao hai",1979,65,NA,8.8,12,0,0,0,0,0,0,0,24.5,14.5,45.5,"",0,1,0,0,0,0,0 -"Nezhnost'",1967,83,NA,7.2,6,0,0,0,0,0,34.5,14.5,14.5,34.5,0,"",0,0,0,0,0,1,0 -"Nezhnyy vozrast",2001,130,NA,7.6,44,0,0,4.5,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Nezlobte dedecka",1934,74,NA,7.8,8,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Nezny barbar",1990,88,NA,8.2,20,4.5,0,0,0,0,14.5,14.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Ng goh haak gwai dik siu nin",2002,95,NA,6.2,11,4.5,0,4.5,4.5,14.5,4.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Ngati",1987,92,NA,4.3,20,0,0,14.5,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Ngau wan gong tau",1976,89,NA,4.7,12,0,4.5,4.5,4.5,4.5,0,4.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Ngayong nandito ka",2003,110,NA,8.3,7,0,0,0,0,14.5,14.5,14.5,0,0,45.5,"",0,0,0,1,0,1,0 -"Ngo dik yeh man tung hok",2001,94,NA,6.3,59,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,"",1,0,1,0,0,0,0 -"Ngo si sui",1998,108,NA,6.5,2867,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Nha fala",2002,110,NA,7.3,32,0,4.5,0,4.5,0,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ni de aqui, ni de alla",1988,93,NA,3.5,6,34.5,0,0,14.5,0,14.5,34.5,0,0,0,"",0,0,1,1,0,0,0 -"Ni ju-seiki shonen dokuhon",1989,106,NA,5.4,20,0,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ni liv",1957,96,NA,7.7,172,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",1,0,0,1,0,0,0 -"Ni na nebu ni na zemlji",1994,100,NA,4.5,18,14.5,0,0,4.5,4.5,4.5,0,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Ni neibian jidian",2001,116,NA,7.2,668,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ni pour, ni contre (bien au contraire)",2003,111,NA,6.6,286,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ni sangre, ni arena",1941,104,NA,6,11,0,4.5,0,0,4.5,24.5,0,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Ni tsutsumarete",1992,40,NA,6.6,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,0,0,1,0,1 -"Ni vivo, ni muerto",2002,95,NA,8.2,11,14.5,0,0,0,4.5,0,14.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Ni vu, ni connu",1958,95,NA,7.2,62,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Ni-ni-roku",1989,114,NA,5.9,8,0,0,0,0,24.5,0,64.5,14.5,0,0,"",1,0,0,1,0,0,0 -"Niagara",1897,1,NA,5.9,26,4.5,0,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Niagara",1953,92,1250000,7,1459,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Niagara Falls",1941,43,NA,6.2,5,0,0,0,24.5,44.5,24.5,0,24.5,0,0,"",0,0,1,0,0,0,1 -"Niagara, Niagara",1997,93,NA,6.6,510,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Niagara: Miracles, Myths and Magic",1986,41,NA,6.4,34,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Nian ni ru xi",1997,43,NA,6.9,7,0,0,14.5,0,0,14.5,0,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Nianchan",1959,101,NA,7.4,22,0,0,0,4.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Niata sti laspi",1984,89,NA,4.5,7,14.5,0,0,14.5,0,0,14.5,14.5,0,44.5,"",1,0,0,1,0,0,0 -"Niaz",1991,82,NA,7.5,14,4.5,0,0,0,4.5,0,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Nibbles",2003,4,NA,6.6,49,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Nibelungen, Teil 1: Siegfried, Die",1966,91,NA,4.8,45,4.5,4.5,4.5,0,24.5,34.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Nibelungen, Teil 2: Kriemhilds Rache, Die",1967,110,NA,5,45,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nibelungen: Kriemhilds Rache, Die",1924,97,NA,8.1,269,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Nibelungen: Siegfried, Die",1924,100,NA,8.4,362,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Nic",1998,80,NA,7.6,23,4.5,0,0,4.5,4.5,14.5,14.5,4.5,44.5,4.5,"",0,0,0,0,0,0,0 -"Nic smiesznego",1995,95,NA,7,104,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Nice Coloured Girls",1987,16,NA,6,8,0,0,0,0,0,45.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Nice Dreams",1981,88,NA,5.5,1124,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nice Girl Like Me, A",1969,90,NA,4.7,12,0,4.5,4.5,4.5,4.5,14.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Nice Girl?",1941,91,NA,5.8,26,14.5,0,4.5,0,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Nice Guys Finish Last",2001,14,NA,6.4,19,4.5,0,0,4.5,0,14.5,24.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Nice Guys Sleep Alone",1999,92,NA,5.9,195,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Nice Little Bank That Should Be Robbed, A",1958,87,NA,4.9,14,14.5,0,0,14.5,24.5,4.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Nice Time",1957,17,NA,6,11,0,0,4.5,4.5,4.5,4.5,34.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Nice Women",1932,70,NA,8.4,6,0,0,0,0,0,34.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Nice and Friendly",1922,11,NA,4.9,7,14.5,0,0,14.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Nice to Meet You, Please Don't Rape Me!",1995,71,NA,5.2,7,24.5,0,0,0,24.5,0,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Nich' mit Leo",1995,90,NA,3.2,44,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nicholas Nickleby",1947,108,NA,7.4,70,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nicholas Nickleby",2002,132,10000000,7.4,1651,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Nicholas and Alexandra",1971,189,NA,6.8,459,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nicht Fisch, nicht Fleisch",2002,90,NA,6.7,15,0,4.5,0,0,4.5,4.5,44.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Nicht der Homosexuelle ist pervers, sondern die Situation, in der er lebt",1971,67,NA,6.4,56,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Nicht fummeln, Liebling",1970,87,NA,7.6,12,0,0,0,0,0,0,24.5,34.5,0,44.5,"",0,0,1,0,0,0,0 -"Nichten der Frau Oberst, Die",1980,91,NA,4.9,15,0,14.5,4.5,0,24.5,34.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Nichts als die Wahrheit",1999,129,NA,7.5,297,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nichts bereuen",2001,95,NA,7.1,295,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Nick Carter, Master Detective",1939,59,NA,5,32,0,4.5,0,14.5,14.5,44.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Nick Name & the Normals",2004,75,NA,4.1,7,24.5,0,14.5,0,0,14.5,14.5,0,24.5,0,"",0,0,0,0,1,0,0 -"Nick Wilson's Gamers",2004,28,NA,8.7,15,0,0,0,4.5,4.5,4.5,4.5,0,14.5,64.5,"",0,0,1,0,0,0,1 -"Nick and Jane",1997,95,NA,5.5,175,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"R",0,0,1,0,0,1,0 -"Nick and Kate",2003,5,NA,8.6,31,14.5,0,0,0,0,0,0,4.5,24.5,45.5,"",0,0,0,1,0,0,1 -"Nick of Time",1995,90,NA,6.2,5125,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Nickel & Dime",1992,95,NA,4,27,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nickel Children, The",2005,95,2000000,5.8,13,0,4.5,0,14.5,4.5,0,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Nickel Mountain",1984,88,NA,5.3,23,0,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Nickel Nurser, The",1932,21,NA,8.1,7,0,0,0,0,14.5,0,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Nickel Ride, The",1974,99,NA,5.5,34,4.5,4.5,0,4.5,24.5,24.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Nickel-Hopper, The",1926,37,NA,6.8,8,0,0,0,14.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,1 -"Nickelodeon",1976,121,9000000,6,291,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nickelodeon Days",1962,103,NA,6.3,5,0,0,0,0,24.5,0,44.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Nico Icon",1995,67,NA,6.7,175,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Nico the Unicorn",1998,90,NA,5.6,96,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Nicole",1978,91,NA,8,10,14.5,0,14.5,0,0,0,0,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Nicole's Revenge",1995,65,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,0,0,0,0,0 -"Nicotina",2003,90,NA,6.4,431,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Nidaime wa Christian",1985,101,NA,6.6,5,24.5,0,0,0,0,24.5,44.5,0,24.5,0,"",1,0,1,1,0,1,0 -"Nido del ragno, Il",1988,120,NA,6.5,28,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nido, El",1979,97,NA,6.6,51,4.5,0,4.5,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Nie lubie poniedzialku",1971,98,NA,7.7,50,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Nie ma mocnych",1974,89,NA,7.3,61,0,4.5,4.5,0,0,14.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Nie ma zmiluj",2000,102,NA,5.5,13,4.5,0,4.5,14.5,4.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Nie solo sein",2004,9,NA,5.8,6,0,0,0,0,14.5,0,0,64.5,0,14.5,"",0,0,0,0,0,0,1 -"Nie wiem",1977,47,NA,2.7,6,14.5,0,0,0,34.5,34.5,0,0,0,14.5,"",0,0,0,0,1,0,0 -"Nieciekawa historia",1982,113,NA,6,5,0,0,0,0,24.5,0,44.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Niemandsland",1931,93,NA,5.9,7,0,14.5,0,0,0,0,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Nienasycenie",2003,125,NA,4.6,37,14.5,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Niente rose per OSS 117",1968,91,NA,4.4,19,0,4.5,0,34.5,24.5,24.5,14.5,4.5,0,0,"",1,0,0,1,0,0,0 -"Nietos (Identidad y memorial)",2004,75,NA,6.7,6,0,0,0,0,0,14.5,14.5,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Niets bijzonders",1961,9,NA,1,8,34.5,0,0,0,14.5,0,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Nieuwe gronden",1934,36,NA,9.2,7,0,0,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Niewinni czarodzieje",1960,87,NA,6.9,28,0,0,0,0,4.5,24.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Niezi",1986,102,NA,6.7,9,0,0,0,0,14.5,34.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nifty Nineties, The",1941,6,NA,6.7,33,4.5,14.5,0,4.5,4.5,24.5,4.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Nigdy w zyciu!",2004,102,NA,5.9,102,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Nigel Stone",2003,18,NA,8.2,10,0,0,0,0,24.5,0,24.5,0,24.5,44.5,"",0,0,1,0,0,0,1 -"Nigger",2004,12,NA,5.9,18,34.5,0,0,0,4.5,4.5,0,4.5,0,44.5,"",0,0,0,1,0,0,1 -"Nigger in the Woodpile, A",1904,10,NA,3.9,37,24.5,0,0,0,4.5,0,0,0,4.5,64.5,"",0,0,1,0,0,0,1 -"Nigger, The",1915,50,NA,7.9,109,24.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Night",1930,7,NA,4.7,7,0,14.5,0,14.5,24.5,0,24.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Night 'n Gales",1937,11,NA,7.2,12,0,0,4.5,0,0,0,44.5,44.5,0,4.5,"",0,0,1,0,0,0,1 -"Night After Night",1932,70,NA,5.6,34,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Night After Night After Night",1969,88,NA,4.9,14,0,0,4.5,24.5,14.5,24.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Night Angel",1931,86,NA,6.3,8,24.5,0,0,0,14.5,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Night Angel",1990,90,NA,2.7,59,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Before Christmas, The",1933,8,NA,7,29,14.5,0,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Night Before Christmas, The",1941,9,NA,7.4,62,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Night Before, The",1988,85,NA,5.5,362,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Night Before, The",2003,19,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Night Boat to Dublin",1946,100,NA,5,7,0,0,14.5,14.5,45.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Night Brings Charlie, The",1990,75,NA,3.8,27,44.5,14.5,4.5,0,24.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Night Call Nurses",1972,74,NA,2.8,23,24.5,14.5,4.5,14.5,4.5,4.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Night Caller, The",1965,85,NA,5.6,44,0,4.5,0,14.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Caller, The",1998,92,NA,4.2,76,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Night Children",1990,90,NA,4.4,15,14.5,4.5,4.5,14.5,14.5,14.5,0,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Night Class",2001,90,NA,5.1,48,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Club",1989,91,NA,6.1,10,24.5,0,0,24.5,0,44.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Night Club Lady",1932,66,NA,6.5,6,0,0,0,0,14.5,45.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Night Club, The",1925,60,NA,8.3,5,0,0,0,0,24.5,24.5,0,24.5,44.5,0,"",0,0,1,0,0,0,0 -"Night Comes Too Soon, The",1947,52,NA,4.4,7,14.5,0,24.5,0,14.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Night Court",1932,92,NA,6.4,36,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Night Creature",1977,83,NA,4.9,34,4.5,14.5,24.5,14.5,24.5,0,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Night Cries: A Rural Tragedy",1989,19,NA,4.7,22,24.5,0,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Night Crossing",1981,107,NA,6.4,155,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Night Demons",2004,15,NA,8.8,11,0,0,0,14.5,0,0,0,0,4.5,74.5,"",1,0,0,0,0,0,1 -"Night Deposit",1999,9,NA,5.1,18,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Night Digger, The",1971,110,NA,6,69,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Editor",1946,68,NA,7.6,9,0,0,0,0,0,0,64.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Night Eyes",1990,90,NA,3.5,149,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night Eyes 4",1996,101,NA,3.5,85,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Night Eyes II",1992,97,NA,3.4,152,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Night Eyes Three",1993,97,NA,3.8,130,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Night Falls on Manhattan",1997,118,NA,6.3,1399,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Night Ferris Bueller Died, The",1999,29,NA,3,35,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Night Fire",1994,97,NA,2.8,71,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Night Flier",1997,93,NA,5.4,1294,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Night Flight",1933,84,NA,7.1,13,0,0,0,14.5,4.5,24.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Night Fright",1967,65,18000,1.3,19,45.5,0,24.5,14.5,0,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Night Game",1989,95,NA,4.8,91,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Night God Screamed, The",1971,85,NA,3.8,23,14.5,4.5,4.5,0,4.5,0,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Night Has Eyes, The",1942,79,NA,5.8,48,4.5,4.5,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night Has a Thousand Eyes",1948,81,NA,7.1,129,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Night Holds Terror, The",1955,86,NA,5.7,20,4.5,0,0,14.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Night Hunter",1995,86,NA,4,102,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Night Into Morning",1951,86,NA,6.5,36,0,4.5,4.5,4.5,0,24.5,34.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Night Is Young, The",1935,81,NA,6.9,27,0,0,0,14.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Night Key",1937,68,NA,6.5,14,0,0,0,0,4.5,44.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Night Larry Kramer Kissed Me, The",2000,81,NA,4,53,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Night Life of the Gods, The",1935,73,NA,6.2,10,0,0,0,0,44.5,0,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Night Light",2003,3,NA,8.9,5,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,1,0,0,0,0,1 -"Night Magic",1984,85,NA,7.7,6,0,0,0,0,0,34.5,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Night Magic",1985,95,NA,4.5,14,14.5,4.5,4.5,4.5,0,0,34.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Night Mail",1936,25,NA,7,97,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Night Monster",1942,73,NA,6,56,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Night Moves",1975,100,NA,6.8,759,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Night Must Fall",1964,101,NA,5.4,100,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night My Number Came Up, The",1955,94,NA,8,76,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Night Nurse",1931,72,NA,6.6,176,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Night Orchid",1997,106,NA,4.3,32,4.5,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Night Owls",1930,30,NA,7.4,109,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Night Parade",1929,71,NA,5.8,6,0,0,0,34.5,34.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Night Passage",1957,90,NA,6.8,220,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night Patrol",1984,85,NA,3.1,228,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Night People",1954,94,NA,6.1,103,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night Rhythms",1992,99,NA,4.8,85,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Rider, The",1932,72,NA,5.7,7,0,0,14.5,14.5,14.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Night Riders, The",1939,56,NA,4.4,36,14.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Night Runner, The",1957,79,NA,6.3,6,0,0,0,0,34.5,14.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Night School",1981,88,NA,3.6,96,14.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night Shade",1997,96,NA,2.1,23,24.5,24.5,14.5,0,4.5,4.5,0,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Night Shadow",1989,95,NA,4,8,34.5,0,14.5,24.5,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Night Shadows",1984,99,2500000,3.8,134,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night Shift",1982,105,NA,6.2,2639,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Night Song",1948,102,NA,6.2,52,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Night Stage to Galveston",1952,61,NA,6,6,0,14.5,0,14.5,14.5,14.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Night Stalker, The",1987,89,NA,5.2,31,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night Surf",2002,30,NA,5,33,14.5,4.5,4.5,0,24.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Night Terror",1989,91,NA,5.4,10,14.5,24.5,0,0,0,34.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Night Terrors",1993,98,NA,2.6,234,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night That Never Happened, The",1997,95,NA,5,50,4.5,4.5,14.5,14.5,14.5,4.5,24.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Night They Raided Minsky's, The",1968,99,NA,5.4,202,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Night Tide",1961,84,NA,5.5,151,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Night Time in Nevada",1948,67,NA,5.7,6,0,0,0,0,14.5,34.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Night Train",1995,14,NA,5,8,0,14.5,14.5,0,34.5,0,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Night Train",1999,80,NA,5,21,0,4.5,4.5,14.5,4.5,4.5,24.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Night Train to Memphis",1946,66,NA,5.8,5,0,0,0,24.5,0,0,44.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Night Train to Mundo Fine",1966,89,30000,1.8,1095,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Night Train to Munich",1940,90,NA,7.3,177,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Night Train to Murder",1983,70,NA,6.2,24,4.5,0,14.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Night Train to Paris",1964,65,NA,4,18,0,4.5,14.5,14.5,24.5,4.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Night Train to Terror",1985,98,NA,2.9,130,34.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Trap",1993,95,NA,3.7,51,14.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Unto Night",1949,84,NA,3.4,54,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Night Vision",1987,102,NA,5.3,9,14.5,0,24.5,14.5,24.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Night Visitor",1989,93,NA,3.9,73,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Night Visitor, The",1971,106,NA,6.1,83,4.5,0,4.5,4.5,14.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Night Waiter, The",1987,30,NA,3.9,14,24.5,0,0,4.5,24.5,0,24.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Night Waitress",1936,57,NA,5.9,20,0,0,14.5,4.5,14.5,44.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Night Walker, The",1964,86,NA,5.8,180,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Waltz: The Music of Paul Bowles",2000,89,NA,5.5,15,0,0,14.5,14.5,14.5,0,4.5,34.5,24.5,0,"",0,0,0,0,1,0,0 -"Night Warning",1981,96,NA,5.9,82,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Wars",1991,90,NA,3.6,19,14.5,34.5,14.5,24.5,0,0,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Night Watch",1973,99,NA,5.1,61,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night Watchman, The",1938,7,NA,7.5,15,0,0,0,4.5,14.5,4.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Night We Called It a Day, The",2003,97,NA,6.4,126,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Night We Dropped a Clanger, The",1959,86,NA,5.9,5,0,0,0,0,24.5,64.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Night We Never Met, The",1993,99,NA,5.9,765,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Night Without Sleep",1952,77,NA,6.8,6,0,0,0,0,34.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Night Without Stars",1951,75,NA,5.3,9,14.5,0,0,0,34.5,45.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Night World",1932,58,NA,6.2,17,0,4.5,0,0,4.5,14.5,14.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Night and Day",1946,128,NA,5.9,318,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Night and Day",2003,61,NA,8.3,12,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Night and the City",1950,96,NA,7.9,405,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Night and the City",1992,105,NA,5.7,798,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Night and the Moment, The",1995,90,NA,5,72,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Night at Earl Carroll's, A",1940,62,NA,4.3,5,24.5,24.5,0,0,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Night at the Golden Eagle",2002,87,NA,5.8,214,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Night at the Movies, A",1937,10,NA,6.9,37,0,0,0,4.5,14.5,24.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Night at the Opera, A",1935,93,NA,8.1,6008,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Night at the Roxbury, A",1998,81,17000000,5.1,5937,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Night in Casablanca, A",1946,85,NA,6.9,705,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Night in Havana: Dizzy Gillespie in Cuba, A",1988,84,NA,8.5,6,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Night in Heaven, A",1983,83,NA,3.5,158,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Night in Montmartre",1931,69,NA,3.6,8,14.5,0,14.5,14.5,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Night in Paradise, A",1946,84,NA,5.6,12,14.5,4.5,0,0,14.5,4.5,34.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Night in a Dormitory, A",1930,22,NA,3.8,18,14.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,0,0,"",0,0,1,0,0,0,1 -"Night in the Life of Jimmy Reardon, A",1988,90,NA,4.7,470,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Night in the Show, A",1915,29,NA,6.9,120,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Night of Adventure, A",1944,65,NA,6.2,26,0,0,14.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night of Bloody Horror",1969,89,NA,4.1,22,14.5,4.5,14.5,14.5,24.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Night of Dark Shadows",1971,129,900000,4.6,139,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Night of Evil",1962,88,NA,6,7,0,0,14.5,44.5,14.5,0,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Night of Henna",2005,92,NA,5.7,12,14.5,24.5,0,4.5,0,4.5,0,0,0,44.5,"",0,0,1,0,0,1,0 -"Night of Horror",1978,76,NA,1.5,47,94.5,4.5,4.5,0,0,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Night of January 16th",1941,80,NA,7.1,8,0,0,0,0,0,14.5,14.5,64.5,14.5,0,"",0,0,0,0,0,0,0 -"Night of June 13th, The",1932,76,NA,5.6,7,0,0,14.5,0,0,0,44.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Night of Terror",1933,65,NA,6.7,24,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night of a Thousand Screams",2001,87,175000,9.2,15,0,0,0,0,4.5,0,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Night of the Archer",1994,95,NA,4.6,15,0,24.5,24.5,4.5,24.5,0,24.5,0,4.5,0,"",1,0,0,1,0,0,0 -"Night of the Big Heat",1967,94,NA,5,131,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night of the Blood Beast",1958,62,68000,2.2,126,44.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Night of the Cobra Woman",1972,85,NA,2.7,15,34.5,14.5,24.5,14.5,0,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Night of the Comet",1984,95,NA,5.8,1387,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night of the Coyote",1999,93,NA,8.9,30,4.5,4.5,0,0,0,0,0,0,4.5,84.5,"",0,0,0,0,0,0,0 -"Night of the Creeps",1986,85,NA,5.9,792,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Night of the Cyclone",1990,85,NA,3.7,32,4.5,14.5,14.5,4.5,24.5,4.5,4.5,0,4.5,4.5,"",1,0,0,1,0,0,0 -"Night of the Dead",1993,90,NA,5.4,5,0,24.5,0,0,24.5,44.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Night of the Demon",1957,83,NA,7.4,1141,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Night of the Demon",1980,97,NA,4.1,77,24.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night of the Demons",1988,90,1200000,5,640,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Night of the Demons III",1997,85,NA,3,249,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Night of the Dog",2005,86,5000,9.5,33,4.5,0,4.5,0,0,0,4.5,4.5,4.5,84.5,"",0,0,1,0,0,1,0 -"Night of the Eagle",1962,90,200000,6.6,199,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Night of the Following Day, The",1968,93,NA,5.9,159,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Night of the Generals, The",1967,148,NA,7,493,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Night of the Ghouls",1959,69,NA,2.8,225,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night of the Grizzly, The",1966,102,NA,5.5,105,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night of the Hunter, The",1955,93,795000,8.2,7543,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Night of the Iguana, The",1964,112,3000000,7.3,1099,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Night of the Juggler",1980,101,NA,5.5,68,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Night of the Lepus",1972,88,NA,3.1,542,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night of the Living Babes",1987,60,NA,6.3,7,14.5,0,0,14.5,0,44.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Night of the Living Bread",1990,8,NA,6.7,94,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Night of the Living Dead",1968,90,114000,7.6,11590,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Night of the Living Dead",1990,88,4200000,6.1,2562,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Night of the Living Dead: 25th Anniversary Edition",1993,83,NA,4.3,56,24.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Night of the Living Duck, The",1988,7,NA,7.1,22,4.5,0,0,4.5,4.5,4.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Night of the Party, The",1935,61,NA,5.2,6,0,0,0,0,45.5,0,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Night of the Prowler, The",1962,60,NA,4,6,0,14.5,0,45.5,34.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Night of the Quarter Moon",1959,96,NA,8.1,8,0,0,0,0,0,0,24.5,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Night of the Running Man",1994,93,NA,5.1,249,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Night of the Scarecrow",1995,94,2000000,4.3,134,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Night of the Snakehead Fish",2003,54,1500,7.4,5,24.5,0,0,0,0,0,24.5,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Night of the Strangler",1975,88,NA,4.4,11,4.5,0,24.5,0,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Night of the Vampire Hunter",2000,95,NA,8.4,18,4.5,0,0,4.5,0,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Night of the Warrior",1991,99,NA,3.3,40,14.5,4.5,24.5,4.5,14.5,14.5,0,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Night of the Wilding",1990,85,NA,3.4,13,34.5,0,4.5,14.5,14.5,14.5,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Night of the Witches",1970,75,NA,3.9,17,14.5,0,14.5,0,4.5,0,14.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Night of the Zombies",1981,75,NA,1.9,161,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Night on Earth",1991,129,NA,7.5,5339,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Night the Banshee Cried, The",1957,22,NA,1.9,22,45.5,4.5,0,0,4.5,0,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Night the Lights Went Out in Georgia, The",1981,120,NA,5,199,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Night the World Exploded, The",1957,64,NA,3.5,19,14.5,4.5,14.5,24.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Night to Remember, A",1943,88,NA,6.8,65,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Night to Remember, A",1958,123,1680000,7.7,2476,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Night with Lou Reed, A",1983,60,NA,8.4,5,0,0,0,0,0,24.5,0,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Night, the Prowler, The",1978,90,NA,6.9,15,4.5,0,4.5,14.5,0,0,24.5,24.5,0,24.5,"",0,0,1,1,0,0,0 -"Nightangel",1986,19,NA,7.2,5,0,0,0,0,24.5,24.5,44.5,0,24.5,0,"",0,1,0,0,0,0,1 -"Nightbeast",1983,80,NA,2.5,48,34.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nightbreed",1990,102,NA,5.7,1818,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nightcomers, The",1972,96,NA,5.5,127,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nightdreams",1981,78,NA,8,20,4.5,4.5,0,0,4.5,4.5,0,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Nightfall",1957,78,NA,6.9,93,0,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nightfall",1988,83,NA,2.8,211,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nightflyers",1987,89,NA,3.9,117,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nightforce",1987,87,NA,3.6,46,14.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Nighthawks",1978,113,NA,6.3,49,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nighthawks",1981,99,NA,6.2,1726,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Nighthawks",1998,15,NA,5.7,16,4.5,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Nightingale Sang in Berkeley Square, A",1979,102,NA,5.6,50,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nightingale in a Music Box",2002,96,NA,5.5,21,4.5,0,0,0,14.5,0,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Nightkill",1980,97,NA,4.8,66,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nightlife",1983,82,NA,5.1,6,14.5,14.5,0,0,14.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Nightmare",1942,81,NA,6.7,6,0,0,0,0,0,14.5,45.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Nightmare",1956,89,NA,6.3,99,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nightmare",1964,83,NA,6.2,43,0,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Nightmare",1981,96,NA,4.6,174,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nightmare Alley",1947,110,NA,8.4,357,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Nightmare Before Christmas, The",1993,76,18000000,7.8,19646,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Nightmare Campus",1996,110,NA,6.4,8,0,0,0,0,24.5,14.5,45.5,14.5,0,0,"",0,1,0,0,0,0,0 -"Nightmare Circus",1974,86,NA,3.2,43,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Nightmare County",1977,75,NA,5.8,5,0,0,24.5,24.5,0,44.5,24.5,0,0,0,"",1,0,0,1,0,0,0 -"Nightmare Man",1999,98,NA,3.5,28,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Nightmare On Elm Street 3: Dream Warriors, A",1987,88,4000000,5.8,4962,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nightmare On Elm Street 4: The Dream Master, A",1988,99,13000000,4.8,3856,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nightmare On Elm Street Part 2: Freddy's Revenge, A",1985,87,3000000,4.5,4488,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nightmare On Elm Street, A",1984,91,1800000,7.1,12590,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Nightmare On Elm Street: The Dream Child, A",1989,89,6000000,4.3,2988,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nightmare Sisters",1987,83,40000,3.5,55,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Nightmare at 43 Hillcrest",1974,71,NA,7,6,0,0,0,0,0,45.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Nightmare in Blood",1978,90,NA,5.2,18,14.5,0,0,24.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Nightmare in the Sun",1965,80,NA,4.5,9,0,34.5,24.5,24.5,0,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Nightmares",1980,90,NA,3,20,24.5,14.5,14.5,14.5,4.5,24.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Nightmares",1983,99,NA,4.7,268,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nightowls of Coventry, The",2004,75,NA,8,5,0,0,0,0,0,0,64.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Nightride",1997,11,NA,5.7,7,14.5,0,0,0,0,44.5,24.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Nights Below Station Street",1997,98,NA,4,23,14.5,4.5,0,0,0,14.5,14.5,24.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Nightshadows",2004,16,NA,8,14,14.5,0,0,0,0,0,4.5,4.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Nightstalker",2002,95,NA,4,212,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Nightwatch",1997,101,NA,6.1,2944,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Nightwing",1979,105,NA,4,145,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nightwish",1989,96,NA,4.5,49,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nihon boryoku-dan: Kumicho",1969,97,NA,6.9,27,0,0,0,0,4.5,14.5,34.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Nihon kuroshakai",1999,105,NA,6.9,133,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nihon no higeki",1953,116,NA,8.3,18,0,0,0,0,0,0,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Nihon no ichiban nagai hi",1967,157,NA,8.7,14,24.5,0,0,0,0,4.5,14.5,0,24.5,34.5,"",0,0,0,1,0,0,0 -"Nihon no yoru to kiri",1960,107,NA,7.2,35,0,4.5,4.5,4.5,0,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Nihonbashi",1956,115,NA,6.3,8,0,0,0,0,0,24.5,24.5,34.5,0,14.5,"",0,0,0,1,0,1,0 -"Nihonkai daikaisen",1969,128,NA,5.6,10,14.5,0,0,0,24.5,14.5,24.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Nije lako sa muskarcima",1985,91,NA,6.3,19,0,0,0,14.5,14.5,0,0,14.5,4.5,45.5,"",0,0,1,0,0,1,0 -"Nije nego",1978,97,NA,8.3,7,0,0,14.5,0,0,0,0,24.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Nijinsky",1980,129,NA,5.9,98,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Nijushi no hitomi",1954,116,NA,8.3,69,4.5,0,4.5,0,0,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Niki de Saint Phalle: Wer ist das Monster - du oder ich?",1996,93,NA,8.3,14,4.5,0,0,0,4.5,0,14.5,14.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Niki et Flo",2003,100,NA,7.1,71,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Nikita",1990,112,NA,7.6,10867,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Nikita Blues",2001,85,NA,3.1,22,4.5,14.5,24.5,14.5,4.5,4.5,4.5,0,0,24.5,"R",0,0,0,1,0,0,0 -"Nikki, Wild Dog of the North",1961,74,NA,6.1,55,4.5,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Niklas och Figuren",1971,90,NA,5,5,0,0,24.5,0,64.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Nikmato Shel Itzik Finkelstein",1993,83,500000,7.3,7,0,0,0,0,0,0,24.5,0,74.5,0,"",0,0,1,0,0,0,0 -"Nikodem Dyzma",1956,107,NA,8.6,5,24.5,0,0,24.5,0,0,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Nikos",2003,100,65000,3.6,93,34.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nikudan",1968,116,NA,9,9,0,0,0,0,0,0,14.5,24.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Nikutai no mon",1964,90,NA,7.2,108,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nil by Mouth",1997,128,9000000,6.9,1159,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Nils Karlsson Pyssling",1990,75,NA,5.6,38,0,0,4.5,14.5,24.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Niluohe nuer",1987,91,NA,6.1,21,4.5,0,4.5,0,14.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nimed marmortahvlil",2002,88,NA,7.1,304,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Nimeh-ye penhan",2001,103,NA,7.6,73,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nin x Nin: Ninja Hattori-kun, the Movie",2004,102,NA,6.6,10,0,0,14.5,0,14.5,14.5,45.5,24.5,0,0,"",1,0,1,1,0,0,0 -"Nina",2004,90,NA,8.1,59,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,24.5,"",0,1,0,1,0,0,0 -"Nina Hagen = Punk + Glory",1999,100,NA,6.1,18,4.5,0,0,14.5,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Nina Takes a Lover",1994,100,NA,5.2,216,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Nine 1/2 Weeks",1986,102,NA,5.3,5459,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Nine Dead Gay Guys",2002,83,NA,6.2,274,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Nine Deaths of the Ninja",1985,94,NA,2.5,100,34.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Nine Girls",1944,78,NA,7.9,9,0,0,0,0,0,14.5,24.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Nine Good Teeth",2003,75,NA,7.2,23,0,0,0,0,4.5,0,24.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Nine Hours to Rama",1963,124,NA,6.6,66,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nine Lives",2002,82,NA,2.8,203,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nine Lives Are Not Enough",1941,63,NA,3.9,31,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nine Lives of Fritz the Cat, The",1974,79,NA,4.9,248,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,1,1,1,0,0,0 -"Nine Lives of Tomas Katz, The",2000,87,NA,7,184,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Nine Lives of a Wet Pussy",1976,63,NA,2.5,26,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Nine Men",1943,68,NA,5.8,15,0,0,0,0,24.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nine Mile Walk, The",2003,20,NA,6.7,9,0,0,0,0,14.5,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Nine Months",1995,103,NA,5.3,6351,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Nine O'Clock Folks",1931,11,NA,3.3,8,14.5,0,24.5,0,14.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Nine to Five",1980,110,NA,6.3,4785,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nineteen Eighty-Four",1984,113,NA,6.8,4085,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ninfa plebea",1996,110,NA,5.1,16,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Ningen Johatsu",1967,130,NA,7.5,23,0,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Ningen gokaku",1998,109,NA,7.1,61,0,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Ningen no joken I",1959,208,NA,8.9,139,0,0,4.5,0,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Ningen no joken II",1959,181,NA,9,98,0,0,0,0,0,4.5,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Ningen no joken III",1961,190,NA,9.2,95,0,0,4.5,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Ningen no yakusoku",1986,124,NA,6.6,9,0,0,0,14.5,0,14.5,24.5,24.5,34.5,0,"",0,0,0,0,0,0,0 -"Ninja Academy",1990,120,NA,2.8,72,24.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ninja Assassins",1985,91,NA,1.5,14,74.5,4.5,0,4.5,0,0,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Ninja Bachelor Party",1991,30,5000,7.2,52,4.5,4.5,4.5,0,0,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Ninja Champion",1985,87,NA,3.1,14,24.5,24.5,14.5,4.5,0,4.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ninja Checkmate",1979,90,NA,5.3,41,4.5,0,4.5,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ninja Demon's Massacre",1988,90,NA,1.5,9,45.5,14.5,14.5,0,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Ninja Dragon",1986,85,NA,2.7,14,44.5,24.5,4.5,0,0,4.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Ninja Hunter, The",1984,88,NA,6.2,24,4.5,4.5,0,0,24.5,4.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Ninja III: The Domination",1984,92,NA,3.8,240,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Ninja Knight Brothers of Blood",1988,90,NA,2,10,44.5,0,24.5,0,0,0,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Ninja Mission, The",1984,93,NA,3.2,141,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Ninja Pays Half My Rent, A",2003,5,NA,7.6,69,4.5,4.5,4.5,0,4.5,14.5,4.5,34.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Ninja Thunderbolt",1985,90,NA,3.5,28,24.5,4.5,4.5,14.5,4.5,4.5,14.5,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Ninja Vs. Bruce Lee",1982,79,NA,1.2,10,64.5,14.5,0,14.5,0,0,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Ninja Warriors",1985,90,NA,1.5,26,45.5,14.5,14.5,4.5,4.5,0,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Ninja bugei-cho",1967,135,NA,6.4,10,0,0,0,0,24.5,0,14.5,34.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Ninja bugeicho momochi sandayu",1980,117,NA,5.8,82,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Ninja the Protector",1986,92,NA,2.8,37,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Ninja, the Violent Sorceror",1986,90,NA,2.8,5,44.5,24.5,0,0,0,24.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Ninjo kami fusen",1937,86,NA,9.2,15,0,0,0,0,0,4.5,0,0,34.5,64.5,"",0,0,0,1,0,0,0 -"Ninotchka",1939,100,1365000,7.9,2388,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Ninth Configuration, The",1980,99,NA,6.9,831,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Ninth Gate, The",1999,133,38000000,6.4,16291,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Ninth Guest, The",1934,65,NA,6.8,6,0,0,0,0,0,14.5,64.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ninth Street",1999,95,NA,5.7,35,4.5,0,4.5,4.5,14.5,4.5,4.5,24.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Nionde kompaniet",1987,109,NA,5.5,164,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nipagesh Basivuv",1989,85,NA,3.4,11,4.5,4.5,0,14.5,4.5,4.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Nipernaadi",1983,88,NA,8.9,22,4.5,0,4.5,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Nipoti di Zorro, I",1968,96,NA,6.3,8,14.5,0,0,0,14.5,14.5,34.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Nippon Sengoshi - Madamu onboro no Seikatsu",1970,105,NA,6.6,18,4.5,0,4.5,0,0,14.5,44.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Nippon chinbotsu",1973,90,NA,4.2,42,34.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nippon konchuki",1963,123,NA,7.9,75,0,0,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nippon musekinin jidai",1962,86,NA,8.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Nippon no kuroi natsu - Enzai",2001,118,NA,7.6,9,0,14.5,0,0,0,34.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nippon tanjo",1959,112,NA,7.9,21,4.5,0,0,0,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Nirgendwo in Afrika",2001,141,NA,8,2688,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Nirvana",1997,113,NA,5.4,1199,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Nirvana Live! Tonight! Sold Out!!",1994,90,NA,8.9,272,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Nirvana Street Murder",1990,75,NA,5.7,22,0,0,0,4.5,14.5,4.5,45.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Nise daigakusei",1960,94,NA,8.4,8,0,0,0,0,0,0,34.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Nishaant",1975,140,NA,6.5,30,4.5,0,0,4.5,4.5,0,14.5,14.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Nishi Ginza ekimae",1958,52,NA,5.9,13,0,0,0,4.5,0,34.5,14.5,4.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Niskavuoren Aarne",1954,91,NA,7.8,12,0,0,0,0,4.5,4.5,14.5,45.5,14.5,0,"",0,0,0,0,0,0,0 -"Niskavuoren naiset",1938,84,NA,5.5,6,0,0,0,14.5,0,0,64.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Niskavuori",1984,115,NA,4.4,11,0,0,4.5,14.5,0,34.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Niskavuori taistelee",1957,96,NA,5.9,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Nisuim Fiktiveem",1988,90,25000,7.1,7,14.5,0,0,14.5,0,0,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nit-Witty Kitty",1951,7,NA,6.3,32,0,0,14.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Nitrate Kisses",1992,67,NA,5.9,13,4.5,0,0,14.5,4.5,34.5,4.5,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Nitrato d'argento",1997,87,NA,6.2,16,0,14.5,4.5,0,14.5,0,14.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Nits",2003,10,NA,7.9,6,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Nitschewo",2003,86,NA,8.3,6,0,0,0,0,14.5,0,14.5,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Nitwits, The",1935,81,NA,6.8,41,0,0,0,4.5,14.5,4.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Niu-Peng",1989,86,NA,6.2,19,14.5,0,4.5,4.5,4.5,24.5,14.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Nix on Hypnotricks",1941,7,NA,7.8,9,0,0,0,0,0,14.5,34.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Nixon",1995,212,50000000,6.8,5837,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Nizhalkkuthu",2002,90,NA,5.8,21,4.5,0,4.5,4.5,0,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Njama nishto po-hubavo ot loshoto vreme",1971,129,NA,7.9,9,0,0,0,0,14.5,0,24.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"No 1: Licensed to Love and Kill",1979,78,NA,2.8,13,14.5,24.5,24.5,4.5,4.5,0,0,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"No Alibi",2000,90,NA,4.4,201,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"No Angel",1992,96,NA,5,9,14.5,0,14.5,14.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"No Barking",1954,7,NA,7.5,29,0,0,0,0,14.5,14.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"No Big Deal",1983,86,NA,5.7,16,0,4.5,4.5,4.5,4.5,14.5,34.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"No Blade of Grass",1970,96,1500000,6.2,82,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"No Budget Story",1998,87,NA,7.2,45,4.5,0,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"No Census, No Feeling",1940,17,NA,8.3,68,0,0,4.5,0,4.5,0,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,1 -"No Code of Conduct",1998,95,12000000,4.4,314,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"No Contest",1994,98,NA,3.7,219,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"No Contest II",1997,86,NA,4.3,89,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"No Contest!",1934,22,NA,5.5,8,0,0,0,24.5,14.5,34.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"No Dead Heroes",1987,86,NA,2,11,64.5,14.5,0,0,0,0,14.5,0,0,0,"",1,0,0,0,0,0,0 -"No Deposit, No Return",1976,112,NA,5.5,209,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"No Dessert, Dad, Till You Mow the Lawn",1994,89,NA,3.9,50,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"No Dia dos Meus Anos",1992,65,NA,7.7,7,0,0,0,0,14.5,14.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"No Dough Boys",1944,17,NA,7.6,52,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"No Down Payment",1957,105,NA,6.9,70,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"No Drums, No Bugles",1972,85,NA,5.2,29,14.5,4.5,0,14.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"No Dumb Questions",2001,24,NA,8.1,9,0,14.5,0,0,0,0,24.5,34.5,0,34.5,"",0,0,0,0,1,0,1 -"No Easy Way",1996,107,NA,7.5,25,0,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"No Escape",1953,76,NA,6.2,5,0,0,0,24.5,24.5,0,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"No Escape",1994,118,20000000,5.6,2372,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"No Exit",1962,85,NA,4.7,8,0,0,0,14.5,24.5,14.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"No Exit",1995,93,NA,3.4,56,14.5,4.5,14.5,14.5,14.5,4.5,14.5,0,0,14.5,"R",1,0,0,0,0,0,0 -"No Exit",1998,110,NA,6.3,18,14.5,4.5,0,14.5,0,4.5,0,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"No Experience Necessary",1996,25,NA,3.1,12,24.5,0,0,0,0,24.5,4.5,24.5,0,14.5,"",0,0,1,0,0,0,1 -"No Greater Glory",1934,117,NA,7,15,4.5,0,4.5,0,0,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"No Highway",1951,98,NA,7.2,373,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"No Holds Barred",1952,65,NA,6.6,26,0,0,0,0,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"No Holds Barred",1989,93,NA,3.5,1007,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"No Hunting",1955,6,NA,7.5,21,0,0,0,0,0,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"No Kidding",1960,86,NA,4.9,5,0,24.5,0,24.5,24.5,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"No Law 4000",2002,28,NA,7,15,4.5,0,4.5,14.5,34.5,0,14.5,4.5,0,24.5,"",1,0,1,0,0,0,1 -"No Leave, No Love",1946,119,NA,5.4,19,0,4.5,0,34.5,14.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"No Lies...",1975,16,NA,8.6,30,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,1 -"No Limit",1931,72,NA,6.3,9,0,0,0,0,14.5,24.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"No Limit",1936,80,NA,4.9,23,4.5,0,4.5,0,4.5,4.5,4.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"No Looking Back",1998,96,5000000,5.6,622,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"No Love for Johnnie",1961,110,NA,6.3,34,4.5,0,0,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"No Man Is an Island",1962,114,NA,6.3,78,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"No Man of Her Own",1932,85,NA,6.1,91,4.5,4.5,0,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"No Man of Her Own",1950,98,NA,7.2,125,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"No Man's Land",1985,110,NA,5.2,21,0,14.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"No Man's Land",1987,106,NA,5.2,490,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"No Man's Land",2001,98,NA,7.9,7184,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"No Maps for These Territories",2000,89,NA,6.8,69,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"No Mercy",1986,106,NA,5.5,980,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"No Mercy Man, The",1975,91,NA,3.9,13,4.5,0,4.5,14.5,4.5,34.5,14.5,0,0,4.5,"",1,0,0,1,0,0,0 -"No Minor Vices",1948,96,NA,5.6,23,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"No Money, No Funey",1990,96,NA,4.7,9,0,0,14.5,45.5,14.5,14.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"No More Excuses",1968,62,12000,1,7,84.5,0,0,0,0,0,0,0,14.5,0,"",0,0,1,0,0,0,0 -"No More Ladies",1935,80,NA,6.5,42,4.5,0,4.5,14.5,4.5,14.5,14.5,24.5,0,14.5,"",0,0,1,0,0,1,0 -"No More Monkeys Jumpin' on the Bed",2000,76,NA,4.1,18,0,0,24.5,24.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"No My Darling Daughter",1961,85,NA,6,16,0,0,0,0,14.5,45.5,24.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"No Name on the Bullet",1959,77,NA,7.2,141,4.5,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"No News Is Good News",1943,10,NA,6.1,6,0,0,0,14.5,0,45.5,0,0,0,34.5,"",0,0,1,0,0,0,1 -"No Nukes",1980,103,NA,5.9,40,14.5,0,14.5,0,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"No One Can Hear You",2001,92,NA,4.4,101,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"No One Could Protect Her",1996,97,NA,6.2,47,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"No One Man",1932,73,NA,4,6,0,14.5,14.5,0,34.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"No One Sleeps",2000,108,NA,4.6,85,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"No Orchids for Miss Blandish",1948,98,NA,5.1,6,14.5,0,0,0,0,14.5,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"No Ordinary Love",1994,90,NA,4,101,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"No Other Woman",1933,58,NA,5.9,24,0,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"No Parking Hare",1954,7,NA,7.7,37,0,4.5,4.5,0,0,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"No Pets",1994,79,NA,7.2,8,24.5,0,0,0,0,0,0,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"No Picnic",1987,84,NA,7,7,0,0,0,0,0,0,44.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"No Place Like Home",2001,85,NA,4.9,31,4.5,0,4.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"No Place to Go",1939,56,NA,5.2,12,0,0,0,14.5,4.5,45.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"No Place to Hide",1975,90,NA,3.9,67,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"No Place to Hide",1982,30,NA,5,6,0,0,14.5,0,34.5,0,34.5,0,0,14.5,"",0,0,0,0,0,0,1 -"No Place to Hide",1993,98,NA,4.7,146,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"No Place to Land",1958,77,NA,4.3,11,4.5,14.5,4.5,0,34.5,0,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"No Problem",1992,13,NA,6.5,11,0,0,4.5,0,4.5,24.5,14.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"No Prom for Cindy",2002,26,NA,6.6,10,0,0,14.5,0,0,14.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"No Quarter",1995,24,NA,7.7,7,0,14.5,0,0,0,0,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"No Quarto da Vanda",2000,179,NA,7.9,42,4.5,0,4.5,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"No Questions Asked",1951,80,NA,6.3,36,4.5,0,0,0,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"No Regrets",2004,96,NA,4.1,23,4.5,0,4.5,4.5,4.5,0,4.5,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"No Retreat, No Surrender",1985,79,NA,4,1065,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"No Retreat, No Surrender 2: Raging Thunder",1989,104,NA,4.1,107,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"No Retreat, No Surrender 3: Blood Brothers",1990,101,NA,3.8,56,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"No Return",2003,86,35000,6.1,18,14.5,4.5,0,0,34.5,4.5,4.5,14.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"No Road Back",1957,83,NA,5.6,15,0,0,0,14.5,14.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"No Room for the Groom",1952,82,NA,5.8,29,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"No Sad Songs for Me",1950,88,NA,6.8,32,4.5,4.5,0,4.5,14.5,14.5,4.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"No Sail",1945,7,NA,6.5,18,0,0,0,0,14.5,34.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"No Secrets",1991,92,NA,4.3,27,14.5,4.5,14.5,14.5,14.5,0,24.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"No Sex Last Night",1996,76,NA,6.7,22,14.5,0,4.5,14.5,0,4.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,1,0 -"No Sex Please: We're British",1973,91,NA,4.6,94,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"No Skin Off My Ass",1991,73,NA,5.9,76,14.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"No Sleep 'til Madison",2002,89,NA,6,23,4.5,0,0,4.5,4.5,24.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"No Small Affair",1984,102,NA,5.1,282,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"No Smoking",1951,6,NA,7.4,41,4.5,0,0,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"No Strings Attached",1997,93,NA,5.3,44,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"No Such Thing",2001,102,NA,6.5,793,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"No Such Thing As Gravity",1989,36,NA,7.4,5,24.5,0,0,0,0,0,0,44.5,0,44.5,"",0,0,0,0,0,0,1 -"No Surrender",1985,100,NA,6.3,83,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"No Telling",1991,93,NA,4.7,32,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"No Time for Comedy",1940,93,NA,6.4,95,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"No Time for Love",1943,83,NA,7.1,72,0,0,0,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"No Time for Sergeants",1958,119,NA,7.5,635,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"No Time to Be Young",1957,82,NA,7.9,6,0,0,0,0,0,0,34.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"No Time to Die",1958,86,NA,5.8,22,0,0,4.5,4.5,24.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"No Tomorrow",1998,100,NA,3.5,84,24.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"No Tomorrow",2002,91,NA,4.5,11,4.5,14.5,14.5,0,14.5,0,0,24.5,0,4.5,"",0,0,0,1,0,0,0 -"No Trees in the Street",1958,96,NA,4.5,8,14.5,0,0,14.5,24.5,0,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"No Trespassing",1922,70,NA,8.9,18,24.5,4.5,0,0,0,0,0,0,0,74.5,"",0,0,0,1,0,0,0 -"No Turning Back",2001,101,NA,5.7,134,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"No Vacancy",1999,84,NA,4.5,98,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"No Vladimir",2000,6,NA,8.1,19,0,0,0,0,0,14.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"No Way Back",1976,103,NA,3.5,14,24.5,4.5,0,4.5,14.5,0,0,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"No Way Back",1995,91,NA,5.2,474,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"No Way Home",1996,99,4000000,6.6,328,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"No Way Out",1950,106,NA,7.4,264,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"No Way Out",1987,114,NA,7,5814,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"No Way to Treat a Lady",1968,108,NA,7.1,364,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"No Witness",2003,9,NA,6.9,7,44.5,0,0,0,0,14.5,44.5,0,0,0,"",0,0,0,0,0,0,1 -"No Witness",2004,95,350000,3.8,9,24.5,14.5,14.5,14.5,0,0,0,14.5,0,34.5,"R",0,0,0,0,0,0,0 -"No abras nunca esa puerta",1952,85,NA,9.1,7,0,0,0,0,0,0,0,14.5,45.5,24.5,"",0,0,0,0,0,0,0 -"No quiero volver a casa",2001,78,NA,8.1,11,0,0,0,4.5,0,4.5,4.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"No sabe no contesta",2002,90,NA,6,36,4.5,4.5,0,4.5,14.5,34.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"No se lo digas a nadie",1998,120,NA,8,300,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"No somos de piedra",1968,89,NA,5.3,5,0,0,24.5,24.5,0,24.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"No somos nadie",2002,93,NA,4.3,37,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,4.5,"R",0,0,0,1,0,0,0 -"No sos vos, soy yo",2004,105,NA,6.9,26,0,0,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"No trains no planes",1999,105,NA,7.8,112,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"No yohna mono",1981,103,NA,6.2,5,0,0,0,0,24.5,0,24.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"No! No! A Thousand Times No!!",1935,7,NA,6,14,0,14.5,0,0,14.5,24.5,24.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"No, No, Nanette",1940,96,NA,4.9,13,0,4.5,14.5,34.5,24.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"No, Not Now",2001,17,NA,6.3,10,0,0,0,24.5,14.5,0,14.5,24.5,34.5,14.5,"",0,0,0,0,0,0,1 -"No. 1 of the Secret Service",1977,91,NA,5.1,21,4.5,14.5,14.5,4.5,34.5,4.5,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"No. 3",1997,108,NA,7.1,132,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"No. 4",1966,6,NA,5.2,6,0,0,34.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Noa Bat 17",1982,86,NA,7.6,7,0,0,0,0,14.5,14.5,0,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Noa Noa",1974,105,NA,6.8,6,0,0,14.5,0,0,34.5,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Noah's Arc",2004,75,NA,8.3,11,4.5,0,0,0,0,0,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Noah's Ark",1929,75,2000000,5.9,73,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Noah's Ark",1959,19,NA,7.3,20,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Noam Chomsky: Personal Influences",1994,28,NA,9.4,6,34.5,0,0,0,0,0,0,0,14.5,45.5,"",0,0,0,0,1,0,1 -"Nob Hill",1945,95,NA,6,22,0,0,0,4.5,14.5,34.5,34.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Nobat e Asheghi",1990,75,NA,6.3,20,4.5,0,0,4.5,24.5,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Nobi",1959,110,NA,8.3,149,0,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Noble Sissle and Eubie Blake",1923,3,NA,5.3,6,0,0,0,14.5,34.5,14.5,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Nobleza baturra",1935,85,NA,5.1,9,0,14.5,0,14.5,34.5,14.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Nobody",1998,16,13000,5.3,16,4.5,4.5,0,4.5,4.5,4.5,0,4.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Nobody Knows Anything!",2003,88,NA,4.4,76,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,0,"R",0,0,1,0,0,0,0 -"Nobody Knows: Chronicle of an Unsigned Band",2003,82,0,8.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Nobody Lives Forever",1946,100,NA,6.8,105,0,4.5,0,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nobody Needs to Know",2003,96,NA,5.5,17,4.5,0,0,14.5,14.5,0,0,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Nobody Waved Good-bye",1964,80,NA,6.1,34,0,0,4.5,0,14.5,4.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nobody's Baby",1937,68,NA,3.9,10,14.5,0,0,0,24.5,24.5,44.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Nobody's Baby",2001,110,NA,6.2,290,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Nobody's Business",1996,60,NA,7.7,60,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Nobody's Fool",1986,107,NA,5.4,196,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nobody's Fool",1994,110,NA,7.2,3654,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nobody's Perfect",1968,103,NA,5.8,30,0,4.5,0,4.5,24.5,4.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Nobody's Perfect",1989,90,NA,5.1,99,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nobody's Perfect",2004,25,NA,5.9,24,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Nobody's Perfekt",1981,96,NA,4.1,38,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Noc na Karlstejne",1973,87,NA,7.8,50,0,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Noc u kuci moje majke",1991,96,NA,7.3,7,0,0,14.5,0,0,14.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Noc za slusanje",1995,42,NA,5.6,5,24.5,0,0,24.5,0,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Noce blanche",1989,92,NA,7,243,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Noce i dnie",1975,245,NA,7,31,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Noces barbares, Les",1987,99,NA,7.3,32,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Noces rouges, Les",1973,96,NA,6.9,121,4.5,4.5,0,4.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Noch nad Chili",1977,111,NA,8,7,14.5,0,0,0,0,0,0,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Noch pered Rozhdestvom",1913,41,NA,8.6,18,0,0,0,0,4.5,14.5,14.5,4.5,34.5,24.5,"",0,0,1,0,0,0,1 -"Noche con Sabrina Love, Una",2000,95,NA,7.5,186,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Noche de Walpurgis, La",1971,95,NA,4.5,155,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Noche de bodas",2000,4,NA,6.6,10,0,24.5,0,0,0,24.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Noche de duendes",1930,47,NA,6.9,6,14.5,0,0,14.5,0,14.5,14.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Noche de las gaviotas, La",1976,89,NA,4.7,91,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Noche de los asesinos, La",1976,82,NA,5,20,0,14.5,14.5,4.5,24.5,14.5,14.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Noche de los brujos, La",1974,80,NA,3.4,23,4.5,4.5,24.5,4.5,14.5,4.5,0,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Noche de los mil gatos, La",1972,63,NA,2.1,48,34.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Noche de reyes",2001,99,NA,4.6,45,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Noche del terror ciego, La",1971,101,NA,5.5,364,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Noche en la terraza",2002,90,NA,8.5,20,0,14.5,4.5,0,0,0,4.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Noche oscura, La",1989,93,NA,6.4,15,4.5,4.5,0,0,4.5,14.5,44.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Noche, La",2001,86,NA,2.5,10,74.5,0,0,14.5,14.5,0,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Noches de Constantinopla, Las",2001,119,NA,6.4,5,24.5,0,0,0,0,24.5,0,44.5,24.5,0,"",0,0,1,0,0,0,0 -"Nochevala tuchka zolotaya...",1989,97,NA,7.7,6,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Nochnoy dozor",2004,115,4200000,6.3,1020,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",1,0,0,0,0,0,0 -"Nochnye zabavy",1991,97,NA,4.5,20,4.5,0,0,0,0,0,24.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Nocturna",1979,85,NA,5.9,24,0,4.5,4.5,4.5,24.5,4.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nocturna Artificialia",1979,21,NA,7.5,35,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Nocturne",1946,87,NA,7.4,78,0,0,0,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nocturne indien",1989,112,NA,7.5,92,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nocturnes",1988,9,NA,7.4,7,14.5,0,0,0,0,14.5,14.5,14.5,0,44.5,"",0,1,0,0,0,0,1 -"Nocturnu",1998,11,NA,5.1,14,14.5,4.5,0,4.5,4.5,4.5,4.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Nodo jiman",1999,112,NA,6.4,16,4.5,0,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Noe beroligende",1995,82,NA,6,5,44.5,0,0,0,0,0,0,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Noe helt annet",1985,75,NA,4.6,40,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Noel",2004,96,NA,5.9,211,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Nogent, Eldorado du dimanche",1929,16,NA,7.4,10,0,0,0,0,0,14.5,45.5,34.5,0,14.5,"",0,0,0,0,1,0,1 -"Nogiku no gotoki kimi nariki",1955,100,NA,7.9,14,0,0,0,0,0,14.5,14.5,4.5,34.5,24.5,"",0,0,0,1,0,1,0 -"Nogo",2002,90,NA,6.4,39,4.5,0,0,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Nohoi oron",1998,94,NA,7.3,41,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Noi tre",1984,88,NA,6.5,11,0,0,0,4.5,4.5,4.5,24.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Noi uomini duri",1987,90,NA,4,35,4.5,4.5,4.5,34.5,14.5,24.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Noi vivi",1942,174,NA,7.7,59,4.5,0,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Noigwon",1983,95,NA,4.2,6,14.5,0,14.5,14.5,34.5,0,14.5,0,0,0,"",1,0,0,0,0,0,0 -"Noir comme le souvenir",1995,92,NA,6.6,24,4.5,0,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Noir et blanc",1986,80,NA,7.6,31,4.5,0,4.5,0,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Noire de..., La",1966,65,NA,7.6,51,0,4.5,4.5,4.5,0,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Noirs et blancs en couleur",1976,90,NA,7.3,155,0,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Noises Off...",1992,101,NA,6.9,2344,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Noite Escura",2004,94,NA,6.5,50,24.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Noite Vazia",1964,93,NA,6.7,36,4.5,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Noite, A",1999,6,NA,8,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Noites",2000,75,NA,5,5,24.5,0,0,0,24.5,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Nola",2003,97,NA,5.9,25,14.5,4.5,24.5,4.5,4.5,4.5,4.5,0,4.5,34.5,"R",0,0,1,0,0,1,0 -"Noleul bola america",1991,90,NA,4.1,10,24.5,0,14.5,14.5,14.5,14.5,14.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Noll tolerans",1999,108,NA,6.4,634,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Nom de code: Sacha",2001,37,NA,7.1,8,14.5,14.5,24.5,0,0,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Nom du feu, Le",2002,20,NA,6.2,7,24.5,0,14.5,0,0,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Nomads",1986,91,NA,5.5,431,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nomads of the North",1920,109,NA,6,20,0,0,14.5,4.5,24.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nombril du monde, Le",1993,145,NA,6.4,16,0,0,4.5,0,4.5,14.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Nomi Song, The",2004,96,NA,6.9,64,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Nomina Domini",2000,22,NA,6.3,9,14.5,0,0,0,0,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Nomos 4000",1962,91,NA,7.5,19,0,0,0,0,14.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Non aver paura della zia Marta",1989,88,NA,5.8,25,14.5,0,14.5,4.5,4.5,14.5,24.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Non chiamarmi Omar",1992,102,NA,3.6,10,14.5,14.5,0,14.5,14.5,14.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Non ci resta che piangere",1985,113,NA,7.5,456,4.5,4.5,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Non coupable",1947,95,NA,8.3,17,0,4.5,0,0,0,4.5,24.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Non ho sonno",2001,117,NA,6,951,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Non lo sappiamo ancora",1999,95,NA,6.3,6,0,0,0,0,14.5,34.5,45.5,0,0,0,"",0,0,1,0,0,0,0 -"Non si deve profanare il sonno dei morti",1974,93,NA,6.7,412,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Non si sevizia un paperino",1972,102,NA,7.2,438,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Non stop sempre buio in sala",1985,80,NA,4.3,5,0,0,24.5,0,0,0,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Non ti muovere",2004,125,NA,7,489,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Non ti pago!",1942,72,NA,7.8,13,0,0,0,0,14.5,4.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Non-Abductees Anonymous",2001,4,15000,7.2,11,0,0,0,4.5,4.5,4.5,24.5,34.5,0,4.5,"",0,0,1,0,0,0,1 -"Non-Stop New York",1937,69,NA,6.8,19,4.5,4.5,0,4.5,14.5,4.5,24.5,44.5,0,4.5,"",0,0,0,1,0,1,0 -"Nona, La",1979,73,NA,5.1,39,4.5,0,4.5,4.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"None But the Brave",1965,106,NA,6.5,208,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"None But the Lonely Heart",1944,113,NA,6.4,206,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"None Shall Escape",1944,85,NA,7.1,17,0,0,4.5,4.5,14.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nonna Sabella, La",1957,95,NA,6.9,11,0,0,0,0,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Noodle Soup",2003,8,15000,8.2,7,0,0,0,0,0,0,14.5,45.5,24.5,0,"",0,0,1,0,0,0,1 -"Noodles",2004,5,NA,6.4,6,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Noon Blue Apples",2002,122,NA,7.5,26,4.5,4.5,0,4.5,4.5,14.5,4.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Noon Sunday",1975,104,NA,5.4,6,34.5,14.5,0,14.5,0,0,14.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Noorderlingen, De",1992,108,NA,7.6,316,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Noored kotkad",1927,78,NA,8,7,0,0,14.5,0,0,0,0,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Noose Hangs High, The",1948,77,NA,5.8,57,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Noose for a Gunman",1960,69,NA,5,8,0,14.5,0,14.5,24.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Noose, The",1948,72,NA,6.4,16,0,0,14.5,4.5,4.5,14.5,4.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Nor the Moon by Night",1958,84,NA,4.7,24,0,4.5,0,4.5,44.5,14.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Nora",2000,106,NA,5.9,460,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Nora Prentiss",1947,111,NA,7,108,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nora inu",1949,122,NA,7.9,1197,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nora inu",1973,104,NA,7.2,21,4.5,4.5,0,0,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Nora-neko rokku: Sekkusu hanta",1970,85,NA,6.8,31,0,0,4.5,4.5,4.5,24.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Norang meori 2",2001,102,NA,6.3,13,0,4.5,4.5,0,4.5,4.5,34.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Nord",1991,88,NA,7.3,23,0,0,4.5,4.5,0,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Nordkraft",2005,125,NA,7.2,115,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nordrand",1999,107,NA,7.1,174,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nordsee ist Mordsee",1976,87,NA,6.7,58,0,4.5,0,0,14.5,4.5,34.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Norega se metek ogne",2004,85,NA,9,11,4.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,1,1,0,0,0 -"Norma Rae",1979,110,NA,7.3,1490,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Norma's Lament",1997,34,25000,2.8,16,14.5,0,4.5,0,0,14.5,0,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Normaal - Ik kom altied weer terug",2001,82,NA,6.2,29,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Normais, Os",2003,110,NA,7.5,192,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Normal Life",1996,102,NA,6.2,566,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Normal Love",1963,105,NA,9.7,5,0,0,0,0,24.5,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Normalni ljudi",2001,91,NA,5.9,14,0,0,14.5,4.5,34.5,4.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Norman Jewison, Filmmaker",1971,50,NA,6.8,6,0,0,14.5,0,45.5,0,0,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Norman Loves Rose",1982,98,NA,5.6,15,0,4.5,4.5,0,24.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Norman's Awesome Experience",1988,87,NA,3.8,19,14.5,14.5,0,24.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Norman... Is That You?",1976,91,NA,4.4,75,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Normanni, I",1962,79,NA,4.1,10,14.5,14.5,0,0,34.5,24.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Noro",2002,85,500000,5.4,12,14.5,0,0,14.5,45.5,4.5,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Norseman, The",1978,90,NA,3.2,122,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Norske byggeklosser",1972,94,NA,6.5,137,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Norte, El",1983,139,NA,7.6,830,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"North",1994,87,40000000,4.1,2539,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"North Avenue Irregulars, The",1979,99,NA,5.8,199,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"North Beach",2000,78,NA,5.4,55,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,4.5,44.5,"",0,0,1,1,0,0,0 -"North Dallas Forty",1979,119,NA,7,774,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"North End, The",1997,98,NA,8.5,12,0,0,0,0,0,4.5,4.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"North Sea",1938,32,NA,6,6,0,14.5,0,0,0,0,45.5,34.5,0,0,"",0,0,0,1,1,0,1 -"North Sea Hijack",1980,99,NA,6.2,577,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"North Shore",1987,84,NA,5.5,302,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,1,0 -"North Star, The",1943,108,NA,6,115,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"North West Frontier",1959,129,NA,7.1,198,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"North West Mounted Police",1940,126,NA,6.3,226,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"North by Northwest",1959,136,4000000,8.6,35648,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"North from the Lone Star",1941,58,NA,6.1,6,0,0,0,14.5,14.5,45.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"North of Pittsburgh",1992,98,NA,4.7,13,4.5,0,4.5,24.5,24.5,0,4.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"North of Providence",2003,28,10000,9.7,7,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,0,1,0,0,1 -"North of Superior",1971,18,NA,8.3,13,0,0,0,0,0,4.5,0,14.5,44.5,34.5,"",0,0,0,0,1,0,1 -"North of Vortex",1991,58,NA,5,6,14.5,14.5,0,14.5,0,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"North of the Great Divide",1950,67,NA,6.2,14,0,0,0,0,24.5,44.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"North of the Rio Grande",1937,70,NA,7.3,18,0,0,0,0,14.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"North on Evers",1992,87,NA,6.7,5,0,0,0,0,0,44.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"North or Northwest",1938,8,NA,8.2,6,14.5,0,0,0,14.5,0,14.5,14.5,0,34.5,"",0,0,1,0,0,1,1 -"North to Alaska",1960,122,3500000,6.7,777,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Northeast of Seoul",1972,84,NA,4.4,12,14.5,0,0,44.5,14.5,4.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Northern Lights",1978,95,NA,6.7,35,0,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Northern Lights",2000,30,NA,8.4,11,4.5,0,0,4.5,0,44.5,0,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Northern Pursuit",1943,94,NA,6.6,109,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Northern Soul",2004,30,NA,8.5,11,0,0,0,0,0,14.5,4.5,24.5,0,44.5,"",0,0,1,1,0,0,1 -"Northern Star",2003,82,NA,5.3,11,0,0,14.5,0,24.5,4.5,4.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Northfork",2003,103,1900000,6.2,1521,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Northville Cemetery Massacre",1976,86,NA,5.2,35,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Northward, Ho!",1940,10,NA,5.3,6,0,0,14.5,14.5,14.5,14.5,34.5,0,0,0,"",0,0,0,0,1,0,1 -"Northwest Hounded Police",1946,7,NA,7.8,55,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Northwest Outpost",1947,91,NA,4.8,16,0,0,4.5,34.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Northwest Passage",1940,125,NA,7.2,443,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Northwest Rangers",1942,65,NA,6,20,0,0,0,0,24.5,64.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Northwest Stampede",1948,79,NA,5.5,23,14.5,0,0,4.5,14.5,34.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Northwest Trail",1945,61,NA,6,6,0,0,0,0,14.5,64.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Norwood",1970,96,NA,5.4,33,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nos Embalos de Ipanema",1978,100,NA,3.2,8,24.5,0,14.5,24.5,0,14.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Nos amis de la banque",1997,85,NA,6.8,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,0,0,0,1,0,0 -"Nos amis les flics",2004,90,NA,4.1,39,4.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nos amis les humains",2003,9,NA,6.5,6,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Nos hacemos falta (Tilt)",2001,97,NA,4.7,8,0,0,45.5,0,0,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Nos miran",2002,104,NA,5.3,164,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nos vies heureuses",1999,145,NA,6.2,65,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Nose Hair",1994,7,NA,7.1,42,0,0,0,4.5,4.5,4.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Nosey Parker",2003,104,NA,7.9,25,0,0,0,0,0,14.5,14.5,45.5,14.5,4.5,"",0,0,1,0,1,0,0 -"Nosferatu Tango",2002,13,NA,6.8,19,0,0,0,0,4.5,14.5,34.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Nosferatu a Venezia",1988,97,NA,5.1,92,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Nosferatu, eine Symphonie des Grauens",1922,92,NA,8.1,8404,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Nosferatu: Phantom der Nacht",1979,124,NA,7.2,2326,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Nosotras",2000,93,NA,6.9,18,0,0,4.5,0,0,24.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Nosotros",2002,71,NA,8.2,5,0,0,0,0,0,0,64.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Nosotros los pobres",1948,128,NA,8.7,82,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Nostalghia",1983,125,NA,7.6,1257,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Nostra signora dei turchi",1968,124,NA,4,21,14.5,0,0,4.5,4.5,0,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Nostradamus",2000,102,NA,4.2,137,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Nostradamus IV",1944,11,NA,4.9,7,0,0,24.5,14.5,24.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Nostradamus Says So!",1955,11,NA,5,7,0,0,0,14.5,44.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Nostradamus and the Queen",1942,12,NA,4.6,25,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Nostradamus, el genio de las tinieblas",1962,77,NA,6.3,6,0,0,0,0,34.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Nostri anni, I",2000,88,NA,3.7,21,14.5,4.5,0,0,0,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,1,0,0 -"Nosutoradamusu no daiyogen",1974,88,NA,3.7,49,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Not Afraid to Say...",1999,85,NA,5.2,22,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Not Afraid, Not Afraid",2001,86,NA,7.8,6,0,0,0,0,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Not Again!",1995,91,NA,3.5,7,24.5,0,14.5,14.5,0,0,0,0,14.5,24.5,"",0,0,1,0,0,1,0 -"Not Angels But Angels",1994,80,NA,5.8,24,4.5,0,0,4.5,4.5,45.5,14.5,4.5,0,0,"",0,0,0,0,1,0,0 -"Not Another Mistake",1988,99,NA,3.8,5,0,0,44.5,0,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Not Another Teen Movie",2001,89,16000000,5.2,10295,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Not Another Tolkien Movie",2004,88,NA,1.7,13,14.5,4.5,4.5,4.5,0,0,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Not Bad for a Girl",1996,90,NA,5.7,17,24.5,0,0,0,0,0,0,14.5,0,64.5,"",0,0,0,0,1,0,0 -"Not Even the Trees",1998,90,NA,3.4,25,24.5,4.5,14.5,0,24.5,4.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Not I",2000,14,NA,5.5,70,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Not Like Us",1995,87,NA,4.7,58,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Not Now",1936,7,NA,5.1,11,0,4.5,0,4.5,24.5,34.5,0,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Not Now Darling",1973,97,NA,4.6,33,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Not Quite Paradise",1986,106,NA,5.2,31,4.5,0,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Not So Dumb",1930,76,NA,6,39,0,4.5,14.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Not Wanted",1949,91,NA,7.4,28,0,4.5,4.5,4.5,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Not Without My Daughter",1991,115,NA,5.7,1507,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Not Without My Handbag",1993,13,NA,7,126,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Not a Fish Story",2002,23,NA,5.9,11,0,0,0,14.5,4.5,24.5,14.5,0,4.5,14.5,"",0,0,0,1,0,0,1 -"Not a Love Song",1997,88,NA,6.3,6,0,14.5,0,14.5,0,14.5,14.5,0,14.5,14.5,"",0,0,1,0,0,1,0 -"Not a Love Story: A Film About Pornography",1981,69,NA,5.5,43,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Not as a Stranger",1955,135,2000000,6.6,223,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Not for Publication",1984,88,NA,4.4,28,4.5,14.5,14.5,14.5,14.5,24.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Not of This Earth",1957,67,100000,4.8,102,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Not of This Earth",1988,81,NA,4.4,236,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Not with My Wife, You Don't!",1966,119,NA,5.5,83,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Note bleue, La",1991,135,NA,3.5,43,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Notebook",1963,10,NA,7.6,5,24.5,0,0,24.5,0,0,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Notebook, The",2004,123,30000000,7.8,8830,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"PG-13",0,0,0,1,0,1,0 -"Notes From Underground",1995,88,NA,7.1,86,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Notes from Under the Volcano",1984,56,NA,5.6,6,0,0,14.5,0,34.5,0,0,0,14.5,34.5,"",0,0,0,0,1,0,0 -"Notes on the Circus",1966,12,NA,3.3,8,34.5,0,0,0,0,14.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Notes to You",1941,7,NA,6.8,24,0,0,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Nothing",2003,90,NA,6.7,374,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Nothing But Trouble",1944,69,NA,5.6,79,4.5,4.5,4.5,14.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nothing But Trouble",1991,94,40000000,3.7,3909,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nothing But a Man",1964,95,160000,7.6,136,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Nothing But the Best",1964,99,NA,7,66,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Nothing But the Night",1972,90,NA,4.5,95,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nothing But the Tooth",1948,7,NA,6.5,21,0,14.5,0,4.5,14.5,14.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Nothing But the Truth",1941,90,NA,7.6,46,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Nothing Deal, The",2000,15,NA,4.4,5,64.5,0,0,0,0,0,0,0,24.5,24.5,"",0,0,1,0,0,0,1 -"Nothing Ever Happens",1933,19,NA,4.2,6,0,0,0,34.5,0,14.5,14.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Nothing Lasts Forever",1984,82,3000000,6.3,90,4.5,4.5,0,4.5,24.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Nothing Like Dreaming",2004,95,NA,7.2,8,0,0,0,0,0,34.5,14.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Nothing Personal",1980,97,NA,4.3,34,4.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Nothing Personal",1995,85,NA,6.7,159,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Nothing Really Happens: Memories of Aging Strippers",2003,93,300000,8.1,7,0,0,0,0,0,24.5,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Nothing Sacred",1937,75,1831927,7.4,535,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Nothing So Strange",2002,82,NA,6.6,46,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Nothing in Common",1986,118,NA,5.7,1169,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Nothing to Hide",1981,101,NA,3.7,26,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Nothing to Lose",1996,108,200000,4.7,138,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nothing to Lose",1997,98,NA,6.5,5606,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,1,0,0,0,0 -"Notorious",1946,101,2000000,8.3,10637,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Notorious Affair, A",1930,67,NA,6.9,9,0,14.5,0,0,24.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Notorious C.H.O.",2002,95,NA,6.8,430,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Notorious Cleopatra, The",1970,88,NA,3.6,9,14.5,14.5,0,24.5,14.5,14.5,0,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Notorious Daughter of Fanny Hill, The",1966,74,NA,2.9,21,14.5,14.5,4.5,24.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Notorious Landlady, The",1962,123,NA,6.2,151,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Notorious Lone Wolf, The",1946,64,NA,6.7,9,0,0,0,0,0,24.5,64.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Notorious Sophie Lang, The",1934,64,NA,6.8,8,0,0,0,0,0,14.5,14.5,45.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Notre Dame de Paris",1956,115,NA,6.4,232,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Notre Dame de la Croisette",1981,53,NA,5.5,11,4.5,4.5,4.5,14.5,0,0,24.5,4.5,0,14.5,"",0,0,0,1,1,0,0 -"Notre histoire",1984,110,NA,7.1,136,0,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Notre musique",2004,80,NA,6.5,289,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Notte brava, La",1959,95,NA,7.8,30,0,0,4.5,0,0,14.5,34.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Notte d'estate con profilo greco, occhi a mandorla e odore di basilico",1986,94,NA,5.9,23,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Notte dei dannati, La",1971,87,NA,3.9,12,0,4.5,34.5,24.5,0,14.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Notte dei diavoli, La",1972,91,NA,6.7,30,4.5,0,0,0,14.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Notte di San Lorenzo, La",1982,105,NA,8.1,407,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Notte italiana",1987,92,NA,7.2,23,4.5,0,0,4.5,0,4.5,4.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Notte, La",1961,122,NA,7.7,799,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Notti bianche, Le",1957,107,NA,7.9,161,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Notti del terrore, Le",1980,85,NA,4.8,376,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Notti di Cabiria, Le",1957,117,NA,8.1,2286,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Notti erotiche dei morti viventi, Le",1980,88,NA,4.4,127,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Notti porno nel mondo",1977,80,NA,2.5,9,14.5,14.5,0,14.5,24.5,0,24.5,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Notting Hill",1999,124,42000000,7,27285,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Notting Hill Anxiety Festival",2003,12,NA,7.8,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,1,0,0,1 -"Notturno",1983,204,NA,6.5,6,0,0,0,34.5,34.5,0,34.5,0,0,0,"",1,0,0,0,0,0,0 -"Noumero, To",1979,135,NA,5.6,18,4.5,4.5,0,14.5,14.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Nous deux",1992,93,NA,5.9,8,0,0,0,0,34.5,34.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Nous irons tous au paradis",1977,110,NA,6.8,114,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nous les gosses",1941,90,NA,5.5,5,0,0,0,24.5,44.5,0,24.5,0,24.5,0,"",0,0,1,1,0,0,0 -"Nous maigrirons ensemble",1979,100,NA,6.7,6,0,14.5,0,0,0,0,45.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Nous ne vieillirons pas ensemble",1972,106,NA,7.5,80,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nous sommes tous des assassins",1952,115,NA,8.6,22,0,4.5,0,0,0,0,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Nous sommes tous encore ici",1997,80,NA,5.4,9,14.5,24.5,0,0,0,0,24.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Nousukausi",2003,98,NA,7.1,497,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Nouveau Jean-Claude, Le",2002,90,NA,5,75,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nouvelle de la tour L",2000,9,NA,7.1,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Nouvelle vague",1990,89,NA,6.1,162,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Nouvelle-France",2004,142,NA,5.9,75,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Novel Desires",1991,85,NA,2.7,14,24.5,14.5,14.5,24.5,4.5,0,4.5,0,0,0,"",0,0,0,1,0,1,0 -"Novela Novela",2001,60,NA,8.1,14,14.5,0,0,0,0,0,34.5,14.5,4.5,24.5,"",1,0,1,0,0,1,0 -"November",2004,73,300000,2.8,164,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"R",0,0,0,1,0,0,0 -"November Days",1991,129,NA,8,9,24.5,0,0,0,0,0,14.5,24.5,14.5,34.5,"",0,1,0,0,1,0,0 -"November Men, The",1995,98,NA,3.4,36,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Novembermond",1985,100,NA,6.7,35,0,4.5,4.5,4.5,0,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Novia de medianoche, La",1997,134,NA,6.5,22,4.5,14.5,0,24.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Novia ensangrentada, La",1972,82,NA,5.7,112,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Novia que te vea",1994,114,NA,5,22,4.5,4.5,0,0,4.5,0,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Novia, esposa y amante",1981,90,NA,6.1,5,0,0,24.5,0,24.5,44.5,24.5,0,0,0,"",0,0,0,1,0,1,0 -"Novices, Les",1970,91,NA,5,18,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Novicia rebelde, La",1971,92,NA,5.4,5,0,0,0,24.5,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Noviembre",2003,104,NA,8,171,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Novinar",1979,112,NA,7.2,12,0,0,0,0,4.5,0,44.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Novio a la vista",1954,83,NA,6.3,28,0,0,0,4.5,24.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Novios",1999,111,NA,7.1,83,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Novios 68",1967,98,NA,4.4,5,0,0,0,44.5,24.5,0,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Novo",2002,98,NA,5.9,300,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Novocaine",2001,95,6000000,5.9,2829,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Novye priklyucheniya kapitana Vrungelya",1978,88,NA,7.5,11,0,0,0,4.5,0,0,24.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Novye priklyucheniya neulovimykh",1968,82,NA,6.5,44,0,4.5,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Novyy Gulliver",1935,75,NA,5.6,11,0,0,0,14.5,4.5,14.5,14.5,14.5,0,14.5,"",0,1,0,0,0,0,0 -"Novyy Odeon",1992,71,NA,2.7,12,14.5,14.5,4.5,0,0,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Novyy Vavilon",1929,120,NA,8.2,34,0,0,0,0,4.5,14.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Now",1965,5,NA,7.6,13,0,0,0,0,0,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Now & Forever",2002,101,NA,5.4,44,4.5,4.5,4.5,0,24.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Now Chinatown",2000,112,NA,6.3,41,14.5,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,1,0 -"Now Hear This",1962,6,NA,8.3,22,4.5,0,0,0,4.5,14.5,14.5,4.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Now I'll Tell",1934,72,NA,5.2,17,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Now That Summer Is Gone",1938,6,NA,5.6,9,0,0,0,14.5,34.5,34.5,24.5,0,0,0,"",0,1,1,0,0,0,1 -"Now We'll Tell One",1932,19,NA,5.1,5,0,24.5,0,0,0,0,44.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Now You See Him, Now You Don't",1972,88,NA,5.4,196,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Now You See It",1947,10,NA,7.3,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Now You Tell One",1926,20,NA,8,17,0,0,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,"",0,0,1,0,0,0,1 -"Now You're Talking",1927,9,NA,6.6,11,0,0,0,4.5,14.5,0,45.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Now and Forever",1934,81,NA,5.6,55,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Now and Forever",1983,89,NA,3.9,24,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,1,0 -"Now and Then",1995,100,NA,6,4394,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Now or Never",1921,60,NA,6.7,30,4.5,0,0,4.5,4.5,24.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Now, Hare This",1958,7,NA,7.3,25,0,0,0,0,14.5,4.5,14.5,44.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Now, Voyager",1942,117,NA,7.7,1777,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Nowa ksiazka",1975,10,NA,7.9,12,0,0,0,0,0,14.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Nowhere",1997,82,NA,5.7,1531,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Nowhere",2002,100,NA,7.4,48,14.5,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Nowhere Fast",1997,102,NA,1.7,14,44.5,4.5,4.5,0,4.5,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Nowhere Land",1998,88,NA,4.7,38,4.5,4.5,14.5,14.5,24.5,24.5,0,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Nowhere Man",2005,90,250000,5.6,14,24.5,0,0,0,14.5,0,4.5,4.5,4.5,44.5,"",1,0,1,1,0,0,0 -"Nowhere in Sight",2000,93,NA,5.7,51,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Nowhere to Go",1958,89,NA,6.6,34,4.5,0,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nowhere to Go",1998,92,NA,5.3,26,4.5,0,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nowhere to Hide",1987,90,NA,5.1,73,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Nowhere to Run",1989,86,NA,4.2,40,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Nowhere to Run",1993,102,NA,4.7,2089,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Nowheresville",2000,96,NA,5.7,13,0,0,4.5,0,14.5,4.5,0,14.5,24.5,34.5,"",0,0,0,0,0,1,0 -"Noz",1999,135,NA,6.4,65,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Nozze di Figaro, Le",1975,181,NA,9.8,19,0,0,4.5,0,0,0,4.5,4.5,14.5,74.5,"",0,0,1,0,0,0,0 -"Nu",2002,5,NA,7.6,6,0,0,0,14.5,0,14.5,0,34.5,34.5,0,"",0,0,0,0,0,0,1 -"Nu",2003,29,NA,5.4,11,0,14.5,4.5,0,4.5,4.5,4.5,4.5,0,34.5,"",0,0,0,1,0,0,1 -"Nu hei xia huang ying",1992,89,NA,6.5,9,14.5,24.5,0,0,14.5,0,24.5,34.5,0,0,"",1,0,0,0,0,0,0 -"Nu ji xie ren",1991,94,NA,5.5,77,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nu ren de gu shi",1989,96,NA,7.6,5,0,0,0,0,0,44.5,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Nu ren si shi",1994,100,NA,7.1,85,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Nu stiger den",1966,101,NA,6,7,0,0,0,14.5,0,74.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Nu tang",1999,98,NA,5.6,7,0,0,14.5,14.5,24.5,0,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Nuan",2003,109,NA,8,26,0,4.5,0,0,0,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Nube, La",1998,120,NA,7,78,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Nubes de verano",2004,101,NA,6.4,33,0,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Nude Bomb, The",1980,94,NA,4.4,554,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nude Restaurant, The",1967,100,NA,4.3,15,24.5,4.5,0,4.5,4.5,4.5,14.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Nude on the Moon",1962,83,NA,3.5,104,24.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nude... si muore",1968,98,NA,5.4,21,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nudist Colony of the Dead",1991,90,NA,2.8,44,24.5,4.5,4.5,0,4.5,4.5,4.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Nudity Required",1988,90,NA,6.1,27,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Nudity Required",2003,101,NA,6.1,8,0,0,0,14.5,14.5,0,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Nudo di donna",1981,106,NA,6.3,39,0,4.5,0,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Nudo e crudele",1984,96,NA,3.1,5,0,0,44.5,0,0,44.5,0,0,0,24.5,"",0,0,0,0,1,0,0 -"Nudo e selvaggio",1985,88,NA,5.1,79,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Nudo no yoru",1993,110,NA,7.3,9,0,0,0,0,0,14.5,24.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Nudos",2003,97,NA,5.8,12,0,4.5,0,4.5,0,34.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Nueba Yol",1995,106,NA,6,85,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Nueces para el amor",2000,103,NA,6.5,104,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Nueva Cenicienta, La",1964,92,NA,4.1,13,0,24.5,4.5,4.5,4.5,0,34.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Nueve cartas a Berta",1966,90,NA,5.8,13,0,0,0,4.5,0,24.5,0,34.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Nueve reinas",2000,114,1500000,7.6,3721,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Nuevo mundo",1978,95,NA,8.2,5,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"Nuga naleul michige haneunga",1995,100,NA,4.3,5,0,0,24.5,0,64.5,0,0,0,0,24.5,"",0,0,0,0,0,1,0 -"Nugget, The",2002,97,NA,6,231,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nuisance, The",1933,83,NA,6.3,29,4.5,0,0,4.5,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Nuit Bengali, La",1988,153,NA,7.7,27,4.5,0,4.5,4.5,4.5,0,14.5,24.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Nuit d'ivresse",1986,90,NA,6,67,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nuit d'orage",2003,10,NA,8.3,12,0,0,0,0,0,0,4.5,34.5,34.5,24.5,"",0,1,0,0,0,0,1 -"Nuit de Varennes, La",1982,135,NA,7.2,270,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Nuit du carrefour, La",1932,75,NA,6.9,30,0,0,14.5,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Nuit du destin, La",1997,90,NA,7.7,11,0,0,0,4.5,0,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Nuit du risque, La",1986,81,NA,2.4,7,44.5,14.5,0,14.5,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Nuit en permanence, La",2001,14,NA,8.5,6,0,0,0,0,0,0,0,34.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Nuit est mon royaume, La",1951,110,NA,7.2,6,0,0,0,0,0,14.5,14.5,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Nuit et brouillard",1955,32,NA,8.1,1268,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,1 -"Nuit et jour",1991,92,NA,5.7,65,4.5,4.5,14.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nuit fantastique, La",1942,85,NA,6.7,29,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Nuit porte jarretelles, La",1985,85,NA,4.3,12,0,4.5,14.5,4.5,4.5,4.5,24.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Nuit, tous les chats sont gris, La",1977,104,NA,6.3,8,0,0,14.5,0,0,24.5,34.5,14.5,14.5,0,"",0,0,1,1,0,0,0 -"Nuits de la pleine lune, Les",1984,102,NA,6.9,304,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Nuits fauves, Les",1992,126,NA,6.8,487,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Nuits rouges",1974,105,NA,6.7,17,0,14.5,0,4.5,14.5,4.5,14.5,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Nukitsamees",1981,75,NA,8.5,32,4.5,4.5,0,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Nukkekauppias ja kaunis Lilith",1955,70,NA,6.6,5,0,0,0,24.5,0,24.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Null Uhr 12",2001,93,NA,7.1,38,4.5,0,4.5,14.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Numb",2003,77,NA,7,9,14.5,14.5,0,0,0,14.5,14.5,0,34.5,24.5,"",0,0,0,0,0,0,0 -"Number 1",1939,3,NA,5.8,6,0,14.5,0,0,0,34.5,14.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Number 27",1988,74,NA,8.3,12,0,0,0,0,0,0,34.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Number 96",1974,113,NA,5.8,14,0,4.5,4.5,0,4.5,24.5,14.5,24.5,0,24.5,"",0,0,1,1,0,0,0 -"Number One",1969,105,NA,4.8,77,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Number One",1976,42,NA,6.8,5,0,0,0,0,44.5,0,0,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Number One Fan",1995,89,NA,3.5,46,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Number One with a Bullet",1987,103,NA,4.5,64,14.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Number One, Longing. Number Two, Regret",2004,98,NA,5.7,10,44.5,0,0,0,0,0,24.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Number Our Days",1976,28,NA,8.7,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,1,0,1 -"Number Seventeen",1932,63,NA,6.2,432,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Number, Please?",1920,23,NA,7.5,45,4.5,0,0,0,14.5,4.5,14.5,34.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Numbered Men",1930,70,NA,4.1,9,14.5,14.5,24.5,24.5,24.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Nummer 14 Johan Cruijff",1973,90,NA,6.5,25,0,0,0,0,4.5,4.5,44.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Nummisuutarit",1938,117,NA,7.3,5,0,0,0,0,24.5,0,44.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Nun Fu",2005,5,5000,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",1,0,0,0,0,0,1 -"Nun and the Bandit, The",1992,92,NA,5.3,16,0,4.5,0,4.5,34.5,24.5,14.5,0,14.5,4.5,"",0,0,0,1,0,0,0 -"Nun va Goldoon",1996,78,NA,8.4,204,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Nun's Story, The",1959,149,3500000,7.4,1197,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Nuns on the Run",1990,89,NA,5.6,1445,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Nunta de piatra",1972,90,NA,6.8,14,4.5,0,4.5,0,4.5,0,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Nunzio",1978,85,NA,4.6,35,4.5,4.5,0,4.5,24.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Nunzio's Second Cousin",1994,18,NA,6.4,66,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Nuomos sutartis",2002,78,NA,6.2,31,4.5,0,4.5,14.5,24.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nuove comiche, Le",1994,102,NA,3.9,32,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Nuovi barbari, I",1982,91,NA,3.2,104,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Nuovi mostri, I",1977,100,NA,6.3,109,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Nuovo cinema Paradiso",1989,170,NA,8.4,13999,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,0,1,0,0,0 -"Nur aus Liebe",1996,100,NA,6.4,110,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,1,0 -"Nur der Wind",1961,87,NA,3.2,6,0,34.5,14.5,0,45.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Nuremberg",1996,50,NA,8.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Nuremberg Trials",1947,58,NA,6.4,16,0,4.5,14.5,4.5,0,0,45.5,14.5,0,4.5,"",0,0,0,0,1,0,0 -"Nureta futari",1968,82,NA,7,5,0,0,0,0,0,0,100,0,0,0,"",0,0,0,1,0,0,0 -"Nurse Betty",2000,110,24000000,6.6,10441,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Nurse Edith Cavell",1939,108,NA,6.5,28,0,4.5,4.5,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Nurse Marjorie",1920,88,NA,8.8,7,0,0,0,0,14.5,14.5,0,24.5,0,44.5,"",0,0,1,1,0,0,0 -"Nurse on Wheels",1963,85,NA,5.9,31,0,4.5,4.5,0,4.5,44.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Nurse's Secret, The",1941,64,NA,5.2,13,4.5,0,0,4.5,4.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Nurse, The",1997,94,NA,4.4,85,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Nurse-Mates",1940,7,NA,6.2,11,4.5,0,4.5,0,0,14.5,45.5,0,0,4.5,"",0,1,1,0,0,0,1 -"Nusumareta yokujo",1958,90,NA,6.3,20,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Nut, The",1921,60,NA,7,14,0,0,4.5,0,0,14.5,45.5,4.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Nutbag",2000,80,40000,4,20,34.5,0,0,4.5,14.5,0,4.5,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Nutcracker",1982,101,NA,4.4,25,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Nutcracker",2001,81,NA,3.8,7,24.5,0,0,14.5,0,14.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Nutcracker Prince, The",1990,75,NA,5.3,109,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Nutcracker, The",1993,92,19000000,5,177,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Nuts",1987,116,NA,6.4,1191,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Nuts and Volts",1964,6,NA,7.1,13,0,0,0,0,4.5,34.5,34.5,14.5,14.5,0,"",0,1,1,0,0,0,1 -"Nuts in May",1917,30,NA,5.7,6,0,0,14.5,0,34.5,0,0,0,34.5,14.5,"",0,0,1,0,0,0,1 -"Nutt House, The",1992,90,NA,2.8,106,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Nutty But Nice",1940,18,NA,7.3,51,0,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Nutty News",1942,7,NA,7.6,6,0,0,0,0,0,34.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Nutty Professor II: The Klumps",2000,109,84000000,4.5,5825,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Nutty Professor, The",1963,107,NA,6.6,1678,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Nutty Professor, The",1996,95,54000000,5.8,12273,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Nuvem",1992,95,NA,6.9,14,0,0,0,4.5,24.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Nuvola di polvere... un grido di morte... arriva Sartana, Una",1971,99,NA,7.8,11,0,0,0,0,0,14.5,4.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Nyarlathotep",2001,13,NA,7.6,13,0,0,0,0,0,0,44.5,4.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Nybyggarna",1972,204,NA,7.9,279,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Nye scener fra Amerika",2003,35,NA,7.4,13,4.5,0,0,0,0,4.5,34.5,34.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Nyhta gamou",1967,89,NA,7.1,18,0,0,0,4.5,4.5,4.5,44.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Nyi blorong",1982,82,NA,8.2,6,0,0,0,0,14.5,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Nymph",1975,80,NA,5.3,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Nymph",1997,83,NA,6.4,71,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Nymphoid Barbarian in Dinosaur Hell, A",1991,82,40000,2.2,196,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Nynke",2001,110,NA,7,186,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"O",2001,95,5000000,6.3,4555,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"O",2002,9,NA,6.2,19,4.5,0,0,0,4.5,0,24.5,34.5,24.5,14.5,"",0,0,0,0,0,0,1 -"O Beautiful",2002,29,NA,5.5,48,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,1 -"O Brother, Where Art Thou?",2000,106,26000000,7.8,37961,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"PG-13",0,0,1,0,0,0,0 -"O Canada!",1982,18,NA,6.7,42,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,1 -"O Lucky Man!",1973,183,NA,7.6,1175,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"O da beni seviyor",2001,106,1500000,6.4,26,4.5,0,0,4.5,0,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"O dve slabiky pozadu",2005,90,NA,6.6,13,0,0,14.5,14.5,0,14.5,14.5,4.5,0,34.5,"",0,0,0,1,0,1,0 -"O palec",1999,10,NA,8.1,8,0,0,0,0,14.5,14.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,1 -"O pokojniku sve najlepse",1984,95,NA,7.1,14,0,4.5,0,4.5,0,0,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"O simdi asker",2003,125,NA,5.8,109,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"O simdi mahkum",2005,120,NA,6.9,15,14.5,0,14.5,0,0,0,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"O slavnosti a hostech",1966,71,NA,7.6,32,0,0,0,4.5,4.5,0,14.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"O'Hara's Wife",1982,87,NA,5.2,41,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"O'Shaughnessy's Boy",1935,87,NA,6.8,26,4.5,0,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"O-Roshiya-koku suimu-dan",1992,123,NA,7.1,6,0,0,0,0,0,0,34.5,45.5,14.5,0,"",0,0,0,1,0,0,0 -"O-Solar-Meow",1967,7,NA,3.6,19,24.5,14.5,14.5,4.5,24.5,0,14.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"O-bi, O-ba - Koniec cywilizacji",1985,88,NA,6.3,16,0,0,4.5,0,4.5,14.5,14.5,0,24.5,34.5,"",0,0,0,1,0,0,0 -"O-juken",1999,114,NA,6.4,16,4.5,0,0,14.5,4.5,14.5,4.5,34.5,14.5,0,"",0,0,1,1,0,0,0 -"O. Henry's Full House",1952,117,NA,7.3,245,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"O.C. and Stiggs",1987,109,7000000,5,286,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"O.H.M.S.",1937,71,NA,5.5,19,0,0,4.5,14.5,24.5,24.5,4.5,14.5,0,14.5,"",1,0,1,1,0,0,0 -"O.J. Simpson: Juice on the Loose",1974,47,NA,6.8,12,14.5,0,0,4.5,0,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"O.K.",1970,80,NA,7.8,23,4.5,0,0,0,4.5,0,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"O.K. Garage",1998,106,NA,4.5,119,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"O.S.S.",1946,105,NA,6.8,55,0,0,4.5,4.5,14.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"OK Connery",1967,104,NA,3.9,141,34.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"OK patron",1974,85,NA,3.5,9,24.5,0,0,34.5,24.5,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"OT: Our Town",2002,76,NA,7.1,77,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Oasi",1994,78,NA,5.7,8,0,0,14.5,0,24.5,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Oasis",2002,133,NA,8.3,583,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Oasis, The",1984,92,NA,4,16,14.5,0,14.5,14.5,0,14.5,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Oath of Vengeance",1944,57,NA,5.3,5,0,24.5,24.5,0,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Oath, The",1996,10,NA,4.8,12,14.5,0,0,0,0,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Oath, The",2005,23,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,1,0,0,1 -"Oatsurae Jirokichi goshi",1931,70,NA,6.1,8,0,0,14.5,0,14.5,0,34.5,24.5,14.5,0,"",1,0,0,1,0,0,0 -"Obaltan",1960,110,NA,6.4,35,4.5,4.5,0,4.5,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Obchod na korze",1965,128,NA,8.8,539,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Obcy musi fruwac",1993,95,NA,5.5,7,0,0,14.5,0,0,24.5,0,0,14.5,44.5,"",0,0,1,0,0,0,0 -"Obedience",2000,18,NA,9.2,9,0,0,0,0,0,0,14.5,14.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Obedience",2003,14,NA,5,7,45.5,0,0,24.5,0,0,14.5,0,0,0,"",0,0,0,1,0,0,1 -"Oberst Redl",1985,144,NA,7.4,323,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Oberstube",2001,10,NA,3.2,15,24.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Obeti a vrazi",2000,96,NA,6.1,30,4.5,0,0,14.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Obich",1972,90,NA,9,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Object of Beauty, The",1991,103,NA,5.4,449,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Object of My Affection, The",1998,111,15000000,6,4027,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Object of Obsession",1995,91,NA,4.1,42,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Objective, Burma!",1945,142,NA,7.4,521,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Objects in the Mirror Are Further Than They Appear",2003,15,NA,6,10,0,0,0,0,14.5,0,14.5,0,14.5,74.5,"",0,0,0,1,0,0,1 -"Oblako-ray",1991,79,NA,6.1,42,0,0,0,4.5,4.5,0,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Obliging Young Lady",1942,80,NA,4.4,28,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Obliteration",1984,40,NA,4.9,22,24.5,0,0,0,4.5,0,0,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Oblivion",1994,94,2500000,4.2,188,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Oblivion 2: Backlash",1996,83,2500000,5.1,92,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Oblong Box, The",1969,91,175000,5.6,287,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Obnazhyonnaya v shlyape",1991,68,NA,4.8,5,24.5,0,0,0,24.5,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Oboreru sakana",2000,101,NA,3.9,11,0,14.5,0,14.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Obra maestra",2000,115,NA,6,135,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Obras",2004,12,NA,8.3,14,0,0,0,4.5,0,24.5,0,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Obras maestras del terror",1960,61,NA,5.6,27,14.5,0,0,0,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Obscuratio",2000,29,NA,1,13,14.5,0,4.5,4.5,0,0,0,4.5,14.5,44.5,"",0,0,0,1,0,1,1 -"Observations Under the Volcano",1984,82,NA,5,15,14.5,0,4.5,4.5,0,24.5,0,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Obsession",1949,96,NA,7.9,86,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Obsession",1954,103,NA,3.7,5,0,0,24.5,24.5,0,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Obsession",1976,94,1400000,6.9,924,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Obusku z pytle ven!",1955,70,NA,6.5,12,0,0,0,0,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Obvious Moment of Happiness, An",2003,82,NA,9,7,0,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Obyasneniye v lyubvi",1977,135,NA,7.3,7,14.5,0,0,0,0,0,14.5,44.5,0,24.5,"",0,0,0,0,0,1,0 -"Obyknovennoye chudo",1964,99,NA,9.1,25,0,4.5,4.5,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,1,0 -"Obyknovennyj prezident",1996,54,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Obyknovennyy fashizm",1965,82,NA,8.7,59,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Obywatel Piszczyk",1989,112,NA,6.8,14,0,0,0,0,4.5,24.5,45.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Occasional Coarse Language",1998,81,NA,6.2,79,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Occasional Hell, An",1996,96,NA,4.8,214,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Occasional, Strong",2002,12,NA,4.9,7,0,14.5,0,14.5,14.5,0,44.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Occasioni di Rosa, Le",1981,90,NA,5.1,8,14.5,0,0,14.5,24.5,14.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Occhi dalle stelle",1978,90,NA,3.5,48,24.5,14.5,14.5,24.5,14.5,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Occhi freddi della paura, Gli",1971,91,NA,5.4,61,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Occhi, la bocca, Gli",1982,93,NA,5.7,27,0,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Occhiali d'oro, Gli",1987,110,NA,6.6,67,0,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Occhio alla penna",1981,90,NA,6.1,112,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Occhio del ragno, L'",1971,94,NA,4,10,14.5,14.5,34.5,24.5,0,0,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Occhio selvaggio, L'",1967,98,NA,6.9,8,0,0,0,0,14.5,0,24.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Occhio, malocchio, prezzemolo e finocchio",1983,100,NA,5.9,34,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"OcchioPinocchio",1994,135,NA,2.5,37,45.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Occident",2002,105,NA,7.9,239,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Occidente",2000,93,NA,7.3,7,0,0,0,0,14.5,24.5,0,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Occult History of the Third Reich, The",1999,155,NA,6.2,37,0,4.5,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Occultist, The",1987,82,NA,2.2,26,44.5,14.5,24.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Ocean Men: Extreme Dive",2001,40,NA,6.3,22,0,4.5,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Ocean Park",2002,100,NA,4.6,11,14.5,0,0,4.5,4.5,14.5,4.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Ocean Tribe",1997,106,380000,6.3,60,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Ocean Waif, The",1916,40,NA,7.7,14,0,0,0,0,0,4.5,24.5,24.5,24.5,14.5,"",0,0,1,1,0,0,1 -"Ocean Wonderland",2003,44,NA,5.3,10,0,0,14.5,34.5,34.5,24.5,0,14.5,0,0,"",0,0,0,0,1,0,1 -"Ocean's Eleven",1960,129,NA,6.3,2801,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ocean's Eleven",2001,116,85000000,7.5,44662,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Ocean's Twelve",2004,125,110000000,6,14797,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Och, Karol",1985,94,NA,5.3,11,0,0,0,14.5,24.5,24.5,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Ocha Cups for Christmas",2002,30,NA,8.9,7,0,0,0,0,0,0,0,45.5,0,44.5,"",0,0,0,1,0,0,1 -"Ochazuke no aji",1952,116,NA,8,106,0,0,4.5,4.5,0,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ochtend: Liefde in 4 aktes",2001,15,NA,7.7,18,0,0,24.5,0,14.5,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,1 -"Oci ciornie",1987,118,NA,7.5,406,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Octagon, The",1980,103,NA,4.7,419,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Octaman",1971,76,NA,2.4,65,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Octane",2003,91,11500000,4.4,355,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Octavia",1984,93,NA,3.8,6,0,14.5,0,34.5,0,0,0,45.5,0,0,"",0,0,0,1,0,0,0 -"Octavia",2002,130,NA,5.1,12,0,0,4.5,14.5,14.5,4.5,4.5,4.5,34.5,0,"",0,0,0,1,0,0,0 -"October 22",1998,94,NA,5.9,78,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"October Man, The",1947,110,NA,6.8,83,0,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"October Silk",1980,85,NA,6,5,0,0,0,24.5,0,24.5,24.5,0,44.5,0,"",0,0,0,0,0,0,0 -"October Sky",1999,108,NA,7.7,12847,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"PG",0,0,0,1,0,0,0 -"Octobre",1994,97,NA,7.4,188,4.5,0,0,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Octobriana & the Finger of Lenin",2003,24,NA,4.1,6,0,0,0,34.5,14.5,0,34.5,14.5,0,0,"",1,0,0,0,0,0,1 -"Octopus",1998,92,NA,8.6,11,4.5,0,0,0,0,4.5,0,4.5,0,74.5,"",0,0,0,0,0,0,0 -"Octopus",2000,95,5000000,2.8,367,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Octopus 2: River of Fear",2001,91,NA,2.6,158,34.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Octopussy",1983,131,27500000,6.4,8331,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ocularist",2003,9,NA,7.4,23,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Odd Angry Shot, The",1979,92,NA,6.2,132,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Odd Couple II, The",1998,97,NA,5.8,1366,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Odd Couple, The",1968,105,NA,7.6,4961,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Odd Job, The",1978,87,NA,6.9,44,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Odd Jobs",1984,88,NA,4,83,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Odd Man",1998,28,NA,8.5,15,0,0,0,0,0,0,24.5,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Odd Man Out",1947,116,NA,7.7,768,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Oddballs",1984,91,NA,2.8,48,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Odds 777",1932,91,NA,5,10,0,0,14.5,14.5,14.5,14.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Odds Against Tomorrow",1959,96,NA,7.4,249,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ode",1999,48,NA,5.4,20,0,4.5,0,0,14.5,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Ode to Billy Joe",1976,105,NA,5.4,273,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ode to Victory",1943,11,NA,4.8,5,0,0,24.5,0,24.5,64.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Odessa File, The",1974,120,NA,6.6,1033,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Odessa Odessa",2005,96,NA,5.8,13,4.5,4.5,0,4.5,4.5,0,0,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Odette",1950,124,NA,6.3,51,0,0,4.5,0,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Odilon Redon or The Eye Like a Strange Balloon Mounts Toward Infinity",1995,5,NA,7,87,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Odin shans iz tysyatsi",1968,81,NA,9.4,10,0,0,0,14.5,0,0,0,0,44.5,45.5,"",0,0,1,0,0,0,0 -"Odinochestvo krovi",2002,96,NA,5.5,22,44.5,0,4.5,0,4.5,4.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Odinochnoye plavanye",1985,96,NA,6.1,13,14.5,4.5,4.5,4.5,4.5,24.5,4.5,0,14.5,4.5,"",1,0,0,1,0,0,0 -"Odinokaya zhenshchina zhelayet poznakomitsya",1986,90,NA,5.5,27,0,0,14.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Odinokiy golos cheloveka",1987,87,NA,7,21,0,0,0,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Odinokiy igrok",1995,90,400000,6.7,6,0,0,14.5,0,0,14.5,0,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Odio le bionde",1980,89,NA,5.5,11,0,0,14.5,4.5,4.5,4.5,14.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Odio mi cuerpo",1974,97,NA,2.4,12,4.5,14.5,24.5,0,4.5,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Odna",1931,80,NA,7.1,22,4.5,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Odongo",1956,85,NA,3.7,7,24.5,14.5,0,14.5,24.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Odor in the Court",1934,22,NA,7.1,9,0,0,0,24.5,0,0,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Odor of the Day",1948,7,NA,7.3,21,0,0,0,4.5,0,24.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Odor-Able Kitty",1945,7,NA,7.5,40,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Odore del sangue, L'",2004,100,NA,6.4,30,4.5,0,14.5,0,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Odore della notte, L'",1998,101,NA,6.6,41,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Odoru daisosasen",1998,119,NA,7,148,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Odoru daisosasen the movie 2: Rainbow bridge wo fusaseyo!",2003,138,NA,6.1,75,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Odwiedz mnie we snie",1997,74,NA,6.8,5,0,0,0,24.5,24.5,0,44.5,0,0,24.5,"",0,0,0,0,0,1,0 -"Odysseia enos xerizomenou, I",1969,185,NA,5.4,10,14.5,14.5,0,0,0,0,14.5,14.5,0,64.5,"",0,0,0,1,0,0,0 -"Odyssey, the Ultimate Trip",1977,82,NA,4.8,10,14.5,0,0,0,14.5,14.5,24.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Oed Yr Addewid",2002,89,NA,6.5,7,0,0,0,0,14.5,24.5,0,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Oedipus",2004,8,NA,8.3,17,0,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Oedipus Rex",1957,87,NA,6.1,31,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Oedipus Rex",1975,5,NA,4.5,10,14.5,0,0,14.5,0,0,14.5,14.5,0,64.5,"",0,0,0,1,0,0,1 -"Oedipus the King",1967,97,NA,6.1,41,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Oeil au beur(re) noir, L'",1987,90,NA,5.5,52,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oeil de Vichy, L'",1993,110,NA,7.1,45,0,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Oeil de l'autre, L'",2005,84,NA,5.4,16,0,14.5,4.5,14.5,4.5,14.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Oeil du malin, L'",1962,80,NA,7.1,19,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Oeil du monocle, L'",1962,105,NA,6.2,24,4.5,0,0,4.5,4.5,14.5,45.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"Oeil pour oeil",1957,113,NA,6.5,13,0,0,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Oeil qui ment, L'",1993,100,NA,4.4,30,4.5,4.5,4.5,4.5,14.5,14.5,0,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Oeroeg",1993,100,NA,6.3,51,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Oesters van Nam Kee",2002,99,NA,5.4,363,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Oeuvre au noir, L'",1988,110,NA,6.7,35,0,4.5,0,14.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Of Age",2004,5,1000,9.9,7,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,1,0,0,1 -"Of All the Luck",2003,24,NA,6,9,34.5,0,0,0,0,14.5,0,24.5,14.5,24.5,"",0,0,1,0,0,1,1 -"Of Cash and Hash",1955,16,NA,6.8,26,4.5,0,0,14.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Of Civil Wrongs & Rights: The Fred Korematsu Story",2000,60,NA,4.9,9,0,0,14.5,0,14.5,0,24.5,0,44.5,14.5,"",0,0,0,0,1,0,0 -"Of Feline Bondage",1965,6,NA,5.4,34,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Of Fox and Hounds",1940,9,NA,7.3,21,0,0,0,0,4.5,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Of Human Bondage",1934,83,NA,7.2,576,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Of Human Bondage",1946,105,NA,6.9,67,0,0,4.5,0,14.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Of Human Bondage",1964,100,NA,6,119,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Of Human Hearts",1938,103,NA,6.2,112,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Of Love and Desire",1963,94,NA,3.8,12,4.5,4.5,14.5,4.5,0,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Of Love and Shadows",1994,103,NA,4.8,391,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Of Mice and Men",1939,106,NA,7.9,900,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Of Mice and Men",1992,115,NA,7.5,5356,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Of Rice and Hen",1953,7,NA,6.7,26,0,0,4.5,14.5,4.5,14.5,34.5,14.5,14.5,0,"",0,1,1,0,0,0,1 -"Of Thee I Sting",1946,7,NA,6.8,9,0,0,0,0,14.5,14.5,64.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Of Unknown Origin",1983,88,4000000,5.8,182,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ofelas",1987,86,NA,7.6,661,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Ofelia kommer til byen",1985,92,NA,5,15,0,14.5,0,24.5,4.5,34.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Off",2001,15,10000,9.2,5,0,0,0,0,0,0,0,24.5,44.5,44.5,"",0,0,0,0,0,0,1 -"Off Beat",1986,92,NA,4.8,236,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Off Islanders",2004,15,NA,1.2,5,84.5,24.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,1 -"Off Key",1994,22,NA,8,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Off Key",2001,118,NA,5.3,47,14.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Off Limits",1953,89,NA,5.9,56,0,4.5,0,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Off Limits",1988,102,NA,5.7,430,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Off Screen",2005,100,NA,5.3,58,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Off the Hook",1999,108,NA,5.4,10,14.5,0,0,0,14.5,14.5,14.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Off the Lip",2004,87,NA,3.8,34,24.5,0,14.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Off the Map",2003,105,NA,7.6,229,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Off the Mark",1986,90,NA,4.9,28,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Off the Menu: The Last Days of Chasen's",1997,90,NA,5.2,101,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Off the Wall",1983,85,NA,3.4,20,14.5,34.5,24.5,4.5,0,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"OffOn",1972,9,NA,5.5,38,14.5,4.5,4.5,14.5,0,14.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Offence, The",1973,112,NA,6.8,358,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Offenders, The",1980,100,NA,8.6,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Offending Angels",2001,89,NA,6.1,8,24.5,14.5,0,0,0,0,0,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Offering, The",1966,80,NA,7.4,9,0,0,0,0,14.5,14.5,24.5,34.5,24.5,0,"",0,0,0,0,0,0,0 -"Offering, The",1996,105,NA,9.7,10,34.5,24.5,0,0,0,0,0,0,24.5,34.5,"",0,0,0,1,0,0,0 -"Offering, The",1999,10,NA,9.5,7,0,24.5,0,0,0,0,14.5,0,0,45.5,"",0,0,0,0,0,0,1 -"Offerings",1989,95,NA,3.8,62,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Office Blues",1930,9,NA,7.1,15,0,0,0,4.5,0,44.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Office Boy, The",1932,7,NA,5.5,5,0,0,0,24.5,24.5,0,44.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Office Killer",1997,82,NA,4.3,476,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Office Love-in, White-Collar Style",1968,82,NA,1,6,100,0,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Office Party, The",2000,12,NA,6.6,40,4.5,0,0,0,4.5,14.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Office Space",1999,89,10000000,7.7,26134,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Office Wife, The",1930,59,NA,5.6,16,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,1,0 -"Officer 444",1926,200,NA,3.2,6,45.5,0,0,0,0,0,45.5,0,0,0,"",1,0,0,0,0,0,0 -"Officer Duck",1939,7,NA,7.9,44,0,0,0,0,4.5,24.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Officer Pooch",1941,8,NA,5.6,22,0,0,14.5,4.5,14.5,14.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Officer Thirteen",1932,62,NA,5.1,9,0,0,0,14.5,24.5,34.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Officer and a Gentleman, An",1982,122,NA,6.8,7076,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Offret - Sacrificatio",1986,149,NA,7.5,1419,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Offside",2001,13,NA,8,30,4.5,0,4.5,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Offspring",1996,83,NA,3.5,8,14.5,24.5,0,0,45.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Offspring",2001,55,NA,7.9,13,0,0,0,0,0,4.5,4.5,24.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Offspring, The",1987,99,1100000,5.4,102,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Oficir s ruzom",1987,103,NA,7.4,30,0,0,0,4.5,4.5,0,24.5,34.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Ofitsery",1971,96,NA,6.7,25,0,0,0,0,0,24.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Ofrivillige golfaren, Den",1991,107,NA,5.4,435,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Often an Orphan",1949,7,NA,6.2,30,0,0,4.5,14.5,4.5,14.5,34.5,4.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Ogaryova, 6",1980,87,NA,5.4,8,0,0,0,24.5,24.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Oggi a me... domani a te!",1968,105,NA,5.1,75,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Oggi, domani, dopodomani",1965,95,NA,3.8,16,14.5,0,0,0,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ogifta par - en film som skiljer sig",1997,90,NA,5.6,226,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ogin-sama",1978,150,NA,8.3,6,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Oglinda",1993,160,NA,6.4,20,34.5,0,0,0,0,0,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Ogni volta che te ne vai",2004,95,NA,6.1,9,0,0,14.5,0,34.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Ogniem i mieczem",1999,175,8000000,6.7,375,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ogniomistrz Kalen",1961,108,NA,7,8,0,0,14.5,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ogon, voda i... mednye truby",1968,86,NA,6.8,20,0,4.5,0,4.5,0,4.5,4.5,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Ogro",1980,100,NA,5.1,40,14.5,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ogu",2003,90,NA,4.8,13,4.5,4.5,14.5,4.5,0,0,24.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Oh Boy!",1991,88,NA,5.3,44,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oh Dad, Poor Dad, Mama's Hung You in the Closet and I'm Feeling So Sad",1967,86,NA,4.1,56,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oh Dem Watermelons",1965,12,NA,7.6,18,4.5,0,0,0,0,14.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Oh Doctor!",1917,23,NA,6.3,52,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Oh Jonathan, oh Jonathan!",1973,97,NA,5.5,20,0,0,14.5,14.5,24.5,34.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oh Marbella!",2003,88,2000000,8.6,5,0,0,0,0,0,24.5,24.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Oh My God",2004,10,3500,7.5,20,14.5,4.5,0,0,0,0,14.5,4.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Oh My God?!",2001,9,NA,5.9,31,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Oh Que Calma",1986,3,NA,6.1,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",0,1,0,0,0,0,1 -"Oh! Calcutta!",1972,100,NA,4.8,64,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oh! How I Hate to Get Up in the Morning",1932,8,NA,4.8,8,0,0,14.5,14.5,45.5,24.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Oh! Oh! Cleopatra",1931,16,NA,6,5,0,0,0,0,64.5,0,24.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Oh! Soo-jung",2000,126,NA,7.1,145,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Oh! Susanna",1951,84,NA,5.7,20,0,0,0,4.5,34.5,44.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Oh! What a Lovely War",1969,144,NA,6.4,337,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Oh, Daddy!",1935,77,NA,4,11,0,14.5,4.5,0,14.5,34.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Oh, God!",1977,98,NA,6.2,1959,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oh, God! Book II",1980,94,NA,4.6,504,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oh, God! You Devil",1984,97,NA,4.8,500,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oh, Heavenly Dog!",1980,103,NA,5,475,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oh, Men! Oh, Women!",1957,86,NA,5.6,36,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Oh, Mr. Porter!",1937,85,NA,8.2,254,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Oh, Sure",1977,2,NA,8.2,7,0,0,0,14.5,0,0,24.5,0,14.5,44.5,"",0,1,1,0,0,0,1 -"Oh, Susanna!",1936,59,NA,5.7,12,0,0,0,24.5,24.5,4.5,0,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Oh, What a Night",1992,93,NA,5.7,96,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Oh, Xiangxue",1989,89,NA,9,5,0,0,0,0,0,0,0,24.5,64.5,24.5,"",0,0,0,0,0,0,0 -"Oh, You Beautiful Doll",1949,93,NA,6.2,16,0,0,0,4.5,14.5,34.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Oh, cielos",1994,90,NA,3.3,10,14.5,24.5,14.5,0,0,64.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Oh, for a Man",1930,78,NA,3.1,5,0,24.5,24.5,0,24.5,0,0,24.5,0,24.5,"",0,0,0,0,0,1,0 -"Oh, uomo",2004,71,NA,7,5,0,24.5,0,0,0,24.5,0,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Oh-My-God-Frances",1997,15,NA,5.4,20,4.5,0,0,0,4.5,4.5,24.5,34.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Oh... Rosalinda!!",1955,101,NA,7.6,52,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ohikkoshi",1993,124,NA,6.9,8,0,0,0,0,14.5,14.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Ohne Krimi geht die Mimi nie ins Bett",1962,79,NA,4.9,45,4.5,14.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oi ching baak min baau",2001,101,NA,6.7,17,0,0,0,0,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Oi nei oi do saat sei nei",1997,101,NA,4,29,14.5,4.5,0,14.5,24.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"Oi yue shing",2000,89,NA,6.9,52,4.5,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Oi! Warning",1999,90,NA,6.8,219,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Oi, muistatkos...",1954,90,NA,5.2,5,0,0,0,24.5,44.5,0,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Oigyeseo on Ulemae",1986,80,NA,8.8,5,24.5,0,0,0,0,0,0,0,24.5,64.5,"",1,0,0,0,0,0,0 -"Oikogeneia Horafa",1968,100,NA,6.5,7,0,0,0,0,14.5,0,45.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Oil Factor: Behind the War on Terror, The",2004,93,NA,9.2,12,4.5,0,0,0,0,0,0,14.5,44.5,34.5,"",0,0,0,0,1,0,0 -"Oil for the Lamps of China",1935,97,NA,7.1,44,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Oil on Ice",2004,56,NA,9.3,6,0,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Oil's Well That Ends Well",1958,16,NA,5.8,47,4.5,0,4.5,14.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Oily American, The",1954,7,NA,6.4,6,0,0,0,14.5,0,14.5,14.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Oily Hare",1952,7,NA,7.3,34,0,0,4.5,4.5,4.5,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Oily to Bed, Oily to Rise",1939,18,NA,8.3,68,0,0,0,0,0,14.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Oinaru genei",1999,95,NA,4.7,36,14.5,4.5,0,14.5,4.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Oiseaux blancs, les oiseaux noirs, Les",2003,4,NA,7.1,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,1,0,0,0,0,1 -"Oiseaux en cage ne peuvent pas voler, Les",2000,3,NA,6.3,10,0,0,0,0,34.5,24.5,14.5,34.5,14.5,0,"",0,1,0,0,0,0,1 -"Oitavo Selo, O",1999,15,NA,5.2,13,14.5,4.5,0,0,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Ojo en la nuca, El",2001,25,NA,4.7,16,14.5,14.5,0,0,0,4.5,0,14.5,34.5,14.5,"",0,0,0,1,0,0,1 -"Ojos llenos de amor, Los",1954,85,NA,9.1,6,0,0,0,0,0,0,0,64.5,0,34.5,"",0,0,1,0,0,1,0 -"Ojos que no ven",2000,90,NA,5.4,23,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,24.5,"",1,0,0,1,0,1,0 -"Ojos que no ven",2003,95,NA,8.1,61,0,0,0,4.5,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Ojos siniestros del doctor Orloff, Los",1973,81,NA,3,12,34.5,4.5,0,4.5,0,0,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Ojos vendados, Los",1978,110,NA,5.9,19,4.5,4.5,0,14.5,4.5,24.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Oka Oori Katha",1977,116,NA,7.5,5,0,0,0,0,0,24.5,44.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Okaeri",1995,199,NA,6.6,32,4.5,0,4.5,0,4.5,4.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Okami",1955,120,NA,8.5,6,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Okami yo rakujitsu o kire",1974,159,NA,6.3,10,0,14.5,0,0,0,14.5,14.5,14.5,24.5,44.5,"",1,0,0,1,0,0,0 -"Okasan",1952,98,NA,7.8,48,4.5,0,0,4.5,4.5,4.5,14.5,4.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Okay",2002,97,NA,6.9,409,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Okay for Sound",1937,86,NA,5.7,9,0,0,0,24.5,24.5,14.5,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Okay for Sound",1946,20,NA,6.1,18,14.5,0,0,0,14.5,14.5,44.5,4.5,0,14.5,"",0,0,0,0,1,0,1 -"Okay, America!",1932,78,NA,6.9,8,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Okhota na lis",1980,97,NA,5.4,7,0,0,14.5,0,14.5,0,14.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Okhotnik",2004,90,NA,5.5,14,0,0,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Okie Noodling",2001,57,NA,7.5,55,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Okinawa",1952,67,NA,5.7,11,4.5,0,0,0,34.5,14.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Okkadu",2003,170,NA,9.5,12,0,0,0,0,0,0,0,14.5,14.5,64.5,"",1,0,0,0,0,1,0 -"Oklahoma Annie",1952,90,NA,5.2,27,4.5,0,14.5,0,34.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Oklahoma Crude",1973,108,NA,5.9,164,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Oklahoma John",1965,81,NA,4.7,5,0,24.5,0,24.5,24.5,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Oklahoma Kid, The",1939,85,NA,6.4,245,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Oklahoma Outlaws",1943,20,NA,5.1,14,0,0,14.5,0,44.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Oklahoma Woman, The",1956,73,60000,1.8,8,34.5,34.5,14.5,0,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Oklahoma!",1955,145,5000000,7.2,1873,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Oklahoman, The",1957,80,NA,5.9,30,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Okno v Parizh",1994,96,NA,7,246,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Okoge",1992,120,NA,6.7,54,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Okraina",1933,98,NA,8,96,0,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Okraina",1998,95,NA,7,49,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Oksuzler",1973,84,NA,5,5,24.5,0,0,0,44.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Oktoberfest",1987,101,NA,6.1,23,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Oktyabr",1927,95,NA,7.8,651,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Okul",2004,100,1000000,6.4,224,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Okuman choja",1954,83,NA,5.4,6,0,0,0,14.5,34.5,14.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Ola ine dromos",1998,118,NA,7.4,63,0,0,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Old Acquaintance",1943,110,NA,7.4,261,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Old Army Game, The",1943,6,NA,6.9,44,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Old Barn Dance, The",1938,60,NA,5.3,18,0,0,14.5,14.5,24.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Old Bill and Son",1941,96,NA,5.4,12,0,0,0,14.5,24.5,45.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Old Bones of the River",1938,90,NA,6.9,33,0,0,0,0,0,34.5,45.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Old Box, An",1975,9,NA,6.9,5,0,0,0,0,0,24.5,24.5,64.5,0,0,"",0,1,0,0,0,0,1 -"Old Boyfriends",1979,103,NA,3.5,46,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Old Curiosity Shop, The",1934,105,NA,5.9,10,0,0,0,0,14.5,34.5,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Old Dark House, The",1932,70,NA,7.5,595,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Old Dark House, The",1963,86,NA,4.7,83,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Old English",1930,85,NA,6.4,5,0,0,24.5,0,0,24.5,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Old Enough",1984,91,NA,5.9,88,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Old Explorers",1990,100,NA,4.8,15,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Old Fashioned Way, The",1934,66,NA,7.8,131,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Old Fools, The",2002,6,NA,4.4,5,0,24.5,24.5,24.5,24.5,0,0,24.5,0,0,"",0,1,0,0,0,0,1 -"Old Glory",1939,9,NA,6.1,50,4.5,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,1,0,0,1 -"Old Grey Hare, The",1944,8,NA,8.4,55,4.5,0,0,0,4.5,4.5,24.5,14.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Old Grey Mayor, The",1935,20,NA,6.6,20,0,0,0,4.5,4.5,44.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Old Gringo",1989,120,NA,5.5,362,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Old Hickory",1939,17,NA,4.2,6,0,0,0,45.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,1 -"Old Hutch",1936,80,NA,6.5,12,0,0,0,0,4.5,45.5,14.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Old Ironsides",1926,111,NA,9.1,25,0,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Old King Cole",1933,7,NA,6.6,18,0,14.5,0,0,14.5,24.5,24.5,4.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Old Lady's Camping Trip, The",1983,9,NA,6.7,8,0,0,0,0,14.5,14.5,45.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Old Los Angeles",1948,60,NA,8.5,8,0,0,0,0,0,0,24.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Old MacDonald Duck",1941,8,NA,7.2,43,0,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Old Maid Having Her Picture Taken, The",1901,1,NA,4,13,24.5,0,4.5,34.5,4.5,4.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Old Maid, The",1939,95,NA,7.6,330,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Old Man",2000,3,NA,7.8,5,24.5,0,0,0,0,0,0,0,44.5,44.5,"",0,0,1,0,0,0,1 -"Old Man Blues",1932,10,NA,6.6,12,0,0,0,0,14.5,34.5,24.5,4.5,14.5,0,"",0,0,0,0,0,0,1 -"Old Man Dogs",1997,88,NA,7.4,16,14.5,4.5,0,0,0,0,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Old Man Rhythm",1935,75,NA,6.4,6,0,0,0,0,45.5,0,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Old Man Who Read Love Stories, The",2001,111,9500000,6.1,145,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Old Man and the Goblins",2001,5,NA,9,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,0,0,0,1 -"Old Man and the Sea, The",1958,86,NA,6.9,719,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Old Man and the Sea, The",1999,22,NA,7.5,86,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Old Man and the Studio, The",2004,12,15000,7.8,8,0,14.5,0,0,14.5,0,0,14.5,34.5,24.5,"",0,0,1,0,0,0,1 -"Old Man of the Mountain, The",1933,7,NA,7.7,31,0,0,0,0,4.5,14.5,24.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Old Man's Bride, The",1967,33,NA,4.6,7,14.5,44.5,0,0,0,24.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Old Mill Pond, The",1936,8,NA,6.9,11,4.5,0,0,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Old Mill, The",1937,9,NA,8.7,148,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Old Mother Hubbard",1935,8,NA,5.3,14,4.5,0,4.5,4.5,0,24.5,0,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Old New Orleans",1940,9,NA,6.3,5,0,0,0,0,24.5,0,24.5,44.5,24.5,0,"",0,0,0,0,1,0,1 -"Old No. 587: The Great Train Robbery",2000,80,NA,4.7,23,4.5,4.5,0,24.5,4.5,4.5,0,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Old Oklahoma Plains",1952,60,NA,5.7,7,0,0,24.5,24.5,14.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Old Overland Trail",1953,60,NA,6.2,11,0,0,0,4.5,4.5,44.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Old Paint",1969,8,NA,3.6,9,24.5,0,0,44.5,14.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Old Place, The",1998,49,NA,7,17,14.5,0,0,0,14.5,0,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Old Rockin' Chair Tom",1948,7,NA,6.9,30,0,0,0,4.5,14.5,14.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Old San Francisco",1927,88,NA,7,37,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Old School",2000,88,NA,5.2,24,14.5,0,14.5,4.5,4.5,24.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Old School",2003,92,24000000,6.7,14283,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Old Scores",1991,93,NA,5.8,14,0,0,4.5,0,24.5,4.5,0,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Old Sequoia",1945,6,NA,7.5,25,0,0,0,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Old Shatterhand",1964,122,NA,5.8,102,0,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Old Shep",1936,10,NA,7.6,14,0,0,0,0,0,4.5,14.5,45.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Old Smokey",1938,8,NA,4.8,22,4.5,4.5,24.5,14.5,14.5,4.5,24.5,0,0,4.5,"",0,1,1,0,0,0,1 -"Old South, The",1940,11,NA,5.5,8,0,0,0,0,45.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Old Spanish Custom, An",1932,10,NA,5,7,0,0,0,14.5,45.5,14.5,0,0,0,14.5,"",0,0,0,0,1,0,1 -"Old Surehand",1965,93,NA,5.1,93,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Old West, The",1952,61,NA,6.3,5,0,0,24.5,0,24.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Old Yeller",1957,83,NA,7.2,1441,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Oldboy",2003,120,NA,8.4,8983,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",1,0,0,0,0,0,0 -"Olden Days Coat, The",1982,30,NA,8.1,8,0,0,0,0,14.5,14.5,0,14.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Olden Days, Ye",1933,8,NA,6,37,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,1,1 -"Ole Aleksander Filibom-bom-bom",1998,92,NA,4.5,8,0,0,14.5,14.5,34.5,24.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Ole dole doff",1968,110,NA,5.9,47,0,4.5,0,14.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Oleanna",1994,89,NA,6.6,677,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Olga",2004,141,NA,6.4,199,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Olga's Dance Hall Girls",1966,60,NA,3.6,12,24.5,0,4.5,14.5,4.5,14.5,4.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Olga's Girls",1964,70,NA,5.1,12,0,4.5,4.5,4.5,0,4.5,14.5,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Olga's House of Shame",1964,70,NA,4.5,21,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Olgami",1997,100,NA,6,13,0,0,0,0,14.5,34.5,44.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Olifant en de slak, De",2002,6,NA,8.5,8,0,0,0,0,14.5,0,24.5,14.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Oligarkh",2002,123,5000000,6.2,282,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Olive",2003,11,NA,5.7,6,0,0,0,0,14.5,14.5,34.5,0,0,34.5,"",0,0,1,0,0,0,1 -"Olive Harvest, The",2003,89,NA,7.8,8,14.5,0,0,0,0,14.5,0,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Olive Juice",2001,88,NA,5.4,66,34.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"PG-13",0,0,1,0,0,1,0 -"Olive Oyl and Water Don't Mix",1942,6,NA,7.5,11,0,0,0,4.5,14.5,0,4.5,14.5,0,44.5,"",0,1,1,0,0,0,1 -"Olive Oyl for President",1948,6,NA,6.3,15,0,0,4.5,4.5,4.5,4.5,14.5,44.5,0,24.5,"",0,1,1,0,0,0,1 -"Olive Thomas: The Most Beautiful Girl in the World",2003,58,NA,4.4,8,14.5,0,0,14.5,14.5,14.5,0,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Olive's $weep$take Ticket",1941,6,NA,6.4,6,0,0,14.5,0,0,34.5,0,0,34.5,14.5,"",0,1,1,0,0,0,1 -"Olive's Boithday Presink",1941,6,NA,5.9,10,0,0,14.5,24.5,0,34.5,34.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Oliver & Company",1988,72,NA,6.2,1489,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Oliver Twist",1916,50,NA,8.3,7,0,0,0,0,0,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Oliver Twist",1922,98,175000,7,62,4.5,4.5,4.5,4.5,14.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Oliver Twist",1933,80,NA,5.4,44,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Oliver Twist",1948,105,NA,7.9,1628,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Oliver Twist",1974,91,NA,2.8,6,14.5,14.5,45.5,0,0,0,14.5,0,0,0,"",0,1,0,0,0,0,0 -"Oliver Twisted",2000,90,NA,6.2,23,4.5,14.5,0,0,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Oliver i Olivera",2000,10,NA,8.6,9,14.5,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,1,0,0,1,1 -"Oliver the Eighth",1934,27,NA,7.4,132,4.5,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Oliver!",1968,153,10000000,7.3,3310,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Oliver's Story",1978,91,NA,4.3,131,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Olivetti 82",2001,88,NA,6,54,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Olivia",1983,80,NA,4.4,18,14.5,4.5,14.5,14.5,4.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Olivier Blanckart: La galerie des urgences",1992,28,NA,7.4,6,0,0,0,0,0,0,45.5,34.5,14.5,0,"",0,0,0,0,1,0,1 -"Olivier, Olivier",1992,110,NA,7.4,586,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Olle Hexe",1991,75,NA,5.4,6,0,0,0,0,34.5,14.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Ollin oppivuodet",1920,91,NA,6.3,5,0,0,0,44.5,24.5,0,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Olly, Olly, Oxen Free",1978,83,NA,5.2,41,14.5,0,4.5,4.5,24.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Olo to varos tou kosmou",2004,123,NA,6,16,0,14.5,14.5,4.5,0,0,4.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Olsen Banden Junior",2001,89,NA,5.7,51,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Olsen-banden",1968,80,NA,6.5,177,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Olsen-banden",1969,82,NA,6.5,152,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Olsen-banden deruda'",1977,105,NA,6.3,114,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Olsen-banden i Jylland",1971,101,NA,6.8,177,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Olsen-banden over alle bjerge",1981,100,NA,6.7,116,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Olsen-banden overgiver sig aldrig",1979,108,NA,6.5,113,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Olsen-bandens sidste bedrifter",1974,102,NA,6.5,126,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Olsen-bandens sidste stik",1998,105,NA,4.7,190,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Olsen-bandens store kup",1972,99,NA,6.6,96,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Olsenbanden + Data Harry sprenger verdensbanken",1978,101,NA,5.6,83,0,0,4.5,4.5,24.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Olsenbanden for full musikk",1976,91,NA,6.3,113,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Olsenbanden gir seg aldri!",1981,101,NA,5.4,67,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Olsenbanden og Dynamitt-Harry",1970,100,NA,5.9,93,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Olsenbanden tar gull",1972,94,NA,5.6,83,0,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Olsenbandens aller siste kupp",1982,101,NA,5.4,75,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Olsenbandens siste bedrifter",1975,91,NA,5.2,72,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Olsenbandens siste stikk",1999,90,NA,4.9,79,24.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Oltre il confine",2002,104,NA,3.7,7,0,0,24.5,0,14.5,0,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Oltre la porta",1982,110,NA,5,33,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Olvidados, Los",1950,87,NA,7.8,1260,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Olyan mint otthon",1978,108,NA,8.7,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Olympia",1998,76,NA,4,24,4.5,0,14.5,0,0,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Olympic Champ, The",1942,7,NA,6.6,48,4.5,4.5,0,0,4.5,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Olympic Events",1932,10,NA,4.2,8,0,0,14.5,45.5,24.5,0,0,0,14.5,0,"",0,0,0,0,1,0,1 -"Olympic Fever",1979,80,NA,5.1,11,0,4.5,0,0,4.5,34.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Olympic Glory",1999,40,NA,5.6,22,0,0,4.5,4.5,0,4.5,34.5,4.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Olympische Sommer, Der",1993,85,NA,3.7,9,0,0,14.5,14.5,0,0,34.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Om",1986,4,NA,5.4,8,14.5,0,0,14.5,14.5,0,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Om inte",2001,90,NA,5.2,110,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Omaha (The Movie)",1995,85,38000,5.2,92,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Omaha Trail, The",1942,61,NA,5.3,10,14.5,0,0,14.5,34.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Omar Gatlato",1976,90,NA,4.7,17,4.5,0,14.5,0,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Omar Khayyam",1957,101,NA,4.9,47,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Ombra nell'ombra, Un",1979,85,NA,5.2,10,0,0,0,34.5,0,0,34.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Ombre du doute, L'",1993,106,NA,5.4,29,4.5,0,4.5,14.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ombrellone, L'",1966,90,NA,6.2,12,0,0,0,0,4.5,34.5,44.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Omega Code, The",1999,100,8000000,3.5,2224,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Omega Doom",1997,84,NA,3.2,437,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Omega Man, The",1971,98,NA,6.4,2520,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Omega Syndrome",1987,90,NA,4.2,40,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Omegans, The",1968,85,NA,2.9,21,34.5,14.5,14.5,24.5,4.5,4.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Omelette",1998,78,NA,6.9,7,0,0,14.5,0,14.5,0,44.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Omen, The",1976,107,2800000,7.3,7895,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Omicidio perfetto a termine di legge, Un",1971,90,NA,7.3,6,0,0,0,0,0,14.5,34.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Omicron",1963,102,NA,7.8,13,0,0,0,0,0,0,4.5,44.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Omocha",1999,113,NA,7.2,41,4.5,4.5,0,4.5,0,4.5,4.5,24.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Omohide poro poro",1991,118,NA,7.8,619,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,0,1,0,0,0 -"Omweg, De",2000,98,NA,4.2,18,14.5,14.5,14.5,24.5,0,14.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"On Again Off Again",1937,68,214000,5.8,8,0,0,14.5,0,14.5,0,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"On Any Sunday",1971,96,NA,7.1,217,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"On Any Sunday II",1981,90,NA,6.5,10,0,0,0,0,0,24.5,14.5,44.5,24.5,14.5,"",0,0,0,0,1,0,0 -"On Approval",1944,80,NA,7.4,49,0,0,0,0,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"On Borrowed Time",1939,99,NA,8.1,317,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"On Dangerous Ground",1952,82,NA,7.2,399,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"On Deadly Ground",1994,102,NA,3.5,3731,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"On Dress Parade",1939,62,NA,5.5,37,0,0,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"On Golden Pond",1981,109,NA,7.3,4705,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"On Growing Older",2001,7,NA,7.7,10,14.5,0,0,0,0,14.5,34.5,0,14.5,44.5,"",0,0,0,1,0,0,1 -"On Her Majesty's Secret Service",1969,140,7000000,6.7,7219,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,1,0 -"On Ice",1935,8,NA,7.8,68,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"On Location with Westworld",1973,9,NA,4.4,18,24.5,24.5,0,0,24.5,0,14.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"On Location with: FAME",1980,12,NA,5.9,9,0,0,0,0,14.5,34.5,14.5,0,0,44.5,"",0,0,0,0,1,0,1 -"On Location: 'Where Eagles Dare'",1968,13,NA,6.2,52,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,1 -"On Location: Dustin Hoffman",1971,26,NA,5.9,5,0,0,0,0,44.5,24.5,24.5,0,0,24.5,"",0,0,0,0,1,0,1 -"On Moonlight Bay",1951,95,NA,6.7,263,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"On My Own",1992,97,NA,6.3,62,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"On Our Merry Way",1948,98,NA,5.6,56,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"On Our Selection",1932,99,NA,6,13,4.5,0,0,4.5,14.5,4.5,45.5,4.5,0,0,"",0,0,1,0,0,0,0 -"On Probation",1981,5,NA,5.7,14,4.5,4.5,0,4.5,34.5,14.5,14.5,4.5,4.5,0,"",0,1,0,0,0,0,1 -"On Seal Island",1948,27,NA,6.7,8,0,0,0,14.5,14.5,14.5,24.5,0,0,34.5,"",0,0,0,0,0,0,1 -"On Their Knees",2001,85,250000,5.5,26,14.5,0,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"On Tiptoe: The Music of Ladysmith Black Mambazo",2000,58,NA,7.4,11,0,4.5,0,0,4.5,0,0,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"On Top Down Under",2000,28,NA,7.1,36,0,0,4.5,4.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"On Top of Old Smoky",1953,59,NA,6.3,6,0,0,14.5,0,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"On Trial 2",1991,76,NA,6.4,24,4.5,0,0,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"On Trial 3: Takin' It to the Jury",1992,78,NA,4.5,5,0,24.5,24.5,0,24.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"On Valentine's Day",1986,106,NA,5.8,34,4.5,0,4.5,4.5,24.5,0,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"On Your Mark",1995,7,NA,8,408,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"On Your Toes",1939,94,NA,5.8,25,4.5,0,0,4.5,24.5,34.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"On a Clear Day",2005,92,NA,7.3,31,4.5,0,0,0,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"On a Clear Day You Can See Forever",1970,129,10000000,5.8,578,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"On an Island with You",1948,107,NA,6.2,70,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"On aura tout vu",1976,100,NA,5.7,34,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"On dirait le sud",2003,71,NA,4.1,16,0,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"On fait comme on a dit",2000,80,NA,5.6,16,0,4.5,4.5,24.5,14.5,24.5,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"On lautalla pienoinen kahvila",1952,84,NA,6,6,0,0,0,0,34.5,34.5,34.5,0,0,0,"",0,0,1,0,0,1,0 -"On n'est pas des anges... elles non plus",1981,110,NA,3.5,8,14.5,0,34.5,14.5,14.5,0,24.5,0,0,0,"",0,0,1,0,0,0,0 -"On n'est pas sorti de l'auberge",1982,91,NA,2.5,26,34.5,24.5,14.5,0,4.5,4.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"On na ma dut lin na",1998,97,NA,7.1,84,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"On ne meurt que 2 fois",1985,106,NA,6.9,66,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"On the Air Live with Captain Midnight",1979,90,NA,4.9,13,4.5,0,0,14.5,14.5,0,4.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"On the Avenue",1937,90,NA,7,53,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"On the Beach",1959,134,NA,7.4,1771,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"On the Beat",1962,106,NA,5.3,87,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"On the Black Hill",1987,117,NA,7,21,0,0,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"On the Border",1998,103,3000000,4.8,165,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"On the Borderline",2001,93,NA,5.5,53,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"On the Bowery",1957,65,NA,5.3,16,0,0,0,14.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"On the Bridge",1992,95,NA,6.5,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",0,0,0,0,1,0,0 -"On the Bus",2001,97,NA,4.8,35,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"On the Buses",1971,88,NA,4.6,147,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"On the Corner",2003,95,NA,7,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"On the Couch",2004,17,NA,8.1,7,0,0,0,0,24.5,0,0,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"On the Double",1961,92,NA,6,91,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"On the Downlow",2004,90,NA,8.6,16,14.5,0,0,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"On the Edge",1985,95,NA,5.8,35,0,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"On the Fiddle",1961,89,NA,5.5,41,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"On the Fringe",2001,100,NA,6.4,12,0,0,0,4.5,0,44.5,44.5,4.5,0,0,"",0,0,0,1,0,0,0 -"On the Front Page",1926,22,NA,5,19,0,0,24.5,14.5,14.5,14.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,1 -"On the Line",1984,103,NA,5.4,31,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"On the Line",2001,85,10000000,4.1,1013,24.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"On the Loose",1931,20,NA,6.9,9,0,0,24.5,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"On the Loose",1951,74,NA,5.7,25,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"On the Loose",1985,32,NA,4.8,14,24.5,24.5,0,4.5,14.5,4.5,0,0,0,24.5,"",0,0,0,0,0,0,1 -"On the Nickel",1980,96,NA,4.9,14,0,0,4.5,4.5,14.5,4.5,4.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"On the Nose",2001,104,NA,6,153,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"On the Old Spanish Trail",1947,57,NA,5.9,16,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"On the Outs",2004,86,NA,7.6,27,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"On the Q.T.",1999,90,NA,5.3,29,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"On the Right Track",1981,97,NA,4.9,88,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"On the Riviera",1951,89,NA,6.5,103,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"On the Road with Duke Ellington",1974,57,NA,6.5,6,0,0,0,14.5,0,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"On the Rocks",1996,26,NA,6.9,14,24.5,0,0,0,0,4.5,0,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"On the Ropes",1999,94,NA,7.5,143,4.5,0,0,0,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,1,0,0 -"On the Run",1999,94,750000,6.6,128,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"On the Threshold of Space",1956,98,NA,6.9,19,4.5,0,0,4.5,0,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"On the Town",1949,98,2111250,7.7,1898,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"On the Trail of the Iguana",1964,14,NA,6.7,31,0,4.5,0,4.5,4.5,34.5,4.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"On the Waterfront",1954,108,910000,8.4,12803,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"On the Wrong Trek",1936,18,NA,7.2,23,0,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"On with the New",1938,7,NA,5.1,8,0,0,14.5,0,64.5,24.5,0,0,0,0,"",0,1,1,0,0,0,1 -"On with the Show!",1929,103,NA,6.3,31,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ona voli Zvezdu",2001,104,NA,5.7,12,34.5,0,14.5,0,4.5,0,34.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Onat Haduvdevanim",1991,103,NA,7.5,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Once",1974,100,NA,5.7,8,0,0,0,0,14.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Once Around",1991,115,NA,6.3,924,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Once Before I Die",1965,97,NA,3.9,56,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Once Bitten",1985,94,3200000,4.8,1556,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Once More, My Darling",1949,92,NA,6.3,25,0,0,4.5,4.5,0,14.5,34.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Once More, with Feeling",1960,92,NA,5.4,70,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Once Over Lightly",1938,19,NA,3.7,7,24.5,0,0,14.5,14.5,24.5,0,0,14.5,0,"",0,0,1,0,0,0,1 -"Once Over, Light",1931,10,NA,7.1,10,0,0,0,14.5,34.5,0,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Once Upon a Christmas",2000,90,NA,4.4,49,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Once Upon a Crime...",1992,95,NA,4.8,590,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Once Upon a Dream",1947,87,NA,4.8,11,0,0,4.5,14.5,14.5,34.5,0,4.5,4.5,0,"",0,0,1,0,0,1,0 -"Once Upon a Forest",1993,71,NA,4.6,134,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Once Upon a Honeymoon",1942,115,NA,6.4,263,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Once Upon a Honeymoon",1956,14,NA,4.5,39,24.5,14.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Once Upon a Horse...",1958,85,NA,5.7,25,4.5,4.5,4.5,4.5,14.5,4.5,44.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Once Upon a Scoundrel",1973,99,NA,5.2,8,0,0,14.5,0,14.5,14.5,34.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Once Upon a Time",1944,89,NA,5.3,70,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Once Upon a Time",1976,83,NA,5.8,31,0,0,4.5,0,0,4.5,4.5,4.5,4.5,64.5,"",0,1,0,0,0,0,0 -"Once Upon a Time in America",1984,227,30000000,8.2,19292,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Once Upon a Time in Mexico",2003,102,29000000,6,14732,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Once Upon a Time in the Midlands",2002,104,NA,5.7,583,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Once Upon a Time... When We Were Colored",1995,115,NA,7.4,151,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Once Upon a Wheel",1968,60,NA,4.5,5,0,0,24.5,24.5,0,24.5,24.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Once We Were Strangers",1997,96,NA,7.2,53,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Once Were Warriors",1994,103,NA,7.9,6240,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Once You Kiss a Stranger",1969,106,NA,5.2,38,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Once a Doctor",1937,57,NA,4.3,9,24.5,0,0,0,14.5,64.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Once a Jolly Swagman",1948,100,NA,5.9,18,0,0,0,0,14.5,14.5,24.5,24.5,24.5,0,"",0,0,1,0,0,1,0 -"Once a Lady",1931,80,NA,6.8,7,0,0,0,0,24.5,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Once a Thief",1950,88,NA,6.9,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Once a Thief",1965,107,NA,6.4,206,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Once in Paris...",1978,100,NA,5.6,12,0,14.5,0,24.5,0,24.5,4.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Once in a Blue Moon",1995,96,NA,6.6,45,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"PG",0,0,0,0,0,0,0 -"Once in a Lifetime",1932,91,NA,6.4,23,0,0,0,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Once in the Life",2000,104,NA,4.8,160,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Once to Every Woman",1934,70,NA,6.8,21,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Oncle Yanco",1967,22,NA,3.8,11,4.5,0,0,0,14.5,14.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Onda Nova",1983,90,NA,6.9,12,14.5,4.5,0,14.5,0,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ondanondu Kaladalli",1978,156,NA,7.8,5,24.5,0,0,0,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Ondata di piacere, Una",1975,88,NA,7.3,7,0,0,0,24.5,0,0,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Onde a Terra Acaba",2001,75,NA,7.5,26,14.5,0,4.5,0,0,0,14.5,24.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Ondergrondse orkest, Het",1998,108,NA,7.1,31,4.5,0,0,4.5,0,4.5,24.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Ondskan",2003,114,NA,7.7,2266,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ondt blod",1996,90,NA,6.2,56,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"One",1998,102,180000,6.3,49,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"One",2000,112,NA,6.7,24,14.5,4.5,4.5,4.5,0,0,4.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"One A.M.",1916,34,NA,7.8,222,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,1 -"One Against the World",1939,11,NA,5.3,9,14.5,0,0,24.5,24.5,24.5,0,24.5,0,0,"",0,0,0,0,1,0,1 -"One Angry Dwarf",2001,28,3500,8.5,16,4.5,0,0,0,4.5,0,0,24.5,14.5,45.5,"",0,0,1,0,0,0,1 -"One Arm Bandit, The",2000,12,NA,6.4,5,0,0,0,0,0,24.5,24.5,0,24.5,44.5,"",0,0,1,0,0,0,1 -"One Blood Planet",2001,80,200000,8,7,14.5,0,0,0,0,14.5,0,0,14.5,45.5,"",0,0,0,0,0,0,0 -"One Body Too Many",1944,75,NA,5.3,65,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"One Cab's Family",1952,8,NA,7.4,29,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"One Crazy Summer",1986,89,NA,6,2266,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"One Crowded Night",1940,68,NA,6.1,28,0,0,4.5,14.5,14.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"One Dark Night",1983,94,978000,4,121,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"One Day Crossing",1999,25,NA,6.5,33,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"One Day in Europe",2005,95,NA,7,47,0,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"One Day in September",2000,94,NA,7.6,1186,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,0,1,0,0 -"One Day in the Life of Ivan Denisovich",1970,100,NA,6.9,98,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"One Day...",2001,9,NA,7.2,78,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"One Deadly Road",1998,104,NA,6.9,15,14.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"One Desire",1955,94,NA,6,33,0,0,0,4.5,24.5,34.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"One Dog Day",1997,101,NA,9.6,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,0,0,0,0 -"One Dollar (El precio de la vida)",2001,63,NA,8.4,9,0,0,0,14.5,0,0,24.5,0,24.5,44.5,"",0,0,0,0,1,0,0 -"One Dollar Curry",2004,90,NA,5.1,9,34.5,24.5,0,0,0,0,0,0,14.5,34.5,"",0,0,1,0,0,0,0 -"One Dollar Diary, The",2001,96,NA,2.4,30,24.5,4.5,4.5,4.5,0,0,14.5,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"One Down, Two to Go",1982,89,NA,3.2,69,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"One Droopy Knight",1957,7,NA,6.7,27,0,0,0,14.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"One Eight Seven",1997,119,23000000,6.3,2958,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"One Exciting Adventure",1934,70,NA,6.9,5,0,0,0,44.5,0,0,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"One Exciting Night",1922,128,267000,4.6,8,0,0,14.5,34.5,34.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"One Eyed King",2001,105,6500000,5.1,81,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"One False Move",1992,105,NA,7.2,1787,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"One Fine Day",1996,108,NA,6.2,6522,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"PG",0,0,1,1,0,1,0 -"One Fine Morning",2003,16,NA,7.6,5,0,0,0,0,0,0,44.5,64.5,0,0,"",0,0,0,0,0,0,1 -"One Flew Over the Cuckoo's Nest",1975,133,4400000,8.7,70234,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"One Foot in Heaven",1941,108,NA,7.4,132,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"One Foot in Hell",1960,90,NA,6,27,0,4.5,0,14.5,24.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"One Frightened Night",1935,66,NA,5.6,17,14.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"One Froggy Evening",1955,7,NA,8.9,405,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,1,1,0,0,0,1 -"One Girl's Confession",1953,74,NA,3.3,5,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"One Good Cop",1991,105,NA,5.4,702,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"One Good Turn",1931,20,NA,7.2,110,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,0,1 -"One Good Turn",1954,90,NA,5.8,50,4.5,0,0,14.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"One Good Turn",1996,90,NA,5.2,55,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"One Got Fat",1963,15,NA,5.3,10,0,14.5,0,0,0,64.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"One Ham's Family",1943,8,NA,7.8,26,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"One Heavenly Night",1931,82,NA,5.2,13,0,0,0,24.5,24.5,4.5,4.5,0,14.5,24.5,"",0,0,1,0,0,1,0 -"One Hell of a Christmas",2002,94,400000,2.7,70,34.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"One Hot Night of Passion",1985,83,NA,6.9,13,0,0,4.5,0,0,14.5,0,24.5,0,45.5,"",0,0,0,0,0,0,0 -"One Hour Photo",2002,96,12000000,7.1,17130,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"One Hour with You",1932,80,NA,7.5,151,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"One Hundred Men and a Girl",1937,85,762000,6.9,100,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"One Hundred and One Dalmatians",1961,79,4000000,7.1,5942,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,0 -"One Is Business, the Other Crime",1912,15,NA,6.4,27,0,4.5,4.5,4.5,4.5,14.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"One Is a Lonely Number",1972,93,NA,6,38,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"One Jump Ahead",1954,66,NA,5,5,0,0,0,0,84.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"One Last Chance",2004,96,NA,5.2,45,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"One Last Fling",1949,65,NA,5.7,10,0,0,14.5,14.5,24.5,24.5,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"One Last Ride",2003,88,NA,2.6,7,0,14.5,0,14.5,0,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"One Life Stand",2000,119,NA,1.7,66,45.5,24.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"One Little Indian",1973,90,NA,5.7,67,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"One Magic Christmas",1985,88,NA,6.1,295,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"One Man",1977,87,NA,6.6,8,0,0,0,14.5,0,0,64.5,0,0,24.5,"",0,0,0,1,0,0,0 -"One Man Army",1994,79,NA,2.7,32,14.5,14.5,24.5,4.5,4.5,4.5,0,0,4.5,34.5,"",1,0,0,0,0,0,0 -"One Man Force",1989,92,NA,4.4,29,24.5,14.5,14.5,14.5,24.5,14.5,4.5,0,0,4.5,"",1,0,0,1,0,0,0 -"One Man Jury, The",1978,98,NA,4.8,24,4.5,4.5,14.5,14.5,24.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"One Man Out",1989,90,NA,4.7,11,0,4.5,14.5,4.5,4.5,24.5,0,4.5,0,14.5,"",1,0,0,0,0,0,0 -"One Man Show: A Musical Documentary",2004,74,NA,6.9,14,24.5,0,0,0,0,4.5,4.5,0,4.5,45.5,"",0,0,0,0,1,0,0 -"One Man's Hero",1999,121,18000000,5.5,271,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,1,0 -"One Man's Journey",1933,72,NA,8.8,6,0,0,0,0,0,0,14.5,34.5,45.5,0,"",0,0,0,1,0,0,0 -"One Man's Way",1964,105,NA,7.3,16,0,0,0,0,4.5,24.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"One Meat Brawl",1947,7,NA,7.4,14,0,0,0,0,4.5,14.5,24.5,45.5,0,0,"",0,1,1,0,0,0,1 -"One Million AC/DC",1969,80,NA,2.4,35,44.5,14.5,4.5,14.5,4.5,0,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"One Million B.C.",1940,80,NA,5.5,134,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"One Million Years B.C.",1966,91,NA,5.3,829,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"One Minute Before Death",1972,68,NA,2.5,7,0,44.5,24.5,0,14.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"One Minute to Zero",1952,105,NA,5.4,85,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"One More Kiss",1999,97,NA,6.1,64,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"One More River",1934,85,NA,5.9,27,4.5,0,4.5,4.5,4.5,24.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"One More Round",2005,90,200000,8.8,13,0,0,0,0,0,4.5,4.5,34.5,4.5,44.5,"",0,0,1,0,0,0,0 -"One More Saturday Night",1986,95,NA,5.4,72,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"One More Spring",1935,87,NA,6.6,5,0,0,0,0,24.5,24.5,24.5,0,0,44.5,"",0,0,1,1,0,0,0 -"One More Time",1931,7,NA,6.3,17,0,0,0,0,14.5,44.5,4.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"One More Tomorrow",1946,87,NA,6.2,30,0,0,0,4.5,24.5,34.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"One More Train to Rob",1971,108,NA,5.3,40,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"One Mysterious Night",1944,61,NA,6.6,10,14.5,0,0,0,14.5,24.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"One Night Stand",1984,94,NA,5.7,34,0,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"One Night Stand",1995,88,NA,4.9,42,4.5,4.5,4.5,24.5,24.5,14.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"One Night Stand",1997,102,24000000,5.7,1709,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"One Night Stand, A",1915,14,NA,4.4,8,14.5,14.5,14.5,14.5,34.5,14.5,0,0,0,0,"",0,0,1,0,0,0,1 -"One Night at McCool's",2001,93,NA,6.2,6893,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"One Night in Lisbon",1941,97,NA,7.6,8,0,0,0,0,0,14.5,14.5,24.5,34.5,14.5,"",0,0,1,0,0,0,0 -"One Night in the Tropics",1940,82,NA,5.9,134,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"One Night of Love",1934,84,NA,6.8,30,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"One Night the Moon",2001,57,NA,6.7,67,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"One Night with You",1948,92,NA,6.2,8,0,0,0,0,14.5,34.5,24.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"One On One",1977,98,NA,6.2,297,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"One P.M.",1972,90,NA,5.2,21,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"One Particular Person",2000,10,6000,8.5,6,0,0,0,0,0,0,0,64.5,14.5,14.5,"",0,0,1,0,0,0,1 -"One Perfect Day",2004,106,NA,5.7,136,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"One Point O",2004,92,NA,6,505,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"One Potato, Two Potato",1964,83,NA,7.1,60,4.5,4.5,0,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"One Rainy Afternoon",1936,94,511383,6,13,0,0,0,0,24.5,34.5,34.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"One Romantic Night",1930,73,NA,4.5,6,0,14.5,14.5,0,0,0,34.5,34.5,0,0,"",0,0,1,0,0,1,0 -"One Run Elmer",1935,19,NA,6.4,8,0,0,0,14.5,34.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"One Small Hero",1999,84,NA,3.4,64,14.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"One Soldier",1999,30,NA,7.2,20,4.5,0,0,0,0,4.5,14.5,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"One Spy Too Many",1966,102,NA,5.7,78,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"One Step to Hell",1967,98,NA,4.9,6,0,0,0,34.5,14.5,0,45.5,0,0,0,"",1,0,0,0,0,0,0 -"One Sunday Afternoon",1933,69,NA,7.1,53,4.5,0,0,4.5,4.5,4.5,44.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"One Sunday Afternoon",1948,90,NA,6.7,25,0,0,0,4.5,14.5,24.5,24.5,24.5,0,4.5,"",0,0,0,0,0,1,0 -"One Survivor Remembers",1995,39,NA,6.5,22,4.5,0,0,14.5,0,0,0,0,14.5,45.5,"",0,0,0,0,1,0,1 -"One Take",1997,85,NA,7,8,0,0,14.5,0,0,0,64.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"One That Got Away, The",1957,106,NA,7.4,115,0,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"One Third of a Nation",1939,79,NA,5.7,7,0,0,14.5,0,44.5,0,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"One Thousand Words",2001,25,NA,3.6,8,64.5,0,0,14.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"One Thrilling Night",1942,69,NA,6.3,6,14.5,0,0,0,34.5,14.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"One Too Many",1916,16,NA,4,12,4.5,4.5,24.5,14.5,4.5,4.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"One Touch of Venus",1948,82,NA,6.4,192,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"One Tough Bastard",1995,100,NA,4.5,140,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"One Tough Cop",1998,90,NA,5,395,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"One Trick Pony",1980,98,NA,5.3,143,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"One True Thing",1998,127,30000000,7,2534,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"One Way Out",1930,9,NA,4.1,8,0,14.5,14.5,14.5,34.5,14.5,0,14.5,0,0,"",0,0,1,0,0,0,1 -"One Way Out",1954,61,NA,5.2,5,0,0,0,0,64.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"One Way Out",1986,90,NA,7,5,24.5,24.5,0,0,0,24.5,24.5,0,0,24.5,"",1,0,0,1,0,0,0 -"One Way Out",1996,106,NA,6.7,16,14.5,0,4.5,4.5,14.5,34.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"One Way Passage",1932,68,NA,7.8,159,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,1,0 -"One Way Pendulum",1964,90,NA,5.1,19,4.5,4.5,0,14.5,14.5,14.5,4.5,4.5,24.5,24.5,"",0,0,1,0,0,0,0 -"One Way Street",1950,79,NA,6.8,11,0,0,0,0,14.5,4.5,4.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"One Week",1920,19,NA,8.5,323,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,1 -"One Week",2000,97,NA,5.2,66,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"One Weekend a Month",2004,11,4000,9.4,21,0,4.5,0,0,0,0,0,4.5,4.5,84.5,"",0,0,0,0,0,0,1 -"One Wet Night",1924,11,NA,5.3,10,0,0,14.5,24.5,0,64.5,0,0,14.5,0,"",0,0,1,0,0,0,1 -"One Wild Oat",1951,77,NA,5,13,24.5,0,0,4.5,14.5,4.5,4.5,0,0,34.5,"",0,0,1,0,0,0,0 -"One and Only, Genuine, Original Family Band, The",1968,110,NA,5.7,124,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"One and Only, The",1978,97,NA,5.3,171,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"One and Only, The",2002,91,NA,5,137,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"One by One",1975,100,NA,8.7,12,0,0,0,0,4.5,0,4.5,14.5,34.5,34.5,"",0,0,0,0,1,0,0 -"One for the Book",1939,19,NA,6.2,11,0,0,0,14.5,4.5,0,24.5,34.5,0,4.5,"",0,0,1,0,0,0,1 -"One for the Road",2003,94,NA,6.6,55,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"One from the Heart",1982,107,26000000,6,759,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"One in a Million",1936,95,NA,6.9,29,0,0,0,4.5,4.5,24.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"One of Five",2002,28,10000,7.5,8,14.5,14.5,0,0,0,0,0,0,34.5,34.5,"",0,0,0,0,1,0,1 -"One of Our Aircraft Is Missing",1942,82,NA,7.6,190,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"One of Our Dinosaurs Is Missing",1975,100,NA,5.1,206,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"One of Our Spies Is Missing",1966,100,NA,5.6,52,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,0,4.5,"",1,0,1,0,0,0,0 -"One of Them",1998,48,NA,6.6,9,0,0,14.5,0,14.5,34.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"One of Those Days",1988,7,NA,7.4,39,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,24.5,"",0,1,1,0,0,0,1 -"One of Us",2002,27,NA,9.2,8,0,0,0,14.5,0,0,0,0,0,84.5,"",0,0,1,1,0,0,1 -"One of the Hollywood Ten",2000,109,NA,6,88,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"One, Two, Three",1961,115,3000000,7.8,2551,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"One-Armed Executioner",1983,95,NA,4.1,13,4.5,14.5,14.5,4.5,0,4.5,4.5,34.5,0,4.5,"",1,0,0,1,0,0,0 -"One-Eyed Jacks",1961,141,NA,7.1,1050,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Onegin",1999,106,14000000,6.3,1327,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Onfatsoenlijke vrouw, De",1991,95,NA,5.9,85,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ong-bak",2003,101,NA,7.2,3193,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,0,0,0,0,0 -"Oni srazhalis za rodinu",1975,160,NA,7.5,52,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Onibaba",1964,105,NA,8.1,717,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Onibi",1997,101,NA,4.7,19,14.5,4.5,0,0,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Onion Field, The",1979,122,NA,6.9,592,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Onionhead",1958,111,NA,5.7,43,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Onkel Bill fra New York",1959,90,NA,5.5,11,0,0,4.5,14.5,14.5,4.5,0,44.5,0,0,"",0,0,1,0,0,1,0 -"Onkel Filser - Allerneueste Lausbubengeschichten",1966,89,NA,5.4,6,14.5,0,0,0,45.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Onkel Joakims hemmelighed",1967,103,NA,5.5,10,14.5,0,14.5,0,14.5,44.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Onkel aus Amerika, Der",1953,98,NA,4.8,9,0,0,14.5,24.5,0,24.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Onkyo seimeitai Noiseman",1997,16,NA,7.9,8,0,0,0,24.5,0,0,0,24.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Only Angels Have Wings",1939,121,NA,7.6,1145,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Only Game in Town, The",1970,113,11000000,4.8,115,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Only House, The",1971,55,NA,1.9,6,64.5,0,0,0,0,0,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Only In the Way",1911,12,NA,3.8,6,14.5,0,0,14.5,45.5,14.5,0,0,0,0,"",0,0,0,1,0,0,1 -"Only Me",1929,15,NA,7.6,6,0,0,0,0,0,84.5,0,0,0,14.5,"",0,0,1,0,0,0,1 -"Only Once",1998,56,NA,7.7,11,4.5,0,0,0,0,24.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Only Thrill, The",1997,103,NA,5.7,154,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Only Two Can Play",1962,106,NA,6.3,141,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Only Way, The",1970,86,NA,5.8,15,0,0,0,4.5,34.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Only When I Larf",1968,104,NA,5.9,32,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Only When I Laugh",1981,120,NA,6,213,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Only Yesterday",1933,105,NA,7,32,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Only You",1994,104,NA,6.1,2518,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Only in America",1997,100,NA,2.7,13,34.5,0,4.5,4.5,0,4.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Only the Brave",1994,59,NA,4.9,25,0,4.5,4.5,0,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Only the Lonely",1991,104,NA,6,1702,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Only the Strong",1993,99,NA,5.5,492,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Only the Strong Survive",2002,95,NA,6.6,62,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,0,1,0,0 -"Only the Valiant",1951,105,NA,6.3,82,4.5,0,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Onmyoji",2001,116,NA,6.1,189,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Onna ga kaidan o agaru toki",1960,111,NA,8.1,61,0,4.5,0,0,4.5,4.5,4.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Onna hissatsu ken",1974,88,NA,5.6,117,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Onna keiji Riko",1998,99,NA,6.4,6,0,0,0,34.5,0,0,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Onnellinen ministeri",1941,124,NA,5,5,0,0,24.5,44.5,0,0,0,0,44.5,0,"",0,0,1,0,0,0,0 -"Onnen maa",1993,60,NA,6.7,84,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Onnenpeli",1965,93,NA,5.9,8,0,14.5,0,14.5,14.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Onnenpeli 2001",2001,33,NA,6.6,7,0,0,0,14.5,0,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Ono",1989,130,NA,6.5,12,0,0,0,4.5,0,0,24.5,14.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Ono",2004,101,92000,5.9,23,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Onorevole Angelina, L'",1947,90,NA,5,20,0,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Onorevole con l'amante sotto il letto, L'",1981,91,NA,6.3,7,14.5,0,0,0,14.5,0,44.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Onorevoli, Gli",1963,106,NA,8.3,18,0,0,4.5,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Oog boven de put, Het",1988,94,NA,7.2,7,0,0,0,14.5,0,14.5,14.5,14.5,0,44.5,"",0,0,0,0,1,0,0 -"Ooh, You Are Awful",1972,97,NA,4.7,59,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Oom Ferdinand en de toverdrank",1974,95,NA,6,9,14.5,0,0,0,0,34.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Oops!",1999,6,NA,7.1,28,0,0,0,14.5,4.5,24.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Oops!",2003,109,NA,3.8,13,34.5,4.5,0,24.5,14.5,0,0,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Ooru naito rongu",1992,90,NA,6.5,90,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Op Hop/Hop Op",1966,4,NA,8.7,5,0,0,0,0,0,0,0,64.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Op de fiets naar Hollywood",1993,120,NA,1.8,6,34.5,0,14.5,0,0,14.5,14.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Op het randje ...",2002,12,NA,5.8,12,4.5,0,4.5,14.5,0,34.5,24.5,0,4.5,0,"",0,0,1,1,0,0,1 -"Op hoop van zegen",1986,93,NA,6.2,84,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Opasen char",1984,90,NA,9.4,79,0,0,0,0,4.5,0,4.5,4.5,14.5,74.5,"",0,0,1,0,0,0,0 -"Opashkata na dyavola",2001,87,NA,6.6,7,0,0,24.5,0,0,0,0,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Opasno dlya zhizni!",1985,93,NA,6.6,23,0,0,0,4.5,14.5,4.5,14.5,34.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Opasnye gastroli",1969,87,NA,5.2,23,4.5,4.5,0,14.5,4.5,4.5,4.5,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Open All Night",1924,64,NA,6.6,14,0,4.5,0,0,4.5,24.5,24.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Open Fire",1988,90,NA,4.8,21,44.5,4.5,0,4.5,4.5,0,0,4.5,0,24.5,"",1,0,0,1,0,0,0 -"Open House",1982,25,NA,7.5,30,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Open House",1987,95,NA,3.9,45,14.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Open House",2001,5,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,0,0,0,1 -"Open Mic",2000,53,NA,7.4,7,0,0,14.5,0,0,14.5,24.5,0,14.5,24.5,"",0,0,1,0,1,0,0 -"Open Range",2003,139,26000000,7.5,8799,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Open Season",1996,97,NA,5.2,58,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Open Season",1999,6,NA,7.5,10,0,0,0,14.5,0,14.5,0,24.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Open Secret",1948,68,NA,6.6,8,0,0,0,14.5,14.5,14.5,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Open Up Traci",1984,88,NA,5.8,19,14.5,14.5,0,0,0,4.5,14.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Open Water",2003,79,130000,6.1,7204,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Open Window",1972,12,NA,6,6,14.5,0,0,0,0,34.5,0,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Opening Day",1938,9,NA,8.5,5,0,0,0,0,24.5,0,24.5,0,24.5,44.5,"",0,0,1,0,0,0,1 -"Opening Night",1977,144,NA,7.5,444,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Opening Speech",1960,7,NA,6.1,15,0,0,0,0,44.5,0,24.5,4.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Opening of Misty Beethoven, The",1976,85,NA,7.1,187,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Opera",1987,88,8000000,6.9,1136,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Opera Lover, The",1999,93,NA,6,50,14.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Opera No. 1",1994,8,NA,7.9,18,14.5,4.5,0,4.5,0,0,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Operacija Cartier",1991,90,NA,7.8,11,0,0,0,0,4.5,4.5,4.5,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Operacja Koza",2000,95,NA,4.4,18,24.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Operacja Samum",1999,88,NA,4.5,46,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Operai, contadini",2001,123,NA,7.9,12,4.5,0,0,0,14.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Operation",1998,20,NA,8.9,68,4.5,0,0,0,0,0,0,0,4.5,94.5,"",0,0,1,0,0,0,1 -"Operation Amsterdam",1959,143,NA,6,58,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Operation Balikatan",2003,91,NA,2.3,15,34.5,14.5,0,0,24.5,0,24.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Operation Bikini",1963,77,NA,4.2,21,4.5,24.5,4.5,14.5,14.5,0,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Operation Bluebird",1999,15,NA,4.4,8,0,24.5,0,34.5,0,14.5,14.5,0,14.5,0,"",1,0,0,0,0,0,1 -"Operation Bottleneck",1961,77,NA,4.3,7,14.5,0,0,44.5,44.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Operation Bullshine",1959,84,NA,3.7,9,0,14.5,0,14.5,24.5,14.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Operation C.I.A.",1965,90,NA,5.1,25,4.5,0,4.5,24.5,14.5,14.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Operation Cobra",1995,90,NA,5.5,57,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Operation Crossbow",1965,115,NA,6.4,466,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Operation Daybreak",1975,118,NA,6.4,194,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Operation Dead End",1986,95,NA,7.4,6,0,0,0,0,0,34.5,14.5,14.5,34.5,0,"",0,0,0,1,0,0,0 -"Operation Delta Force",1997,93,NA,3.7,188,24.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Operation Delta Force 3: Clear Target",1998,94,NA,3.4,181,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Operation Delta Force 4: Deep Fault",2001,96,NA,3.7,72,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Operation Delta Force 5: Random Fire",1999,91,NA,3.4,80,34.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Operation Dirty Dozen",1967,9,NA,6.2,42,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Operation Dumbo Drop",1995,104,NA,4.8,1274,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Operation Eichmann",1961,92,NA,5.4,20,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Operation Ganymed",1977,118,NA,6.2,39,14.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Operation Golden Phoenix",1993,95,NA,3.1,12,34.5,34.5,14.5,14.5,0,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Operation Haylift",1950,73,NA,4.9,5,0,0,24.5,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Operation Mad Ball",1957,105,NA,6,91,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Operation Pacific",1951,111,NA,6.1,335,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Operation Petticoat",1959,100,NA,7.3,1682,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Operation Raintree",1957,5,NA,5.3,14,0,0,0,4.5,45.5,24.5,4.5,4.5,0,0,"",0,0,0,0,1,0,1 -"Operation Redlight",1969,90,NA,1.3,8,74.5,14.5,0,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Operation Secret",1952,108,NA,6,18,4.5,0,0,4.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Operation Snafu",1945,3,NA,7.1,5,0,0,0,0,24.5,24.5,24.5,44.5,0,0,"",0,1,0,0,0,0,1 -"Operation Snatch",1962,83,NA,4.4,10,0,0,14.5,0,14.5,14.5,0,0,44.5,34.5,"",0,0,1,0,0,0,0 -"Operation Splitsville",1999,90,NA,4.3,85,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Operation Teahouse",1956,5,NA,4.2,9,24.5,14.5,0,0,34.5,14.5,24.5,0,0,0,"",0,0,0,0,1,0,1 -"Operation Warzone",1990,86,NA,1.4,12,64.5,4.5,0,4.5,0,0,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Operation X-70",1971,9,NA,6.4,9,0,0,14.5,14.5,14.5,0,14.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Operation, The",1930,10,NA,5,5,0,0,24.5,0,24.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Operation: Rabbit",1952,7,NA,8.2,100,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Operative, The",2000,93,NA,3.9,98,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Operator 13",1934,85,NA,5.3,49,4.5,4.5,4.5,4.5,34.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Operator, The",2000,102,NA,5.2,93,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Operatsiya Y i drugiye priklyucheniya Shurika",1965,96,NA,8.9,284,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Operazione Kappa: sparate a vista",1977,91,NA,3.5,8,0,14.5,14.5,14.5,14.5,0,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Operazione San Gennaro",1967,104,NA,6,59,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Operazione San Pietro",1967,100,NA,5.4,46,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Operazione paura",1966,83,NA,6.9,340,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Operette",1940,107,NA,7.2,9,0,0,0,0,0,14.5,34.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Opernball",1956,101,NA,5.8,16,0,0,4.5,4.5,4.5,24.5,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Opet pakujemo majmune",2004,92,NA,7,7,0,0,0,0,44.5,0,0,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Opettajatar seikkailee",1960,97,NA,6.3,11,0,0,0,0,14.5,24.5,4.5,4.5,34.5,0,"",0,0,0,0,0,0,0 -"Opfergang",1944,98,NA,7.7,33,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Opinberun Hannesar",2004,84,NA,2.5,133,74.5,4.5,4.5,4.5,0,4.5,4.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Opium",1919,112,NA,8.2,8,0,0,14.5,0,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Opname",1979,92,NA,8.2,24,0,0,0,0,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Opopomoz",2003,75,NA,4.8,13,14.5,0,0,14.5,4.5,14.5,4.5,4.5,34.5,0,"",0,1,0,0,0,0,0 -"Opponent, The",2000,90,NA,5.4,39,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Opportunists, The",2000,90,NA,5.9,396,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Opposing Force",1986,95,NA,5.1,179,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Opposite Sex, The",1956,117,NA,6.3,145,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Opposite of Sex, The",1998,105,NA,6.7,7404,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Oprosti za kung fu",2004,70,NA,5.1,9,24.5,24.5,0,14.5,0,0,14.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Optical Poem, An",1937,6,NA,6.9,11,0,4.5,0,4.5,0,24.5,4.5,0,4.5,34.5,"",0,1,0,0,0,0,1 -"Optimistic",2002,9,0,8.1,7,0,0,14.5,0,14.5,0,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Optimisticheskaya tragediya",1963,120,NA,9.1,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Optimists, The",1973,110,NA,6.5,64,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Optimists, The",2000,83,NA,2.6,29,4.5,4.5,0,0,0,4.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Options",1988,92,NA,3.5,16,0,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Opus 66",1998,6,NA,6.6,20,0,0,14.5,0,4.5,14.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Opus I",1921,13,NA,6.6,54,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Opus III",1924,3,NA,7.4,20,4.5,4.5,0,4.5,4.5,24.5,24.5,34.5,4.5,0,"",0,1,0,0,0,0,1 -"Opus IV",1925,2,NA,6.7,18,4.5,4.5,0,4.5,24.5,14.5,24.5,24.5,4.5,0,"",0,1,0,0,0,0,1 -"Ora di religione (Il sorriso di mia madre), L'",2002,102,NA,6.9,312,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ora pro nobis",1979,28,NA,4.6,6,0,0,14.5,14.5,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Ora sola ti vorrei, Un'",2002,55,NA,5.9,8,0,0,0,14.5,0,0,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Oracle, The",1953,85,NA,6.6,9,0,0,0,0,24.5,14.5,24.5,0,34.5,14.5,"",0,0,1,0,0,0,0 -"Oracle, The",1985,94,NA,3.5,26,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Oraia ton Athinon, I",1954,80,NA,8,15,0,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Orange Blossoms for Violet",1952,9,NA,5.4,13,14.5,4.5,0,4.5,4.5,34.5,4.5,14.5,4.5,0,"",0,0,1,0,0,0,1 -"Orange County",2002,82,18000000,6.1,8526,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Oranges",2004,12,NA,7.9,12,14.5,0,0,0,0,4.5,0,4.5,45.5,14.5,"",0,0,0,1,0,0,1 -"Oranges and Lemons",1923,12,NA,5.6,59,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Oranges: Revenge of the Eggplant",2004,96,NA,7.2,8,14.5,0,14.5,0,0,0,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Orapronobis",1989,94,NA,6.6,21,4.5,0,0,4.5,0,4.5,0,4.5,4.5,45.5,"",1,0,0,1,0,0,0 -"Oratotis miden",1970,110,NA,6.3,19,14.5,4.5,0,0,14.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Orazi e curiazi",1961,105,NA,3.7,18,14.5,4.5,24.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"",1,0,0,1,0,0,0 -"Orbis Pictus",1997,107,NA,7.1,48,4.5,0,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Orca",1977,92,NA,4.6,1269,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Orca, La",1976,79,NA,5.4,6,14.5,0,0,14.5,0,34.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Orchesterprobe",1933,22,NA,7.6,13,0,0,0,4.5,0,14.5,0,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Orchestra Wives",1942,98,NA,6.1,127,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Orchestre rouge, L'",1989,120,NA,6.4,13,0,0,0,0,0,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Orchids and Ermine",1927,70,NA,6.2,16,4.5,0,4.5,0,0,0,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Orde Der Dingen, De",1996,23,NA,8.7,25,14.5,0,0,0,0,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Ordeal by Innocence",1984,90,NA,4.4,108,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Order of the Black Eagle, The",1985,93,NA,1.6,13,34.5,24.5,0,0,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Order of the Eagle",1989,82,NA,3.1,13,34.5,4.5,0,4.5,0,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Order, The",2001,89,NA,4.1,1053,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Order, The",2003,102,38000000,4.6,3004,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Orders Are Orders",1954,78,NA,5.9,17,0,0,0,14.5,24.5,4.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Orders to Kill",1958,93,NA,6.4,22,0,0,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ordet",1943,108,NA,8,23,0,0,0,4.5,0,4.5,4.5,14.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Ordet",1955,126,NA,7.6,1080,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Ordinary Decent Criminal",2000,85,NA,6.2,2492,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Ordinary Heroes",1986,95,NA,6.8,32,0,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Ordinary Magic",1993,103,NA,5,72,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ordinary People",1980,124,6000000,7.9,6785,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ordinary Sinner",2001,91,NA,5.1,46,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Ordo",2004,115,NA,6.2,18,4.5,4.5,0,0,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ordres, Les",1974,109,NA,8.1,122,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Ore ni sawaru to abunaize",1966,87,NA,7.1,45,4.5,0,4.5,0,4.5,14.5,24.5,44.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Oregon",2000,12,NA,5.6,16,0,0,0,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Oregon Trail",1945,55,NA,6.2,13,0,0,0,4.5,0,0,44.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Oregon Trail, The",1936,59,NA,3.7,24,14.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Oregon Trail, The",1959,86,NA,5.1,16,4.5,0,4.5,14.5,44.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Oreille d'un sourd, L'",1996,95,NA,5.9,7,0,14.5,0,0,24.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Orekhovyy khleb",1978,68,NA,9.3,31,0,0,0,0,4.5,0,0,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Orfeu",1999,110,NA,6.5,269,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Orfeu Negro",1959,107,NA,7.5,1224,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Organ",1996,110,NA,4.3,110,24.5,14.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Organ Cranker",1998,7,NA,8.6,7,0,0,0,0,24.5,0,0,0,0,74.5,"",0,1,0,0,0,0,1 -"Organ Grinder's Swing",1937,6,NA,5.6,14,14.5,0,4.5,14.5,0,4.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Organization, The",1971,106,NA,5.7,118,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Orgasmo",1969,91,NA,3.3,33,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Orgasmo nero",1980,90,NA,4.9,23,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Orgasmo perverso",1986,85,NA,4.9,8,14.5,0,0,0,14.5,24.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Orgasmos tis ageladas, O",1996,90,NA,5.2,64,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Orgazmo",1997,92,1000000,5.7,5128,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"NC-17",0,0,1,0,0,0,0 -"Orgia, L'",1978,101,NA,6.9,10,0,0,0,0,24.5,0,45.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Orgueilleux, Les",1953,97,NA,6.8,44,0,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Orgy of the Dead",1965,92,NA,2.1,494,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Oriana",1985,88,NA,8.3,61,0,0,4.5,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Orient Express",2004,115,NA,4.7,111,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Oriental Blue",1975,87,NA,6.4,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Orientation: A Scientology Information Film",1996,37,NA,2.1,83,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Origen del problema, El",1997,20,NA,6.8,9,0,0,14.5,0,0,24.5,0,44.5,24.5,0,"",0,0,0,0,0,0,1 -"Origin of Man, The",2000,78,NA,5.6,11,4.5,0,0,0,24.5,4.5,4.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Original Cast Album-Company",1970,58,NA,8.8,37,4.5,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Original Gangstas",1996,99,4800000,5.3,216,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Original Kings of Comedy, The",2000,115,3000000,6.1,1386,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,1,0,0 -"Original Latin Kings of Comedy, The",2002,86,NA,7.1,54,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Original Movie., The",1922,8,NA,7.2,40,0,0,0,14.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Original Schtick",1999,55,NA,9.7,7,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,1,0,1,0,0 -"Original Sin",2001,116,26000000,5.5,4592,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Original Sins",1994,108,NA,7,13,14.5,0,0,4.5,0,0,0,34.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Original falsifikata",1991,117,NA,7.9,8,0,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Origine du monde, L'",2001,97,NA,4.9,11,0,0,4.5,4.5,34.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Origines du SIDA, Les",2003,91,NA,8.4,40,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Orinoco prigioniere del sesso",1980,94,NA,6,12,14.5,4.5,0,4.5,0,24.5,4.5,4.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Orion's Key",1996,99,NA,3.6,67,14.5,24.5,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Oriundi",1999,97,NA,7.1,63,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"PG",0,0,0,1,0,1,0 -"Orizuru Osen",1935,78,NA,7,12,0,0,0,14.5,0,14.5,0,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Orkly Kid, The",1985,35,NA,6.4,53,0,4.5,4.5,4.5,0,4.5,14.5,14.5,4.5,45.5,"",0,0,1,0,0,0,1 -"Orlak, el infierno de Frankenstein",1960,103,NA,6.4,7,0,14.5,0,0,0,44.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Orlan, carnal art",2001,75,NA,5.2,6,14.5,0,34.5,0,0,14.5,0,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Orlando",1992,95,5000000,6.8,1942,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Orlovi rano lete",1966,91,NA,5.7,12,0,0,0,4.5,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Ornette: Made In America",1985,85,NA,7.8,5,0,0,0,0,0,24.5,0,64.5,24.5,0,"",0,0,0,0,1,0,0 -"Oro di Napoli, L'",1954,107,NA,7.4,99,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Oro diablo",2000,86,NA,7.1,12,14.5,0,0,0,14.5,4.5,4.5,24.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Oro fino",1989,91,NA,5.1,10,0,14.5,24.5,14.5,14.5,0,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Oro nazi en Argentina",2004,93,NA,8.2,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Oro per i Cesari",1963,86,NA,5,30,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Oro, Plata, Mata",1983,194,NA,9.3,32,4.5,0,0,0,0,0,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Orokamono: Kizu darake no tenshi",1998,91,NA,8,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Orphan",2001,99,NA,6,9,14.5,0,0,0,14.5,34.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Orphan's Benefit",1934,8,NA,6.7,35,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Orphan, The",1979,80,NA,2.5,35,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Orphans",1987,115,NA,6.9,224,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Orphans",1997,101,NA,6.7,422,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Orphans of the Storm",1921,152,NA,7.9,238,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Orphans' Benefit",1941,9,NA,5.7,35,4.5,4.5,14.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Orphans' Picnic",1936,8,NA,6.4,44,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Orribile segreto del Dr. Hichcock, L'",1962,76,NA,5.2,87,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Orrori del castello di Norimberga, Gli",1972,90,NA,5.3,291,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Orson Welles Sells His Soul to the Devil",1999,17,NA,7,5,0,0,0,0,24.5,0,44.5,44.5,0,0,"",0,0,0,0,0,0,1 -"Orson Welles: The One-Man Band",1995,90,NA,6.8,62,0,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Oru Vadakkan Veeragatha",1989,168,NA,9.1,7,0,0,0,0,0,0,0,14.5,45.5,24.5,"",0,0,0,0,0,0,0 -"Orwell Rolls in His Grave",2003,103,NA,7.3,196,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Oryol i reshka",1995,86,NA,6.9,32,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Orzel",1959,104,NA,8.4,10,0,0,0,0,0,24.5,24.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Osada havranu",1978,64,NA,5.8,10,0,0,0,14.5,24.5,34.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Osadeni dushi",1975,141,NA,6,36,0,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Osaka Story: A Documentary",1994,75,NA,5.7,7,14.5,0,0,0,24.5,24.5,0,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Osaka jo monogatari",1961,95,NA,5.2,7,0,0,0,0,44.5,24.5,0,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Osaka monogatari",1999,119,NA,5.3,19,4.5,0,0,14.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Osama",2003,83,46000,7.5,1546,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Oscar",1967,85,NA,7.1,327,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Oscar",2004,56,NA,8.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,0,1,0,0 -"Oscar Wilde",1960,96,NA,5.4,46,4.5,4.5,0,14.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Oscar and Lucinda",1997,132,NA,6.7,1784,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Oscar, The",1966,119,NA,5.2,162,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Osceola",1971,109,NA,4.4,10,0,0,24.5,0,14.5,24.5,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Oscura noche",2004,8,NA,9.7,18,0,0,0,0,0,0,0,4.5,24.5,74.5,"",0,0,0,1,0,0,1 -"Oseam",2003,75,NA,8.1,101,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Osen",1974,93,NA,8.2,8,0,0,0,0,0,24.5,0,24.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Osenniy marafon",1979,90,NA,7.7,155,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Osher Lelo Gvul",1996,85,NA,7.3,6,0,14.5,0,0,0,0,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Oshibka rezidenta",1968,142,NA,7.2,6,0,0,0,0,0,0,64.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Oshibki yunosti",1978,87,NA,6,8,0,0,14.5,0,14.5,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Oskar und Leni",1999,90,NA,3.5,11,4.5,0,14.5,0,14.5,0,4.5,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Oslinaya shkura",1982,85,NA,6.5,6,0,0,0,0,14.5,0,64.5,14.5,0,0,"",0,0,1,0,0,1,0 -"Osmose",2003,75,NA,5.1,20,0,4.5,14.5,4.5,14.5,34.5,14.5,0,0,14.5,"",0,0,1,1,0,1,0 -"Osmosis Jones",2001,95,75000000,6.2,3410,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",0,1,1,0,0,0,0 -"Oso rojo, Un",2002,97,NA,7.4,189,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Osobennosti natsionalnoy okhoty",1995,93,NA,7.8,265,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Osobennosti natsionalnoy okhoty v zimniy period",2000,98,NA,6.3,50,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Osobennosti natsionalnoy politiki",2003,83,NA,4.2,22,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Osobisty pamietnik grzesznika... przez niego samego spisany",1986,125,NA,7,10,0,0,0,14.5,0,0,14.5,44.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Ososhiki",1984,124,NA,6.9,206,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Ospiti",1998,78,NA,8.5,10,0,0,0,0,0,0,14.5,44.5,44.5,14.5,"",0,0,1,0,0,0,0 -"Oss",1976,86,NA,4.1,11,4.5,4.5,24.5,14.5,0,14.5,0,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Ossessa, L'",1974,92,NA,3.5,53,14.5,14.5,4.5,4.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Ossessione",1943,112,NA,8,538,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ossessione che uccide, L'",1981,92,NA,5.6,22,0,4.5,0,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ossessione fatale",1991,87,NA,2.8,13,34.5,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Ossos",1997,94,NA,5.7,72,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ostanovilsya poyezd",1982,96,NA,8,7,0,0,0,0,24.5,14.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Ostatni dzien lata",1958,66,NA,5.7,15,0,0,0,14.5,4.5,24.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Ostatni dzwonek",1989,121,NA,7.7,23,0,0,0,0,4.5,0,0,34.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Ostatni etap",1948,110,NA,7.8,10,0,0,0,0,0,14.5,24.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ostatni prom",1990,88,NA,4,13,14.5,0,4.5,4.5,0,14.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Ostatnia misja",2000,102,NA,5.9,25,14.5,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Osterman Weekend, The",1983,116,NA,5.7,1203,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ostinato destino",1992,93,NA,5.8,16,4.5,0,14.5,14.5,0,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Ostkreuz",1991,84,NA,7.5,7,0,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ostra e o Vento, A",1997,112,NA,7.5,115,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Ostria, to telos tou paixnidiou",1984,93,NA,5.1,7,14.5,0,0,0,14.5,24.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ostrov na strese",2001,12,NA,9.2,13,0,0,0,0,4.5,4.5,0,0,34.5,45.5,"",0,0,0,0,0,0,1 -"Osveta",2001,103,NA,6.5,38,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Oswalt Kolle: Dein Mann, das unbekannte Wesen",1970,99,NA,6.3,6,0,0,0,14.5,0,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Oswalt Kolle: Deine Frau, das unbekannte Wesen",1969,96,NA,4.7,10,0,14.5,0,14.5,14.5,0,44.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Osynliga muren, Den",1944,105,NA,6.4,7,0,0,0,0,14.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Osynlige, Den",2002,95,NA,6.6,467,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ot 180 i vyshe",2005,104,NA,7.2,8,14.5,0,0,0,0,24.5,0,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ot nishto neshto",1979,91,NA,7.5,9,0,0,0,0,0,0,14.5,0,0,84.5,"",0,0,1,0,0,0,0 -"Otac na sluzbenom putu",1985,136,NA,7.4,806,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Otan lipi i gata",1962,73,NA,6.1,10,0,0,14.5,14.5,0,24.5,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Otario",1997,94,NA,5.5,8,14.5,0,0,0,0,45.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Otche nash",1989,87,NA,9,5,0,0,0,0,0,0,0,24.5,64.5,24.5,"",0,0,0,1,0,0,0 -"Otello",1955,107,NA,7.3,31,0,0,0,0,4.5,4.5,34.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Otello",1973,142,NA,8.2,8,14.5,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,0,1,0,0,0 -"Otello",1986,122,NA,7.6,103,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Otets i syn",2003,97,NA,6.1,234,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Othello",1922,80,NA,7.4,42,4.5,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Othello",1965,165,NA,7.4,153,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Othello",1995,123,11000000,6.8,1852,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Othello, el comando negro",1982,90,NA,7.5,5,24.5,0,0,0,24.5,0,24.5,44.5,0,0,"",1,0,0,0,0,0,0 -"Other Brother, The",2002,94,NA,3.7,37,24.5,0,4.5,14.5,14.5,4.5,14.5,4.5,0,14.5,"R",0,0,1,1,0,0,0 -"Other Fellow's Feelings, The",1951,8,NA,3.6,5,0,0,24.5,64.5,0,0,24.5,0,0,0,"",0,0,0,1,0,0,1 -"Other Final, The",2003,79,NA,7.8,87,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Other Hollywood, The",1999,85,NA,7.3,17,0,0,0,14.5,14.5,4.5,14.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Other Love, The",1947,95,NA,5.4,39,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,1,0,1,0 -"Other Men's Wives",1996,84,NA,2.4,20,24.5,14.5,14.5,14.5,4.5,24.5,14.5,14.5,0,0,"R",0,0,0,1,0,0,0 -"Other Men's Women",1931,70,NA,6,62,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Other People's Money",1991,103,NA,5.8,1832,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Other Side of AIDS, The",2004,87,NA,6.7,7,0,24.5,0,0,0,14.5,0,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Other Side of Aspen, The",1983,39,NA,8.1,19,0,0,0,0,0,4.5,34.5,4.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Other Side of Bonnie and Clyde, The",1968,75,NA,3.6,11,4.5,14.5,4.5,14.5,0,4.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Other Side of Heaven, The",2001,113,7000000,6.5,683,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"PG",0,0,0,1,0,0,0 -"Other Side of Julie, The",1978,80,NA,4.6,6,0,0,14.5,0,14.5,0,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Other Side of Midnight, The",1977,165,NA,5.4,243,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Other Side of the Hedge, The",1905,2,NA,3.9,25,0,14.5,24.5,24.5,24.5,4.5,0,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Other Side of the Law, The",1994,91,NA,4,14,4.5,4.5,14.5,4.5,24.5,0,0,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Other Side of the Mountain Part II, The",1978,100,NA,4.6,53,0,4.5,4.5,24.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Other Side of the Mountain, The",1975,103,NA,5.6,165,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Other Sister, The",1999,129,NA,6.1,3021,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Other Voices",2000,104,NA,7.1,53,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Other Voices, Other Rooms",1995,94,NA,6.1,46,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Other Woman, The",1954,81,NA,5.7,7,14.5,0,0,0,0,14.5,24.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Other Woman, The",1992,90,NA,4.7,65,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Other Worlds",2004,90,NA,6.7,13,24.5,0,0,0,0,14.5,0,44.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Other, The",1972,100,NA,6.7,532,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Others, The",2001,104,17000000,7.8,36914,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Othon",1970,82,NA,4.3,14,4.5,0,0,0,0,0,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Otilia Rauda",2001,112,NA,8.5,57,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Otklonenie",1967,78,NA,7.8,10,0,0,0,0,0,24.5,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Otley",1968,91,NA,5.9,41,0,0,4.5,4.5,24.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Otogiriso",2001,85,NA,5.2,286,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Otoko wa tsurai yo",1969,91,NA,7.6,26,0,0,0,0,0,14.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,1,0 -"Otoko wa tsurai yo: Boku no ojisan",1989,109,NA,6.9,8,0,0,0,0,0,24.5,0,24.5,0,45.5,"",0,0,1,0,0,0,0 -"Otoko wa tsurai yo: Funto hen",1971,91,NA,8.2,5,0,0,0,0,0,24.5,0,44.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Otoko wa tsurai yo: Hana mo arashi mo Torajiro",1982,106,NA,7,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,1,0,0,0,0 -"Otoko wa tsurai yo: Junjo hen",1971,89,NA,8.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,1,0,0,0,0 -"Otoko wa tsurai yo: Shiretoko bojo",1987,117,NA,7,9,0,14.5,0,0,14.5,14.5,0,14.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Otoko wa tsurai yo: Torajiro aiaigasa",1975,90,NA,8.3,8,0,0,0,0,0,0,24.5,24.5,0,45.5,"",0,0,1,0,0,0,0 -"Otoko wa tsurai yo: Torajiro koiyatsure",1974,104,NA,7.2,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Otoko wa tsurai yo: Torajiro kurenai no hana",1995,107,NA,7.4,10,14.5,0,0,14.5,0,14.5,0,34.5,0,44.5,"",0,0,1,1,0,1,0 -"Otoko wa tsurai yo: Torajiro no kyuujitsu",1990,106,NA,5,5,0,24.5,0,0,0,24.5,0,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Otomo",1999,85,NA,6.3,58,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Otona no miru ehon - Umarete wa mita keredo",1932,100,NA,8.8,300,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Otoshiana",1962,97,NA,7.8,33,4.5,0,0,0,4.5,0,4.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ototo",1960,98,NA,9,15,0,0,0,0,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Otra cara de la luna, La",2000,97,NA,5,14,4.5,14.5,4.5,14.5,0,24.5,0,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Otra conquista, La",1998,106,3500000,6.7,140,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Otra historia de amor",1986,90,NA,3.2,16,4.5,4.5,0,0,0,4.5,14.5,4.5,34.5,24.5,"",0,0,0,1,0,1,0 -"Otra vuelta de tuerca",1985,119,NA,7.6,11,14.5,0,0,4.5,0,0,0,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Otra, La",1946,98,NA,9.6,13,0,0,0,0,0,4.5,0,0,0,94.5,"",0,0,0,1,0,0,0 -"Otro Francisco, El",1975,97,NA,8.6,7,0,0,0,0,0,0,14.5,44.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Otro barrio, El",2000,130,NA,6.7,30,0,0,4.5,0,4.5,24.5,34.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Otro lado de la cama, El",2002,114,NA,6.9,988,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"Otroki vo vselennoy",1974,84,NA,6.2,40,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Otto",2004,12,NA,9.3,6,0,0,0,0,0,14.5,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Otto - Der Film",1985,85,NA,6.5,333,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Otto - Der Katastrofenfilm",2000,87,NA,3.9,189,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Otto ga mita 'Onna no kabako' yori",1964,92,NA,9.2,5,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Otto ist auf Frauen scharf",1968,85,NA,3,11,14.5,24.5,4.5,34.5,4.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Ottsy i dedy",1982,83,NA,5.2,10,14.5,0,0,14.5,14.5,14.5,14.5,0,44.5,14.5,"",0,0,1,0,0,0,0 -"Otvetnyy khod",1981,84,NA,6.8,5,0,0,0,0,24.5,0,44.5,0,24.5,24.5,"",1,0,0,1,0,0,0 -"Oublie-moi",1994,95,NA,6.9,42,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Oui, mais...",2001,104,NA,6.1,105,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Ouija",2003,104,NA,4,18,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Ounce of Pink, An",1965,7,NA,5.5,6,0,0,0,34.5,14.5,34.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Our Betters",1933,83,NA,6.4,48,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Our Blushing Brides",1930,99,NA,6,57,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Our Burden Is Light",2005,89,NA,7.5,65,24.5,4.5,0,0,4.5,0,0,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Our Country",2002,38,NA,9.2,6,0,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,0,0,1,0,1 -"Our Daily Bread",1934,90,125000,7,128,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Our Dancing Daughters",1928,85,NA,6.6,119,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Our Gang Follies of 1936",1935,18,NA,7.6,29,0,4.5,0,0,4.5,4.5,14.5,34.5,34.5,4.5,"",0,0,1,0,0,0,1 -"Our Gang Follies of 1938",1937,21,58815,6.8,63,0,0,0,4.5,4.5,24.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Our Girl Friday",1954,88,NA,6,27,4.5,0,0,14.5,4.5,14.5,24.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Our God's Brother",1997,123,NA,3.4,16,14.5,0,4.5,0,0,14.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Our Hearts Were Growing Up",1946,83,NA,7.2,20,0,24.5,4.5,0,0,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Our Hearts Were Young and Gay",1944,81,NA,6.7,36,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Our Hospitality",1923,65,NA,7.9,880,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Our House",2003,83,NA,8,17,4.5,0,0,14.5,0,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Our House: A Very Real Documentary About Kids of Gay & Lesbian Parents",2000,57,NA,8.7,10,0,0,0,0,14.5,0,14.5,34.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Our Lady of the Sphere",1972,10,NA,7.4,7,0,0,0,14.5,0,14.5,24.5,24.5,14.5,0,"",0,1,0,0,0,0,1 -"Our Lips Are Sealed",2000,89,NA,4.5,371,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Our Little Girl",1935,65,NA,6.1,44,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Our Man Flint",1966,108,NA,6.4,1153,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Our Man in Havana",1959,111,NA,6.9,400,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Our Man in Marrakesh",1966,92,NA,5.5,42,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Our Marilyn",1987,27,NA,8.5,8,14.5,0,14.5,0,0,0,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Our Miss Brooks",1956,85,NA,6.2,97,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Our Miss Fred",1972,96,NA,4.5,16,0,4.5,14.5,0,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Our Modern Maidens",1929,76,NA,6,83,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Our Money",2001,26,NA,8.4,69,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Our Mother's House",1967,104,NA,7.6,214,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Our New Toy",2004,13,NA,7.3,7,24.5,0,0,0,0,0,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Our Old Car",1946,11,NA,7,17,0,0,0,0,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Our Relations",1936,73,NA,7.3,228,4.5,0,0,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Our Song",2000,95,NA,6.9,187,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Our Time",1974,90,NA,6,41,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Our Time Is Up",2004,12,NA,8,11,14.5,0,0,0,0,0,0,14.5,0,64.5,"",0,0,1,0,0,0,1 -"Our Town",1940,89,NA,7.1,322,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Our Very Own",1950,93,NA,6.3,50,0,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Our Vines Have Tender Grapes",1945,105,NA,7.8,221,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Our Wife",1931,20,NA,7.4,110,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Our Wife",1941,92,NA,5.3,10,0,0,0,0,44.5,24.5,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Our Winning Season",1978,92,NA,6.2,19,0,4.5,0,4.5,24.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ouran",1968,8,NA,2.5,8,24.5,24.5,0,0,14.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Ouranokatevatos, O",1965,90,NA,6,11,0,4.5,0,14.5,4.5,4.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Ouranos",1962,80,NA,7.6,7,0,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ours renifleur, L'",1992,8,NA,7.2,5,0,0,0,0,0,24.5,64.5,0,0,24.5,"",0,1,0,0,0,0,1 -"Ours, L'",1988,85,NA,7.3,1732,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Out",1982,83,NA,3.1,49,34.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Out",2002,119,NA,6,20,4.5,0,4.5,14.5,14.5,14.5,34.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Out 1",1971,773,NA,6.7,20,4.5,4.5,4.5,0,4.5,14.5,0,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Out 1: Spectre",1972,225,NA,7.4,18,4.5,4.5,0,0,0,14.5,4.5,14.5,0,64.5,"",0,0,1,1,0,0,0 -"Out All Night",1933,68,NA,7.7,6,0,0,0,0,34.5,0,0,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Out Bound",1924,14,NA,6.2,8,0,0,0,24.5,0,34.5,34.5,0,0,0,"",0,0,1,0,0,0,1 -"Out California Way",1946,67,NA,5.4,15,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Out Cold",1989,88,NA,4.6,106,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Out Cold",2001,92,11000000,5.2,1990,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Out There",2001,8,NA,5.6,6,0,14.5,0,0,0,45.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Out West",1918,25,NA,6.7,58,0,4.5,0,4.5,4.5,34.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Out West",1947,17,NA,6.9,62,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Out West with the Hardys",1938,84,NA,5.9,23,0,4.5,0,4.5,14.5,14.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Out Where the Stars Begin",1938,19,NA,5.2,13,4.5,0,14.5,4.5,4.5,24.5,24.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Out and Out Rout",1966,6,NA,4.9,14,4.5,4.5,0,4.5,24.5,44.5,0,0,4.5,0,"",0,1,1,0,0,0,1 -"Out at Work",1997,56,NA,8.3,10,24.5,0,0,0,0,0,0,24.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Out for Blood",1990,84,NA,5.9,7,0,0,14.5,14.5,0,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Out for Blood",1993,90,NA,3.9,33,14.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Out for Blood",2004,95,NA,4,72,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Out for Justice",1991,88,NA,4.9,2097,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Out for a Kill",2003,88,20000000,3,818,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Out in Fifty",1999,103,NA,3,132,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Out of Africa",1985,160,31000000,6.9,6797,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Out of Bounds",1986,93,NA,4.8,234,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Out of Bounds",2004,90,NA,3.5,82,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Out of Breath",2000,30,NA,6.1,10,0,0,0,0,24.5,14.5,24.5,0,24.5,34.5,"",0,0,0,0,1,0,1 -"Out of Control",1985,78,NA,2.9,58,14.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Out of Control",1992,108,NA,3.6,22,14.5,24.5,4.5,0,14.5,4.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Out of Control",1998,93,NA,5.2,45,14.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Out of Courage 2: Out for Vengeance",1999,28,10000,5.3,38,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",1,0,0,0,0,0,1 -"Out of Depth",2000,100,NA,4.9,20,14.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Out of It",1969,95,NA,5,34,4.5,0,14.5,4.5,24.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Out of Line",2001,96,NA,4.9,46,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"Out of Our Dens: The Richard and the Young Lions Story",2004,47,8000,9.8,8,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,0,0,1,0,0 -"Out of Reach",2004,88,20000000,3.7,399,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,1,0 -"Out of Rosenheim",1987,108,NA,7.4,2006,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Out of Scale",1951,7,NA,7,28,0,0,0,0,4.5,24.5,34.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Out of Season",1975,90,NA,5.5,29,4.5,0,0,14.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Out of Season",1998,98,NA,5.5,20,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Out of Sight",1966,87,NA,4.3,29,14.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Out of Sight",1998,123,48000000,7.3,18776,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Out of Step",2002,90,NA,6.7,38,14.5,4.5,14.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Out of These Rooms",2002,78,NA,8.1,10,0,0,0,0,14.5,14.5,0,34.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Out of This World",1945,96,NA,7,9,0,0,0,0,0,24.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Out of This World",1954,20,NA,3.4,21,24.5,24.5,14.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Out of the Black",2001,106,NA,4.3,73,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Out of the Blue",1947,84,NA,6,12,0,0,0,4.5,14.5,14.5,24.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Out of the Blue",1980,93,NA,6.2,174,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Out of the Closet, Off the Screen: The Life of William Haines",2001,45,NA,3,7,0,14.5,24.5,0,24.5,0,0,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Out of the Clouds",1955,88,NA,5.9,26,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Out of the Cold",1999,111,NA,5.6,58,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Out of the Dark",1989,89,1600000,4.5,53,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Out of the Fog",1941,85,NA,7,123,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Out of the Frying Pan Into the Firing Line",1942,3,NA,6.4,33,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Out of the Inkwell",1938,6,NA,4.5,5,24.5,0,0,0,24.5,24.5,0,24.5,24.5,0,"",0,1,0,0,0,0,1 -"Out of the Past",1947,96,NA,8.1,2541,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Out of the Past",1998,97,NA,7,51,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Out of the Present",1995,96,NA,6.5,30,4.5,0,0,0,4.5,14.5,14.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Out of the Rain",1991,95,NA,3.2,58,44.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Out of the Rain",2003,85,NA,9.3,6,0,0,0,0,0,0,0,0,64.5,34.5,"",0,0,0,0,0,0,0 -"Out on Bail",1989,91,NA,4.1,25,4.5,0,24.5,4.5,0,14.5,24.5,0,24.5,4.5,"",0,0,0,0,0,0,0 -"Out on a Limb",1950,7,NA,6.7,27,0,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Out on a Limb",1992,105,NA,4.3,337,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Out to Punch",1956,6,NA,5.1,16,0,0,4.5,24.5,24.5,4.5,4.5,0,4.5,24.5,"",0,1,1,0,0,0,1 -"Out to Sea",1997,109,NA,5.6,1380,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Out-Foxed",1949,8,NA,7.8,29,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Out-of-Body Experience",2004,15,NA,9.7,13,0,0,0,0,0,4.5,0,0,0,94.5,"",0,0,1,0,0,0,1 -"Out-of-Sync",1995,105,1500000,4.7,37,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Out-of-Towners, The",1970,98,NA,6.9,1218,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Out-of-Towners, The",1999,90,40000000,5,2919,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Out: Stories of Lesbian and Gay Youth in Canada",1994,79,NA,6.4,19,14.5,0,0,0,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Outback Vampires",1987,90,NA,1.7,9,34.5,34.5,14.5,0,0,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Outbreak",1995,127,50000000,6.4,13796,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Outcast of the Islands",1952,93,NA,7.2,76,0,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Outcast, The",1954,90,NA,6.3,26,4.5,0,0,0,24.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Outcasts",2002,88,20000,9,5,0,0,0,0,0,0,24.5,0,44.5,44.5,"",0,0,1,1,0,0,0 -"Outcasts of Poker Flat, The",1937,67,NA,6,22,0,0,0,4.5,4.5,24.5,44.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Outcasts of Poker Flat, The",1952,81,NA,7,12,4.5,0,0,0,0,14.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Outdoorsmen",2002,64,NA,8.8,15,0,0,0,0,0,0,14.5,24.5,44.5,24.5,"",1,0,1,0,1,0,0 -"Oute gata oute zimia",1955,84,NA,6.9,17,0,0,0,4.5,0,0,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Outer Space",1999,10,NA,6.8,52,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Outer Space Connection, The",1975,94,NA,5.2,15,0,0,0,14.5,24.5,0,4.5,34.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Outer Space Jitters",1957,17,NA,4.9,54,24.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Outer and Inner Space",1966,33,NA,6.2,7,14.5,0,0,0,0,24.5,0,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Outfit, The",1973,103,NA,6.4,243,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Outfit, The",1993,92,NA,1.9,29,34.5,24.5,4.5,14.5,4.5,4.5,4.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Outfitters, The",1999,92,NA,5.1,30,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"PG-13",1,0,0,0,0,0,0 -"Outfoxed: Rupert Murdoch's War on Journalism",2004,88,200000,7.8,1382,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Outing, The",1986,87,2000000,4.4,63,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Outland",1981,109,16000000,6.3,3539,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Outlaw Blues",1977,100,1900000,5,61,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Outlaw Force",1987,95,NA,2.1,16,44.5,14.5,14.5,4.5,14.5,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Outlaw Josey Wales, The",1976,135,NA,7.7,7388,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Outlaw Ladies",1981,83,NA,3.9,19,14.5,14.5,4.5,0,4.5,24.5,0,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Outlaw Stallion, The",1954,64,NA,7.3,9,0,0,14.5,0,0,24.5,14.5,14.5,44.5,0,"",0,0,0,0,0,0,0 -"Outlaw Trail",1944,54,NA,4.2,6,0,0,45.5,0,34.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Outlaw Women",1952,75,NA,1.8,10,44.5,14.5,0,24.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Outlaw of Gor",1989,89,NA,2.2,196,44.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Outlaw, The",1943,103,NA,5.4,396,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Outlaws Is Coming, The",1965,88,NA,5.7,91,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Outlaws of the Desert",1941,66,NA,6,17,4.5,14.5,4.5,4.5,4.5,14.5,0,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Outlaws: Legend of O.B. Taggart, The",1994,98,NA,7.7,16,4.5,4.5,4.5,0,0,14.5,24.5,4.5,4.5,34.5,"R",0,0,0,0,0,0,0 -"Outpost in Morocco",1949,92,NA,4.4,28,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Outrage, The",1964,97,NA,6.2,191,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Outrageous Fortune",1987,100,NA,5.8,1529,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Outrageous!",1977,100,NA,6.8,104,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Outremangeur, L'",2003,90,NA,6.5,43,4.5,0,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Outremer",1990,94,NA,6.4,44,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Outriders, The",1950,93,NA,5.8,49,4.5,4.5,4.5,14.5,14.5,14.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Outro Lado da Rua, O",2004,98,NA,8.2,120,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Outros",2000,14,NA,7.8,9,0,0,0,0,0,0,34.5,34.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Outside",2004,22,125000,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,0,0,1 -"Outside Chance of Maximilian Glick, The",1988,97,NA,7.3,72,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Outside Ozona",1998,100,NA,5.7,274,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Outside Providence",1999,96,7000000,6.1,2735,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Outside the Law",1930,70,NA,5.9,8,0,0,0,0,24.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Outside the Wall",1950,80,NA,7.3,6,0,0,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Outsider, The",1951,12,NA,3.4,6,14.5,14.5,14.5,0,14.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Outsider, The",1961,108,NA,7.5,99,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Outsider, The",1979,128,NA,6.1,32,4.5,0,4.5,4.5,14.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Outsiders, The",1983,91,10000000,6.8,7125,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Outta Time",2002,94,NA,3.5,93,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Outtakes",1985,73,NA,4,21,45.5,14.5,4.5,4.5,0,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Outtakes",1998,69,NA,8.1,10,14.5,0,0,0,0,0,24.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Outward Bound",1930,83,NA,6.3,64,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Oveja negra, La",1949,104,NA,9,34,4.5,0,4.5,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Over 21",1945,102,NA,6.6,8,0,0,0,0,14.5,14.5,34.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Over alle hav",1958,96,NA,5.9,11,4.5,24.5,4.5,0,4.5,0,0,0,0,44.5,"",0,0,0,0,1,0,0 -"Over stork og stein",1994,99,NA,5.1,39,14.5,0,4.5,4.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Over the Brooklyn Bridge",1984,108,NA,4.8,77,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Over the Counter",1932,18,NA,4.7,5,0,0,0,24.5,0,0,44.5,0,44.5,0,"",0,0,0,0,0,0,1 -"Over the Edge",1979,95,NA,7.5,660,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Over the Hill",1992,99,NA,5.7,51,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Over the Moon",1939,78,NA,5,10,0,14.5,14.5,0,14.5,34.5,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Over the Rainbow",1995,15,NA,5.5,13,4.5,14.5,4.5,24.5,4.5,0,0,4.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Over the Top",1987,93,NA,4,3401,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Over the Wall",1938,67,NA,4.4,9,0,0,14.5,34.5,44.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Over the Wire",1996,88,NA,3.8,40,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Over-Exposed",1956,80,NA,5.2,17,4.5,0,0,24.5,14.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Over-sexed Rugsuckers from Mars",1989,87,NA,2.3,17,34.5,14.5,4.5,0,0,0,4.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Overboard",1987,112,NA,6.1,5150,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Overdose",1987,88,NA,5,9,0,34.5,0,14.5,24.5,0,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Overdose",1995,5,NA,7.5,5,0,0,0,0,0,0,24.5,84.5,0,0,"",0,1,0,0,0,0,1 -"Overdrive",1997,92,NA,3.5,27,14.5,0,14.5,24.5,14.5,14.5,0,4.5,14.5,4.5,"R",1,0,0,0,0,0,0 -"Overexposed",1990,80,NA,2.9,21,14.5,4.5,24.5,14.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Overkill",1986,87,NA,2.5,15,14.5,24.5,14.5,4.5,4.5,0,0,4.5,0,34.5,"",1,0,0,0,0,0,0 -"Overkill",1996,88,NA,3.5,41,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Overkill",2004,88,NA,8.1,9,14.5,0,0,0,0,0,0,44.5,0,44.5,"",1,0,0,0,0,0,0 -"Overland Pacific",1954,73,NA,4.9,17,4.5,4.5,0,14.5,44.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Overland Riders",1946,53,NA,5.4,8,0,0,14.5,24.5,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Overland Stage Raiders",1938,55,NA,4.1,55,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Overland Telegraph",1951,60,NA,6.6,10,0,0,0,0,14.5,24.5,34.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Overlanders, The",1946,91,NA,6.7,64,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Overlord",1975,85,NA,6.3,15,0,0,0,4.5,4.5,24.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Overnight",2003,82,NA,7.5,101,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"R",0,0,0,0,1,0,0 -"Overnight Delivery",1998,87,12000000,5.9,1229,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Overnight Sensation",2000,90,NA,6.8,18,0,0,4.5,0,4.5,24.5,4.5,0,4.5,45.5,"",0,0,0,0,0,0,0 -"Overserved",2004,90,NA,6.6,10,34.5,0,0,0,0,14.5,14.5,0,0,45.5,"",0,0,1,0,0,0,0 -"Oversight",2001,13,NA,8.8,6,0,0,0,0,0,0,14.5,14.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Overtime",2004,11,NA,9.5,8,0,0,0,0,0,0,0,14.5,24.5,64.5,"",0,0,1,0,0,0,0 -"Overture to The Merry Wives of Windsor",1953,9,NA,5.5,18,14.5,0,4.5,0,24.5,34.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,1 -"Overvallers in de dierentuin",1984,92,NA,5.7,8,0,0,0,0,14.5,14.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Oviri",1986,90,NA,5.7,53,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ovni in mamuti",1985,91,NA,6,5,0,0,0,0,24.5,0,0,64.5,0,24.5,"",0,0,0,1,0,0,0 -"Ovo malo duse",1991,86,NA,9.4,39,0,4.5,4.5,0,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Ovoce stromu rajskych jime",1969,99,NA,6.5,29,4.5,4.5,4.5,34.5,4.5,14.5,0,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Ovosodo",1997,100,NA,7.2,300,4.5,0,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Owd Bob",1938,78,NA,6,9,14.5,0,0,0,24.5,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Owd Bob",1997,105,NA,6.3,87,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Owl Who Married a Goose: An Eskimo Legend, The",1974,8,NA,5.9,7,14.5,14.5,14.5,0,0,0,14.5,0,0,44.5,"",0,1,0,0,0,0,1 -"Owl and the Pussycat, The",1970,95,NA,6.2,454,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Owl and the Pussycat, The",1985,4,NA,6.3,10,0,0,14.5,14.5,24.5,14.5,34.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Owning Mahowny",2003,104,10000000,7,1999,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Owzat",1997,5,NA,5.7,24,4.5,0,4.5,14.5,24.5,24.5,4.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Ox-Bow Incident, The",1943,75,NA,8.2,1940,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Oxen",1991,92,NA,6.9,118,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Oxford Blues",1984,97,NA,4.9,588,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Oxygen",1999,92,NA,6.1,956,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Oxygono",2003,100,NA,5.3,56,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Oy, vy, gusi...",1991,88,NA,8.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Oyayubihime",1983,65,NA,7.8,5,0,0,24.5,0,0,0,24.5,0,24.5,44.5,"",0,1,0,0,0,0,0 -"Oyster Farmer",2004,91,NA,8.2,13,4.5,0,0,0,0,0,34.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Oz",1976,90,150000,3.8,25,24.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Oz",1980,25,NA,4.6,5,24.5,0,24.5,0,44.5,0,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Oz Witch Project, The",1999,9,NA,5.6,49,4.5,4.5,0,4.5,4.5,0,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Ozone",1993,83,3500,3.3,66,34.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ozone",2003,18,NA,5.9,7,0,0,0,14.5,14.5,0,44.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Ozzie Nelson & His Orchestra",1940,10,NA,6.2,7,0,0,0,0,24.5,0,45.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Ozzie Nelson and His Orchestra",1943,9,NA,5.8,8,0,0,0,0,24.5,0,45.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"P",2005,105,NA,8.4,12,0,0,4.5,0,0,0,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"P & B",1983,109,NA,6.2,71,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"P mesle pelican",1972,25,NA,9.7,6,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,1 -"P'tit bal, Le",1995,4,NA,8.2,10,0,0,0,0,14.5,0,24.5,24.5,44.5,14.5,"",0,0,0,0,0,0,1 -"P'tit con",1984,90,NA,6.7,23,0,0,0,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"P'tite Lili, La",1929,10,NA,7.5,8,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"P.1",1999,9,NA,8.2,12,0,0,0,4.5,0,0,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,1 -"P.C.H.",1995,92,NA,3.2,42,24.5,14.5,14.5,4.5,4.5,14.5,4.5,0,4.5,4.5,"R",0,0,1,0,0,1,0 -"P.E.",2002,12,NA,9.2,9,0,0,0,0,14.5,0,0,0,24.5,64.5,"",0,0,1,0,0,0,1 -"P.I. Blues",2003,101,95000,7.6,5,24.5,0,0,0,0,0,0,0,64.5,24.5,"",0,0,0,0,0,0,0 -"P.I. Private Investigations",1987,87,NA,4.8,23,14.5,4.5,14.5,24.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"P.J.",1968,109,NA,5.4,58,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"P.O. Box",2003,8,5000,7.6,8,0,0,0,0,0,0,45.5,34.5,14.5,0,"",0,0,0,0,0,0,1 -"P.O.E.",2004,107,NA,6.5,8,14.5,0,0,0,0,14.5,45.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"P.O.V - Point of View",2001,107,NA,4.4,57,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"P.R.O.F.S.",1985,90,NA,5.7,145,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"P.S.",2004,97,NA,6.3,653,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"P.S. Your Cat Is Dead",2002,88,2000000,4.7,185,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"P.S. sista sommaren",1988,91,NA,4.6,38,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"P.U.N.K.S.",1999,115,NA,2.5,220,44.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"P4W Prison for Women",1981,81,NA,6.2,5,0,0,0,0,0,24.5,64.5,0,24.5,0,"",0,0,0,0,1,0,0 -"PCU",1994,79,9000000,5.9,2963,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"PG",2002,22,15000,6.3,6,14.5,0,14.5,0,14.5,0,0,0,14.5,34.5,"",0,0,0,1,0,0,1 -"PT 109",1963,140,NA,6.2,316,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"PTU",2003,85,NA,7.1,357,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"PX",1984,90,NA,9.4,5,24.5,0,0,0,0,44.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Pa",2000,6,NA,6.8,7,0,0,0,0,24.5,24.5,24.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Pa celam aizejot",2001,90,NA,7.4,25,0,0,4.5,4.5,4.5,14.5,34.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Pa kuo lien chun",1976,110,NA,6.2,10,0,0,0,14.5,0,34.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Pa'amaim Buskila",1998,93,NA,6.6,10,34.5,0,0,0,0,14.5,0,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Paap",2003,120,NA,5.4,18,14.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Paar",1984,141,NA,7.5,20,0,0,0,0,0,0,44.5,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Paau mui",1998,86,NA,4.6,60,4.5,4.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Pablo y Carolina",1957,96,NA,7.1,15,0,0,0,0,14.5,24.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Pacco, doppio pacco e contropaccotto",1993,118,NA,7.5,12,0,0,0,4.5,4.5,4.5,4.5,45.5,0,4.5,"",0,0,0,0,0,0,0 -"Pace That Kills, The",1935,68,NA,3.8,46,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Pace That Thrills, The",1952,63,NA,5.5,6,0,0,14.5,14.5,14.5,14.5,0,0,14.5,14.5,"",1,0,0,0,0,0,0 -"Pacha, Le",1968,90,NA,6.6,77,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pachanga, La",1981,79,NA,9.7,10,24.5,0,0,0,0,0,0,0,34.5,45.5,"",0,0,1,0,0,0,0 -"Pachito Rex - Me voy pero no del todo",2001,109,NA,5.7,18,4.5,14.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Pacho, hybsky zbojnik",1976,91,NA,8.3,40,0,0,0,0,4.5,4.5,0,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Pacific Banana",1981,82,NA,5.4,25,24.5,0,14.5,4.5,4.5,24.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Pacific Heights",1990,102,NA,6.2,3204,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pacific Liner",1938,76,NA,5.7,25,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pacific Paradise",1937,10,NA,6,5,0,0,0,44.5,0,0,24.5,44.5,0,0,"",0,0,0,0,0,0,1 -"Pacific Rendezvous",1942,76,NA,5,18,14.5,0,4.5,24.5,24.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Pacifier, The",2005,95,56000000,4.9,2179,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"PG",1,0,1,0,0,0,0 -"Pacifista, La",1970,85,NA,6.9,5,0,0,0,0,44.5,0,0,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Pack Train",1953,57,NA,7.2,5,0,0,0,24.5,0,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Pack Train at Chilkoot Pass",1898,1,NA,5.5,57,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,0,"",0,0,0,0,1,0,1 -"Pack Up Your Troubles",1932,68,NA,7.1,209,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pack Up Your Troubles",1939,75,NA,5.7,6,0,0,0,0,34.5,0,14.5,0,0,45.5,"",0,0,1,0,0,0,0 -"Pack of Dogs",2002,14,NA,7.4,7,14.5,0,0,0,14.5,14.5,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Pack, The",1977,95,NA,5.1,68,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Package, The",1989,108,NA,6.2,1236,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Packer House, The",2004,6,NA,3.4,5,24.5,0,0,24.5,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Packing Suburbia, A",1999,90,40000,4.5,38,34.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"R",0,0,0,1,0,0,0 -"Paco",1976,97,NA,5.9,8,14.5,0,14.5,14.5,0,14.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Pacotille",2003,12,NA,8.5,5,0,0,0,0,0,24.5,44.5,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Pacsirta",1963,93,NA,7.2,10,0,0,0,14.5,14.5,14.5,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Pact",1996,11,NA,6.4,19,4.5,0,0,0,0,14.5,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Pacte des loups, Le",2001,152,NA,7,12958,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Pacte du silence, Le",2003,95,NA,5.8,197,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pacto de brujas",2003,107,NA,2.7,15,24.5,4.5,0,4.5,34.5,0,4.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Pactole, Le",1985,90,NA,6.4,11,0,0,0,0,14.5,24.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Pad Italije",1981,122,NA,6.6,13,14.5,0,4.5,0,4.5,4.5,14.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Pad and How to Use It, The",1966,86,NA,5.7,33,0,4.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Paddle to the Sea",1966,28,NA,8,41,4.5,0,0,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,1 -"Paddy O'Day",1935,73,NA,4.2,38,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Padma Nadir Majhi",1993,126,NA,4.5,8,0,0,0,14.5,0,0,0,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Padosan",1968,157,NA,7.1,47,0,0,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Padre de la criatura, El",1972,89,NA,1.7,6,45.5,14.5,0,0,0,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Padre di famiglia, Il",1969,95,NA,7.7,11,0,0,0,4.5,0,4.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Padre e figlio",1994,95,NA,6.6,10,0,14.5,0,14.5,14.5,34.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Padre nuestro",1985,91,NA,7.6,20,0,0,4.5,4.5,0,14.5,34.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Padre padrone",1977,113,NA,7.1,346,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Padrecito, El",1964,130,NA,6.7,43,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Padri e figli",1957,92,NA,5.1,13,0,0,0,14.5,0,34.5,4.5,14.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Padroni del mondo, I",1983,80,NA,1.7,5,44.5,24.5,24.5,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Paejabuhwaljeon",1997,84,NA,6.2,21,0,0,0,4.5,4.5,24.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Paese del sesso selvaggio, Il",1972,90,NA,5.2,82,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pafnucio Santo",1977,100,NA,8.1,7,14.5,0,0,0,0,0,0,0,45.5,24.5,"",0,0,0,1,0,0,0 -"Pagador de Promessas, O",1962,95,NA,8.7,182,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Pagaille, La",1991,100,NA,5.8,12,14.5,4.5,4.5,4.5,0,0,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pagan Island",1961,67,NA,3.6,8,24.5,0,24.5,0,0,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pagan Love Song",1950,76,1906265,5.7,32,0,4.5,0,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Pagan, The",1929,98,NA,8,27,0,0,0,0,0,4.5,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Paganini Horror",1989,82,NA,3.9,31,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Page 73",1996,40,NA,8.2,6,0,0,14.5,0,0,0,0,14.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Page Miss Glory",1935,75,NA,6.3,56,0,0,0,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Page Miss Glory",1936,8,NA,7.3,21,0,0,4.5,0,0,14.5,4.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Pagemaster, The",1994,100,NA,4.5,1140,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Paging Emma",1999,112,600000,6.2,8,14.5,24.5,0,0,14.5,0,0,0,0,45.5,"",0,0,0,1,0,0,0 -"Pagliacci",1947,70,NA,7.1,13,4.5,0,0,0,0,0,14.5,0,4.5,64.5,"",0,0,0,0,0,0,0 -"Pagliacci",1982,72,NA,9,37,0,0,0,0,0,0,14.5,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Pagten",2003,24,NA,5.8,5,0,0,0,24.5,0,64.5,0,0,0,24.5,"",0,0,0,1,0,0,1 -"Paha maa",2005,130,NA,7.4,225,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Pahat pojat",2003,120,NA,6.5,587,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pai Tirano, O",1941,114,NA,8.3,71,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Paid",1930,86,NA,6.3,55,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Paid in Full",1950,98,NA,6.1,30,4.5,4.5,0,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Paid in Full",2002,97,NA,6.1,404,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"Paid to Love",1927,76,NA,5.6,7,0,0,0,24.5,14.5,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,1,0 -"Paille et la poutre, La",2002,13,NA,6.8,6,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,1,1,0,0,1 -"Pain au chocolat - Chocolate Pain",1999,14,NA,4.8,9,14.5,0,24.5,0,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Pain in the Pullman, A",1936,20,NA,8.1,64,0,0,0,0,0,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Paint Cans",1994,100,NA,4.4,65,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Paint Job, The",1992,90,NA,6.5,90,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,44.5,"R",0,0,1,0,0,0,0 -"Paint Your Wagon",1969,158,20000000,6.5,2011,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Painted Angels",1998,110,NA,3.4,66,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Painted Desert",1938,58,NA,6.4,10,0,0,0,14.5,24.5,24.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Painted Desert, The",1931,85,NA,5.5,77,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Painted Door, The",1984,24,NA,9.5,8,0,0,0,0,0,0,0,14.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Painted Faces",1929,74,NA,5.7,5,0,0,0,24.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Painted Hills, The",1951,68,NA,3.7,87,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Painted Lady, The",1912,12,NA,6,35,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Painted Stallion, The",1937,212,NA,6.3,18,0,0,0,0,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Painted Veil, The",1934,85,947000,6,85,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Painted Woman, The",1932,73,NA,5.6,9,0,0,14.5,14.5,14.5,14.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Painters Painting",1972,116,NA,7.6,23,4.5,4.5,0,0,4.5,4.5,24.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Painting the Clouds with Sunshine",1951,87,NA,5.6,16,0,4.5,4.5,0,34.5,24.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Painting the Town",1992,78,NA,4.8,12,4.5,0,0,0,4.5,14.5,0,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Pair of Boots, A",1962,48,NA,7.9,8,0,0,0,14.5,0,0,34.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Pair of Briefs, A",1962,90,NA,5.1,31,0,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pair of Greenbacks, A",1969,6,NA,6.3,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,1,1,0,0,0,1 -"Pair of Tights, A",1929,20,NA,8.3,11,0,0,0,0,14.5,0,24.5,0,4.5,44.5,"",0,0,1,0,0,0,1 -"Paja i Jare",1973,108,NA,5.9,10,0,0,0,0,14.5,24.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Pajama Game, The",1957,101,NA,7,471,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Pajama Party",1964,82,NA,4.4,102,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pajarico",1997,100,NA,6.9,53,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pajeczarki",1993,105,NA,5.4,8,14.5,0,14.5,14.5,14.5,45.5,0,0,0,0,"",1,0,1,0,0,0,0 -"Pak slaag, Een",1979,104,NA,4.5,8,14.5,0,14.5,24.5,14.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Pakeezah",1971,146,NA,7,147,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,45.5,"",0,0,0,1,0,1,0 -"Paket aranzman",1995,120,NA,8,15,4.5,4.5,0,0,0,4.5,4.5,14.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Pal Joey",1957,111,NA,6.6,495,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Palabras encadenadas",2003,87,NA,7,162,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Palace",1985,90,NA,5.2,18,0,14.5,14.5,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Palace",1996,90,NA,7.2,53,0,0,0,0,4.5,14.5,34.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Palach",1990,166,NA,4,10,24.5,0,14.5,0,0,0,34.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Palacio presidencial!",2004,10,NA,9.1,10,0,0,0,0,0,24.5,0,0,14.5,74.5,"",0,0,1,0,0,0,1 -"Paladini - storia d'armi e d'amori, I",1983,98,NA,5.3,104,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Palais des mille et une nuits, Le",1905,14,NA,6.9,13,4.5,0,0,4.5,4.5,24.5,4.5,4.5,34.5,4.5,"",0,0,0,0,0,0,1 -"Palanquin des larmes, Le",1987,100,NA,7,18,0,0,0,0,0,24.5,24.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Palavra e Utopia",2000,130,NA,6.6,71,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pale Blood",1990,93,NA,4.3,37,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pale Rider",1985,115,6900000,6.9,4487,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Pale Saints",1997,90,NA,3.8,64,14.5,0,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Paleface, The",1922,20,NA,7.1,172,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Paleface, The",1948,91,NA,6.9,478,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Palermo Hollywood",2004,113,NA,5.9,14,14.5,0,0,4.5,0,24.5,14.5,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Palermo Milano solo andata",1995,100,NA,5.9,91,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Palermo oder Wolfsburg",1980,175,NA,6.8,8,0,0,0,0,0,14.5,24.5,24.5,34.5,0,"",0,0,0,1,0,0,0 -"Palindromes",2004,100,NA,7.3,405,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Paljas",1998,119,NA,7,71,4.5,4.5,0,0,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Palkkasoturi",1997,79,NA,2.9,14,24.5,4.5,4.5,4.5,4.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Palla di neve",1995,110,NA,6,11,14.5,0,0,14.5,4.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Pallbearer, The",1996,98,NA,4.8,2093,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Palle alene i verden",1949,25,NA,8,21,0,0,0,0,0,14.5,14.5,14.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Pallet on the Floor",1984,90,NA,5.6,5,0,0,24.5,0,24.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Pallieter",1976,89,NA,5.6,38,4.5,0,4.5,4.5,14.5,24.5,24.5,0,4.5,4.5,"",0,0,0,1,0,1,0 -"Palm Beach",1979,88,NA,4.9,10,24.5,0,14.5,0,14.5,34.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Palm Beach Story, The",1942,88,NA,7.8,1224,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Palm Springs Weekend",1963,100,NA,6,92,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Palmer's Pick Up",1999,108,NA,4.1,58,14.5,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Palmes de M. Schutz, Les",1997,106,NA,7,114,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Palmetto",1998,114,NA,5.6,2228,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Palmy Days",1931,77,NA,6.6,56,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Palo, El",2001,87,NA,6.2,88,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Paloma de Marsella, La",1999,100,NA,6.8,6,0,0,0,14.5,14.5,0,34.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Paloma de papel",2003,90,NA,5.9,32,0,4.5,4.5,0,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Paloma, La",1974,110,NA,5.4,22,4.5,0,0,4.5,4.5,14.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Palombella rossa",1989,89,NA,7.5,282,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Palomino, The",1950,73,NA,5.2,8,0,0,0,24.5,14.5,34.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Palomita blanca",1973,125,NA,6.3,22,24.5,4.5,0,0,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Palomo cojo, El",1995,114,NA,7.9,32,0,4.5,0,0,4.5,14.5,14.5,24.5,34.5,0,"",0,0,1,0,0,0,0 -"Palomos, Los",1964,109,NA,3.9,7,0,24.5,0,0,14.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Palooka",1934,86,NA,5.5,52,4.5,4.5,4.5,4.5,24.5,14.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Palooka from Paducah",1935,20,NA,6,5,0,0,0,0,44.5,24.5,0,24.5,0,24.5,"",0,0,1,0,0,0,1 -"Palookaville",1995,92,NA,6.5,793,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Pals and Gals",1954,17,NA,5.9,27,14.5,14.5,14.5,14.5,0,14.5,4.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Pals of the Golden West",1951,68,NA,5.6,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Pals of the Saddle",1938,55,NA,4.4,50,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Paltoquet, Le",1986,92,NA,6.1,47,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Palwolui Christmas",1998,97,NA,8,539,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Pamela Principle, The",1992,95,NA,4.1,45,14.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pamietnik znaleziony w garbie",1993,110,NA,6.7,7,0,0,0,0,14.5,14.5,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Pamplemousse",1999,4,NA,5.7,10,0,14.5,14.5,0,0,14.5,0,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Pamptohoi A.E.",2001,90,NA,5.2,18,4.5,14.5,4.5,0,24.5,34.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Pan",1995,115,NA,4.9,45,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Pan Jin Lian zhi qian shi jin sheng",1989,99,NA,6.7,42,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pan Samochodzik i praskie tajemnice",1989,86,NA,5,5,0,24.5,24.5,0,24.5,24.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Pan Tadeusz",1999,154,NA,6.6,300,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Pan Tau - Der Film",1988,90,NA,7.5,17,0,0,0,4.5,0,14.5,24.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Pan Wolodyjowski",1969,160,NA,7.3,76,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Pan with Us",2003,4,NA,7.8,16,0,0,0,0,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Panaghoy sa suba (The Call of the River)",2004,120,NA,7.7,19,0,0,0,0,4.5,14.5,14.5,0,4.5,64.5,"",0,0,0,1,0,1,0 -"Panama Deception, The",1992,91,NA,7.4,181,14.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Panama Hattie",1942,79,1097907,6.2,51,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Panama Lady",1939,65,NA,5.2,17,0,0,14.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Panarea",1997,100,NA,3.2,36,45.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Panchatanthiram",2002,150,NA,8.6,12,0,0,0,0,0,24.5,0,14.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Pancho Villa",1972,92,NA,3.8,56,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Panda kopanda amefuri saakasu no maki",1973,38,NA,6.5,46,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Pandaemonium",2000,124,15000000,6.2,244,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Pandemonium",1982,82,NA,4.8,205,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Pandemonium",1988,88,NA,3,21,24.5,14.5,4.5,4.5,0,4.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Pandemonium, la capital del infierno",1997,97,NA,3.6,11,14.5,0,0,0,4.5,14.5,14.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Pandora Project, The",1998,89,NA,3,150,24.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Pandora and the Flying Dutchman",1951,122,1500000,6.7,234,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Pandora's Mirror",1981,93,NA,6.3,19,4.5,0,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Pandora's Paradox",2004,24,NA,8.6,15,44.5,0,0,0,0,0,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Pane e cioccolata",1973,112,NA,7.5,235,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Pane e tulipani",2000,118,NA,7.3,2259,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Pane, amore e fantasia",1953,94,NA,6.7,114,0,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Pane, amore e gelosia",1954,97,NA,6.3,56,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Pane, amore e...",1955,110,NA,6.2,52,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Pane, burro e marmellata",1977,100,NA,6.1,8,0,0,14.5,14.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Pane, vy jste vdova!",1970,97,NA,7.3,60,4.5,0,4.5,0,4.5,14.5,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Paneless Window Washer, The",1937,6,NA,5.9,22,0,0,0,34.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Panelkapcsolat",1982,102,NA,8.2,12,0,0,0,0,0,0,0,34.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Panelstory",1979,96,NA,7.6,17,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Pang shen feng",1976,85,NA,7.4,8,0,0,0,24.5,14.5,0,14.5,0,14.5,34.5,"",1,1,0,0,0,0,0 -"Pangako... ikaw lang",2001,100,NA,6.6,5,24.5,0,0,0,0,24.5,0,44.5,0,24.5,"",0,0,0,1,0,1,0 -"Pangarap ng puso",2000,100,NA,4.7,15,24.5,0,0,0,14.5,0,0,4.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Panhandle",1948,85,NA,6.2,5,0,0,0,24.5,0,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Pani minister tanczy",1937,87,NA,5.4,10,0,0,14.5,14.5,14.5,24.5,14.5,34.5,14.5,0,"",0,0,1,0,0,1,0 -"Panic",1999,15,NA,4.9,76,0,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,34.5,"",0,0,0,1,0,0,1 -"Panic",2000,88,1000000,6.9,2524,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Panic",2001,91,NA,4.3,120,24.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Panic Button",1964,90,NA,4.5,15,4.5,24.5,0,4.5,14.5,24.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Panic Room",2002,113,48000000,7,24302,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Panic in Needle Park, The",1971,110,NA,6.9,979,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Panic in Year Zero!",1962,93,NA,6.4,240,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Panic in the City",1968,97,NA,5.1,22,4.5,4.5,14.5,4.5,34.5,24.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Panic in the Streets",1950,98,NA,7.4,460,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Paniekzaaiers",1986,95,NA,5.7,60,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Panik i familien",1945,59,NA,1.9,5,24.5,64.5,24.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Panikos sta sholeia",1981,118,NA,7.7,12,14.5,4.5,0,0,0,0,0,4.5,0,64.5,"",1,0,0,1,0,0,0 -"Panique",1947,91,NA,7.8,65,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Panique",1977,97,NA,3.2,7,14.5,14.5,0,0,14.5,0,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Panna Nikt",1996,98,NA,6.1,51,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Panni sporchi",1999,110,NA,4.5,17,14.5,4.5,14.5,14.5,14.5,14.5,24.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Panny z Wilka",1979,118,NA,7.2,81,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pano kato ke plagios",1993,108,NA,6.8,19,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Panorama Exterior Westinghouse Works",1904,6,NA,3.8,6,14.5,0,0,45.5,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Panorama View Street Car Motor Room",1904,3,NA,4.5,9,14.5,0,14.5,0,14.5,34.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Panorama of Esplanade by Night",1901,1,NA,4.4,14,14.5,0,14.5,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Panorama of Machine Co. Aisle",1904,3,NA,3.9,7,14.5,0,24.5,14.5,0,0,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Panorama of Riker's Island, N.Y.",1903,2,NA,3.7,6,14.5,0,0,45.5,34.5,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Panoramic View Aisle B",1904,2,NA,3.8,5,24.5,0,24.5,24.5,0,44.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Panserbasse",1936,99,NA,5.8,6,0,14.5,0,0,0,14.5,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Pansion za kucheta",2000,84,NA,4.5,5,0,0,0,24.5,0,24.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Pantalones",2000,4,NA,8.4,29,4.5,0,14.5,4.5,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Pantano de los cuervos, El",1974,83,NA,3.3,10,24.5,34.5,14.5,14.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Panther",1995,124,NA,5.6,408,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Panther Girl of the Kongo",1955,167,NA,5.1,12,0,0,24.5,24.5,14.5,4.5,14.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Panther Squad",1984,77,NA,1.7,27,44.5,44.5,4.5,0,4.5,0,4.5,0,0,0,"",1,0,0,0,0,0,0 -"Panther's Claw, The",1942,70,NA,6.4,6,0,0,0,0,0,34.5,45.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Pantry Panic",1941,7,NA,5.8,23,4.5,0,0,4.5,14.5,14.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Pantry Pirate",1940,7,NA,6.1,35,24.5,4.5,4.5,4.5,4.5,24.5,0,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Pants on Fire",1998,107,NA,7.3,27,0,0,4.5,0,4.5,4.5,24.5,24.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Panty Raid",1984,75,NA,5.9,10,0,0,14.5,14.5,14.5,34.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Pao Da Shuang Deng",1994,115,NA,6.9,215,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Pao zhi nu peng you",2003,91,NA,3,36,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Paolo il caldo",1973,104,NA,4.3,9,0,24.5,0,0,0,0,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Paolo il freddo",1974,105,NA,6.5,6,0,0,14.5,0,0,0,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Papa",2004,94,3500000,8.1,85,0,4.5,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Papa Gets the Bird",1940,8,NA,5,11,0,0,24.5,4.5,4.5,34.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Papa Was a Preacher",1985,90,NA,5,18,4.5,0,14.5,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Papa est parti, maman aussi",1989,104,NA,6.8,12,0,0,0,4.5,14.5,24.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Papa's Delicate Condition",1963,98,NA,6.2,118,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Papa's kleine Meid",1999,10,NA,5.5,11,0,0,0,4.5,4.5,34.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Papa's song",2000,95,800000,5.5,13,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Papa, maman, la bonne et moi...",1954,97,NA,7.6,22,0,0,0,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Papa, maman, ma femme et moi...",1956,105,NA,7.6,14,0,0,0,0,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Papa, umer ded moroz",1992,73,NA,6.5,9,0,0,0,24.5,14.5,14.5,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Papaflessas",1971,130,NA,6.6,7,0,14.5,14.5,0,0,0,14.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Papagei, Der",1992,90,NA,6.1,44,4.5,0,4.5,0,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Papageno",1935,11,NA,7.5,8,0,0,0,0,0,14.5,0,14.5,0,74.5,"",0,1,0,0,0,0,1 -"Papal Cab",2002,13,NA,6.3,10,0,24.5,14.5,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Paparazzi",1964,18,NA,6,43,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Paparazzi",2004,84,20000000,5.6,2028,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Paparazzo",1995,66,NA,3.1,17,24.5,4.5,0,4.5,0,14.5,4.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Papatrehas, O",1966,90,NA,8.5,24,0,0,0,4.5,4.5,0,14.5,14.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Papaya dei Caraibi",1978,85,NA,5.3,22,4.5,4.5,4.5,14.5,24.5,14.5,24.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Paper Boy, The",1994,97,NA,4.6,182,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Paper Bullets",1941,72,NA,5.3,14,0,0,4.5,14.5,14.5,24.5,24.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Paper Chase, The",1973,111,NA,7.2,1331,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Paper Chasers",2003,80,NA,7.9,5,0,0,0,0,0,0,44.5,44.5,24.5,0,"",0,0,0,0,1,0,0 -"Paper Clips",2004,82,NA,8.4,86,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Paper Hearts",1993,88,NA,4,17,4.5,4.5,4.5,24.5,24.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Paper Lion",1968,107,NA,6.1,213,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Paper Mask",1990,118,NA,6.7,156,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Paper Moon",1973,102,NA,7.7,3182,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Paper Route, The",1999,19,NA,2.8,10,14.5,14.5,24.5,0,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Paper Soldiers",2002,88,NA,5.1,103,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"R",1,0,1,0,0,0,0 -"Paper Tiger",1975,99,NA,5.4,89,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Paper, The",1994,112,NA,6.2,2863,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Paper-Thin Immortals",1998,117,NA,5.2,8,24.5,0,14.5,0,14.5,14.5,0,24.5,0,14.5,"",0,0,1,1,0,0,0 -"Paperback Hero",1973,93,NA,4.3,53,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Paperback Hero",1999,96,NA,5.9,352,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Paperboys",2001,41,NA,7,16,4.5,0,0,0,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Paperchase in Berlin",1989,15,NA,9.6,12,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,1,0,0,1 -"Paperhouse",1988,92,NA,6.8,533,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Papertrail",1997,89,NA,4.5,147,14.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Papesse, La",1975,95,NA,4.5,8,0,0,0,24.5,0,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Papierove hlavy",1995,96,NA,6.6,12,4.5,4.5,0,0,0,0,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Papierowe malzenstwo",1992,84,NA,6.6,23,0,0,0,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Papillon",1973,150,12000000,7.8,9553,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Papillon",2001,10,NA,6.5,10,14.5,14.5,0,0,0,44.5,0,34.5,0,14.5,"",0,0,0,1,0,0,1 -"Papillon d'amour",2003,3,NA,8.5,22,4.5,0,0,24.5,0,4.5,14.5,4.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Papillon, Le",2002,84,NA,6.9,314,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Papillons de nuit",1997,8,NA,5.7,23,4.5,0,0,4.5,14.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Papillons de nuit",2002,82,NA,5,8,0,14.5,14.5,14.5,0,14.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Papirosnitsa ot Mosselproma",1924,78,NA,6.9,18,0,0,0,0,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Papocchio, Il",1981,110,NA,7.3,56,4.5,0,0,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Pappa & jag",2000,41,NA,7.1,7,0,0,0,0,14.5,0,44.5,14.5,0,24.5,"",0,0,0,0,1,0,1 -"Pappa Bom",1949,90,NA,3.2,17,0,24.5,24.5,14.5,14.5,14.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Pappa ante Portas",1991,84,NA,7.9,464,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Pappa e ciccia",1982,92,NA,5.5,26,4.5,4.5,0,0,14.5,24.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Pappa tar gull",1964,83,NA,4.9,12,4.5,4.5,24.5,14.5,0,14.5,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Pappy's Puppy",1955,7,NA,6.2,14,0,0,0,4.5,14.5,24.5,24.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Paprika",1991,99,NA,5.2,163,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Paquebot Tenacity, Le",1934,85,NA,8.5,5,0,0,0,0,24.5,0,0,64.5,0,24.5,"",0,0,0,0,0,0,0 -"Paqueras, Os",1969,102,NA,5.1,6,14.5,0,14.5,0,14.5,0,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Par coeur",1998,79,NA,7.4,7,0,0,0,0,14.5,14.5,14.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Par de asesinos, Un",1971,95,NA,6.9,6,0,0,0,34.5,0,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Par le trou de serrure",1901,2,NA,6.9,27,0,0,0,4.5,4.5,24.5,34.5,24.5,4.5,0,"",0,0,1,0,0,0,1 -"Para que dure no se apure",1988,90,NA,4.9,7,24.5,0,0,0,0,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Para que no me olvides",2005,100,NA,4.6,8,0,0,14.5,14.5,14.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Paracelsus",1943,104,NA,6.1,16,0,0,0,4.5,0,44.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Parachute Battalion",1941,75,NA,5.4,21,4.5,0,4.5,4.5,24.5,14.5,24.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Parachute Jumper",1933,65,206000,6.7,115,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Parad planet",1984,97,NA,5.1,31,4.5,0,4.5,4.5,4.5,4.5,0,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Parade of the Award Nominees",1932,2,NA,7.1,18,0,0,0,0,24.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Parade of the Wooden Soldiers",1933,8,NA,5.8,12,0,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Paradies",1986,106,NA,5.6,16,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Paradies der Junggesellen",1939,91,NA,6.2,14,0,0,0,14.5,4.5,14.5,45.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Paradigma",1985,120,NA,6.3,7,0,0,0,14.5,0,44.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Paradine Case, The",1947,94,4258000,6.3,1243,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Paradis perdu",1940,103,NA,6.9,9,0,0,0,0,0,14.5,34.5,34.5,24.5,0,"",0,0,0,1,0,0,0 -"Paradis pour tous",1982,110,NA,6.2,26,0,0,0,14.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Paradis utan biljard, Ett",1991,113,NA,5.1,8,14.5,0,24.5,0,14.5,14.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Paradisco",2002,17,NA,7.8,34,0,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Paradise",1982,100,NA,4.1,403,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Paradise",1984,15,NA,8.8,12,0,0,0,0,0,0,34.5,14.5,4.5,44.5,"",0,1,0,0,0,0,1 -"Paradise",1991,111,NA,6.5,710,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Paradise Alley",1962,85,NA,4,5,24.5,24.5,24.5,24.5,0,0,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Paradise Alley",1978,107,NA,4.8,401,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Paradise Bent: Boys Will Be Girls in Samoa",1999,51,NA,8.2,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,0,0,1,0,0 -"Paradise Canyon",1935,52,NA,4.6,52,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Paradise Falls",1997,101,NA,3.6,18,14.5,0,0,0,0,4.5,4.5,4.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Paradise Found",2003,89,NA,4.9,83,4.5,0,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Paradise Island",1930,68,NA,1.9,5,24.5,24.5,0,0,0,0,24.5,24.5,24.5,0,"",0,0,1,0,0,1,0 -"Paradise Lost",1999,105,NA,5.2,57,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Paradise Motel",1984,89,NA,4.3,38,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Paradise Now",2005,90,NA,7.9,31,4.5,0,0,0,0,0,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Paradise Road",1988,88,NA,8.6,13,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"Paradise Road",1997,122,NA,6.7,1094,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Paradise Villa",2001,100,NA,5.9,31,0,0,4.5,4.5,4.5,14.5,44.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Paradise for Three",1938,78,NA,6.9,40,0,0,0,0,14.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Paradise, Hawaiian Style",1966,91,NA,4.4,208,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Paradise, Nebraska",1998,7,NA,6,5,0,0,0,24.5,0,44.5,0,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Paradiset",2003,115,NA,4.9,179,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Paradisio",1961,76,NA,6.6,5,0,0,0,0,44.5,24.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Paradiso - Sieben Tage mit sieben Frauen",2000,103,NA,6.2,22,4.5,4.5,4.5,0,4.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Paradiso all'improvviso, Il",2003,93,NA,4.7,60,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Paradjanov: A Requiem",1994,57,NA,6.8,21,0,14.5,4.5,4.5,0,4.5,44.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Paradox Lake",2002,85,NA,5.1,59,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Paradzhanov",1998,60,121000,2.3,6,14.5,34.5,45.5,0,0,0,0,0,0,0,"",0,0,0,0,1,0,0 -"Paragraph 175",2000,75,NA,8,295,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Paraguas para tres, Un",1992,90,NA,6.2,15,0,0,4.5,0,14.5,44.5,14.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Parahyba Mulher Macho",1983,87,NA,8.1,18,4.5,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Paraiso",2003,96,NA,9.2,8,0,0,0,0,0,0,14.5,14.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Parajanov: The Last Spring",1992,55,NA,8.8,22,0,0,0,0,0,0,4.5,24.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Parallax View, The",1974,102,NA,7.2,1519,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Parallel Lines",2004,98,NA,7.2,27,0,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Parallel Passage",2003,15,NA,7.9,13,4.5,14.5,0,0,0,0,4.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Parallel Sons",1995,93,NA,6.1,61,4.5,4.5,14.5,4.5,0,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Parallelle lig, Det",1982,85,NA,5.9,28,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Parallels",1980,92,NA,5.3,5,0,24.5,0,0,24.5,24.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Paramedics",1987,90,NA,3.8,55,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Paramount Victory Short No. T2-1: A Letter From Bataan",1942,15,NA,5.2,6,0,0,0,34.5,14.5,14.5,34.5,0,0,0,"",0,0,0,1,0,0,1 -"Paramount on Parade",1930,77,NA,6.5,41,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Parampara",1992,155,NA,3.5,19,4.5,0,14.5,0,14.5,14.5,14.5,0,14.5,24.5,"",1,0,0,0,0,1,0 -"Paran daemun",1998,105,NA,7.1,108,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Parangelia",1980,87,NA,7.5,23,4.5,0,0,0,4.5,0,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Paranoia",1967,102,NA,6.8,11,0,0,0,0,14.5,0,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Paranoia",1970,88,NA,3.4,18,14.5,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Paranoia",1998,80,NA,4.2,63,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Paranoiac",1963,80,NA,6.6,65,4.5,4.5,4.5,4.5,4.5,24.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Parapalos",2004,90,NA,7.1,47,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Parapluies de Cherbourg, Les",1964,87,NA,7.8,2268,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Paras kai o foukaras, O",1964,88,NA,4.6,8,0,14.5,14.5,14.5,24.5,0,0,34.5,0,0,"",0,0,1,0,0,0,0 -"Parasaito Ivu",1997,120,NA,5.5,201,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Parasakthi",1952,188,NA,8.2,6,14.5,0,0,0,0,0,0,0,34.5,45.5,"",0,0,0,0,0,0,0 -"Parash Pathar",1958,111,NA,6.8,37,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Parasite",1982,85,800000,3.2,228,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Parasite, The",1997,80,NA,1.9,9,24.5,24.5,0,0,34.5,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Parasites, Les",1999,90,NA,5.5,45,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Paratiisin lapset",1994,104,NA,4.5,10,0,34.5,24.5,0,14.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Paratroop Command",1959,71,NA,4.8,19,0,4.5,14.5,14.5,14.5,14.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Parcheta lyubov",1989,91,NA,7.2,6,0,0,0,0,0,0,14.5,0,0,84.5,"",0,0,0,1,0,0,0 -"Pardehe Akhar",1991,105,NA,6.3,6,0,0,0,0,0,34.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Pardners",1956,90,NA,5.7,170,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pardon My Backfire",1953,16,NA,7.6,33,0,0,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Pardon My Blooper",1974,75,NA,6.9,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,1,0,1,0,0 -"Pardon My Clutch",1948,15,NA,8.3,26,0,0,0,0,0,4.5,4.5,14.5,34.5,44.5,"",0,0,1,0,0,0,1 -"Pardon My Gun",1930,67,NA,4,6,14.5,34.5,14.5,14.5,0,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Pardon My Past",1945,88,NA,6.6,11,0,0,0,0,14.5,4.5,44.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"Pardon My Pups",1934,19,NA,5.3,31,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Pardon My Sarong",1942,84,NA,6.9,200,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Pardon My Scotch",1935,19,NA,7.8,68,0,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Pardon My Terror",1946,17,NA,6.7,5,0,0,0,0,0,24.5,24.5,0,64.5,0,"",0,0,1,0,0,0,1 -"Pardon Us",1931,65,NA,7.3,209,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Pare kosme",1967,85,NA,8,7,0,0,0,14.5,0,0,0,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Paree, Paree",1934,21,NA,6.3,15,0,0,0,14.5,0,24.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Parell d'ous, Un",1985,89,NA,4.8,6,0,0,0,14.5,0,14.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Parent Trap, The",1961,129,NA,6.9,2465,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Parent Trap, The",1998,127,NA,6.4,4393,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"Parenthood",1989,125,NA,7,7638,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Parenti serpenti",1992,105,NA,7.1,93,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Parents",1989,81,3000000,5.9,625,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Parents",1992,10,NA,6.4,18,34.5,14.5,0,4.5,0,0,4.5,4.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Parents of the Year",2004,21,100000,7.8,6,14.5,0,0,0,0,0,0,34.5,0,45.5,"",0,0,0,0,1,0,1 -"Parents terribles, Les",1948,105,NA,7.3,79,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Parfait amour!",1996,110,NA,6.7,85,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Parfum d'Yvonne, Le",1994,89,NA,6.7,237,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Pari",1995,115,NA,5.6,28,4.5,0,4.5,4.5,0,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Pari e dispari",1978,109,NA,6.1,305,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Pari, Le",1997,100,NA,5.6,226,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Paria",2000,125,NA,6.3,17,0,0,4.5,4.5,14.5,4.5,4.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Pariah",1998,105,NA,4.2,244,24.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Parichay",1972,145,NA,8.8,16,0,0,0,0,0,0,4.5,14.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Parinda",1989,154,NA,8.4,114,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Parineeta",1953,151,NA,8.1,8,0,0,0,0,0,0,14.5,0,45.5,34.5,"",0,0,0,1,0,0,0 -"Paris",1998,97,NA,6.4,10,0,0,0,0,0,34.5,24.5,34.5,0,24.5,"",0,0,0,1,1,0,0 -"Paris",2003,98,NA,4.7,65,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Paris - When It Sizzles",1964,110,4000000,5.6,650,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Paris 1900",1948,74,NA,7,20,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Paris After Dark",1943,85,NA,5.2,7,14.5,0,0,0,45.5,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Paris Blues",1961,98,NA,6.4,217,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Paris Calling",1941,108,NA,5.6,5,0,0,0,0,64.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Paris Chausey",1975,60,NA,9.1,6,0,0,0,0,0,0,0,45.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Paris Chic",1997,92,NA,6.9,53,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Paris Holiday",1958,103,NA,5.2,65,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Paris Honeymoon",1939,92,NA,6.2,11,0,0,0,24.5,0,0,24.5,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Paris Interlude",1934,72,NA,6.6,14,0,0,0,0,24.5,44.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Paris Is Burning",1990,71,500000,7,340,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Paris On Parade",1938,9,NA,5.3,11,0,0,0,14.5,34.5,24.5,0,4.5,0,4.5,"",0,0,0,0,1,0,1 -"Paris Playboys",1954,62,NA,6.7,27,0,0,0,4.5,4.5,14.5,4.5,4.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Paris Underground",1945,97,NA,6.8,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Paris Was a Woman",1995,75,NA,7.2,27,0,0,0,14.5,0,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Paris by Night",1988,103,NA,6.3,24,4.5,4.5,0,0,24.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Paris la belle",1959,24,NA,6.6,5,0,0,0,24.5,0,24.5,24.5,44.5,0,0,"",0,0,0,0,1,0,1 -"Paris minuit",1986,90,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,1,0,0,0 -"Paris nous appartient",1960,120,NA,5.6,81,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Paris qui dort",1925,18,NA,7.5,123,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Paris vu par...",1965,95,NA,6.4,58,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Paris, France",1993,112,NA,4.4,167,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"NC-17",0,0,1,1,0,0,0 -"Paris, Texas",1984,147,NA,7.6,5226,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Paris, mon petit corps est bien las de ce grand monde",2000,108,NA,5.7,6,0,14.5,14.5,0,14.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Pariserhjulet",1993,106,NA,3.8,42,14.5,14.5,4.5,24.5,4.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Parisiennes, Les",1962,100,NA,7,10,0,0,0,14.5,0,14.5,24.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pariziana, I",1969,91,NA,8.2,10,14.5,0,0,0,0,14.5,24.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Park Bong-gon gachulageon",1996,104,NA,4.8,11,14.5,0,4.5,24.5,14.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Park Plaza 605",1953,75,NA,6.8,5,0,0,24.5,0,0,24.5,0,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Park Row",1952,83,NA,7,85,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Parking",1996,13,NA,9.2,9,0,0,0,14.5,0,0,0,0,14.5,74.5,"",0,0,0,0,0,0,1 -"Parking",2003,5,NA,6.7,49,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Parklands",1996,51,NA,5,20,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Parlez-moi d'amour",2002,98,NA,5.1,50,14.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Parlez-nous d'amour",1976,115,NA,7.2,29,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Parlor, Bedroom and Bath",1931,73,NA,5.6,95,4.5,4.5,0,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Parlor, The",2001,15,NA,8.5,237,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Parmigiana, La",1963,95,NA,7.2,5,0,0,0,0,0,0,84.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Parnell",1937,118,1547000,4.5,53,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Parola amore esiste, La",1998,87,NA,7,91,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Parole Officer, The",2001,93,NA,6.3,1047,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Parole de flic",1985,96,NA,5.4,152,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Parole, Inc.",1948,71,NA,5,5,24.5,0,0,0,24.5,24.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Paroles d'assistantes maternelles",1983,29,NA,7.3,5,0,0,0,0,0,0,64.5,24.5,24.5,0,"",0,0,0,0,1,0,1 -"Paroles et musique",1984,109,NA,5.7,64,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Paroma",1984,120,NA,7.9,7,14.5,0,0,0,0,0,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Paroxismus",1969,86,NA,6.2,62,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Parrish",1961,138,NA,5.9,157,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Parsley Days",2000,79,NA,5.6,48,14.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Parson and the Outlaw, The",1957,71,NA,3.4,17,14.5,34.5,14.5,14.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Parson of Panamint, The",1941,84,NA,6.3,6,0,0,0,0,14.5,14.5,0,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Part des lions, La",1971,90,NA,8.2,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,0,0,0,0 -"Part du feu, La",1978,99,NA,4.5,12,0,0,14.5,4.5,4.5,14.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Part of the Game",2004,111,NA,8.7,38,4.5,0,0,4.5,0,0,4.5,14.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Particle Dreams",1988,2,NA,7,6,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,1,0,0,0,0,1 -"Particles in Space",1966,4,NA,8,13,4.5,0,0,0,0,0,34.5,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Particles of Truth",2003,101,NA,6.5,113,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Particularly Now, in Spring",1995,8,NA,7.5,36,4.5,0,24.5,4.5,14.5,4.5,4.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Parties fines",1977,91,NA,6.3,23,0,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Partigiani",1997,62,NA,6.2,6,14.5,0,0,0,0,14.5,34.5,34.5,0,0,"",0,0,0,0,1,0,0 -"Partigiano Johnny, Il",2000,135,NA,6.3,58,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Partilha, A",2001,96,NA,8.2,194,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Parting Glances",1986,90,NA,7.3,473,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Partisans of Vilna",1986,130,NA,9,16,0,0,4.5,0,0,0,0,4.5,44.5,44.5,"",0,0,0,0,1,0,0 -"Partita, La",1988,104,NA,5.9,32,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Partizani",1974,100,NA,5.1,14,4.5,4.5,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Partizanska eskadrila",1979,130,NA,5.1,30,4.5,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Partner",1968,105,NA,4.7,52,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Partners",1932,58,NA,3.6,15,4.5,4.5,4.5,44.5,24.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Partners",1982,93,NA,4.6,224,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Partners in Crime",2000,95,NA,5.5,129,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Partners of the Plains",1938,70,NA,6.7,20,4.5,0,0,0,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Party",1984,118,NA,7.8,11,0,0,0,0,4.5,4.5,0,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Party",1996,95,NA,5.2,52,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Party 7",2000,104,NA,5.9,72,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Party Animal, The",1984,78,NA,4.8,141,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Party Camp",1986,96,NA,3.3,55,24.5,14.5,24.5,4.5,4.5,4.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Party Crashers, The",1958,78,NA,3,21,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Party Crashers, The",1998,77,NA,1.8,22,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Party Favors",1987,83,NA,4.6,12,24.5,4.5,4.5,14.5,0,4.5,0,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Party Girl",1930,67,NA,4.4,10,14.5,14.5,14.5,24.5,24.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Party Girl",1958,99,NA,7.1,233,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Party Line",1988,91,NA,3.2,22,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Party Monster",1998,57,NA,6.5,112,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Party Monster",2003,98,5000000,5.8,1976,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Party Party",1983,100,NA,5.1,63,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Party Wire",1935,70,NA,7.9,9,0,0,0,0,0,0,24.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Party at Kitty and Stud's, The",1970,71,NA,2.6,308,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Party at Sam's",1996,89,NA,6.8,5,0,0,0,0,44.5,0,0,64.5,0,0,"",0,0,1,0,0,0,0 -"Party's Over, The",1965,94,NA,4.9,9,0,14.5,14.5,0,14.5,0,0,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Party, Le",1990,103,NA,6.8,132,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Party, The",1968,99,1500000,7.4,4235,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Partyphotograph, Der",1968,89,NA,4.1,7,0,0,24.5,14.5,14.5,0,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Parumu no Ki",2002,130,NA,6.4,50,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Parvaz-e zanbur",1998,90,NA,5.9,15,4.5,0,0,0,14.5,34.5,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Pas d'histoires!",2001,70,NA,7.2,21,4.5,0,0,4.5,4.5,4.5,0,44.5,14.5,14.5,"",0,1,1,1,0,0,0 -"Pas de C4 pour Daniel Daniel",1987,13,NA,6.5,41,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Pas de deux",1968,13,NA,7.8,67,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Pas de deux",1998,15,NA,7.1,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Pas de repos pour Billy Brakko",1984,5,NA,7,17,4.5,0,0,4.5,4.5,24.5,24.5,4.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Pas de repos pour les braves",2003,107,NA,5.7,67,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pas de scandale",1999,107,NA,6.8,157,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pas koji je voleo vozove",1977,85,NA,7.2,20,0,0,0,4.5,0,14.5,44.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pas question le samedi",1965,116,NA,7.8,6,14.5,0,0,0,0,0,0,0,64.5,14.5,"",0,0,1,0,0,0,0 -"Pas si grave",2003,98,NA,5.2,73,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Pas sur la bouche",2003,115,NA,6.4,248,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Pas vu, pas pris",1998,90,NA,8.2,45,0,0,4.5,4.5,0,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Pasaje de Ida, Un",1988,90,NA,7.2,15,0,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Pasajera",1997,8,NA,7.1,6,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Pasajeros de una pesadilla",1984,96,NA,5.1,9,14.5,0,0,14.5,14.5,45.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Pasajes",1996,90,NA,3.7,23,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Pasan ko ang daigdig",1987,128,NA,6.7,7,0,24.5,0,0,0,0,0,24.5,44.5,0,"",0,0,0,1,0,0,0 -"Pasaporte rojo",2003,93,NA,5.4,7,14.5,14.5,0,0,0,24.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Pasaz",1997,102,NA,6,16,4.5,0,0,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Pasazerka",1963,62,NA,7.4,84,0,4.5,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Pascali's Island",1988,104,NA,6.8,228,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Pascual Duarte",1975,94,NA,6.4,22,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Pasir berbisik",2001,106,NA,6.1,42,4.5,4.5,0,4.5,4.5,24.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Pasodoble",1988,90,NA,7.1,10,0,14.5,0,0,0,14.5,45.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Pasolini, un delitto italiano",1995,100,NA,6.9,95,4.5,0,0,4.5,14.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Pasongsong gyerantak",2005,120,NA,5.6,9,0,0,14.5,0,14.5,44.5,0,24.5,0,14.5,"",0,0,1,1,0,0,0 -"Pasos perdidos, Los",2001,93,NA,6.2,18,4.5,0,0,24.5,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pasport",1990,103,NA,7.6,74,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Pasqualino Settebellezze",1975,115,NA,7.7,654,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Pass the Ammo",1988,93,NA,4.9,152,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Pass the Gravy",1928,23,NA,7,24,0,0,4.5,0,0,0,4.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Pass, The",1998,90,NA,3.9,80,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Passado e o Presente, O",1972,115,NA,7.3,12,0,0,0,0,0,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Passage Home",1955,102,NA,5.5,20,4.5,14.5,4.5,4.5,34.5,34.5,0,4.5,0,0,"",0,0,0,1,0,0,0 -"Passage Through: A Ritual",1990,50,NA,8,6,0,0,0,0,14.5,14.5,0,0,0,64.5,"",0,0,0,1,0,0,0 -"Passage West",1951,80,NA,5.5,6,0,14.5,14.5,0,34.5,0,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Passage du Rhin, Le",1960,125,NA,7.8,23,0,0,0,0,4.5,4.5,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Passage du milieu",2000,78,NA,5.5,33,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Passage thru Pamela, A",1985,86,NA,3.5,10,24.5,14.5,0,0,14.5,14.5,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Passage to India, A",1984,163,NA,7.3,2141,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Passage to Marseille",1944,75,NA,6.6,409,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Passage to Ottawa, A",2001,90,300000,6.3,31,4.5,0,0,0,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Passage, Le",1986,100,NA,4.8,126,4.5,4.5,4.5,4.5,24.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Passage, The",1979,99,NA,4.8,102,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Passage, The",2003,77,10000,5.8,12,0,0,0,4.5,0,24.5,4.5,4.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Passageiros",1987,9,NA,3.2,6,14.5,0,14.5,0,34.5,0,0,34.5,0,0,"",0,0,0,0,0,0,1 -"Passagem da Noite, A",2003,95,NA,8,36,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Passagem por Lisboa",1994,105,NA,6.4,10,14.5,24.5,0,0,0,14.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Passager de la pluie, Le",1969,115,NA,6.8,222,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Passageraren",1996,75,NA,4.2,21,4.5,4.5,4.5,24.5,4.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Passagers, Les",1999,93,NA,5.4,43,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Passages 1",1991,75,NA,7.3,19,4.5,0,0,4.5,0,0,4.5,34.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Passages 2",1991,75,NA,7,12,0,4.5,0,4.5,0,24.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Passages 3",1991,65,NA,7.1,12,0,4.5,0,0,4.5,24.5,0,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Passages 4",1991,71,NA,7.9,12,0,4.5,0,0,0,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Passaggio per il paradiso",1998,97,NA,5.4,22,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Passagier - Welcome to Germany, Der",1988,102,NA,6.4,17,0,0,0,4.5,4.5,14.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Passante du Sans-Souci, La",1982,110,NA,7.6,112,4.5,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Passe ton bac d'abord",1979,86,NA,7.1,34,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Passe-montagne, Le",1978,108,NA,6.4,29,0,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Passe-muraille, Le",1951,90,NA,6,47,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Passed Away",1992,96,NA,5.5,297,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Passeio com Johnny Guitar",1995,3,NA,7.3,6,0,14.5,0,0,0,0,34.5,0,34.5,14.5,"",0,0,0,0,0,0,1 -"Passenger 57",1992,84,NA,5.4,5329,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Passengers",2002,8,NA,7.3,30,0,4.5,4.5,0,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,1 -"Passer passer piger",1965,83,NA,4.8,42,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Passi di danza su una lama di rasoio",1972,84,NA,3.9,35,4.5,4.5,24.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Passin' It On",1993,57,NA,5.7,6,0,0,0,14.5,0,0,0,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Passing Resemblance",2002,16,NA,7.8,6,0,0,0,0,0,0,14.5,0,45.5,34.5,"",0,0,0,1,0,0,1 -"Passing Stones",2001,90,NA,6.5,83,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Passing of the Third Floor Back, The",1935,90,NA,6.4,28,0,0,0,4.5,14.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Passion",1954,84,NA,5.1,20,0,4.5,4.5,34.5,0,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Passion",1982,88,NA,5.9,197,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Passion",1999,102,NA,5.3,76,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Passion Fish",1992,134,NA,7.3,1381,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Passion Flower",1930,79,NA,5.3,18,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Passion and Romance: Double Your Pleasure",1997,83,NA,3.3,20,14.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Passion and Romance: Scandal",1997,85,NA,3,5,0,0,24.5,0,0,0,0,44.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Passion and Romance: Strange Desire",1997,80,NA,1.9,15,44.5,14.5,4.5,24.5,0,0,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Passion de Jeanne d'Arc, La",1928,114,NA,8.4,3466,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Passion in Hot Hollows",1969,83,NA,7.6,6,0,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Passion in the Desert",1997,91,NA,5.9,219,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Passion in the Sun",1964,73,NA,4.4,22,24.5,4.5,4.5,4.5,4.5,0,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Passion of Ayn Rand, The",1999,104,NA,5.6,261,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Passion of Darkly Noon, The",1995,101,NA,5.6,806,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Passion of John Ruskin, The",1994,14,NA,6.7,40,0,0,0,14.5,34.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Passion of Martin, The",1991,49,NA,3.1,32,44.5,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Passion of Mind",2000,101,NA,5.5,838,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Passion of the Christ, The",2004,127,30000000,7.4,34046,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"R",0,0,0,1,0,0,0 -"Passion to Kill, A",1994,93,NA,4.6,73,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Passion, En",1969,99,NA,7.4,459,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Passionada",2002,108,NA,6.1,279,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG-13",0,0,1,1,0,1,0 -"Passionate Friends, The",1949,95,NA,6.9,70,0,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Passionate Pilgrim, The",1984,22,NA,8.2,8,0,0,0,0,14.5,14.5,0,14.5,34.5,24.5,"",0,0,1,0,0,0,1 -"Passionate Plumber, The",1932,63,NA,5,59,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Passionate Stranger, A",1957,97,NA,7,7,0,0,0,0,14.5,14.5,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Passione d'amore",1981,117,NA,6.6,100,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Passione, La",1996,109,NA,6.7,28,4.5,0,0,14.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Passionless Moments",1983,13,NA,7.1,48,4.5,4.5,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Passions",1985,85,NA,4.1,8,0,14.5,0,0,0,14.5,74.5,0,0,0,"",0,0,0,0,0,0,0 -"Passover Plot, The",1976,108,NA,4,13,24.5,0,0,34.5,4.5,0,0,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Passport to Destiny",1944,65,NA,5.8,19,0,0,0,4.5,24.5,34.5,4.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Passport to Pimlico",1949,84,NA,7.3,532,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Passport to Shame",1958,86,NA,7,12,0,0,4.5,0,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Passport to Suez",1943,72,NA,5.5,9,0,14.5,0,0,24.5,34.5,0,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Password Is Courage, The",1962,116,NA,6.5,179,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Password: Uccidete agente Gordon",1967,103,NA,5,5,0,0,44.5,24.5,0,0,24.5,24.5,0,0,"",1,0,0,0,0,0,0 -"Password: Una mirada en la oscuridad",2002,92,NA,7.8,11,0,0,0,0,4.5,0,4.5,34.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Past Midnight",1992,100,NA,4.9,193,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Past Perfect",1998,92,NA,4.3,91,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Past Perfect",2002,91,NA,6.5,28,14.5,0,4.5,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Past Perfumance",1955,7,NA,7.2,26,0,0,0,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Pasternak",1965,9,NA,7.1,21,0,0,0,0,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Pasti, pasti, pasticky",1998,125,NA,6.7,53,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Pastirci",1973,88,NA,4.7,10,0,0,0,24.5,14.5,14.5,14.5,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Pastorale 1943",1978,125,NA,6.8,60,0,4.5,0,4.5,4.5,14.5,44.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pastorali",1975,95,NA,8.6,20,0,0,0,0,0,0,0,44.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Pastores da Noite, Os",1975,121,NA,6,9,0,14.5,0,24.5,14.5,0,24.5,0,0,34.5,"",0,0,0,1,0,1,0 -"Pastry, Pain and Politics",1998,30,NA,6.9,8,0,0,0,0,14.5,0,24.5,45.5,0,14.5,"",0,0,0,0,0,0,1 -"Paszport",2001,71,NA,5.4,12,0,14.5,0,0,4.5,14.5,44.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Pat Garrett and Billy the Kid",1973,122,4638783,6.9,1469,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Pat Neal Is Back",1968,9,NA,6.1,11,0,0,4.5,4.5,0,14.5,14.5,34.5,4.5,0,"",0,0,0,0,1,0,1 -"Pat and Mike",1952,95,NA,7,763,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Patagonia rebelde, La",1974,110,NA,7.5,64,0,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Patala Bhairavi",1951,195,NA,6.6,19,0,4.5,0,0,4.5,0,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Patate",1964,95,NA,4.7,6,0,14.5,14.5,0,0,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Patates, Les",1969,100,NA,4.4,11,4.5,0,14.5,24.5,0,34.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Patch Adams",1998,115,50000000,6.1,12110,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Patch of Blue, A",1965,105,NA,7.7,880,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Patchwork Girl of Oz, The",1914,81,NA,6,34,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Patchwork Monkey, The",2003,10,NA,6.1,12,0,0,4.5,14.5,14.5,4.5,24.5,0,4.5,14.5,"",0,0,0,0,0,0,1 -"Patent Leather Kid, The",1927,150,NA,6.9,7,0,0,0,0,0,44.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Pater familias",2003,87,NA,5.7,21,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Patera katse fronima",1967,97,NA,5.6,7,0,0,0,14.5,24.5,44.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Paternal Instinct",2004,74,NA,8.1,14,0,4.5,0,0,0,0,4.5,24.5,0,45.5,"",0,0,0,0,1,0,0 -"Paternity",1981,94,NA,4.7,224,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pather Panchali",1955,119,NA,7.7,1273,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Pathfinder, The",1952,78,NA,5.2,18,4.5,4.5,0,14.5,24.5,24.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Pathinaru Vayathinile",1977,139,NA,6.2,10,0,0,0,14.5,0,34.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Pathos - segreta inquietudine",1988,89,NA,3.5,16,14.5,0,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Paths of Glory",1957,87,935000,8.6,14391,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Paths to Paradise",1925,78,NA,8.3,16,0,0,0,0,0,4.5,4.5,24.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Patient 14",2004,97,NA,4.3,7,14.5,0,0,14.5,14.5,14.5,14.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Patient Porky",1940,6,NA,6.8,18,0,0,4.5,14.5,0,0,64.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Patient in Room 18, The",1938,59,NA,5.5,27,0,4.5,0,4.5,34.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Patient, The",1994,31,NA,6.7,9,0,0,0,14.5,0,44.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Patinoire, La",1998,77,NA,7,78,0,4.5,4.5,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Patio 29: Historias de silencio",1998,84,NA,4.2,29,0,74.5,0,0,24.5,0,4.5,0,0,4.5,"",0,0,0,0,1,0,0 -"Patoruzito",2004,75,NA,3.1,36,34.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,1,1,0,0,0,0 -"Patota, La",1960,88,NA,6.8,7,0,0,0,0,0,24.5,14.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Patrick",1978,115,NA,5.2,146,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Patrimonio nacional",1981,112,NA,7.1,45,0,0,4.5,0,0,14.5,34.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Patriot Games",1992,117,45000000,6.8,12751,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Patriot, The",1928,113,1000000,6.6,5,0,24.5,0,24.5,24.5,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Patriot, The",1986,88,NA,3.6,50,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Patriot, The",2000,164,110000000,6.8,29665,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Patriotes, Les",1994,138,NA,7.1,163,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Patriotic Popeye",1957,6,NA,4.6,9,0,14.5,24.5,0,44.5,14.5,0,0,0,14.5,"",0,1,1,0,0,0,1 -"Patrioticheskaya komediya",1992,109,NA,5.9,10,0,14.5,0,24.5,14.5,14.5,24.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Patriotin, Die",1979,121,NA,7.3,22,0,0,4.5,0,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Patris, listeia, oikoyeneia",1987,90,NA,7.2,6,0,0,14.5,0,0,34.5,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Patrizia",1980,81,NA,4.1,28,14.5,14.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Patrullero 777, El",1978,120,NA,5.4,30,0,4.5,24.5,4.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Patrullero, El",1991,105,1500000,6.9,117,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Patsany",1983,96,NA,8.3,10,0,0,0,0,0,24.5,0,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Patsy, The",1928,77,NA,7.9,87,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Patsy, The",1964,101,NA,5.4,185,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Patterns",1956,83,NA,8,137,0,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Patterns",1998,19,NA,6.2,25,14.5,0,4.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Pattes blanches",1949,92,NA,7,17,0,0,0,0,4.5,4.5,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Patti Rocks",1988,86,NA,5.8,79,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Pattiyude Divasam",2001,74,NA,5.6,8,14.5,0,0,0,24.5,24.5,0,14.5,24.5,0,"",0,0,1,1,0,0,0 -"Pattogatott kukorica",1999,70,NA,7.4,5,0,24.5,0,0,0,0,24.5,0,44.5,24.5,"",0,0,0,0,0,0,0 -"Patton",1970,172,12000000,8.2,14351,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Patty Hearst",1988,108,NA,5.7,189,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Patu!",1983,112,NA,7.7,7,0,0,0,0,0,0,14.5,45.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Patul conjugal",1993,102,NA,6.2,50,4.5,0,0,4.5,4.5,4.5,0,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Patul lui Procust",2001,118,NA,5.3,19,0,0,4.5,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Pauker, Der",1958,91,NA,5.4,65,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Paul Bowles - Halbmond",1995,95,NA,7.6,15,0,4.5,4.5,0,14.5,14.5,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Paul Bowles: The Complete Outsider",1995,57,NA,7.4,8,0,0,0,0,0,24.5,0,0,34.5,34.5,"",0,0,0,0,1,0,0 -"Paul Bunyan",1958,17,NA,6.9,91,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Paul Chevrolet en de ultieme hallucinatie",1985,110,NA,6.1,11,0,4.5,0,0,4.5,0,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Paul Is Dead",2000,75,NA,7.5,94,4.5,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Paul Monette: The Brink of Summer's End",1996,90,NA,7.2,41,0,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Paul Robeson: Tribute to an Artist",1979,30,NA,7.5,23,14.5,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Paul Tomkowicz: Street-railway Switchman",1954,9,NA,7.7,9,0,14.5,0,0,0,0,0,24.5,44.5,24.5,"",0,0,0,0,1,0,1 -"Paul and Michelle",1974,103,NA,4.5,49,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Paula",1952,80,NA,6.6,19,0,0,0,4.5,14.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Paule und Julia",2002,82,NA,6.1,30,0,0,0,4.5,14.5,34.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Paulie",1996,24,NA,5.3,18,14.5,14.5,0,14.5,14.5,14.5,24.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Paulie",1998,90,NA,6.1,1496,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Paulina",1998,88,NA,7.5,18,0,0,0,14.5,0,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Paulina s'en va",1970,90,NA,7.2,5,0,0,0,24.5,0,24.5,0,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Pauline & Paulette",2001,106,NA,6.8,525,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG",0,0,1,1,0,0,0 -"Paulo e Ana Luiza em Porto Alegre",1998,15,NA,5.8,8,0,0,0,0,14.5,24.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Pauls Reise",1999,88,NA,5,14,0,14.5,0,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pauly Shore Is Dead",2003,82,NA,5,521,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Paura e amore",1988,112,NA,6.1,31,0,0,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Paura fa 90, La",1951,90,NA,7.1,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Paura nel buio",1989,90,NA,3,37,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Paura, La",1954,84,NA,5.2,54,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pavilion of Women",2001,111,5000000,5.3,209,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Paviljon VI",1978,97,NA,8.3,6,0,0,0,0,14.5,0,14.5,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Pavlos melas",1973,195,NA,6.6,5,24.5,24.5,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Pavone nero, Il",1974,90,NA,6.1,5,0,0,0,24.5,0,44.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Pavoni, I",1994,100,NA,8.8,6,0,0,0,0,0,0,34.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Paw",1959,93,NA,7.3,17,0,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pawn, The",1998,88,NA,3.9,41,14.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"R",0,0,0,1,0,0,0 -"Pawnbroker, The",1964,116,500000,7.6,1107,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pawnee",1957,80,NA,4.9,17,4.5,14.5,0,14.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Pawnshop, The",1916,32,NA,7.5,256,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Paws",1997,90,NA,4.9,94,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pawtucket Fire Department",1903,1,NA,2.8,6,0,34.5,45.5,0,0,0,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Pay As You Exit",1936,11,NA,7.4,38,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Pay It Forward",2000,123,40000000,6.7,13531,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Pay or Die",1960,111,NA,5.6,44,4.5,0,0,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pay or Die",1979,86,NA,6.1,9,24.5,14.5,0,14.5,0,14.5,0,14.5,0,34.5,"",1,0,0,0,0,0,0 -"Pay-Off, The",1930,65,NA,5.1,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Payback",1990,94,1000000,5.1,23,4.5,0,14.5,4.5,4.5,24.5,24.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Payback",1995,93,NA,5.5,149,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Payback",1999,100,50000000,6.8,18252,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Paycheck",2003,119,60000000,6.1,10383,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Payday",1944,3,NA,5.9,5,0,0,0,0,64.5,0,0,44.5,0,0,"",0,1,0,0,0,0,1 -"Payday",1972,103,76000,6,53,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Paying Guest",1957,157,NA,7.6,5,0,0,0,0,0,0,64.5,24.5,24.5,0,"",0,0,0,1,0,1,0 -"Paying Respects",1996,11,NA,7.3,16,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Paying the Piper",1949,7,NA,7,20,4.5,0,0,0,4.5,14.5,44.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Paying the Price: Killing the Children of Iraq",2000,75,NA,8.1,18,14.5,0,0,0,0,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Payment Deferred",1932,81,NA,6.6,53,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Payment on Demand",1951,90,NA,7.1,137,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Payroll",1961,105,NA,5.7,10,0,0,0,0,34.5,0,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pays bleu, Le",1976,104,NA,6.1,9,0,0,0,24.5,0,14.5,45.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Pays des sourds, Le",1992,99,NA,6.6,66,4.5,4.5,0,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Pays du chien qui chante, Le",2002,95,NA,5.3,6,0,0,0,14.5,45.5,0,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Paysage mexicain",2002,5,NA,8.9,6,0,0,0,0,0,34.5,0,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Paysagiste, Le",1976,8,NA,7.8,18,0,4.5,0,0,0,4.5,14.5,4.5,14.5,45.5,"",0,1,0,0,0,0,1 -"Paz!",2002,142,NA,6.3,84,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pea Soup",1979,94,NA,3.8,10,44.5,14.5,0,0,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Peace Is Every Step: Meditation in Action: The Life and Work of Thich Nhat Hanh",1998,60,NA,4.4,13,44.5,4.5,0,0,4.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,1,0,0 -"Peace Killers, The",1971,88,NA,5.5,13,0,0,4.5,14.5,0,34.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Peace on Earth",1939,9,NA,8.4,68,4.5,0,0,4.5,0,4.5,4.5,14.5,24.5,34.5,"",0,1,0,1,0,0,1 -"Peaceable Kingdom",2004,70,NA,9.8,16,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,1,0,0 -"Peacekeeper, The",1997,98,10000000,4.6,505,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Peacemaker, The",1997,124,50000000,5.9,8994,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Peach",1995,16,NA,3.3,48,14.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Peach-O-Reno",1931,63,NA,6.4,37,0,0,0,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Peaches",2000,84,1400000,4.3,37,24.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Peachy Cobbler, The",1950,7,NA,6.8,27,4.5,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Peanut Butter Solution, The",1985,94,NA,5.1,221,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Peanuts - Die Bank zahlt alles",1996,95,NA,5.9,44,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Peanuts to the Presidency",1978,75,NA,7.2,9,24.5,0,0,0,0,0,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Pear ta ma 'on maf",2004,87,NA,6.8,12,0,0,14.5,4.5,4.5,0,45.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Pearl Harbor",2001,184,135250000,5.4,33409,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,1,0,1,0 -"Pearl Harbor II: Pearlmageddon",2001,11,NA,6.1,75,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Pearl of Death, The",1944,69,NA,6.6,251,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pearl of the South Pacific",1955,86,NA,4.1,30,14.5,14.5,14.5,24.5,14.5,14.5,14.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Pearls Before Swine",1999,96,NA,3.5,31,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Peau blanche, La",2004,92,NA,6.3,73,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Peau d'ange",2002,83,NA,5.7,67,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Peau d'espion",1967,93,NA,3.5,12,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Peau de banane",1963,97,NA,7.3,21,4.5,0,0,0,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Peau de torpedo, La",1970,110,NA,5.5,6,0,0,0,34.5,0,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Peau de vache",2001,23,NA,7,19,4.5,0,4.5,0,4.5,14.5,34.5,24.5,0,14.5,"",0,0,0,1,0,0,1 -"Peau douce, La",1964,110,NA,7.5,516,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Peau neuve",1999,96,NA,6.3,59,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pebble and the Penguin, The",1995,74,NA,4.5,173,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Pecado de amor",1961,116,NA,7.5,10,14.5,0,0,0,0,14.5,34.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pecador impecable, El",1987,87,NA,4.9,6,0,0,0,14.5,34.5,14.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Pecados de una chica casi decente, Los",1975,97,NA,3.1,9,24.5,0,0,44.5,0,0,24.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Pecan Pie",2003,2,NA,6.4,129,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Pecata minuta",1999,95,NA,4.5,16,14.5,0,0,14.5,24.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Peccati in famiglia",1975,97,NA,4.1,5,0,0,0,44.5,24.5,0,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Peccato che sia una canaglia",1955,95,NA,6.2,39,0,0,0,14.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Peccato veniale",1973,92,NA,5.5,37,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Peck Up Your Troubles",1945,7,NA,6.5,20,0,0,0,0,24.5,24.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Peck o' Trouble, A",1953,7,NA,6,6,0,0,0,14.5,34.5,34.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Peck's Bad Boy",1934,70,NA,5.2,10,0,0,14.5,14.5,24.5,34.5,24.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Pecker",1998,87,6000000,6.4,4013,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Pecos Pest",1955,7,NA,7.2,41,0,4.5,0,4.5,0,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Peculiar Penguins",1934,6,NA,6.7,45,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Pedal",2001,52,NA,7.6,8,0,0,0,0,0,24.5,14.5,34.5,0,24.5,"",0,0,0,0,1,0,0 -"Pedar",1996,96,NA,7.7,45,4.5,0,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Pedestrian",2000,97,NA,2.1,28,14.5,14.5,4.5,0,0,0,4.5,14.5,4.5,45.5,"",0,0,1,1,0,0,0 -"Pedestrian, The",2003,90,NA,4,12,0,4.5,14.5,4.5,14.5,4.5,14.5,0,4.5,14.5,"",0,0,1,1,0,1,0 -"Pedhia tou dhiavolou, Ta",1975,99,NA,5,168,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pedro",1943,7,NA,4.6,11,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Pedro Navaja",1984,95,NA,6.2,7,0,0,0,14.5,0,24.5,14.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Pee Shy",2000,4,NA,7,12,4.5,0,0,0,4.5,0,0,0,4.5,74.5,"",0,0,1,0,0,0,1 -"Pee Shy",2004,15,NA,9.8,14,0,0,0,0,0,0,0,4.5,4.5,84.5,"",0,0,0,0,0,0,1 -"Pee-wee's Big Adventure",1985,90,6000000,6.7,7552,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Peefeeyatko",1991,60,NA,9.3,6,0,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,0,0,0,0 -"Peege",1972,28,NA,7.2,11,0,0,0,0,4.5,4.5,4.5,24.5,0,44.5,"",0,0,0,1,0,0,1 -"Peep 'TV' Show",2004,98,NA,5.7,24,14.5,0,4.5,14.5,4.5,4.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Peep Show",1981,7,NA,5.7,46,14.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Peep Show",1999,9,NA,6.2,54,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Peep in the Deep",1946,8,NA,5.2,6,0,0,0,34.5,14.5,14.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Peeper",1975,87,NA,4.9,48,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Peeping Tom",1960,86,NA,7.6,2435,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Peeping Tom",2002,12,NA,7.4,12,0,0,4.5,0,4.5,0,4.5,34.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Peer Gynt",1941,100,NA,5.3,17,4.5,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Peesua lae dokmai",1986,120,NA,5.3,9,0,0,0,14.5,0,14.5,14.5,0,44.5,24.5,"",0,0,0,0,0,0,0 -"Peg o' My Heart",1933,87,623000,5.9,43,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Peggy",1950,76,NA,7.7,12,4.5,0,0,0,0,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Peggy Su!",1997,94,NA,5.1,25,4.5,0,0,0,0,24.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Peggy Sue Got Married",1986,104,18000000,6.3,5797,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Pehlivan",1984,98,NA,5.7,9,0,0,0,14.5,24.5,0,14.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Peixe-Lua",2000,124,NA,3.8,14,4.5,14.5,4.5,24.5,14.5,4.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pejzazi u magli",1984,114,NA,7,11,0,0,0,4.5,4.5,4.5,4.5,45.5,0,4.5,"",0,0,0,1,0,0,0 -"Pekin no suika",1989,135,NA,7.3,6,0,0,0,14.5,0,14.5,34.5,0,34.5,0,"",0,0,0,0,0,0,0 -"Peking Express",1951,95,NA,4.8,8,0,24.5,0,14.5,14.5,24.5,14.5,14.5,0,0,"",1,0,0,1,0,1,0 -"Pekko ja muukalainen",1996,80,NA,2.4,35,44.5,14.5,14.5,4.5,14.5,4.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Pelican Brief, The",1993,141,NA,6.3,10119,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pelikaanimies",2004,90,NA,6.1,30,4.5,0,0,4.5,14.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Pelle Politibil",2002,74,NA,3.9,17,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pelle erobreren",1987,157,NA,7.6,1611,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Pelle, La",1981,131,NA,6.4,64,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pelli Chesi Choodu",1952,191,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,1,1,0,0,0 -"Pelo suelto",1991,100,NA,6.1,7,14.5,24.5,0,0,0,0,0,14.5,0,44.5,"",0,0,1,1,0,0,0 -"Pelon maantiede",2000,98,NA,4.9,124,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pelota vasca. La piel contra la piedra, La",2003,417,NA,7.2,209,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Pelotazo nacional",1993,80,NA,3.2,6,14.5,0,0,14.5,14.5,34.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Peluca",2003,9,NA,7,171,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Peluca y Marisita",2002,85,NA,3.3,10,24.5,0,24.5,34.5,0,0,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Pelvis",1977,84,NA,4.2,11,24.5,4.5,0,4.5,0,0,14.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Pembalasan ratu pantai selatan",1988,82,NA,5.2,84,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Pen Point Percussion",1951,6,NA,6.8,6,0,0,0,0,0,34.5,45.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Pen hou nu lang",1992,87,NA,3,5,44.5,0,24.5,0,24.5,24.5,0,0,0,0,"",1,0,1,0,0,0,0 -"Pena de muerte",1973,89,NA,2.9,9,34.5,14.5,0,14.5,24.5,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Penalty",2000,50,NA,6.6,22,0,14.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Penalty, The",1941,80,NA,5.7,23,0,0,4.5,0,44.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Penance",2004,10,20000,8,7,14.5,0,0,0,0,0,0,14.5,44.5,24.5,"",0,0,0,1,0,0,1 -"Pencil Mania",1932,7,NA,5.9,10,0,14.5,0,24.5,0,34.5,14.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Pendant ce temps...",1998,13,NA,6.1,7,0,0,0,0,24.5,0,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Pendragon legenda, A",1974,98,NA,5.8,13,0,0,4.5,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Pendulum",1969,102,NA,6.1,37,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pendulum",2001,95,NA,4,150,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Penelope",1966,97,4000000,5.3,142,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pengar - en tragikomisk saga",1946,97,NA,7.6,18,0,0,0,0,14.5,0,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Penguin Parade, The",1938,7,NA,5.8,13,0,0,4.5,0,24.5,14.5,34.5,0,14.5,4.5,"",0,1,1,0,0,0,1 -"Penguin Pool Murder",1932,65,NA,7.5,104,4.5,0,0,4.5,4.5,14.5,14.5,34.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Penis",1965,45,NA,6.8,20,34.5,0,4.5,0,0,0,4.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Penis",1997,3,NA,5.2,55,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Penis Envy",2004,8,NA,9.9,7,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,1,0,0,0,1 -"Penitent, The",1988,94,NA,6.7,28,0,4.5,0,4.5,4.5,14.5,24.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Penitentiary",1980,99,100000,4.6,51,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Penitentiary II",1982,108,NA,3.3,48,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Penitentiary III",1987,91,NA,3,46,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Penn & Teller Get Killed",1989,89,NA,5.5,367,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Penn of Pennsylvania",1942,78,NA,6.3,22,0,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pennies from Heaven",1936,80,NA,6.1,36,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Pennies from Heaven",1981,108,22000000,6.3,1109,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Penny Antics",1954,8,NA,5.6,6,0,0,14.5,0,0,34.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Penny Game, The",2001,16,NA,7.7,6,0,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Penny Points to Paradise",1951,77,NA,6.1,11,4.5,0,0,0,0,14.5,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Penny Princess",1952,91,NA,6,30,4.5,0,4.5,4.5,14.5,34.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Penny Serenade",1941,119,NA,7,732,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Penny Wisdom",1937,10,NA,6.3,18,0,0,0,0,24.5,24.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Penny and the Pownall Case",1948,47,NA,4.6,13,0,0,14.5,24.5,34.5,4.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Pennyman",2002,8,NA,6,8,0,0,0,0,0,24.5,14.5,0,0,64.5,"",0,0,1,0,0,0,1 -"Pennyweight",1999,39,NA,5.9,30,4.5,0,4.5,0,14.5,14.5,4.5,34.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Penrod and His Twin Brother",1938,63,NA,6.8,5,0,0,0,0,44.5,44.5,0,0,24.5,0,"",0,0,1,0,0,0,0 -"Penrod and Sam",1931,71,NA,5.9,16,0,0,0,4.5,4.5,44.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Penrod and Sam",1937,64,NA,6.2,15,0,0,0,4.5,24.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Pensavo fosse amore invece era un calesse",1992,113,NA,5.9,70,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pension Mimosas",1935,109,NA,7.7,11,0,0,0,0,0,24.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Pensionat Oskar",1995,108,NA,6.3,124,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Pensionat Paradiset",1937,79,NA,6.2,29,0,0,0,0,14.5,14.5,14.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Pent-House Mouse",1963,7,NA,5.4,30,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Pentathlon",1994,101,NA,3.8,209,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Penthouse",1933,90,NA,7.2,79,0,0,4.5,4.5,4.5,4.5,24.5,44.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Penthouse, The",1967,96,NA,4.8,26,14.5,4.5,14.5,0,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pentito, Il",1985,120,NA,5.6,5,0,0,0,0,24.5,24.5,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"People",2004,87,NA,2.8,61,24.5,14.5,24.5,14.5,14.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"People Against O'Hara, The",1951,102,NA,6.7,108,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"People Are Bunny",1959,7,NA,7.1,36,0,0,0,4.5,0,24.5,34.5,4.5,14.5,14.5,"",0,1,1,0,0,0,1 -"People I Know",2002,100,NA,5.5,2051,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"People Next Door, The",1970,93,NA,6.8,46,4.5,0,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"People Say I'm Crazy",2003,84,NA,7.5,18,4.5,0,0,0,0,0,24.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"People That Time Forgot, The",1977,90,NA,4.9,221,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"People Under the Stairs, The",1991,99,NA,5.7,2777,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"People Will Talk",1935,67,NA,8.2,7,0,0,14.5,0,0,14.5,14.5,14.5,0,44.5,"",0,0,1,0,0,0,0 -"People Will Talk",1951,110,NA,7.5,715,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"People of the Wind",1976,110,NA,7.5,20,0,0,0,0,4.5,14.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"People vs. Dr. Kildare, The",1941,78,NA,5.3,27,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"People vs. Larry Flynt, The",1996,129,NA,7.2,12347,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Pep Squad",1998,94,500000,4.4,120,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Pepe",1960,195,NA,4,135,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pepe & Fifi",1994,105,NA,7.9,8,0,0,0,0,0,0,45.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pepe El Toro",1953,120,NA,7.7,39,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Pepe Guindo",1999,99,NA,8.2,6,0,0,0,0,0,0,45.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Pepe, der Paukerschreck",1969,95,NA,3.8,72,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Peperina",1995,93,NA,1.6,17,64.5,4.5,14.5,0,4.5,0,0,0,0,4.5,"",0,0,0,1,1,0,0 -"Pepito Piscina",1978,80,NA,1.8,17,44.5,24.5,0,4.5,4.5,4.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Peppermills",1997,12,NA,3.4,13,14.5,0,0,4.5,0,0,0,45.5,24.5,0,"",0,0,0,0,0,0,1 -"Peppermint",1999,105,NA,6.4,125,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Peppermint-Frieden",1983,112,NA,7.9,20,4.5,0,0,0,4.5,0,24.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Peppi en Kokki bij de marine",1976,80,NA,3.7,5,0,0,24.5,0,24.5,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Per",1975,107,NA,5.2,15,24.5,14.5,4.5,0,24.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Per 100,000 dollari ti ammazzo",1967,92,NA,5.1,8,0,0,14.5,0,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Per amare Ofelia",1974,105,NA,4.4,10,14.5,0,0,14.5,0,34.5,24.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Per amore, solo per amore",1993,114,NA,4.7,44,14.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Per amore... per magia...",1967,110,NA,1.9,6,34.5,0,0,0,14.5,34.5,14.5,0,0,0,"",0,0,0,0,0,1,0 -"Per grazia ricevuta",1971,120,NA,6.9,45,4.5,4.5,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Per il gusto di uccidere",1966,86,NA,5.9,5,0,0,0,0,24.5,64.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Per le antiche scale",1975,110,NA,6.2,8,0,0,0,0,14.5,24.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Per pochi dollari ancora",1967,95,NA,5.5,19,0,0,0,14.5,14.5,14.5,34.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Per sempre",1991,96,NA,7,14,14.5,0,0,14.5,4.5,4.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Per tutto il tempo che ci resta",1998,110,NA,3.1,5,0,0,44.5,24.5,0,0,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Per un dollaro di gloria",1966,93,NA,4.5,10,0,0,14.5,14.5,24.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Per un pugno di diamanti",1986,89,NA,1.8,14,45.5,14.5,4.5,0,0,0,0,4.5,0,24.5,"",1,0,0,0,0,0,0 -"Per un pugno di dollari",1964,99,200000,7.8,8998,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Per un pugno nell'occhio",1970,99,NA,5.5,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Per una bara piena di dollari",1971,91,NA,7.6,51,0,0,4.5,0,4.5,4.5,14.5,24.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Perceval le Gallois",1979,140,NA,7.2,124,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Percy",1971,103,NA,4.2,56,24.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Percy's Progress",1974,90,NA,3.7,45,14.5,4.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Perdiamoci di vista!",1994,115,NA,6.5,111,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Perdido por perdido",1993,93,NA,7.4,51,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Perdita Durango",1997,125,NA,6,1480,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",1,0,0,1,0,1,0 -"Perdutoamor",2003,115,NA,6.3,23,4.5,4.5,4.5,4.5,4.5,24.5,34.5,0,14.5,4.5,"",0,0,0,1,0,0,0 -"Pered rassvetom",1989,85,NA,7,5,24.5,0,0,0,0,24.5,0,24.5,0,44.5,"",1,0,0,0,0,0,0 -"Perekhvat",1986,87,NA,7.5,8,0,0,14.5,0,14.5,14.5,0,0,45.5,14.5,"",1,0,0,0,0,0,0 -"Perekryostok",1999,105,NA,5,16,4.5,14.5,14.5,0,14.5,14.5,14.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Peremena uchasti",1987,109,NA,7.5,11,0,0,0,0,0,14.5,24.5,0,4.5,44.5,"",0,0,0,1,0,0,0 -"Perempuan dalam pasungan",1980,95,NA,5.7,7,24.5,0,0,0,14.5,0,0,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Perempuan melayu terakhir",1999,119,NA,4.7,12,4.5,0,4.5,4.5,14.5,4.5,24.5,4.5,14.5,0,"",0,0,0,1,0,1,0 -"Perempuan, isteri dan jalang",1993,109,NA,6.6,14,4.5,24.5,0,0,0,4.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Perez Family, The",1995,113,11000000,6,517,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Perfect",1985,115,NA,3.9,868,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Perfect Alibi",1995,100,NA,5.1,71,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Perfect Candidate, A",1996,105,NA,7.2,79,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Perfect Candidate, The",2004,9,NA,9.1,10,0,0,0,14.5,0,0,14.5,0,0,84.5,"",0,0,1,0,0,0,1 -"Perfect Couple, A",1979,110,1500000,5.7,87,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Perfect Day",1929,19,NA,7,114,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Perfect Eyes",2003,3,NA,9.2,16,4.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,0,0,1 -"Perfect Fit",1999,103,NA,4.1,56,24.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Perfect Fit, A",2005,85,NA,8.6,7,0,0,0,0,0,0,14.5,44.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Perfect Friday",1970,94,NA,6.6,88,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Perfect Furlough, The",1958,93,NA,6.1,115,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Perfect Gentleman, The",1935,73,NA,6,19,0,0,0,14.5,24.5,4.5,24.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Perfect Husband, The",2003,110,NA,4,6,0,0,0,45.5,0,0,14.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Perfect Location, The",2004,10,50000,9.7,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,0,0,0,1 -"Perfect Marriage, The",1947,88,NA,5.9,10,0,0,14.5,14.5,14.5,24.5,34.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Perfect Match, The",1988,92,NA,4.1,19,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Perfect Murder, A",1998,108,NA,6.4,9728,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Perfect Murder, The",1988,93,NA,6.4,31,4.5,0,0,14.5,4.5,24.5,14.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Perfect Pie",2002,92,NA,6.6,57,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Perfect Score, The",2004,93,NA,5,2019,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Perfect Sense",2003,18,2100,8.3,6,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Perfect Son, The",2000,92,NA,6.7,111,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Perfect Specimen, The",1937,97,NA,5.7,33,0,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Perfect Specimen, The",1999,73,NA,5.2,23,0,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Perfect Storm, The",2000,130,120000000,6.2,24946,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Perfect Strangers",1945,93,NA,7.3,137,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Perfect Strangers",1950,88,NA,6.4,25,0,0,4.5,14.5,4.5,14.5,45.5,4.5,0,4.5,"",0,0,0,1,0,1,0 -"Perfect Strangers",1984,90,NA,4.5,40,24.5,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Perfect Strangers",2003,96,NA,5.2,203,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Perfect Target",1997,89,3500000,4.2,55,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Perfect Tenant, The",2000,93,NA,4.3,96,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Perfect Tribute, The",1935,20,NA,6.9,10,0,0,14.5,0,44.5,0,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Perfect Understanding",1933,80,NA,4.1,7,0,0,14.5,14.5,14.5,14.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Perfect Victims",1988,99,NA,2.7,12,44.5,4.5,0,14.5,4.5,14.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Perfect Weapon, The",1991,83,NA,4.7,430,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Perfect Woman, The",1949,89,NA,5.9,22,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Perfect Woman, The",1993,8,8000,7.8,8,0,0,0,14.5,0,0,34.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Perfect World",1990,76,NA,6.6,36,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Perfect World, A",1993,138,NA,7,8310,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Perfect You, The",2002,90,NA,5.6,135,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Perfect moment - L'aventure continue",2003,100,NA,6.8,11,0,4.5,14.5,0,0,14.5,0,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Perfectionist, The",1987,93,NA,2.8,6,0,14.5,34.5,14.5,0,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Perfectly Normal",1990,107,NA,6,121,4.5,4.5,0,4.5,14.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Perfekte menneske, Det",1967,13,NA,7.2,111,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Perfekte mord, Det",1992,110,NA,1.9,14,24.5,24.5,4.5,0,4.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Performance",1970,105,NA,6.7,819,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Performance Anxiety",1994,14,NA,3.2,8,24.5,0,14.5,0,14.5,0,0,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Perfume",2001,106,NA,4.2,192,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Perfumed Garden",2000,110,NA,4,71,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,1,0,0,0 -"Peril",2000,92,NA,4.6,21,14.5,4.5,4.5,14.5,14.5,4.5,14.5,0,0,14.5,"R",0,0,0,0,0,0,0 -"Perilous",2000,95,NA,4.2,38,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Perils in Nude Modeling",2003,12,NA,9.4,27,0,0,0,4.5,0,0,4.5,4.5,14.5,74.5,"",0,0,1,0,0,0,1 -"Perils of Nyoka",1942,261,NA,8.3,34,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",1,0,0,0,0,0,0 -"Perils of Pauline, The",1934,231,NA,4.4,16,4.5,4.5,14.5,14.5,4.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Perils of Pauline, The",1947,96,NA,6.1,154,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Perils of Pauline, The",1967,107,NA,4.9,56,14.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Perinbaba",1985,90,NA,7.2,65,4.5,0,0,0,4.5,4.5,4.5,24.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Period of Adjustment",1962,112,NA,6.2,133,14.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Periwig-Maker, The",1999,15,NA,6.9,116,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,1,0,0,1 -"Perkele",2004,20,NA,6.1,9,0,0,0,14.5,0,0,34.5,14.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Perkele! Kuvia Suomesta",1971,96,NA,7.4,32,4.5,0,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Perla w koronie",1972,117,NA,7.5,14,0,0,0,0,0,14.5,4.5,34.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Perla, La",1947,85,NA,8.1,44,4.5,0,0,4.5,0,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Perles de la couronne, Les",1937,105,NA,7.9,24,0,0,4.5,0,4.5,0,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Permanent Midnight",1998,88,NA,6.2,1813,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Permanent Record",1988,91,8000000,6.1,360,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Permanent Vacation",1980,75,NA,5.8,264,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Permette? Rocco Papaleo",1971,120,NA,5.5,29,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Permian Flow",2004,6,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Permission",1997,23,NA,2.2,14,45.5,0,0,14.5,4.5,24.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Permission to Kill",1975,93,NA,5.7,37,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Permissive",1970,75,NA,2.8,9,24.5,14.5,24.5,0,14.5,0,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Perpetual Life of Jim Albers, The",2003,13,NA,6.8,7,0,0,0,14.5,0,0,24.5,0,14.5,44.5,"",0,0,0,0,0,0,1 -"Perpetual Twilight of Gregor Black, The",2004,11,NA,5,7,24.5,0,14.5,0,0,14.5,0,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Perri",1957,75,NA,7.1,44,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Perro callejero",1980,120,NA,4.4,6,0,14.5,0,0,14.5,0,14.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Perro callejero II",1981,96,NA,5.6,14,4.5,0,0,14.5,4.5,4.5,14.5,24.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Perro del hortelano, El",1996,109,NA,7.6,141,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Perro llamado Dolor, Un",2001,90,NA,6.6,14,0,0,4.5,0,14.5,4.5,24.5,4.5,24.5,14.5,"",0,1,0,0,0,0,0 -"Perro, El",1976,114,NA,5.2,28,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Perro, El",2004,97,NA,6.7,121,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Perros callejeros",1977,103,NA,4.1,44,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Perros callejeros II",1983,100,NA,4.9,10,14.5,0,0,24.5,0,0,24.5,14.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Perros de Pavlov, Los",2003,14,NA,7.7,6,14.5,0,0,14.5,0,0,14.5,34.5,14.5,0,"",0,0,0,1,0,0,1 -"Persecution",1974,95,NA,3.7,46,14.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Perseo l'invincibile",1963,82,NA,3.6,33,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Persistence",2003,10,NA,9,7,0,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,1 -"Persistence of Memory, The",1998,5,NA,6,5,0,0,0,0,24.5,44.5,0,44.5,0,0,"",0,0,0,0,0,0,1 -"Person to Bunny",1960,7,NA,6.8,27,0,0,4.5,0,14.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Persona",1966,83,NA,8.2,3667,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Persona",2005,6,0,8.4,15,14.5,0,0,0,0,0,0,0,44.5,44.5,"",0,0,0,0,0,0,1 -"Persona Non Grata",2003,67,NA,6,126,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Personal",1904,5,NA,3.1,6,14.5,14.5,0,14.5,0,45.5,0,0,0,0,"",0,0,1,0,0,0,1 -"Personal Affair",1953,82,NA,6.3,10,0,0,0,0,24.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Personal Best",1982,124,NA,6,496,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Personal History, Adventures, Experience, and Observation of David Copperfield, the Younger, The",1935,145,NA,7.7,466,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Personal Maid's Secret",1935,58,NA,5.9,18,4.5,0,0,4.5,4.5,24.5,24.5,24.5,14.5,0,"",0,0,1,1,0,0,0 -"Personal Property",1937,84,299000,6.3,90,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Personal Services",1987,105,NA,6,209,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Personal Velocity: Three Portraits",2002,86,NA,6.5,1207,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Personality Kid, The",1934,68,NA,6.7,8,0,0,0,0,14.5,24.5,24.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Personality Parade",1938,20,NA,6.4,7,0,0,0,14.5,14.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Personals, The",1982,90,NA,4.5,26,0,0,4.5,4.5,24.5,0,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Personals, The",1999,40,NA,4.6,8,0,14.5,0,0,24.5,24.5,0,0,14.5,24.5,"",0,0,0,0,1,0,1 -"Personne ne m'aime",1994,98,NA,5.3,33,4.5,4.5,0,0,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Persons Unknown",1996,99,NA,5,224,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Persons of Interest",2004,63,NA,8,34,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Perth",2005,107,NA,5.8,10,24.5,0,14.5,14.5,0,14.5,0,24.5,34.5,0,"",0,0,0,1,0,0,0 -"Perumthachan",1990,140,NA,8.2,5,0,0,0,24.5,0,0,24.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Pervaya vstrecha - poslednyaya vstrecha",1987,92,NA,7.9,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,1,1,0,0,0 -"Perverse Preachers, Fascist Fundamentalists and Kristian Kiddie Kooks",1991,120,NA,8.2,10,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Perversion for Profit",1965,29,NA,3.5,14,24.5,0,24.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Pervirella",1997,92,NA,3.6,52,24.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pervola, sporen in de sneeuw",1985,102,NA,5.5,31,4.5,0,4.5,14.5,0,4.5,4.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pervyy etazh",1990,70,NA,7.2,5,0,0,44.5,0,0,0,0,44.5,24.5,0,"",0,0,0,1,0,1,0 -"Pervyy uchitel",1965,99,NA,8.4,36,0,0,0,4.5,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Pes ta Chrisostome",1983,84,NA,5.5,9,14.5,0,0,0,24.5,34.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Pesadilla para un rico",1996,96,NA,4,10,0,14.5,34.5,14.5,24.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Pesky Suitor, The",1995,21,NA,6.3,43,4.5,4.5,0,4.5,4.5,4.5,24.5,34.5,0,24.5,"",0,0,0,0,0,0,1 -"Pessi ja Illusia",1984,77,NA,5.9,13,0,0,0,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pest Man Wins",1951,16,NA,7.1,34,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Pest Pilot",1941,6,NA,5.9,10,0,0,14.5,0,34.5,14.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Pest That Came to Dinner, The",1948,7,NA,6.5,19,0,4.5,4.5,0,14.5,14.5,44.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Pest in Florenz, Die",1919,96,NA,8.8,5,0,0,0,0,0,0,44.5,0,64.5,0,"",0,0,0,0,0,0,0 -"Pest in the House, A",1947,8,NA,7.1,39,0,0,0,4.5,4.5,4.5,44.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Pest, The",1997,84,17000000,3.8,1405,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"PG-13",0,0,1,0,0,0,0 -"Peste, La",1992,145,NA,5.8,256,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pesti ve tme",1986,98,NA,7.9,14,0,0,0,0,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Pestka",1996,93,NA,5.8,20,0,4.5,0,14.5,14.5,24.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Pestonjee",1988,110,NA,7.9,7,0,0,0,0,0,24.5,0,44.5,0,24.5,"",0,0,1,1,0,0,0 -"Pests for Guests",1955,7,NA,6.1,27,4.5,0,0,4.5,14.5,24.5,24.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Pests of the West",1950,6,NA,6,7,0,0,0,24.5,14.5,14.5,14.5,0,14.5,14.5,"",0,1,0,0,0,0,1 -"Pet Peeve",1954,6,NA,5.8,21,0,0,14.5,4.5,0,34.5,14.5,0,14.5,14.5,"",0,1,1,0,0,0,1 -"Pet Sematary",1989,103,11500000,5.7,5718,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pet Sematary II",1992,96,8000000,3.7,1979,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pet Store, The",1933,7,NA,6.6,25,0,0,0,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Pete 'n' Tillie",1972,100,NA,5.6,174,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Pete Kelly's Blues",1955,95,NA,6.5,147,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pete Roleum and His Cousins",1939,16,NA,6.6,7,14.5,0,0,0,14.5,24.5,14.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Pete's Dragon",1977,130,10000000,5.8,1584,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Pete's Garden",1998,23,NA,7,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Pete's Meteor",1998,92,NA,4.2,55,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Peter Ibbetson",1935,88,NA,7.2,151,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Peter Pan",1924,101,NA,7.6,111,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Peter Pan",1953,76,4000000,7.2,4891,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Peter Pan",2003,113,100000000,7.2,5596,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG",1,0,0,0,0,0,0 -"Peter Rabbit and the Crucifix",2001,13,NA,6.8,12,0,0,0,0,0,14.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Peter Voss, der Held des Tages",1959,105,NA,4.5,10,0,0,14.5,24.5,24.5,24.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Peter Voss, der Millionendieb",1946,91,NA,7.4,10,0,0,0,14.5,0,24.5,34.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Peter Voss, der Millionendieb",1958,110,NA,5.8,19,0,0,14.5,4.5,24.5,14.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Peter and the Wolf",1946,15,NA,7.9,317,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,0,0,0,0,1 -"Peter en de vliegende autobus",1977,88,NA,6.4,17,4.5,0,0,0,14.5,14.5,4.5,44.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Peter och Petra",1989,76,NA,5.2,13,0,0,0,24.5,14.5,14.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Peter von Scholten",1987,113,NA,5.7,32,4.5,0,4.5,0,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Peter's Friends",1992,98,NA,6.6,2352,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Peterchens Mondfahrt",1990,80,NA,5,19,14.5,4.5,0,4.5,24.5,14.5,4.5,14.5,0,24.5,"",0,1,0,0,0,0,0 -"Peters baby",1961,96,NA,5.4,30,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,14.5,0,"",0,0,1,0,0,1,0 -"Peters landlov",1963,74,NA,5,5,24.5,0,0,24.5,24.5,24.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Petersen",1974,97,NA,5.7,27,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Petete y Trapito",1975,88,NA,6.3,20,0,0,0,4.5,4.5,14.5,4.5,14.5,34.5,34.5,"",0,1,1,0,0,0,0 -"Petey Wheatstraw",1977,94,NA,5.6,97,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Petit Potam",2001,77,NA,5.3,5,0,0,0,24.5,0,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Petit baigneur, Le",1967,96,NA,6,235,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Petit bougnat, Le",1970,78,NA,4.4,18,24.5,14.5,0,0,24.5,14.5,14.5,0,14.5,4.5,"",0,0,1,1,0,0,0 -"Petit criminel, Le",1990,100,NA,6.7,63,4.5,0,4.5,4.5,14.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Petit jour",1960,16,NA,3.7,5,44.5,24.5,0,0,0,0,0,44.5,0,0,"",0,0,0,0,0,0,1 -"Petit matin, Le",1971,120,NA,7.7,9,0,0,0,14.5,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Petit monde de Don Camillo, Le",1952,107,NA,7.4,432,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Petit poucet, Le",1972,90,NA,4.7,13,14.5,4.5,0,0,24.5,14.5,34.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Petit poucet, Le",2001,91,NA,5.4,215,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Petit prince a dit, Le",1992,106,NA,7.2,93,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Petit soldat, Le",1963,88,180000,7.1,358,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Petit voleur, Le",1999,63,NA,6.6,199,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Petite Aurore l'enfant martyre, La",1952,102,NA,4,59,34.5,4.5,0,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Petite Chartreuse, La",2005,90,NA,6,29,0,4.5,0,14.5,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Petite Lili, La",2003,104,NA,6.7,298,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Petite allumeuse, La",1987,105,NA,5.2,5,0,0,0,44.5,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Petite amie d'Antonio, La",1992,105,NA,8.1,14,0,0,0,0,0,0,24.5,24.5,44.5,4.5,"",0,0,0,1,0,0,0 -"Petite amie, La",1988,87,NA,5.5,6,0,0,0,0,45.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,1,0 -"Petite apocalypse, La",1993,110,NA,6.1,41,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Petite bande, La",1983,91,NA,6.3,12,0,0,0,0,4.5,34.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Petite fille en velours bleu, La",1978,108,NA,6.5,7,0,0,14.5,0,0,24.5,14.5,0,0,44.5,"",0,0,0,1,0,1,0 -"Petite marchande d'allumettes, La",1928,40,NA,7,19,0,4.5,0,4.5,14.5,4.5,14.5,24.5,34.5,4.5,"",0,0,0,0,0,0,1 -"Petite mort, La",1995,26,NA,7.4,99,4.5,4.5,0,4.5,0,4.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Petite morte, La",2003,41,55000,7,10,0,0,0,0,0,0,24.5,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Petite prairie aux bouleaux, La",2003,91,NA,6.3,23,4.5,0,0,4.5,0,34.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Petite vendeuse de soleil, La",1999,45,NA,7.1,82,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Petite voleuse, La",1988,105,NA,6.8,342,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Petites couleurs, Les",2002,94,NA,6.1,38,0,4.5,4.5,14.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Petites coupures",2003,95,NA,5.7,184,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Petites du quai aux fleurs, Les",1944,92,NA,6.2,6,0,0,0,0,0,14.5,34.5,34.5,0,14.5,"",0,0,0,0,0,1,0 -"Petites guerres, Les",1982,108,NA,8.5,10,0,0,14.5,14.5,0,0,0,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Petits arrangements avec les morts",1994,104,NA,6.8,59,4.5,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Petits fils, Les",2004,84,NA,6.9,17,0,0,4.5,0,14.5,0,0,14.5,4.5,64.5,"",0,0,1,1,0,0,0 -"Petits matins, Les",1962,95,NA,6,5,0,24.5,0,0,0,24.5,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Petits oiseaux, Les",2001,13,NA,6.7,19,4.5,4.5,4.5,14.5,34.5,4.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,1 -"Petla",1958,105,NA,7.5,13,4.5,0,0,0,4.5,0,34.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Petlya Oriona",1980,85,NA,7,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Petomane, Il",1983,90,NA,6.8,6,0,0,14.5,0,14.5,0,34.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Petrified Forest, The",1936,83,500000,7.5,1519,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Petrijin venac",1980,99,NA,8.4,25,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Petrina Chronia",1985,142,NA,8.9,56,4.5,4.5,0,0,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,0,0,0,1,0 -"Petropolis",2002,17,NA,7.6,7,0,0,14.5,0,14.5,0,14.5,14.5,0,44.5,"",0,0,0,0,0,0,1 -"Petrovka, 38",1980,88,NA,6.4,7,0,0,0,0,14.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Pets",1974,103,NA,4.5,14,4.5,4.5,14.5,0,14.5,4.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Pets",1999,95,NA,2.2,9,34.5,14.5,24.5,0,0,0,0,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Pett and Pott: A Fairy Story of the Suburbs",1934,29,NA,6.1,5,0,24.5,0,0,0,24.5,44.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Petticoat Camp",1912,15,NA,5,7,14.5,0,0,0,0,44.5,44.5,0,0,0,"",0,0,1,0,0,0,1 -"Petticoat Fever",1936,81,NA,6.6,33,4.5,0,0,4.5,14.5,24.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Petticoat Larceny",1943,61,NA,5.5,13,0,14.5,0,4.5,14.5,14.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Petticoat Pirates",1961,87,NA,3,8,14.5,14.5,14.5,24.5,14.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Petticoat Planet",1996,78,NA,2.7,63,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Pettson och Findus - Kattonauten",2000,80,NA,6.1,40,4.5,4.5,4.5,0,24.5,24.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Petty Girl, The",1950,88,NA,5.8,31,0,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Petualangan Sherina",2000,120,NA,7.1,19,24.5,0,0,0,0,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Petulia",1968,105,NA,6.9,390,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Petunia",2002,37,NA,8.3,9,0,0,14.5,14.5,0,0,0,14.5,0,64.5,"",0,0,0,0,0,0,1 -"Petunia Natural Park",1939,9,NA,6.4,5,0,0,0,24.5,24.5,24.5,0,44.5,0,0,"",0,1,1,0,0,0,1 -"Peuple migrateur, Le",2001,92,NA,8,3085,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Peuple singe, Le",1989,85,NA,7.3,19,0,4.5,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Peur du loup, La",2001,26,NA,8,5,0,0,0,0,0,0,24.5,64.5,24.5,0,"",0,1,0,0,0,0,1 -"Peur sur la ville",1975,125,NA,6.6,254,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Peyton Place",1957,162,NA,7.2,644,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Pez que fuma, El",1977,120,NA,8.2,16,4.5,0,0,0,0,0,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Pfingstausflug, Der",1978,85,NA,7.2,6,0,0,0,0,0,14.5,34.5,45.5,0,0,"",0,0,1,0,0,0,0 -"Phaedra",1962,115,NA,6.5,148,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Phaniyamma",1983,118,NA,8.7,7,0,0,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Phantasm",1979,88,300000,6.2,2406,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Phantasm II",1988,97,3000000,5.4,1005,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Phantasm III: Lord of the Dead",1994,91,2500000,4.8,608,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Phantasm IV: Oblivion",1998,90,650000,4.5,492,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Phantasmes",1975,69,NA,6.5,11,0,0,4.5,4.5,4.5,0,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Phantasy, A",1952,8,NA,7.1,19,4.5,0,0,0,0,24.5,34.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Phantom",1922,117,NA,6.5,67,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Phantom Beirut",1998,117,NA,8.1,7,0,0,0,0,0,24.5,14.5,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Phantom Broadcast, The",1933,68,NA,4.5,15,0,4.5,14.5,14.5,14.5,24.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Phantom Brother",1988,92,NA,2,10,45.5,14.5,0,0,0,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Phantom Creeps, The",1939,78,NA,4.6,85,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Phantom Empire, The",1935,245,70000,6.2,75,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Phantom Empire, The",1986,83,NA,4.2,55,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Phantom Express, The",1932,70,NA,6.3,7,14.5,0,0,0,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Phantom Horsemen, The",1990,100,NA,7.2,5,0,24.5,0,0,0,0,0,64.5,0,24.5,"",0,0,0,0,0,0,0 -"Phantom Killer",1942,61,NA,5,13,4.5,0,0,4.5,34.5,4.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Phantom Lady",1944,87,NA,7.6,327,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Phantom Light, The",1935,76,NA,5.1,34,0,0,0,14.5,24.5,24.5,14.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Phantom Love",2001,84,NA,2.3,21,34.5,4.5,4.5,0,14.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Phantom Plainsmen, The",1942,56,NA,5.4,9,0,14.5,0,14.5,44.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Phantom Planet, The",1961,82,NA,2.6,313,34.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Phantom President, The",1932,78,NA,3.8,14,0,4.5,4.5,24.5,14.5,4.5,14.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Phantom Raiders",1940,70,NA,6.4,21,4.5,0,0,4.5,0,45.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Phantom Rancher",1940,61,NA,5.6,7,0,0,0,14.5,45.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Phantom Rider, The",1946,167,NA,7.5,6,0,0,0,0,34.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Phantom Soldiers",1987,95,NA,3.7,8,34.5,14.5,0,0,24.5,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Phantom Speaks, The",1945,69,NA,4.2,7,14.5,0,14.5,0,14.5,14.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Phantom Submarine, The",1941,70,NA,9.9,7,14.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Phantom Tollbooth, The",1970,90,NA,6.3,312,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Phantom Valley",1948,53,NA,5,16,0,4.5,14.5,14.5,44.5,4.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Phantom from 10,000 Leagues, The",1956,80,NA,3.6,75,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Phantom from Space",1953,73,NA,3.6,82,14.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Phantom of 42nd Street, The",1945,58,NA,4.9,19,4.5,14.5,0,14.5,44.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Phantom of Chinatown",1940,62,NA,4.8,42,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Phantom of Crestwood, The",1932,76,NA,6.8,72,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Phantom of the Mall: Eric's Revenge",1989,91,NA,3.3,106,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Phantom of the Opera",1943,92,1500000,6.6,638,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Phantom of the Opera, The",1925,92,NA,7.6,1794,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Phantom of the Opera, The",1962,84,NA,6,238,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Phantom of the Opera, The",1989,93,NA,4.5,388,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Phantom of the Opera, The",2004,143,60000000,7.2,11283,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"PG-13",0,0,0,1,0,1,0 -"Phantom of the Paradise",1974,92,1300000,6.8,1961,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Phantom of the Range, The",1936,57,NA,7,5,0,0,0,0,0,0,84.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Phantom of the Rue Morgue",1954,83,NA,5.4,101,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Phantom of the West, The",1931,172,NA,5.7,8,0,0,0,14.5,14.5,24.5,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Phantom von Soho, Das",1964,92,NA,5.1,23,0,24.5,4.5,4.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Phantom, The",1931,62,NA,5.9,9,0,0,0,24.5,14.5,34.5,14.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Phantom, The",1943,299,NA,8.3,38,0,0,0,0,4.5,4.5,4.5,24.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Phantom, The",1996,100,45000000,5,3329,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",1,0,0,0,0,0,0 -"Phantoms",1998,92,NA,4.9,3495,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Phar Lap",1983,107,NA,6.9,276,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pharaoh Project, The",2001,85,NA,7.5,6,0,14.5,0,0,0,14.5,14.5,0,0,45.5,"",1,0,0,0,0,0,0 -"Pharaoh's Army",1995,90,NA,6.6,83,4.5,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,"PG-13",0,0,0,0,0,0,0 -"Pharaoh's Curse",1957,66,116000,3.6,39,14.5,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Phare, Le",1997,8,NA,2,5,24.5,84.5,0,0,0,0,0,0,0,0,"",0,1,0,0,0,0,1 -"Pharmacien de garde, Le",2003,90,NA,4.5,182,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pharmacist, The",1933,20,NA,7.7,119,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Phase IV",1974,84,NA,6.1,564,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Phase IV",2001,103,NA,4.9,71,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Phat Beach",1996,89,NA,2.7,168,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"R",0,0,1,0,0,0,0 -"Phenix City Story, The",1955,100,NA,7.2,95,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Phenomena",1985,82,3800000,6.5,1590,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Phenomenon",1996,123,32000000,6.3,12075,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG",0,0,0,1,0,1,0 -"Phffft!",1954,91,NA,6.2,109,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Phil Spitalny and His Musical Queens",1934,11,NA,6.5,6,0,0,0,0,0,45.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Phil Touches Flo",1998,6,NA,7.6,15,0,0,0,0,4.5,0,14.5,14.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Phil the Alien",2004,85,NA,4.6,83,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Philadelphia",1993,125,26000000,7.5,17861,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Philadelphia Experiment II",1993,97,NA,4.3,313,14.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Philadelphia Experiment, The",1984,102,NA,5.9,1828,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Philadelphia Story, The",1940,112,NA,8.2,10536,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Philadelphia, Here I Come",1975,95,NA,4.1,14,0,0,0,24.5,0,14.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Phileine zegt sorry",2003,95,NA,6.2,733,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Philips-Radio",1931,36,NA,5.4,19,0,14.5,4.5,14.5,4.5,14.5,34.5,24.5,4.5,0,"",0,0,0,0,0,0,1 -"Philo Vance's Gamble",1947,62,NA,7.4,5,0,0,0,0,0,24.5,44.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Philosoph, Der",1989,83,NA,6.2,34,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Phinehas",1996,18,NA,1.1,25,84.5,4.5,0,0,0,0,0,0,0,4.5,"",0,0,0,0,0,0,1 -"Phir Teri Kahani Yaad Aayee",1993,105,NA,4.9,13,14.5,4.5,14.5,0,14.5,0,4.5,14.5,0,24.5,"",0,0,0,1,0,1,0 -"Phobia",1980,94,5100000,2.5,54,34.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Phobia",1990,85,NA,4.6,9,14.5,0,24.5,34.5,24.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Phobias",2003,75,NA,6.3,17,14.5,0,4.5,14.5,0,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Phoenix",1998,107,NA,6.3,763,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Phoenix Blue",2001,89,NA,6.3,44,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Phoenix and the Magic Carpet, The",1995,88,NA,5.3,24,4.5,4.5,4.5,4.5,4.5,0,4.5,14.5,14.5,44.5,"PG",0,0,0,0,0,0,0 -"Phoenix the Warrior",1987,90,NA,3.9,57,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Phone",2002,102,NA,6.2,654,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Phone Booth",2002,81,10000000,7.3,21075,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Phone Call from a Stranger",1952,105,NA,7,202,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Phone Call, The",1977,28,NA,5.1,26,14.5,0,0,4.5,4.5,0,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Phony Express",1943,17,NA,7.5,48,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Phool Aur Kaante",1991,173,NA,6.6,9,0,0,0,14.5,0,44.5,34.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Photo de famille",1988,7,NA,6.5,12,14.5,0,0,4.5,4.5,24.5,4.5,0,0,34.5,"",0,0,1,0,0,0,1 -"Photo-Drama of Creation",1914,480,NA,8.1,7,0,0,0,0,14.5,14.5,0,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Photographe",1895,1,NA,4.8,28,14.5,0,4.5,14.5,14.5,34.5,14.5,14.5,0,4.5,"",0,0,0,0,1,0,1 -"Photographer, The",1975,94,NA,4.9,6,0,0,14.5,14.5,45.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Photographia, I",1987,102,NA,7.9,11,0,0,0,0,0,0,24.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Photographing Fairies",1997,106,NA,6.8,644,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Photos d'Alix, Les",1980,15,NA,5.7,11,14.5,0,0,0,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Photos to Send",2002,88,NA,7,8,0,0,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Phuk pui",1990,100,NA,7.8,14,0,0,0,0,0,0,24.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Phynx, The",1970,81,NA,4,21,14.5,14.5,0,24.5,14.5,4.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Physical Evidence",1989,99,NA,4.9,268,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Physical Pinball",2002,21,NA,4.9,27,4.5,14.5,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Physician of the Castle, The",1908,6,NA,6.9,21,0,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Pi",1998,84,60000,7.5,19431,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Pi li huo",1995,110,NA,6.1,735,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Pi pi pilleri",1982,88,NA,2.1,16,34.5,14.5,14.5,14.5,0,4.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Piacere, Il",1985,85,NA,4.7,11,4.5,4.5,4.5,0,4.5,0,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Pianese Nunzio, 14 anni a maggio",1996,114,NA,5.8,65,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pianeta azzurro, Il",1981,83,NA,9.2,8,0,0,0,0,0,0,14.5,14.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Pianeta degli uomini spenti, Il",1961,84,NA,3.3,68,14.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pianeta errante, Il",1966,80,NA,3.3,17,24.5,14.5,14.5,0,14.5,4.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Pianeti contro di noi, I",1962,85,NA,4.9,5,24.5,0,0,24.5,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Pianist, The",1991,112,NA,4.8,33,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Pianist, The",2002,150,35000000,8.5,30467,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Pianista, El",1998,90,NA,8.3,42,4.5,0,4.5,0,14.5,4.5,14.5,4.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Pianiste, La",2001,130,NA,7.2,4123,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Piano Tooners",1932,7,NA,5.3,9,0,0,24.5,0,24.5,14.5,44.5,0,0,0,"",0,1,1,0,0,0,1 -"Piano, The",1993,121,7000000,7.4,12394,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Piao liang ma ma",1999,90,NA,6.7,87,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Piata Universitatii - Romania",1991,72,NA,9.4,14,0,0,0,0,0,4.5,0,4.5,14.5,74.5,"",0,0,0,0,1,0,0 -"Piatka z ulicy Barskiej",1954,108,NA,6.3,10,0,0,0,0,14.5,34.5,45.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Piatto piange, Il",1975,108,NA,3.4,6,14.5,0,0,0,0,34.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Piazza delle cinque lune",2003,90,NA,6,76,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Piazza pulita",1972,90,NA,2.7,9,14.5,24.5,24.5,14.5,14.5,0,0,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Pib and Pog",1994,6,NA,7.6,55,0,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Picado fino",1996,80,NA,7.8,28,14.5,0,0,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Picador Porky",1937,6,NA,7.2,21,0,0,0,0,14.5,4.5,14.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Picardia mexicana",1978,115,NA,5.8,5,0,0,0,44.5,0,0,64.5,0,0,0,"",0,0,1,1,0,0,0 -"Picari, I",1988,121,NA,6.8,21,0,0,0,14.5,4.5,14.5,34.5,4.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Picasso Summer, The",1969,90,NA,5.5,34,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Picasso Trigger",1988,99,NA,3.2,146,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Picc Mi",1992,20,NA,4.4,7,0,0,14.5,0,24.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Piccadilly",1929,92,NA,7.6,75,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Piccadilly Incident",1946,100,NA,7.4,13,4.5,0,0,0,0,24.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Piccadilly Jim",1936,95,NA,6.3,37,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Piccole labbra",1978,77,NA,5.6,15,0,0,24.5,0,24.5,4.5,24.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Piccoli equivoci",1989,85,NA,6,5,0,24.5,0,0,0,44.5,24.5,24.5,0,0,"",0,0,1,0,0,1,0 -"Piccoli fuochi",1985,95,NA,5.7,18,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Piccoli maestri, I",1998,122,NA,6,40,4.5,0,0,4.5,4.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Piccolo diavolo, Il",1988,96,NA,6.7,358,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Piccolo grande amore",1993,149,NA,1.8,53,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Piccolo mondo antico",1941,106,NA,6.8,7,14.5,0,0,0,0,0,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pick a Star",1937,69,NA,4.6,54,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pick-Up, The",1968,80,NA,4.5,8,14.5,0,0,0,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Pick-up",1933,76,NA,5.8,6,0,0,0,0,14.5,14.5,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Pick-up Artist, The",1987,81,15000000,4.8,870,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Pick-up Summer",1980,99,NA,3.7,41,4.5,14.5,4.5,14.5,4.5,0,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Picking Up Chicks with Harland Williams",2001,3,NA,6.7,7,0,24.5,0,0,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Picking Up the Pieces",2000,95,NA,4.9,950,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Pickle, The",1993,103,NA,3.9,180,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Pickled Pink",1965,6,NA,5.9,9,0,0,0,0,44.5,14.5,14.5,34.5,0,0,"",0,1,0,0,0,0,1 -"Pickman's Model",2003,40,2500,6.6,5,24.5,0,0,0,24.5,0,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Picknick",1977,6,NA,3.9,18,14.5,0,0,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Picknick mit Weissmann",1968,13,NA,7,30,0,0,4.5,0,4.5,14.5,34.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Pickpocket",1959,79,NA,7.8,596,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Pickup",1951,78,NA,6.1,16,4.5,0,0,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pickup on 101",1972,93,NA,4.3,14,0,4.5,24.5,0,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pickup on South Street",1953,80,NA,7.7,773,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pickwick Papers, The",1952,109,NA,7.2,45,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Picnic",1955,113,NA,7.2,1437,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Picnic",1996,72,NA,7.6,119,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG",0,0,0,0,0,0,0 -"Picnic at Hanging Rock",1975,107,NA,7.6,4068,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Picnic, The",1930,7,NA,6.2,16,0,0,4.5,4.5,14.5,34.5,4.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Pico, El",1983,105,NA,7.5,41,4.5,0,4.5,0,14.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Picore",2003,3,NA,5.4,6,0,0,14.5,0,0,45.5,0,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Picpus",1943,95,NA,7.6,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Picture Bride",1994,98,NA,6.7,235,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Picture Claire",2001,91,NA,5.1,210,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Picture Mommy Dead",1966,88,NA,3.5,42,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Picture People No. 10: Hollywood at Home",1942,9,NA,5.8,6,14.5,0,0,0,14.5,0,0,0,14.5,45.5,"",0,0,0,0,1,0,1 -"Picture Perfect",1997,105,19000000,5.6,3019,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Picture Show Man, The",1977,99,NA,5.4,27,0,0,0,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Picture Snatcher",1933,77,NA,7,105,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Picture This: The Times of Peter Bogdanovich in Archer City, Texas",1991,58,NA,7.5,8,0,0,0,0,14.5,0,34.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Picture of Dorian Gray, The",1945,110,3500000,7.6,1456,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Picture of Dorian Gray, The",2002,90,NA,7.7,18,14.5,4.5,0,0,0,0,4.5,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Picture of Light",1994,83,NA,6,42,4.5,0,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Pictures",1981,87,NA,4.1,8,14.5,14.5,24.5,14.5,0,0,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Pictures at an Exhibition",1972,91,NA,9.3,10,0,0,0,0,0,0,14.5,24.5,0,74.5,"",0,0,0,0,1,0,0 -"Pictures from a Revolution",1992,93,NA,9.3,6,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,0,0,1,0,0 -"Pictures of Baby Jane Doe",1995,92,NA,5,110,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Pie in the Sky",1996,95,NA,5.9,290,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Pie in the Sky: The Brigid Berlin Story",2000,75,NA,7.3,66,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Pie, Pie Blackbird",1932,11,NA,6.5,17,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Pie-Eyed",1925,18,NA,7.2,8,0,0,14.5,0,14.5,24.5,14.5,0,14.5,24.5,"",0,0,1,0,0,0,1 -"Piece of Cake, A",1948,46,NA,4.8,10,14.5,0,14.5,34.5,0,45.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Piece of Eden, A",2000,106,NA,6.2,38,0,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Piece of the Action, A",1977,135,NA,5.3,131,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pieces",1982,89,NA,4.4,414,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pieces of April",2003,80,300000,7.3,4604,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Pieces of Dreams",1970,100,NA,4.2,74,34.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pieces of My Heart",2001,15,NA,6.4,70,4.5,0,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Pied Piper Porky",1939,7,NA,6.5,16,0,0,4.5,0,14.5,14.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Pied Piper of Guadalupe, The",1961,6,NA,7.4,21,4.5,0,0,0,0,4.5,44.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Pied Piper, The",1933,8,NA,6.2,11,0,4.5,0,0,4.5,24.5,34.5,4.5,0,4.5,"",0,1,0,0,0,0,1 -"Pied Piper, The",1942,87,NA,7.2,52,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Pied Piper, The",1972,90,NA,6,41,0,0,4.5,0,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Piede in paradiso, Un",1991,99,NA,5.7,130,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,0,0,0,0 -"Piedipiatti",1991,92,NA,4.1,26,4.5,14.5,4.5,14.5,4.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Piedone a Hong Kong",1975,108,NA,5.6,154,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",1,0,1,1,0,0,0 -"Piedone d'Egitto",1979,101,NA,5.2,127,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Piedone l'africano",1978,115,NA,5.6,140,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Piedone lo sbirro",1974,113,NA,6.2,174,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",1,0,1,1,0,0,0 -"Piedra libre",1976,97,NA,5.8,5,0,0,0,0,24.5,24.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Piedra sobre piedra",2004,60,NA,8.7,6,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Piedras",2002,135,NA,7.4,390,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pieklo i niebo",1966,91,NA,5.5,14,0,0,14.5,0,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Piekna nieznajoma",1992,90,NA,3.6,8,0,24.5,0,0,24.5,34.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Piel de verano",1961,96,NA,6.8,14,0,0,0,0,4.5,24.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Pieni pyhiinvaellus",2000,59,NA,7.6,31,0,0,0,0,4.5,4.5,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Pieniadze to nie wszystko",2001,120,NA,6.1,60,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pier 5, Havana",1959,67,NA,5.2,21,0,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,0,"",1,0,0,1,0,0,0 -"Pier Paolo Pasolini e la ragione di un sogno",2001,90,NA,5.4,14,4.5,0,0,14.5,44.5,0,14.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Pierce",1990,9,NA,3.1,13,14.5,24.5,4.5,4.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Pierino contro tutti",1981,92,NA,5.4,36,14.5,0,4.5,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Pierino il fichissimo",1981,91,NA,2.3,6,45.5,0,34.5,0,14.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Pierino torna a scuola",1990,96,NA,4.5,17,24.5,0,4.5,0,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Pierna creciente, falda menguante",1970,90,NA,5.3,8,34.5,0,0,0,0,14.5,45.5,0,0,0,"",0,0,1,0,0,0,0 -"Pierre and Gilles, Love Stories",1997,57,NA,3.8,6,14.5,34.5,0,0,14.5,0,14.5,0,14.5,0,"",0,0,0,0,1,0,0 -"Pierre et Djemila",1987,86,NA,6,5,24.5,0,0,0,0,24.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Pierrot le fou",1965,110,300000,7.3,1478,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Pierscionek z orlem w koronie",1993,104,NA,5.8,27,4.5,0,14.5,4.5,4.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Pierwszy milion",2000,96,NA,6.1,16,0,0,14.5,0,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pies and Guys",1958,17,NA,5.8,32,14.5,14.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Pietje Bell",2002,110,NA,6.5,135,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pietje Bell II: De jacht op de tsarenkroon",2003,112,NA,5.7,35,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pietro wyzej",1938,90,NA,7.1,8,0,0,0,0,0,0,64.5,14.5,0,24.5,"",0,0,1,0,0,1,0 -"Pig",2001,88,NA,4,13,44.5,0,4.5,4.5,14.5,0,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Pig Bird",1981,3,NA,7,5,0,0,0,0,0,0,64.5,24.5,24.5,0,"",0,1,1,0,0,0,1 -"Pig Farm, The",2000,77,NA,4.4,28,14.5,14.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Pig!",1996,2,NA,4.6,7,14.5,0,0,0,0,14.5,24.5,0,0,44.5,"",0,0,1,0,0,0,1 -"Pigalle",1994,93,NA,4.6,36,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Pigen fra Egborg",1969,101,NA,5,10,24.5,0,0,0,24.5,0,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Pigen og greven",1966,96,NA,5.7,12,0,4.5,0,14.5,0,24.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Pigen og pressefotografen",1963,100,NA,6.3,30,0,0,4.5,4.5,14.5,24.5,34.5,24.5,4.5,0,"",0,0,1,0,0,1,0 -"Pigen og vandpytten",1958,97,NA,3.2,5,24.5,0,0,0,24.5,44.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Pigeon Egg Strategy, The",1998,88,NA,8.4,95,0,0,0,0,4.5,4.5,4.5,4.5,44.5,44.5,"",0,0,1,0,0,0,0 -"Pigeon That Took Rome, The",1962,103,NA,5.4,71,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pigeonholed",1999,88,NA,4.2,34,45.5,4.5,4.5,4.5,4.5,14.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Pigeons",1971,106,NA,4.6,7,0,0,0,14.5,0,0,0,45.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Piggie",2003,98,NA,6.7,20,14.5,0,4.5,14.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Piggy Bank",1999,15,NA,9.5,11,0,0,0,0,0,0,4.5,0,24.5,64.5,"",0,0,0,0,0,0,1 -"Pigkeeper's Daughter, The",1972,92,NA,4.6,36,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Piglet's Big Movie",2003,75,NA,5.8,559,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Pigs",1984,78,NA,2.5,20,64.5,4.5,0,4.5,14.5,0,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Pigs Is Pigs",1937,7,NA,6,21,0,0,0,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Pigs Is Pigs",1954,10,NA,8.2,18,4.5,0,0,0,4.5,4.5,14.5,24.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Pigs Will Fly",2002,102,NA,7.9,28,0,0,4.5,4.5,4.5,4.5,4.5,45.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pigs in a Polka",1942,8,NA,6.7,38,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Pigskin Parade",1936,93,NA,6.4,79,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Piilopirtti",1978,97,NA,5.2,5,24.5,0,24.5,0,0,24.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Piker's Peak",1957,7,NA,7,41,4.5,0,4.5,4.5,0,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Pikkupojat",1986,80,NA,7,135,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Pikkusisar",1999,107,NA,5.3,47,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Pikovaya dama",1910,15,NA,5,9,14.5,0,0,0,14.5,24.5,24.5,0,24.5,14.5,"",0,0,0,1,0,0,1 -"Pila-balde",1999,98,NA,5.5,18,14.5,4.5,0,14.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Pile ou face",1980,105,NA,6.7,63,4.5,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pilgrim",2000,94,NA,5.3,268,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pilgrim Popeye",1951,7,NA,4.9,5,0,0,0,24.5,24.5,24.5,44.5,0,0,0,"",0,1,1,0,0,0,1 -"Pilgrim, The",1923,39,NA,7.6,262,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Pilgrimage",1933,96,NA,6.3,40,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pilgrimage",2001,18,NA,5.2,12,0,4.5,0,4.5,24.5,0,0,0,4.5,45.5,"",0,0,0,0,1,0,1 -"Pilkarski poker",1989,99,NA,7.6,36,0,0,0,4.5,4.5,4.5,24.5,44.5,14.5,4.5,"",1,0,1,1,0,0,0 -"Pillars of the Sky",1956,95,NA,5.6,42,0,0,4.5,4.5,24.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pillertrillaren",1994,111,NA,2.6,124,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Pillow Book, The",1996,126,NA,6.7,3463,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Pillow Talk",1959,103,NA,7.3,1994,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Pillow of Death",1945,66,NA,5.8,10,0,0,14.5,0,34.5,34.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Pillow to Post",1945,92,NA,6.1,36,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pillowfight",2001,4,NA,9.5,22,0,0,0,0,0,0,4.5,0,24.5,64.5,"",0,0,1,0,0,0,1 -"Pilot #5",1943,70,NA,6,40,4.5,0,0,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pilot, Der",2000,6,NA,6.3,21,0,4.5,4.5,4.5,4.5,0,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Pilot, The",1981,92,NA,5.8,51,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Pilota ritorna, Un",1942,87,NA,6.1,12,0,0,0,24.5,0,4.5,44.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pin Gods",1996,82,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Pin Up",1995,8,NA,7.2,13,0,0,0,0,4.5,24.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Pin Up Girl",1944,84,NA,5.9,50,0,4.5,4.5,0,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Pin for the Butterfly, A",1994,113,NA,5,11,0,0,0,14.5,0,4.5,4.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Pin-Pon: Le film",1999,80,NA,2.5,15,45.5,4.5,4.5,0,24.5,0,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Pin...",1988,103,NA,6.5,228,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pinay Pie",2003,110,NA,3.1,6,14.5,0,0,34.5,14.5,0,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Pindorama",1970,95,NA,1.3,5,64.5,0,0,0,0,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Pineapple Tours",1992,118,NA,5.8,5,0,0,0,44.5,0,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Ping Pong",1986,100,NA,6.7,23,0,4.5,0,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Ping Pong",2002,114,NA,7.3,465,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Ping!",2000,97,NA,3.6,66,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"Pingu",1987,30,NA,8.5,79,0,0,0,0,4.5,4.5,4.5,4.5,24.5,64.5,"",0,1,1,0,0,0,1 -"Pink 8 Ball",1972,6,NA,6,15,0,0,0,14.5,4.5,24.5,14.5,44.5,0,0,"",0,1,0,0,0,0,1 -"Pink Angels, The",1971,81,NA,4.6,11,14.5,0,0,14.5,14.5,4.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Pink Aye",1974,7,NA,4.8,6,0,0,0,14.5,45.5,14.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Blue Plate",1971,6,NA,5.6,6,0,0,0,0,45.5,34.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Blueprint, The",1966,7,NA,6.6,21,0,0,4.5,0,4.5,34.5,24.5,14.5,4.5,0,"",0,1,0,0,0,0,1 -"Pink Cadillac",1989,122,NA,4.9,1495,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Pink Chiquitas, The",1987,83,NA,3.5,63,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Pink Da Vinci",1975,6,NA,5.5,10,0,0,14.5,14.5,24.5,14.5,24.5,34.5,0,0,"",0,1,0,0,0,0,1 -"Pink Flamingos",1972,108,12000,6.1,2029,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"NC-17",0,0,1,0,0,0,0 -"Pink Flea, The",1971,7,NA,5.1,12,0,0,0,14.5,34.5,34.5,4.5,4.5,0,0,"",0,1,0,0,0,0,1 -"Pink Floyd London '66-'67",1967,30,NA,7.8,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,0,1,0,1 -"Pink Floyd The Wall",1982,95,NA,7.5,9567,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Pink Floyd: Live at Pompeii",1972,59,NA,7.8,788,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Pink Ice",1965,6,NA,5.4,11,0,0,0,24.5,14.5,24.5,0,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Pink Is a Many Splintered Thing",1968,6,NA,6.3,7,0,0,0,0,14.5,45.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Jungle, The",1968,104,NA,5.8,54,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pink Komkommer",1991,11,NA,6.4,5,0,24.5,0,0,0,44.5,0,0,44.5,0,"",0,1,0,0,0,0,1 -"Pink Ladies, The",1981,72,NA,6,7,0,0,0,14.5,14.5,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Pink Lagoon, The",1984,90,NA,6.5,22,0,0,0,0,0,14.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Pink Lightning",1978,7,NA,4.4,6,0,0,14.5,14.5,14.5,34.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Motel",1982,87,NA,2,23,34.5,34.5,4.5,4.5,0,4.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Pink Narcissus",1971,64,27000,5.2,114,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pink Nights",1985,75,NA,3.8,13,14.5,4.5,4.5,14.5,4.5,0,34.5,0,14.5,0,"",0,0,1,0,0,1,0 -"Pink On the Cob",1969,6,NA,5.3,8,0,0,0,14.5,34.5,24.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Outs",1967,6,NA,6.1,8,0,0,0,0,14.5,45.5,14.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Pink Package Plot, The",1968,6,NA,5.5,12,0,0,0,0,44.5,44.5,4.5,0,0,4.5,"",0,1,0,0,0,0,1 -"Pink Pajamas",1964,6,NA,5.5,9,0,0,0,0,34.5,45.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Palace, Paradise Beach",1987,93,NA,7.8,6,0,0,0,0,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pink Panic",1967,6,NA,6.5,12,0,0,0,0,4.5,44.5,24.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Pink Panther Strikes Again, The",1976,103,6000000,6.9,3394,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Pink Panther, The",1963,113,NA,7.2,5953,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Pink Panzer",1965,6,NA,6,11,0,0,4.5,4.5,4.5,34.5,4.5,4.5,0,14.5,"",0,1,0,0,0,0,1 -"Pink Paradise",1967,6,NA,5.6,7,0,0,0,0,24.5,74.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Pink Pest Control",1969,6,NA,5.3,13,0,0,0,14.5,34.5,34.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Phink, The",1964,6,NA,7.9,65,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Pink Pill, The",1968,6,NA,5.2,12,0,0,0,34.5,24.5,34.5,4.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Piper",1976,6,NA,4.7,6,0,0,14.5,0,0,84.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Pink Plasma",1975,6,NA,5.7,6,0,0,0,34.5,0,34.5,34.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Posies",1967,6,NA,6.1,8,0,0,0,0,14.5,45.5,24.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Pink Pranks",1971,6,NA,5.4,6,0,0,14.5,14.5,0,14.5,34.5,0,14.5,0,"",0,1,0,0,0,0,1 -"Pink Punch",1966,7,NA,5.2,11,4.5,0,0,0,45.5,24.5,4.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Quarterback, The",1968,6,NA,5.9,11,0,0,0,0,14.5,34.5,24.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Pink S.W.A.T.",1978,7,NA,5,6,0,0,14.5,0,0,45.5,14.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Pink Sphinx",1968,6,NA,5.7,6,0,0,0,0,45.5,34.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink Streaker",1975,7,NA,4.8,6,0,0,14.5,0,0,64.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Pink String and Sealing Wax",1946,89,NA,6.9,24,0,0,0,0,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pink Suds",1979,7,NA,3.9,6,0,14.5,0,0,34.5,14.5,0,34.5,0,0,"",0,0,0,0,0,0,1 -"Pink Tail Fly, The",1965,6,NA,5.2,10,0,0,0,24.5,44.5,24.5,0,14.5,0,14.5,"",0,1,0,0,0,0,1 -"Pink Valiant",1968,6,NA,5.8,6,0,0,0,0,14.5,45.5,14.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Pink in the Clink",1968,6,NA,5.3,6,0,0,0,14.5,34.5,45.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Pink in the Woods",1979,7,NA,3.6,5,0,44.5,0,0,24.5,44.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Pink of the Litter",1967,6,NA,6.3,8,0,0,0,0,14.5,34.5,14.5,34.5,0,0,"",0,1,0,0,0,0,1 -"Pink, Plunk, Plink",1966,6,NA,5.8,13,0,0,0,0,14.5,44.5,34.5,0,0,4.5,"",0,1,0,0,0,0,1 -"Pink-A-Rella",1969,6,NA,5.8,9,0,0,0,14.5,0,45.5,24.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Pink-Come Tax",1968,6,NA,5.2,8,0,0,0,14.5,34.5,24.5,14.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Pink-In",1971,7,NA,6,5,0,0,0,0,24.5,84.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Pinkadilly Circus",1968,6,NA,6,7,0,0,0,0,0,84.5,0,0,0,14.5,"",0,1,0,0,0,0,1 -"Pinkeltje",1978,88,NA,6,30,14.5,4.5,0,14.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pinkfinger",1965,6,NA,5.3,14,0,0,14.5,0,34.5,24.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Pinknic",1967,6,NA,5.7,7,0,0,0,0,24.5,45.5,0,14.5,0,0,"",0,1,0,0,0,0,1 -"Pinky",1949,102,NA,6.9,213,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pinky und der Millionenmops",2001,90,NA,5.9,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Pinocchio",1940,88,2600000,7.7,6805,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Pinocchio",1999,6,NA,8.6,6,14.5,0,0,0,0,0,0,45.5,0,34.5,"",0,1,0,0,0,0,1 -"Pinocchio",2002,112,NA,3.9,939,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pinocchio 3000",2004,80,NA,4.2,57,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Pinocchio In Outer Space",1965,71,NA,4.4,51,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Pinocchio and the Emperor of the Night",1987,87,NA,5.2,36,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,1,0,0,0,0,0 -"Pinocchio's Revenge",1996,96,NA,3.8,204,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pinochet's Children",2002,83,NA,7.4,8,14.5,0,0,0,14.5,0,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Pinot simple flic",1984,85,NA,5.4,80,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Pins and Needles",2001,80,NA,8.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Pintadas",1996,94,NA,6.4,16,0,0,0,0,24.5,14.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Pintea",1976,94,NA,8.4,15,0,0,0,0,4.5,0,14.5,24.5,24.5,34.5,"",1,0,0,0,0,0,0 -"Pintin al rescate, Los",2000,82,NA,5.8,6,0,14.5,0,14.5,0,45.5,14.5,0,0,0,"",0,1,1,0,0,0,0 -"Pinto Pink",1967,6,NA,5.3,9,0,14.5,0,0,44.5,34.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Pio labro asteri, To",1967,94,NA,5.5,14,0,14.5,4.5,14.5,14.5,34.5,4.5,4.5,0,0,"",0,0,1,1,0,1,0 -"Pio labro bouzouki, To",1968,87,NA,4.2,6,14.5,14.5,34.5,0,0,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Pioneer Days",1930,7,NA,6.2,31,0,0,0,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Pioneer Justice",1947,56,NA,5.6,6,0,0,0,0,45.5,34.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Pioneers in Petticoats",1969,33,NA,5.7,7,0,0,0,0,24.5,45.5,0,14.5,0,0,"",0,0,0,1,0,0,1 -"Piovono mucche",2003,90,NA,7.3,16,0,0,0,0,0,14.5,45.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Pip from Pittsburgh, The",1931,21,NA,8.9,13,0,0,4.5,0,0,0,14.5,34.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Pip-eye, Pup-eye, Poop-eye an' Peep-eye",1942,6,NA,7,17,0,0,0,4.5,4.5,4.5,24.5,0,14.5,44.5,"",0,1,1,0,0,0,1 -"Pipas",1994,13,NA,4.5,6,14.5,0,34.5,0,0,14.5,34.5,0,0,0,"",0,0,1,0,0,0,1 -"Pipe Dream",2002,91,NA,6.3,330,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Pipe Dreams",1938,8,NA,5.8,10,0,0,0,14.5,44.5,0,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Pipe Dreams",1976,89,NA,4.5,13,14.5,4.5,0,14.5,4.5,4.5,4.5,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Pipo de clown en de piraten van toen",1975,91,NA,6.4,8,0,0,0,0,14.5,34.5,45.5,0,0,0,"",0,0,1,0,0,0,0 -"Pipo en de p-p-Parelridder",2003,103,NA,3.7,35,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Pippa Passes; or, The Song of Conscience",1909,11,NA,4.6,6,14.5,0,0,14.5,0,34.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Pippi Longstocking",1997,75,NA,4.9,55,14.5,4.5,0,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Pique-Nique Douille",1995,6,NA,8.7,6,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Pique-nique de Lulu Kreutz, Le",2000,102,NA,5.1,56,14.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Piranha",1978,94,660000,5.4,1553,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Piranha Part Two: The Spawning",1981,84,NA,2.8,773,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Piranha, Piranha!",1972,94,NA,3.9,31,24.5,4.5,4.5,14.5,14.5,4.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Pirate Movie, The",1982,98,NA,4.5,912,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Pirate Party on Catalina Isle",1935,19,NA,5.5,17,0,0,0,24.5,14.5,24.5,0,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Pirate, La",1984,88,NA,4.2,26,4.5,4.5,14.5,4.5,0,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pirate, The",1948,102,3700000,7.1,529,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Piraten under sengen",2004,17,NA,3.7,18,24.5,4.5,24.5,14.5,14.5,14.5,0,0,0,4.5,"",0,0,0,0,0,0,1 -"Piratene",1983,93,NA,6.2,30,0,4.5,4.5,4.5,4.5,24.5,4.5,34.5,0,14.5,"",1,0,0,1,0,0,0 -"Piratensender Powerplay",1982,90,NA,3.7,178,24.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pirates",1986,124,40000000,5.5,973,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pirates",1987,26,NA,1.2,6,34.5,0,0,0,0,0,0,34.5,0,34.5,"",0,0,0,0,0,0,1 -"Pirates of Blood River, The",1962,87,NA,5.9,31,0,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pirates of Monterey",1947,77,NA,5.7,9,0,0,0,14.5,24.5,34.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Pirates of Penzance, The",1983,112,NA,6.9,608,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Pirates of Tortuga",1961,97,NA,4.7,14,24.5,0,14.5,0,34.5,0,0,4.5,24.5,0,"",0,0,0,0,0,0,0 -"Pirates of Tripoli",1955,72,NA,5.1,5,0,0,0,44.5,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Pirates of the Caribbean: The Curse of the Black Pearl",2003,143,125000000,8,60812,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"PG-13",1,0,1,0,0,0,0 -"Pirates of the High Seas",1950,260,NA,6.5,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",1,0,0,0,0,0,0 -"Pirates of the Prairie",1942,57,NA,5.3,5,0,0,0,24.5,24.5,24.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Pirates on Horseback",1941,69,NA,5.7,18,14.5,0,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,"",1,0,0,0,0,0,0 -"Pirates: 3D Show",1999,17,NA,6.5,84,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Pirati della Malesia, I",1964,107,NA,5.1,12,0,4.5,0,14.5,14.5,34.5,14.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Pirati della costa, I",1960,102,NA,5.4,11,0,0,0,0,14.5,24.5,0,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Pirati di Capri, I",1949,94,NA,6.4,17,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Piraty XX veka",1979,83,NA,4.6,45,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Piravi",1988,110,NA,7.4,18,0,0,4.5,4.5,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Pirosmani",1969,105,NA,7,23,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Pirouette, La",2002,8,NA,7.7,12,0,0,0,0,0,0,44.5,45.5,4.5,0,"",0,0,0,0,0,0,1 -"Piry Valtasara, ili noch so Stalinym",1989,88,NA,6.2,13,0,0,0,4.5,14.5,0,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pisaj",2004,110,NA,8,5,0,0,0,0,0,0,64.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Piscine, La",1969,120,NA,6.5,403,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pisito, El",1959,87,NA,7.6,49,0,0,0,0,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Pisma myortvogo cheloveka",1986,90,NA,8.1,80,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Pismo - Glava",1983,106,NA,6.8,6,0,0,0,0,14.5,14.5,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Pismo do Amerika",2001,88,NA,7.2,80,0,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Piso pisello",1982,103,NA,6.7,14,0,0,0,4.5,0,24.5,24.5,0,4.5,44.5,"",0,0,1,1,0,0,0 -"Piso porta, I",2000,105,NA,6.5,38,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pissed",2000,12,NA,1.4,13,24.5,4.5,0,0,0,0,24.5,0,4.5,34.5,"",0,0,0,0,0,0,1 -"Pisseuse, La",1997,21,NA,3.9,8,24.5,0,0,0,0,14.5,14.5,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Pissoir",1988,100,NA,6.8,17,0,4.5,14.5,0,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Pistol Harvest",1951,60,NA,5.5,11,0,0,4.5,4.5,24.5,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pistol Opera",2001,112,NA,6.1,250,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Pistol Packin' Mama",1943,64,NA,5.6,7,14.5,0,0,14.5,14.5,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Pistol: The Birth of a Legend",1991,90,NA,6.9,116,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Pistola de mi hermano, La",1997,93,NA,5.2,60,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pistola per Ringo, Una",1965,98,NA,6.4,35,0,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Pistola per cento bare, Una",1968,83,NA,3.9,8,14.5,0,34.5,0,0,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Pistole non discutono, Le",1964,92,NA,4.8,7,14.5,0,0,14.5,0,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Pistoleiro Bossa Nova",1959,111,NA,3.3,6,14.5,0,0,0,0,45.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Pistolero dell'Ave Maria, Il",1969,83,NA,6,19,0,0,0,0,24.5,24.5,4.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Pistoleros de Paso Bravo, Los",1969,92,NA,7.6,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Pistolet, Le",2003,3,NA,3.1,8,34.5,14.5,0,14.5,0,0,14.5,24.5,0,0,"",0,0,0,1,0,0,1 -"Pit and the Pendulum",1961,80,200000,6.8,1072,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pit of Darkness",1961,76,NA,6.1,6,0,14.5,0,0,14.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Pit, The",1981,92,NA,4.5,139,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Pitcairn Island Today",1935,10,NA,6.2,17,0,0,0,0,14.5,44.5,24.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Pitch",1997,81,NA,6.3,75,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Pitch Black",2000,112,23000000,6.7,18522,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Pitch, The",2001,3,NA,7.7,6,0,14.5,0,0,0,0,14.5,14.5,14.5,34.5,"",1,0,1,0,0,0,1 -"Pitchin' Woo at the Zoo",1944,7,NA,5.6,6,0,0,0,0,34.5,0,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Pitfall",1948,86,NA,7.7,65,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pitons",2003,88,NA,6.7,24,14.5,0,4.5,14.5,24.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Pitra, Putra Aur Dharamyuddha",1994,120,NA,7.1,11,0,0,0,0,14.5,4.5,0,4.5,4.5,45.5,"",0,0,0,1,1,0,0 -"Pits",2003,8,NA,8.7,6,0,0,0,0,14.5,0,0,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Pitsi",1946,116,NA,6,5,44.5,0,24.5,0,24.5,0,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Pitstop",2000,91,NA,5.6,5,44.5,0,0,0,0,24.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Pittsburgh",1942,91,NA,6,157,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pittsville - Ein Safe voll Blut",1974,93,NA,5.8,9,0,0,0,0,34.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Pituy",2002,95,NA,6.4,5,0,0,24.5,44.5,0,0,0,24.5,24.5,0,"",0,0,0,1,0,1,0 -"Pity the Blind, No. 2",1904,1,NA,4,7,0,0,24.5,44.5,14.5,0,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Pixote: A Lei do Mais Fraco",1981,122,NA,7.5,828,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Pizza",2004,80,NA,6,35,4.5,0,0,4.5,14.5,0,14.5,4.5,4.5,44.5,"PG-13",0,0,0,0,0,0,0 -"Pizza Connection",1985,111,NA,6.9,24,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pizza Girls, We Deliver",1978,68,NA,5.7,26,0,4.5,4.5,0,0,4.5,4.5,34.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Pizza King",1999,103,NA,5.6,146,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pizza Man",2004,10,NA,8,14,14.5,0,4.5,0,0,0,0,4.5,4.5,64.5,"",0,0,0,0,1,0,1 -"Pizza Man vs. the Dude",2004,82,16000,7.4,10,0,14.5,0,0,0,14.5,34.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Pizza Tweety-Pie, A",1958,6,NA,6.4,30,0,0,4.5,4.5,14.5,24.5,24.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Pizza blob",1992,12,NA,2.5,8,34.5,14.5,14.5,0,0,0,0,14.5,0,24.5,"",0,0,1,0,0,0,1 -"Pizza passionata",2001,14,NA,6.3,28,0,0,0,0,24.5,14.5,34.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Pizza, birra, faso",1998,90,NA,6.3,167,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pizza: The Movie",2004,99,10000,7.5,37,0,0,4.5,0,14.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Pizzaiolo et Mozzarel",1985,85,NA,1,10,45.5,0,0,0,0,0,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Pizzicata",1996,93,NA,6.5,24,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Pizzicato Pussycat",1955,7,NA,7,19,0,0,0,0,4.5,4.5,45.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Placard, Le",2001,84,NA,7.1,3083,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Place Between Our Bodies, The",1975,33,NA,5,7,0,0,0,14.5,24.5,44.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Place Called Chiapas, A",1998,89,891000,6.7,52,0,0,0,0,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Place Called Today, A",1972,103,NA,3.6,12,4.5,14.5,24.5,4.5,4.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Place Called Truth, A",1998,94,NA,2.8,46,34.5,14.5,14.5,14.5,4.5,4.5,0,0,0,4.5,"R",0,0,0,1,0,0,0 -"Place in the Sun, A",1951,122,2295304,7.7,2191,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Place of One's Own, A",1945,92,NA,5.9,37,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Place of Weeping",1986,90,NA,5.9,9,0,0,0,24.5,44.5,0,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Place to Go, A",1963,86,NA,8.4,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Place to Stand, A",1967,17,NA,6.9,10,14.5,0,0,0,24.5,0,0,0,14.5,64.5,"",0,0,0,0,1,0,1 -"Place, La",2001,28,NA,8.8,5,0,0,0,0,0,24.5,0,0,44.5,44.5,"",0,0,0,0,1,0,1 -"Placebo Effect",1998,86,NA,5.2,21,14.5,0,4.5,4.5,4.5,4.5,4.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Placer de matar, El",1988,90,NA,4.9,31,4.5,4.5,0,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Placer sangriento",1967,78,NA,3,19,14.5,34.5,4.5,14.5,14.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Placeres ocultos, Los",1977,95,NA,6.6,14,0,4.5,4.5,0,14.5,0,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Places in the Heart",1984,112,NA,7.4,1490,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Placido Rizzotto",2000,114,NA,6.9,57,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Plage noire, La",2001,114,NA,3.6,15,44.5,14.5,4.5,4.5,14.5,4.5,0,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Plagio",1969,88,NA,5.2,5,0,0,0,0,44.5,44.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Plague",1978,88,NA,4.2,48,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Plague Dogs, The",1982,103,NA,7,273,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG-13",0,1,0,1,0,0,0 -"Plague of the Zombies, The",1966,90,NA,6.4,356,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Plagues and Pleasures on the Salton Sea",2004,86,NA,9,22,0,0,0,4.5,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Plain Clothes",1988,98,NA,5.4,188,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Plain Talk & Common Sense",1987,117,NA,7.6,5,0,0,0,0,0,0,64.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Plains of Heaven, The",1982,80,NA,4.4,13,24.5,4.5,4.5,24.5,24.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Plainsman and the Lady",1946,60,NA,7,9,0,0,0,14.5,0,14.5,44.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Plainsman, The",1936,113,NA,6.6,230,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Plainsman, The",1966,92,NA,5.6,28,0,0,4.5,14.5,34.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Plaisir (et ses petits tracas), Le",1998,100,NA,4.3,72,24.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Plaisir d'amour",1991,90,NA,4.9,6,0,0,14.5,14.5,45.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Plaisir, Le",1952,93,NA,7.8,194,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Plan",2004,149,NA,5.2,34,14.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Plan 10 from Outer Space",1994,80,NA,4.6,83,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Plan 9 from Outer Space",1959,79,60000,3.5,7522,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Plan B",1997,102,NA,6,66,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Plan des Herrn Thomaschek, Der",2003,14,NA,6.8,8,0,0,0,0,0,24.5,0,45.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Plan for Destruction",1943,22,NA,7,18,0,4.5,4.5,0,0,34.5,14.5,0,4.5,24.5,"",0,0,0,0,1,0,1 -"Plane Crazy",1928,6,3528,6.9,60,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Plane Daffy",1944,7,NA,7.6,33,0,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Plane Dippy",1936,8,NA,5.9,14,24.5,0,0,14.5,4.5,24.5,14.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Plane Dumb",1932,7,NA,4.3,12,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,0,0,"",0,1,1,0,0,0,1 -"Plane Nuts",1933,20,NA,7.4,25,0,0,0,4.5,4.5,14.5,4.5,24.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Planes, Trains & Automobiles",1987,93,NA,7.3,11626,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Planet Alex",2001,102,NA,6,18,0,0,4.5,0,14.5,24.5,14.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Planet Earth: Dreams",2004,85,NA,6.9,7,0,14.5,24.5,0,0,0,0,0,0,45.5,"",0,0,1,0,0,0,0 -"Planet Outlaws",1953,71,NA,4.5,10,14.5,0,0,14.5,14.5,14.5,14.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Planet der Kannibalen",2001,91,NA,5,57,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Planet of Dinosaurs",1978,84,NA,3.7,76,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Planet of Junior Brown, The",1997,91,NA,5.8,74,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Planet of the Apes",1968,107,5800000,7.9,20516,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Planet of the Apes",2001,119,100000000,5.6,28601,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Planet of the Pitts",2004,112,NA,1,29,14.5,0,0,4.5,0,0,0,0,0,84.5,"",1,0,1,0,0,0,0 -"Planeta de los hippies, El",1999,75,NA,5,17,24.5,24.5,14.5,14.5,0,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Planeta krawiec",1983,88,NA,7.4,8,0,0,0,0,0,14.5,0,74.5,0,14.5,"",0,0,0,1,0,0,0 -"Planetata na sakrovishtata",1982,72,NA,9.5,8,0,0,0,0,0,0,0,24.5,0,74.5,"",0,1,0,0,0,0,0 -"Plank, The",1967,45,NA,7.1,123,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Plankton",1994,86,250000,4.2,47,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Planning familial",1990,30,NA,7.2,5,0,0,0,0,0,0,64.5,24.5,24.5,0,"",0,0,0,0,1,0,1 -"Planque, La",2004,73,NA,6.2,10,0,0,0,14.5,14.5,0,24.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Plantation Act, A",1926,10,NA,6.4,20,14.5,0,4.5,0,4.5,24.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Plante humaine, La",1996,80,NA,7.8,9,0,0,0,0,14.5,0,14.5,34.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Planter's Wife, The",1952,88,NA,5.3,19,0,0,0,24.5,14.5,34.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Plashch Kazanovy",1993,94,NA,5.7,15,4.5,0,14.5,0,0,24.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Plaster Caster",2001,90,NA,6.2,23,4.5,0,0,0,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,1,0,1,0,0 -"Plastered in Paris",1966,6,NA,7.5,6,0,0,0,0,0,45.5,0,0,45.5,0,"",0,1,0,0,0,0,1 -"Plastic Age, The",1925,73,NA,6.5,53,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Plastic Tree",2003,103,NA,7.1,36,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Plastic Utopia",1997,98,NA,8.1,26,0,4.5,4.5,4.5,0,0,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Plastics Inventor, The",1944,7,NA,7.7,18,0,0,4.5,4.5,0,0,24.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Plastposen",1986,88,NA,4.8,68,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Plata dulce",1982,97,NA,6.7,36,0,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Plata quemada",2000,125,NA,7.5,791,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,1,0 -"Platillos volantes",2003,99,NA,6.7,33,0,0,0,4.5,14.5,14.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Platinum Blonde",1931,90,NA,6.8,300,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Platinum Blonde",2001,90,NA,2.7,36,24.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Platinum High School",1960,95,NA,3.7,24,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Platinum Paradise",1980,82,NA,4,5,24.5,0,0,0,0,24.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Platinum Triangle, The",1989,91,NA,2.2,6,34.5,0,0,0,14.5,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Plato's Run",1997,96,NA,4.2,88,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Plato's, the Movie",1980,90,NA,6,5,0,0,0,0,24.5,24.5,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Platoon",1986,120,6000000,8.1,35210,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Platoon Leader",1988,97,NA,4.6,214,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Platzangst",2002,64,NA,6.8,8,0,0,0,0,24.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Plauto, recuerdo distorsionado de un tonto eventual",2004,85,NA,1.7,17,45.5,14.5,4.5,0,0,0,4.5,0,0,14.5,"",1,0,1,0,0,0,0 -"Play",2000,16,NA,8.1,91,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Play",2003,85,NA,6.1,16,34.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Play Christy for Me",1991,75,NA,6.2,6,0,0,0,14.5,0,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Play Dead",2001,79,NA,5.6,36,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Play Dirty",1968,117,NA,6.2,183,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Play Girl",1941,77,NA,6.1,9,0,0,0,0,34.5,14.5,24.5,24.5,14.5,0,"",0,0,1,0,0,1,0 -"Play It Again, Sam",1972,85,NA,7.5,3154,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Play It As It Lays",1972,99,NA,5.5,55,14.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Play It Cool",1962,82,NA,4.8,12,0,4.5,24.5,4.5,4.5,14.5,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Play It to the Bone",1999,124,24000000,5.1,2645,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Play Misty for Me",1971,96,NA,7,2548,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Play Murder for Me",1990,80,NA,3.9,16,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Play Nice",1992,90,NA,3.6,41,24.5,0,4.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Play Time",1994,90,NA,5.4,171,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Play-Girl",1932,60,NA,4.5,11,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,4.5,0,"",0,0,0,1,0,1,0 -"Playa de los galgos, La",2002,135,NA,7.2,54,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Playback",1996,92,NA,2.9,100,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Playbirds, The",1978,89,NA,3.1,19,24.5,14.5,14.5,0,0,14.5,14.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Playboy en paro",1984,84,NA,2.5,17,14.5,14.5,34.5,14.5,4.5,4.5,0,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Playboy of the Western World",1962,100,NA,6.9,16,0,4.5,0,0,4.5,4.5,14.5,14.5,0,45.5,"",0,0,1,0,0,0,0 -"Playboys, The",1992,108,NA,6.3,296,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Player, The",1992,124,NA,7.7,13647,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Players",1979,120,NA,3.7,59,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Playful Pan",1930,7,NA,5.7,8,0,0,14.5,0,24.5,45.5,0,0,0,14.5,"",0,1,1,0,0,0,1 -"Playful Pluto",1934,8,NA,6.1,12,0,0,0,4.5,4.5,34.5,14.5,4.5,0,24.5,"",0,1,1,0,0,0,1 -"Playgirl",1954,85,NA,4.8,14,4.5,0,4.5,14.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Playgirl",1966,91,NA,4.5,15,4.5,14.5,0,0,0,4.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Playgirl",2002,14,NA,5.6,5,24.5,0,24.5,0,0,0,44.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Playgirl Killer",1968,85,NA,3.5,27,14.5,14.5,0,14.5,4.5,14.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Playgirl, The",1982,86,NA,5.6,11,0,4.5,4.5,0,14.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Playgirls",1995,80,NA,3.2,10,24.5,24.5,34.5,0,14.5,0,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Playgirls II",1995,85,NA,2.4,6,45.5,34.5,14.5,0,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Playgirls and the Bellboy, The",1962,94,NA,2.6,23,24.5,14.5,4.5,0,14.5,0,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Playhouse, The",1921,18,NA,8.3,331,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Playing Around",1930,66,NA,6.5,8,0,0,0,0,45.5,14.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Playing Away",1987,100,NA,5.4,17,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Playing Beatie Bow",1986,93,NA,5,46,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Playing Dangerous",1994,87,NA,4.4,117,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Playing Dangerous 2",1996,97,NA,5.4,31,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Playing Dead",2000,125,NA,1.9,9,14.5,14.5,0,24.5,0,0,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Playing God",1997,94,NA,5.4,1998,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Playing Mona Lisa",2000,97,NA,5.9,261,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Playing by Heart",1998,121,14000000,7.1,4958,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Playing for Keeps",1986,102,NA,3.5,105,34.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Playing the Part",1995,38,12000,7.3,9,0,0,0,14.5,0,0,0,24.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Playing the Ponies",1937,15,NA,7.6,49,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Playing with Fire",1983,100,NA,4.7,8,0,14.5,0,14.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Playing with Mr. Greeley",1997,88,NA,5.5,27,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Playmaker",1994,91,NA,4.2,130,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Playmates",1941,94,NA,4.9,36,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Playroom",1990,90,NA,3.6,56,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Playthings",1999,120,NA,5.6,20,0,4.5,14.5,0,4.5,14.5,0,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Playtime",1967,120,NA,7.7,1333,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Plaza Suite",1971,114,NA,6.2,332,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Plaza de almas",1997,100,NA,8.3,36,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pleasant Grove",2002,15,NA,3.9,25,14.5,24.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Pleasantville",1976,85,NA,5.2,28,14.5,0,0,4.5,24.5,4.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pleasantville",1998,124,40000000,7.5,22561,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Please Believe Me",1950,87,NA,5.8,50,0,4.5,0,14.5,34.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Please Don't Eat My Mother",1973,98,NA,2.9,32,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Please Don't Eat the Babies",1983,90,NA,1.6,12,45.5,24.5,0,0,0,0,14.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Please Don't Eat the Daisies",1960,112,NA,6.1,531,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Please Don't Touch Me",1963,67,NA,9.4,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,0,1,0,0,0 -"Please Kill Mr. Kinski",1999,9,NA,6.8,34,0,4.5,0,0,0,24.5,24.5,4.5,4.5,34.5,"",0,0,0,0,1,0,1 -"Please Murder Me",1956,78,NA,6,7,14.5,0,0,0,14.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Please Sir!",1971,100,NA,5.6,65,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Please Turn Over",1959,87,NA,4.8,14,0,4.5,0,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Please Wait to Be Seated",2004,55,NA,8.2,5,0,0,0,0,0,24.5,0,44.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Please!",1999,15,NA,7.5,38,4.5,0,0,4.5,0,0,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Pleased to Meet Cha!",1935,6,NA,6.1,7,14.5,0,0,14.5,0,0,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Pleasure Beach",1983,74,NA,8,10,0,0,0,14.5,14.5,14.5,0,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Pleasure Garden, The",1925,75,NA,6.4,84,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pleasure Garden, The",1953,38,NA,4.5,8,14.5,0,14.5,0,0,0,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Pleasure Girls, The",1965,88,NA,4.9,7,14.5,14.5,14.5,0,0,14.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Pleasure Pill",2002,3,NA,9.6,9,0,0,0,0,0,0,0,0,44.5,45.5,"",0,0,1,0,0,0,1 -"Pleasure Principle, The",1991,100,NA,5.9,24,0,0,4.5,4.5,24.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pleasure Seekers, The",1964,107,NA,5.3,77,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Pleasure in Paradise",1992,80,NA,2.6,14,24.5,14.5,24.5,4.5,4.5,0,0,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Pleasure of His Company, The",1961,115,NA,6.6,174,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Pleasurecraft",1999,82,NA,2.9,77,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Pleasureland",1996,75,NA,7.1,11,0,0,0,0,4.5,0,14.5,0,4.5,64.5,"",0,0,0,0,0,0,0 -"Pleasures of a Woman",1974,60,NA,5.4,8,0,0,14.5,14.5,0,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Pledge Night",1988,90,NA,3.5,61,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pledge, The",2001,123,45000000,6.9,9852,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Pledge, The",2003,7,NA,6.3,7,0,24.5,0,0,0,14.5,0,44.5,0,14.5,"",0,0,0,0,0,0,1 -"Plein de super, Le",1976,97,NA,7.5,14,0,0,0,0,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Plein soleil",1960,118,NA,7.5,1316,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Pleins feux sur l'assassin",1961,95,NA,7.6,14,4.5,0,0,0,0,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Plenilunio",1999,119,NA,6.5,112,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Plenilunio delle vergini, Il",1973,80,NA,5.3,30,0,4.5,14.5,14.5,14.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Plenty",1985,124,NA,5.6,443,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Plenty of Money and You",1937,7,NA,6.3,11,0,0,0,0,34.5,14.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Pleure pas Germaine",2000,96,NA,6.1,93,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Pleure pas la bouche pleine",1973,116,NA,4.8,40,14.5,14.5,0,0,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Plight of Clownana, The",2004,15,6000,9.9,11,0,0,0,0,0,0,0,0,4.5,94.5,"",0,0,1,0,0,0,1 -"Pljacka Treceg rajha",2004,105,NA,6.2,14,0,14.5,14.5,14.5,14.5,24.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Plokhoy khoroshiy chelovek",1973,100,NA,8.1,31,0,0,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Plop Goes the Weasel",1953,7,NA,6.6,23,0,0,4.5,4.5,14.5,24.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Plop in de wolken",2000,75,NA,3.4,35,14.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Plot Thickens, The",1936,69,NA,4.5,10,0,0,0,24.5,24.5,24.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Plots with a View",2002,94,NA,6.5,596,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Plouffe, Les",1981,259,NA,7.8,50,0,0,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Plough and the Stars, The",1936,72,NA,4.7,42,14.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ploughman's Lunch, The",1983,107,NA,6.1,63,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Plow That Broke the Plains, The",1936,28,NA,6.4,60,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,1,0,1 -"Plowboy, The",1929,6,NA,5.9,8,0,0,0,14.5,14.5,34.5,14.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Plug",1998,11,12000,6.2,28,0,0,4.5,4.5,24.5,14.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Plughead Rewired: Circuitry Man II",1994,98,NA,3.3,75,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Plumbing Is a 'Pipe'",1938,7,NA,7.2,12,0,0,4.5,0,0,14.5,4.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Plumbing We Will Go, A",1940,18,NA,8.4,140,4.5,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Plump Fiction",1997,82,NA,3,758,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Plunder",2003,55,NA,7.4,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Plunder Road",1957,72,NA,5.8,23,0,0,0,4.5,14.5,4.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Plunder of the Sun",1953,81,NA,4.6,12,4.5,14.5,4.5,4.5,4.5,0,4.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Plunderers, The",1948,87,NA,4.9,25,14.5,0,0,4.5,34.5,24.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Plunderers, The",1960,94,NA,6.1,30,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Plunge",1990,85,NA,5.3,5,0,0,24.5,0,0,44.5,0,0,44.5,0,"",0,0,0,0,0,0,0 -"Plunge, The",2003,20,30000,7.1,9,0,24.5,0,0,0,14.5,24.5,0,0,44.5,"",0,0,1,0,0,1,1 -"Plunge: The Movie",2003,89,NA,8,7,14.5,0,0,0,0,14.5,0,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Plunkett & Macleane",1999,93,NA,6.1,2887,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Plus beau jour de ma vie, Le",2004,104,NA,6,19,14.5,4.5,0,0,14.5,14.5,34.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Plus beau pays du monde, Le",1999,116,NA,7,14,0,0,0,14.5,0,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Plus beau que moi, tu meurs",1982,105,NA,2.3,9,44.5,0,14.5,14.5,14.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Plus belles escroqueries du monde, Les",1964,90,NA,5.8,26,14.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Plus grandir",1985,8,NA,7.5,18,0,0,0,0,4.5,14.5,24.5,24.5,0,34.5,"",0,0,0,0,0,0,1 -"Plus haut",2002,85,NA,4.9,5,0,0,0,44.5,24.5,44.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Plus longue nuit du diable, La",1971,95,NA,5.3,215,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Plus qu'hier moins que demain",1998,86,NA,6.3,44,0,0,0,4.5,4.5,24.5,34.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Plus rien...",2000,15,NA,9.1,35,4.5,0,0,0,0,0,4.5,4.5,4.5,84.5,"",0,0,0,0,0,0,1 -"Plushies & Furries",2001,22,NA,2.4,5,84.5,0,0,0,0,0,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Pluto Junior",1942,7,NA,6.5,25,0,0,14.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Pluto and the Armadillo",1943,7,NA,5.6,27,0,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Pluto and the Gopher",1950,6,NA,6.2,19,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Pluto at the Zoo",1942,8,NA,7.3,23,0,0,0,4.5,0,24.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Pluto's Blue Note",1947,7,NA,6.7,26,0,0,0,14.5,14.5,14.5,34.5,4.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Pluto's Christmas Tree",1952,8,NA,7.3,123,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Pluto's Fledgling",1948,7,NA,7.1,24,0,0,0,4.5,0,14.5,34.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Pluto's Heart Throb",1950,7,NA,6.3,18,0,0,0,14.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Pluto's Housewarming",1947,7,NA,5.6,13,0,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Pluto's Judgement Day",1935,7,NA,7.1,68,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Pluto's Kid Brother",1946,7,NA,6.2,20,0,0,4.5,0,24.5,24.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Pluto's Party",1952,8,NA,5.8,37,4.5,0,0,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Pluto's Playmate",1941,8,NA,6.1,19,0,0,0,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Pluto's Purchase",1948,7,NA,6.1,14,0,0,0,4.5,34.5,24.5,24.5,0,4.5,4.5,"",0,1,1,0,0,0,1 -"Pluto's Quin-puplets",1937,9,NA,6.3,99,24.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Pluto's Surprise Package",1949,7,NA,5.9,15,0,0,14.5,4.5,0,44.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Pluto's Sweater",1949,7,NA,6.4,19,0,0,14.5,0,14.5,24.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Plutonium Baby",1987,85,NA,2.1,52,45.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Plutopia",1951,8,NA,5.9,30,4.5,0,14.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Plymouth Adventure",1952,105,NA,6.1,101,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Plymptoons",1990,6,NA,6.9,66,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Plyumbum, ili opasnaya igra",1986,97,NA,7.1,22,0,0,4.5,4.5,0,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Po di Sangui",1996,90,NA,7.7,9,14.5,0,0,14.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Po glavnoy ulitse s orkestrom",1986,94,NA,6.1,18,0,0,0,4.5,14.5,14.5,14.5,14.5,0,34.5,"",0,0,1,0,0,1,0 -"Po semeynym obstoyatelstvam",1977,137,NA,8.6,25,4.5,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Po ulitsam komod vodili...",1978,68,NA,5.8,18,14.5,0,0,0,14.5,0,45.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Po zakonu",1926,80,NA,7.3,25,0,0,0,0,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Pobeda",1985,160,NA,7.3,6,0,0,0,45.5,0,0,0,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Pobeg",2005,117,1800000,2.6,18,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Pobre mariposa",1986,120,NA,8.3,25,4.5,0,4.5,14.5,4.5,4.5,0,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Pocahontas",1995,81,55000000,5.7,6498,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,1,0,0,0,1,0 -"Pocatello Kid, The",1931,61,NA,4.3,6,14.5,14.5,0,0,0,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Pocetni udarac",1990,110,NA,6.6,7,14.5,0,0,14.5,14.5,0,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Pochi dollari per Django",1966,85,NA,4.4,10,0,0,24.5,24.5,0,34.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Pociag",1959,101,NA,8.4,59,0,0,0,4.5,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Pociag do Hollywood",1987,97,NA,6.7,15,0,0,0,4.5,0,24.5,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Pocket Money",1972,102,NA,5.1,192,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pocket Ninjas",1997,80,NA,1.4,147,84.5,4.5,4.5,0,4.5,0,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Pocketful of Miracles",1961,136,2900000,7.1,760,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Poco... Little Dog Lost",1977,88,NA,7.8,10,14.5,0,14.5,0,0,14.5,0,14.5,0,64.5,"",0,0,0,1,0,0,0 -"Pod Jezevci skalou",1978,74,NA,6.6,11,0,0,4.5,0,14.5,14.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Pod igoto",1952,118,NA,8,12,4.5,0,0,0,0,0,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Pod njenim oknom",2003,91,NA,7,71,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Pod severnym siyaniyem",1990,127,NA,7.3,12,0,4.5,0,0,0,4.5,24.5,0,34.5,24.5,"",0,0,0,0,0,0,0 -"Podarok chyornogo kolduna",1978,63,NA,6.5,5,0,0,0,0,0,44.5,24.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Podgryavane na vcherashniya obed",2002,98,NA,6.9,11,24.5,0,4.5,0,0,0,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Podium",2004,95,NA,6.7,483,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Podranki",1976,93,NA,6.4,21,4.5,4.5,0,4.5,0,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Podzemelye vedm",1989,81,NA,3.8,7,0,24.5,0,14.5,14.5,24.5,0,14.5,0,0,"",0,0,0,0,0,1,0 -"Poem - Ich setzte den Fuss in die Luft, und sie trug (Hilde Domin)",2003,95,NA,8,25,0,0,0,0,14.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Poen",1967,5,NA,7.8,5,0,0,0,24.5,0,24.5,24.5,44.5,0,0,"",0,0,0,0,0,0,1 -"Poet & Peasant, The",1945,7,NA,5.6,18,0,14.5,4.5,0,14.5,34.5,4.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Poet's Pub",1949,79,NA,4.1,8,14.5,14.5,0,14.5,34.5,0,0,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Poet, The",2003,100,NA,3.1,78,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Poeta nel Cinema: Andreij Tarkovskij, Un",1984,65,NA,7.3,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,0,1,0,0 -"Poeten og Lillemor",1959,95,NA,6.5,15,0,0,14.5,0,14.5,24.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Poeten og Lillemor og Lotte",1960,99,NA,5.3,10,0,0,14.5,24.5,44.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Poetic Justice",1993,109,14000000,5,1207,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Poetry in Motion",1982,91,NA,8.4,21,4.5,0,0,0,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Poets",2002,185,NA,8.5,25,0,4.5,0,0,0,4.5,4.5,24.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Pogoda na jutro",2003,95,NA,7.8,134,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Pogovorim, brat",1978,116,NA,7.8,6,0,0,0,14.5,14.5,0,0,0,34.5,34.5,"",1,0,0,0,0,0,0 -"Pograbek",1992,75,NA,8,14,0,0,4.5,0,0,0,4.5,45.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Pogrzeb kartofla",1991,96,NA,8.2,10,0,0,14.5,0,0,24.5,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Poia einai i Margarita",1961,81,NA,6.5,7,0,0,0,0,14.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Poika ja ilves",1998,102,NA,5.5,160,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Poil de carotte",1932,91,NA,8,43,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Point Blank",1967,92,3000000,7.4,1642,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Point Blank",1997,92,NA,3.2,228,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Point Break",1991,120,24000000,6.5,11180,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Point Doom",1999,100,NA,3.6,70,24.5,14.5,4.5,24.5,14.5,4.5,4.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Point Five",2003,7,3000,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,1,0,0,0,0,1 -"Point Men, The",2001,88,6100000,4.6,266,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Point of Betrayal",1995,96,NA,4.2,17,14.5,4.5,14.5,14.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Point of Impact",1993,96,NA,3.3,101,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Point of No Return",1993,104,NA,5.7,4600,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Point of Order",1964,93,NA,8,75,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Point of Terror",1971,88,NA,3.1,24,24.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Point of View",1990,90,NA,1.7,9,34.5,0,0,0,0,0,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Point&Shoot",2004,96,NA,6.6,16,14.5,4.5,0,14.5,0,0,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Point, The",1978,48,NA,7,34,4.5,0,0,4.5,0,4.5,0,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Pointe-courte, La",1956,86,NA,5.9,22,0,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pointer, The",1939,9,NA,6.8,37,4.5,0,0,14.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Poios Thanasis",1969,85,NA,7.3,10,0,0,0,14.5,14.5,14.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Poison",1991,85,250000,6.2,452,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Poison Ivy",1992,93,3000000,5,2436,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Poison Ivy II",1996,108,NA,4.2,1093,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Poison Pen",1940,66,NA,6.5,8,0,0,0,0,24.5,0,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Poisson d'avril",1954,102,NA,5.9,18,0,0,4.5,14.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Poisson rouge",1994,3,NA,5.4,17,0,14.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Pojat",1962,100,NA,7.3,124,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Pokemon 4Ever",2002,75,NA,4.4,216,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",1,1,0,0,0,0,0 -"Pokemon: Destiny Deoxys",2005,98,NA,5.1,49,14.5,0,4.5,4.5,4.5,14.5,4.5,4.5,4.5,34.5,"",1,1,0,1,0,0,0 -"Poker",1988,90,NA,4.8,9,0,24.5,14.5,0,24.5,34.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Poker",2001,105,NA,5,41,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Poker Kings",2004,52,NA,5.6,5,0,0,0,24.5,0,0,64.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Poker at Eight",1935,19,NA,8,6,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Pokhorony Stalina",1990,109,NA,4.4,12,14.5,14.5,4.5,0,14.5,0,4.5,4.5,0,24.5,"",0,0,0,1,0,1,0 -"Pokhozhdeniya zubnogo vracha",1965,82,NA,8.4,5,0,0,0,0,0,24.5,0,24.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Pokkers unger, De",1947,93,NA,7.2,9,0,0,0,0,0,24.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Poklonnik",2001,93,NA,6.1,14,24.5,0,0,4.5,4.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Pokolenie",1955,83,NA,6.9,96,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pokuszenie",1995,12,NA,6,10,0,0,0,34.5,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,1,1 -"Pol Pot's Birthday",2004,10,9000,8.7,11,0,0,4.5,0,0,0,4.5,24.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Pola X",1999,134,NA,5.8,677,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Polagana predaja",2001,90,NA,4,7,44.5,0,0,0,14.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Polanow",2002,22,NA,6.8,7,0,0,0,0,0,14.5,44.5,44.5,0,0,"",0,0,0,1,0,1,1 -"Polaquito, El",2003,92,NA,7.5,87,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Polar",1984,97,NA,6,14,4.5,0,24.5,0,4.5,4.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Polar Express, The",2004,99,150000000,6.8,4045,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Polar Outpost",1957,15,NA,6.1,7,0,0,0,0,14.5,44.5,0,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Polar Pals",1939,6,NA,6.9,17,0,0,0,0,4.5,24.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Polar Trappers",1938,8,NA,6.6,55,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Polaroid",2000,96,NA,5.6,11,0,14.5,0,0,4.5,0,24.5,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Poles Apart",2000,86,NA,7.8,10,0,0,0,14.5,0,14.5,0,64.5,0,24.5,"",0,0,0,0,1,0,0 -"Policajac sa Petlovog brda",1992,91,NA,5.6,12,4.5,0,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Policarpo, ufficiale di scrittura",1959,104,NA,4.6,12,4.5,0,0,24.5,0,24.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Police",1916,25,NA,7,105,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Police",1985,113,NA,6.4,260,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Police 2020",1997,102,NA,4.2,7,0,24.5,14.5,0,14.5,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Police Academy",1984,96,4500000,5.7,8268,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Police Academy 2: Their First Assignment",1985,97,NA,4.4,5022,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Police Academy 3: Back in Training",1986,83,NA,3.8,4411,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Police Academy 4: Citizens on Patrol",1987,88,NA,3.4,5501,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Police Academy 5: Assignment: Miami Beach",1988,90,NA,2.9,5066,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Police Academy 6: City Under Siege",1989,84,NA,2.8,4328,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Police Academy: Mission to Moscow",1994,83,NA,2.2,5352,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Police Beat",2005,80,500000,2.7,22,0,44.5,4.5,0,4.5,14.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Police Python 357",1976,125,NA,6.7,151,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Police Rescue",1994,94,NA,4.7,57,4.5,0,0,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Police State",1987,18,NA,5,32,14.5,4.5,0,4.5,4.5,4.5,0,4.5,24.5,24.5,"",0,0,0,1,0,0,1 -"Police des moeurs",1987,90,NA,3.6,24,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Policewomen",1974,90,NA,5.2,30,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Policia corrupto",1996,90,NA,2.3,6,14.5,14.5,14.5,0,0,45.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Policy Girl, The",1934,20,NA,4.1,7,0,14.5,14.5,14.5,45.5,0,0,0,0,0,"",0,0,0,0,0,1,1 -"Policy and Pie",1918,7,NA,5.1,14,14.5,0,4.5,4.5,34.5,0,24.5,0,4.5,0,"",0,1,1,0,0,0,1 -"Polio Water",1995,18,NA,6.3,9,24.5,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Polish Vampire in Burbank",1985,84,3000,3.5,77,34.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Polish Wedding",1998,105,NA,5.3,921,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Polished",2002,18,NA,8.4,10,14.5,0,14.5,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Polissons et galipettes",2002,69,NA,6.7,56,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Polisz kicz projekt",2003,80,NA,4.4,7,24.5,14.5,14.5,0,0,0,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Politics",1931,73,NA,6,25,4.5,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Politics of Fur, The",2002,77,NA,6.8,55,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Politiki kouzina",2003,108,NA,7.8,603,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Polizei",1988,88,NA,7.4,53,4.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Polizeirevier Davidswache",1964,97,NA,6.2,6,0,0,0,0,14.5,45.5,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Polizia accusa: il servizio segreto uccide, La",1975,98,NA,5,18,14.5,0,4.5,0,4.5,14.5,0,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Polizia ha le mani legate, La",1974,95,NA,6.9,6,0,0,0,0,0,14.5,45.5,0,34.5,0,"",0,0,0,0,0,0,0 -"Polizia incrimina la legge assolve, La",1973,98,NA,7.2,54,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Polizia ringrazia, La",1972,100,NA,7.2,27,0,0,0,4.5,0,14.5,34.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Poliziotta a New York, La",1981,91,NA,4.3,17,14.5,4.5,14.5,24.5,4.5,24.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Poliziotta, La",1974,100,NA,4.6,12,4.5,4.5,0,0,0,14.5,34.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Poliziotti violenti",1976,94,NA,5,11,0,14.5,0,4.5,0,0,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Polka-Dot Puss",1949,8,NA,6.7,25,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Pollock",2000,132,6000000,7.1,4013,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Polly of the Circus",1932,69,NA,5.2,40,4.5,4.5,4.5,24.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pollyanna",1920,58,300000,7.3,45,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Pollyanna",1960,134,NA,7.2,1076,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Polo Joe",1936,65,NA,6,12,14.5,0,0,4.5,4.5,34.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Poloiset ja paranormaali",2000,2,NA,7.8,5,0,0,0,0,0,0,24.5,84.5,0,0,"",0,0,0,0,0,0,1 -"Polowanie na muchy",1969,104,NA,7.6,18,0,0,0,14.5,0,4.5,44.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Polski Crash",1993,92,NA,6.1,7,14.5,0,14.5,0,14.5,14.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Poltergeist",1982,114,10700000,7.3,11575,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Poltergeist II: The Other Side",1986,130,19000000,4.9,2482,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Poltergeist III",1988,98,9500000,3.7,2081,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Polvere di Napoli",1998,98,NA,8.2,5,0,0,0,0,0,24.5,24.5,0,44.5,24.5,"",0,0,1,0,0,0,0 -"Polvo enamorado",2003,105,NA,5.8,14,0,0,0,24.5,14.5,0,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Polyclinique de l'amour, La",1998,7,NA,7.9,6,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Polyester",1981,86,300000,6.5,1115,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Polymorph",1996,86,10000,5.9,19,14.5,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Polyoty vo sne i nayavu",1982,92,NA,7.7,56,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Polytehnitis kai erimospitis",1963,86,NA,8.8,27,0,0,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Pomme, la figue et l'amande, La",2000,35,NA,7.2,6,0,0,0,0,0,0,34.5,34.5,0,34.5,"",0,0,0,0,0,0,1 -"Pompatus of Love, The",1996,99,NA,5.5,267,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Pon un hombre en tu vida",1996,87,NA,7.4,70,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Ponchada",1994,14,NA,9.2,9,0,0,0,14.5,0,0,14.5,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Ponette",1996,97,NA,7.4,1267,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Pong",1986,114,NA,4.9,8,24.5,0,0,24.5,14.5,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Poniedzialek",1998,93,NA,5.7,13,4.5,0,34.5,0,0,14.5,34.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Poniente",2002,94,NA,6.9,37,0,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Poniro thiliko, katergara gynaika",1980,97,NA,2.7,6,45.5,14.5,0,0,14.5,14.5,0,0,0,0,"",0,0,1,0,0,1,0 -"Pont des Arts, Le",2004,126,NA,7,51,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Pont du Nord, Le",1982,129,NA,6.9,27,0,14.5,0,0,4.5,0,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Ponterosa",2001,105,NA,1.8,311,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pontiac Moon",1994,108,NA,4.7,198,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pontikaki, To",1954,91,NA,5.2,7,0,0,14.5,24.5,0,14.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Pontioi, Oi",1986,95,NA,2.6,5,0,44.5,24.5,24.5,0,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Pony",2002,5,NA,9.2,10,0,14.5,0,0,0,0,0,0,0,94.5,"",0,0,0,0,0,0,1 -"Pony Express",1953,101,NA,5.4,117,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pony Express Days",1940,20,NA,5.7,10,0,0,0,24.5,34.5,44.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Pony Express Rider",1976,100,NA,5.2,26,14.5,4.5,4.5,4.5,24.5,0,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Pony Glass",1998,15,NA,6.2,7,14.5,0,0,0,0,24.5,45.5,0,0,0,"",0,1,0,0,0,0,1 -"Pony Soldier",1952,82,NA,5.9,59,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ponzio Pilato",1962,93,NA,3.2,21,4.5,14.5,0,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pooh's Heffalump Movie",2005,68,20000000,6.7,295,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Pool Days",1993,27,NA,6.6,51,4.5,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Pool Sharks",1915,15,NA,6.1,144,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Pool of London",1951,85,NA,7.2,29,0,0,0,0,4.5,24.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pool, The",2004,22,NA,4,5,24.5,24.5,24.5,24.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Poolhall Junkies",2002,94,4000000,6.6,1411,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Poolse bruid, De",1998,86,NA,7.1,322,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Poolside Ecstacy",1994,8,NA,4.2,26,4.5,4.5,0,0,0,4.5,0,4.5,4.5,64.5,"",0,0,1,0,0,0,1 -"Poopdeck Pappy",1940,6,NA,6.7,21,0,0,0,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Poor Cecily",1973,62,NA,4.1,15,24.5,4.5,4.5,14.5,4.5,0,0,4.5,0,44.5,"",0,0,0,1,0,0,0 -"Poor Cinderella",1934,11,NA,6.8,34,0,0,14.5,4.5,4.5,14.5,14.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Poor Cow",1967,101,NA,6.5,121,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Poor Little Rich Girl",1936,75,NA,6.8,148,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Poor Little Rich Girl, The",1917,65,NA,6.9,36,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Poor Man's Dope",2003,41,NA,3.1,11,0,14.5,4.5,0,0,0,0,0,14.5,45.5,"",0,0,0,1,1,0,1 -"Poor Pretty Eddy",1975,92,NA,3.9,31,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Poor White Trash",2000,85,NA,4.6,375,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Poor and Hungry, The",2000,118,NA,8.3,77,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Pootie Tang",2001,70,3000000,4.1,1921,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Pop",1996,3,NA,5.1,32,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,1,0,0,0,0,1 -"Pop & Me",1999,91,NA,6.3,67,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,0,1,0,0 -"Pop 'im Pop!",1950,7,NA,7,19,0,0,0,0,14.5,14.5,24.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Pop Always Pays",1940,67,NA,5.6,26,0,0,0,14.5,34.5,14.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Pop Corn",1998,10,NA,6.8,19,24.5,4.5,4.5,0,4.5,0,0,14.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Pop Gear",1965,70,NA,4.6,38,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pop Goes Your Heart",1934,7,NA,6.4,14,0,0,4.5,24.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Pop Goes the Easel",1935,20,NA,8.2,81,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Pop Weed Sayong",2001,90,NA,5.4,21,4.5,4.5,0,4.5,14.5,14.5,14.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Popcorn",1969,85,NA,4.4,14,4.5,4.5,0,4.5,34.5,0,14.5,4.5,0,24.5,"",0,0,0,0,1,0,0 -"Popcorn",1991,91,NA,4.6,310,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Pope Joan",1972,132,NA,4.5,39,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pope Must Die, The",1991,95,NA,4.7,390,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pope of Greenwich Village, The",1984,121,NA,6.1,923,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Pope of Utah, The",1993,83,40000,7.1,10,24.5,0,0,0,0,14.5,34.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Popeye",1980,115,20000000,4.8,4822,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Popeye Makes a Movie",1950,9,NA,4.7,9,0,14.5,24.5,14.5,44.5,0,0,14.5,0,0,"",0,1,1,0,0,0,1 -"Popeye Meets Hercules",1948,7,NA,6.5,22,0,0,0,24.5,14.5,14.5,4.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Popeye Meets Rip Van Winkle",1941,6,NA,5.1,16,0,0,24.5,14.5,0,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Popeye Meets William Tell",1940,6,NA,5.3,16,0,4.5,14.5,24.5,4.5,14.5,4.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Popeye Presents Eugene, the Jeep",1940,6,NA,5.7,15,0,0,4.5,24.5,14.5,14.5,24.5,24.5,4.5,0,"",0,1,1,0,0,0,1 -"Popeye and the Pirates",1947,7,NA,5.9,9,0,0,14.5,14.5,24.5,0,0,44.5,0,14.5,"",0,1,1,0,0,0,1 -"Popeye for President",1956,6,NA,5.8,22,0,4.5,14.5,0,24.5,24.5,4.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Popeye the Sailor",1933,7,NA,6.1,32,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Popeye the Sailor Meets Ali Baba's Forty Thieves",1937,19,NA,7.4,93,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Popeye the Sailor Meets Sindbad the Sailor",1936,16,NA,8,98,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Popeye's 20th Anniversary",1954,7,NA,4.8,9,0,0,24.5,14.5,0,34.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Popeye's Premiere",1949,11,NA,5.2,7,0,0,14.5,14.5,14.5,0,44.5,0,14.5,0,"",1,1,1,0,0,0,1 -"Popeye, the Ace of Space",1953,7,NA,4.7,20,14.5,4.5,0,44.5,0,24.5,14.5,4.5,14.5,0,"",0,1,1,0,0,0,1 -"Popi",1969,113,NA,6.1,128,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Popioly",1965,234,NA,7.4,29,4.5,0,0,0,4.5,14.5,34.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Poppea... una prostituta al servizio dell'impero",1972,93,NA,3.8,12,0,24.5,0,24.5,14.5,24.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Poppies Are Also Flowers",1966,80,NA,4.6,58,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Poppitz",2002,99,NA,6.9,249,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Poppy",1936,75,NA,7.3,69,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Popstar",2000,84,NA,2.7,71,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Popsy Pop",1971,100,NA,4,21,0,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Popular Melodies",1933,9,NA,5.2,7,0,0,0,14.5,45.5,14.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Populi",2002,8,NA,7.5,13,0,0,0,0,4.5,4.5,14.5,14.5,34.5,24.5,"",0,1,0,0,0,0,1 -"Por la libre",2000,96,NA,7.2,119,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Por mis pistolas",1968,123,NA,5.6,13,4.5,0,4.5,0,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Por primera vez",1967,9,NA,7,15,0,0,0,0,4.5,24.5,34.5,24.5,4.5,0,"",0,0,0,0,1,0,1 -"Por si no te vuelvo a ver",1997,97,NA,7.9,31,0,0,0,0,0,4.5,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Poranek kojota",2001,100,NA,6.2,115,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Porcaria",1994,35,NA,8.2,5,0,0,0,0,24.5,0,0,44.5,0,44.5,"",0,0,0,0,0,0,1 -"Porcelain Pussy, The",2004,15,NA,8.4,7,0,0,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Porci con le ali",1977,102,NA,7,6,0,0,14.5,14.5,0,34.5,0,34.5,0,0,"",0,0,0,1,0,0,0 -"Porcile",1969,99,NA,6.5,178,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Poretta eli Keisarin uudet pisteet",1941,102,NA,3.7,6,0,0,14.5,14.5,0,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Porgi l'altra guancia",1974,100,NA,5.6,246,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Porgy and Bess",1959,138,7000000,7.9,282,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Pork Chop Hill",1959,97,NA,7.2,496,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Porklips Now",1980,22,NA,7.5,76,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Porky & Daffy",1938,7,NA,7.4,24,0,0,0,4.5,0,4.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Porky Chops",1949,7,NA,6,57,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Porky Pig's Feat",1943,9,NA,7.8,35,0,0,0,4.5,4.5,4.5,4.5,24.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Porky and Gabby",1937,7,NA,7.2,18,0,0,0,0,14.5,14.5,14.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Porky and Teabiscuit",1939,8,NA,6.7,13,0,0,0,4.5,4.5,14.5,34.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Porky at the Crocadero",1938,8,NA,8.2,10,0,0,14.5,0,14.5,14.5,14.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Porky in Egypt",1938,7,NA,7,14,4.5,0,0,0,0,14.5,34.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Porky in Wackyland",1938,7,NA,8.9,86,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,1,1,0,0,0,1 -"Porky in the North Woods",1936,7,NA,7,5,0,0,0,0,0,0,100,0,0,0,"",0,1,1,0,0,0,1 -"Porky the Fireman",1938,6,NA,7.8,7,0,14.5,0,0,0,14.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Porky the Giant Killer",1939,8,NA,6.9,14,4.5,0,0,0,0,4.5,45.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Porky the Gob",1938,8,NA,6,7,14.5,0,0,14.5,14.5,14.5,14.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Porky the Rain-Maker",1936,8,NA,8.5,15,0,0,0,0,0,0,14.5,44.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Porky the Wrestler",1937,7,NA,7.1,11,0,0,0,0,34.5,4.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Porky's",1982,94,4000000,5.4,5483,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Porky's Ant",1941,7,NA,6.9,11,0,0,4.5,0,14.5,4.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Porky's Badtime Story",1937,7,NA,7.6,18,4.5,0,0,4.5,0,0,44.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Porky's Baseball Broadcast",1940,7,NA,6.2,15,0,4.5,0,24.5,4.5,14.5,0,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Porky's Bear Facts",1941,7,NA,6.8,21,0,4.5,0,4.5,4.5,14.5,34.5,4.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Porky's Building",1937,8,NA,6.3,10,0,0,0,0,34.5,24.5,0,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Porky's Cafe",1942,7,NA,5.4,13,4.5,0,0,0,24.5,14.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Porky's Double Trouble",1937,8,NA,7.1,9,14.5,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Porky's Duck Hunt",1937,9,NA,7.8,48,0,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Porky's Five & Ten",1938,7,NA,7.2,11,0,0,0,0,4.5,4.5,34.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Porky's Garden",1937,7,NA,6.6,24,0,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,0,"",0,1,1,0,0,0,1 -"Porky's Hare Hunt",1938,8,NA,6.9,21,4.5,0,0,0,4.5,14.5,44.5,24.5,4.5,0,"",0,1,1,0,0,0,1 -"Porky's Hero Agency",1937,7,NA,7.6,17,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Porky's Hired Hand",1940,7,NA,5.8,17,0,4.5,0,0,24.5,34.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Porky's Hotel",1939,7,NA,7.1,7,0,0,0,0,14.5,14.5,0,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Porky's II: The Next Day",1983,98,6500000,4,1623,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Porky's Last Stand",1940,6,NA,6.6,12,0,0,0,0,4.5,14.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Porky's Midnight Matinee",1941,7,NA,6.3,13,0,0,0,0,24.5,24.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Porky's Movie Mystery",1939,7,NA,7.1,13,0,0,4.5,0,4.5,14.5,4.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Porky's Naughty Nephew",1938,8,NA,6.3,13,0,0,0,24.5,0,34.5,14.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Porky's Party",1938,7,NA,7.7,17,0,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Porky's Pastry Pirates",1942,7,NA,6.7,11,0,0,14.5,0,0,4.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Porky's Picnic",1939,7,NA,6.2,12,0,0,0,14.5,0,34.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Porky's Pooch",1941,7,NA,6.1,21,4.5,0,0,4.5,0,14.5,14.5,34.5,14.5,0,"",0,1,1,0,0,0,1 -"Porky's Poor Fish",1940,7,NA,7.4,15,0,0,0,4.5,0,24.5,34.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Porky's Poppa",1938,7,NA,6.8,16,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Porky's Poultry Plant",1936,8,NA,7,8,0,0,0,0,14.5,24.5,24.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Porky's Preview",1941,6,NA,8.1,18,0,0,0,0,4.5,0,24.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Porky's Prize Pony",1941,7,NA,7.8,5,0,0,0,0,0,24.5,0,64.5,0,24.5,"",0,1,1,0,0,0,1 -"Porky's Railroad",1937,7,NA,6.3,17,0,4.5,4.5,14.5,4.5,24.5,14.5,24.5,4.5,0,"",0,1,1,0,0,0,1 -"Porky's Revenge",1985,92,9000000,3.7,1143,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Porky's Road Race",1937,7,NA,6.7,9,0,0,0,0,0,24.5,44.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Porky's Romance",1937,8,NA,5.9,16,14.5,0,0,0,14.5,14.5,4.5,34.5,0,24.5,"",0,1,1,0,0,1,1 -"Porky's Snooze Reel",1941,7,NA,7.5,6,0,0,0,14.5,0,0,34.5,34.5,14.5,0,"",0,1,1,0,0,0,1 -"Porky's Spring Planting",1938,7,NA,6.6,7,0,0,0,14.5,14.5,0,44.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Porky's Super Service",1937,7,NA,7,10,0,0,0,0,14.5,14.5,24.5,34.5,0,34.5,"",0,1,1,0,0,0,1 -"Porky's Tire Trouble",1939,7,NA,6.1,9,0,0,0,0,24.5,24.5,14.5,24.5,24.5,0,"",0,1,1,0,0,0,1 -"Porn",1994,10,NA,6.3,16,34.5,0,4.5,0,4.5,14.5,4.5,0,0,34.5,"",0,0,0,0,1,0,1 -"Porn Star: The Legend of Ron Jeremy",2001,80,NA,6.6,685,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"R",0,0,0,0,1,0,0 -"Porno",1990,78,NA,3.7,66,34.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Porno shop della settima strada, Il",1979,77,NA,2.1,11,24.5,0,0,4.5,4.5,14.5,0,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Pornografia",2003,117,NA,6.7,110,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Pornographe, Le",2001,108,NA,5.9,286,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pornographer, The",1994,93,NA,2.6,22,14.5,14.5,14.5,0,4.5,0,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Pornographer, The",1999,89,NA,5.6,328,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Pornographer: A Love Story, The",2000,81,NA,2.8,24,44.5,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Porr i skandalskolan",1974,80,NA,5.9,8,0,0,24.5,14.5,0,14.5,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Porridge",1979,93,NA,6.2,206,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Port Afrique",1956,92,NA,4.3,9,0,24.5,0,34.5,0,24.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Port Djema",1997,95,NA,4.6,37,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Port Sinister",1953,65,NA,4.6,17,4.5,4.5,24.5,14.5,14.5,14.5,0,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Port of Hell",1954,80,NA,6.1,5,0,0,0,24.5,0,24.5,64.5,0,0,0,"",0,0,0,1,0,0,0 -"Port of Last Resort, The",1998,79,NA,8.2,27,0,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Port of Lost Dreams",1934,71,NA,6.5,5,0,24.5,0,0,24.5,0,0,44.5,24.5,0,"",0,0,0,1,0,1,0 -"Port of New York",1949,82,NA,6.1,49,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Port of Seven Seas",1938,81,NA,7,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Porta del cannone",1969,92,NA,3.4,6,0,14.5,14.5,34.5,34.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Portaborse, Il",1991,90,NA,7.3,121,4.5,0,0,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Portal: The Movie",2003,29,15000,8.4,5,0,0,0,0,0,24.5,0,24.5,44.5,24.5,"",0,0,1,0,0,0,1 -"Porte aperte",1990,108,NA,6.8,109,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Porte des Lilas",1957,95,NA,7.3,57,0,0,0,4.5,4.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Portefeuille, Le",2003,10,NA,7.2,15,0,4.5,0,0,0,0,44.5,24.5,0,34.5,"",0,1,0,1,0,0,1 -"Portero, El",2000,88,NA,6.4,73,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Portes de la gloire, Les",2001,89,NA,6.1,210,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Portes de la nuit, Les",1946,100,NA,7.4,99,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Portes tournantes, Les",1988,101,NA,6.9,51,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Portes, Les",1993,5,NA,3,18,4.5,0,0,0,0,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Porteuse de pain, La",1963,122,NA,6.9,10,0,0,0,0,14.5,44.5,34.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Portfolio",1983,83,NA,4.2,17,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Portiere di notte, Il",1974,115,NA,6.6,1002,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Portile albastre ale orasului",1973,98,NA,9.7,13,0,0,0,0,0,0,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Portishead live in N.Y.",1997,93,NA,9,130,0,0,4.5,0,4.5,4.5,4.5,4.5,14.5,74.5,"",0,0,0,0,1,0,0 -"Portland",1996,103,NA,6.2,89,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Portnoy's Complaint",1972,101,NA,4.5,78,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Porto Santo",1997,90,NA,3.8,10,24.5,0,24.5,24.5,14.5,0,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Porto das Caixas",1962,80,NA,8,11,0,0,0,0,0,4.5,44.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Portrait d'un assassin",1949,100,NA,5.9,19,0,0,0,4.5,14.5,24.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Portrait from Life",1948,90,NA,6.5,12,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Portrait in Black",1960,112,NA,5.6,116,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Portrait in Red",1995,90,NA,2.3,23,24.5,14.5,24.5,14.5,4.5,4.5,4.5,0,0,0,"R",0,0,0,0,0,0,0 -"Portrait in Terror",1965,81,NA,3.4,8,34.5,0,0,14.5,14.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Portrait of Arshile, A",1995,4,NA,6.1,26,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Portrait of Christy",1990,82,NA,6.5,9,0,14.5,0,0,0,14.5,24.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Portrait of Jason",1967,105,NA,7.8,15,0,0,0,14.5,0,24.5,24.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Portrait of Jennie",1948,86,4041000,7.5,954,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Portrait of Seduction",1976,76,NA,7.2,5,0,0,24.5,0,24.5,0,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Portrait of a Genius",1943,10,NA,6.4,8,0,0,14.5,0,0,34.5,34.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Portrait of a Hitman",1977,86,NA,3.9,30,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Portrait of a Lady, The",1996,142,NA,5.9,2221,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Portrait of a Mobster",1961,108,NA,6.5,25,0,0,0,4.5,4.5,34.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Portrait of a White Marriage",1988,101,NA,5.4,12,4.5,4.5,0,4.5,14.5,14.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Portrait of a Young Man Drowning",1999,11,NA,6.2,9,0,0,0,34.5,0,0,44.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Portrait of the Artist as a Young Man, A",1977,92,NA,5.3,42,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Portrait spirituel, Le",1903,2,NA,4.7,5,24.5,24.5,0,0,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Portraits chinois",1996,111,NA,6.4,192,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Portraits of a Killer",1996,93,NA,4.5,46,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Portret zheny khudozhnika",1981,88,NA,8.4,7,0,0,0,0,0,0,24.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Portugal S.A.",2004,95,NA,6.2,23,4.5,14.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Porzus",1997,121,NA,2.3,21,14.5,4.5,4.5,0,4.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Poseban tretman",1980,94,NA,8.1,18,0,0,0,4.5,4.5,0,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Poseidon Adventure, The",1972,117,5000000,6.8,5591,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Poseidon's Fury: Escape From the Lost City",1999,18,NA,5.5,9,0,0,0,14.5,0,0,24.5,14.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Posers",2002,80,NA,4.1,86,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Position de l'escargot, La",1999,100,NA,5.4,10,0,0,0,14.5,34.5,44.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Positive I.D.",1987,95,NA,5.4,83,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Posle dozhdichka, v chetverg",1985,78,NA,6.6,7,0,0,0,0,0,14.5,0,74.5,0,14.5,"",0,0,0,0,0,0,0 -"Posledniy poezd",2003,82,NA,6.5,28,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Poslednja trka",1979,87,NA,8.6,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Poslednji krug u Monci",1989,102,NA,7.4,16,0,4.5,0,4.5,4.5,0,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Poslednyaya zhertva",1975,103,NA,6.1,8,0,14.5,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,1,0,1,0 -"Poslesloviye",1983,98,NA,8.3,7,0,0,0,0,14.5,0,14.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Poslizg",1972,81,NA,5.6,5,0,0,0,24.5,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Posljednji podvig diverzanta Oblaka",1978,108,NA,7.4,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Posredine mira",1990,16,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,1,0,0,1 -"Posse",1975,92,NA,6.1,201,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Posse",1993,111,NA,5,686,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Posse Cat",1954,6,NA,6.4,20,0,0,0,14.5,0,24.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Posse from Hell",1961,89,NA,6.1,48,4.5,0,0,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Possessed",1931,76,NA,6.5,145,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Possessed",1947,108,NA,7,250,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Possessed by the Night",1994,94,NA,3.2,103,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Possession",1981,80,NA,6.8,727,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Possession",1987,90,NA,4.4,14,24.5,4.5,4.5,24.5,14.5,0,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Possession of Joel Delaney, The",1972,105,1300000,5.1,121,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Posseteni ot gospoda",2001,118,NA,7.7,9,0,0,0,0,24.5,14.5,0,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Possible Worlds",2000,93,NA,6.8,281,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Possum",1997,15,NA,4.3,24,4.5,4.5,0,4.5,0,4.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Possums",1998,97,1400000,5.3,66,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Post Concussion",1999,82,NA,6.6,24,4.5,0,0,0,4.5,0,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Post Mortem",1999,92,NA,7.2,163,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Post No Bills",1992,57,NA,6,24,14.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Post geht ab, Die",1962,90,NA,1.9,8,45.5,34.5,14.5,0,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Postage Due",1924,20,NA,5.5,5,0,0,24.5,0,0,44.5,24.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Postal Inspector",1936,58,NA,5.4,10,0,0,14.5,14.5,34.5,44.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Postal Worker",1998,85,NA,3,36,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Postav dom, zasad strom",1980,93,NA,7,10,0,0,0,0,14.5,24.5,44.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Postcards from America",1994,92,NA,5.6,76,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Postcards from the Edge",1990,101,NA,6.3,2531,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Postcards from the Future: The Chuck Palahniuk Documentary",2003,90,NA,7.8,34,0,0,0,0,0,4.5,4.5,14.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Postel",1998,90,NA,4.9,9,0,24.5,0,0,0,24.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Poster Boy",2004,104,NA,7.2,28,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Postino, Il",1994,108,3000000,7.6,8342,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG",0,0,1,1,0,1,0 -"Postkort fra Mars",2001,27,NA,4,8,14.5,14.5,34.5,14.5,14.5,0,0,14.5,0,0,"",0,0,0,1,0,0,1 -"Postman Always Rings Twice, The",1946,113,NA,7.6,2188,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Postman Always Rings Twice, The",1981,122,NA,6.3,2377,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Postman's Knock",1962,88,NA,4.7,30,0,0,4.5,4.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Postman, The",1997,177,80000000,5.2,8773,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Postmark Paradise",2000,92,NA,5.4,37,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"R",0,0,1,0,0,0,0 -"Postmeister, Der",1940,95,NA,7.7,14,0,0,0,0,0,4.5,34.5,14.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Posto all'inferno, Un",1969,107,NA,5.8,7,0,0,14.5,0,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Posto dell'anima, Il",2003,106,NA,7.3,47,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Posto, Il",1961,90,NA,8.2,213,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Postriziny",1980,99,NA,7.3,199,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Posture Pals",1952,10,NA,2.3,18,44.5,34.5,4.5,4.5,0,0,0,4.5,0,0,"",0,0,0,0,0,0,1 -"Posutoman burusu",1997,110,NA,7.5,323,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",1,0,1,1,0,0,0 -"Poszukiwany - poszukiwana",1973,82,NA,8.1,66,0,0,0,4.5,0,4.5,4.5,24.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Pot Luck",1936,71,NA,5,5,0,0,0,0,84.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Pot o' Gold",1941,86,NA,5.5,169,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Pot-Bouille",1957,115,NA,7,37,4.5,4.5,0,0,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Potato Fritz",1976,94,NA,4.3,26,14.5,0,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Potato Hunter, The",1990,7,NA,5.8,16,4.5,0,0,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Pote tin Kyriaki",1960,97,NA,7.3,462,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Poteau rose, Le",2002,15,NA,7.1,6,0,0,0,0,0,0,64.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Potestad",2002,90,NA,6.8,9,0,0,24.5,0,0,0,24.5,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Potloodmoorden, De",1982,80,NA,5.7,10,0,0,14.5,0,44.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Poto and Cabengo",1979,76,NA,6.1,25,0,0,4.5,4.5,14.5,24.5,4.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Potomok Chingis-Khana",1928,126,NA,7.5,113,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Potonulo groblje",2002,102,NA,3.8,15,24.5,4.5,0,34.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Potop",1974,315,NA,8.4,144,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Pots and Pans",1932,6,NA,4.9,8,0,0,0,34.5,24.5,24.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Potted Psalm, The",1946,24,NA,5.6,5,24.5,0,0,24.5,24.5,0,24.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Poulet au vinaigre",1985,110,NA,6.5,157,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Poulet, Le",1962,15,NA,3.3,11,14.5,4.5,0,0,0,4.5,14.5,0,14.5,24.5,"",0,0,1,0,0,0,1 -"Poulette grise, La",1947,6,NA,7.8,11,0,0,0,0,0,14.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Poulpe, Le",1998,100,NA,6.5,155,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Poultry Pirates",1938,9,NA,6.1,5,0,0,0,0,44.5,44.5,0,24.5,0,0,"",0,1,1,0,0,0,1 -"Pound",1970,92,NA,4.1,29,14.5,4.5,0,0,4.5,14.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Pound Puppies and the Legend of Big Paw",1988,73,NA,3.4,28,14.5,4.5,14.5,4.5,14.5,14.5,4.5,0,4.5,24.5,"",0,1,0,0,0,0,0 -"Pour 100 briques t'as plus rien...",1982,100,NA,5.6,84,4.5,0,4.5,14.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pour Sacha",1991,114,NA,5.6,92,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pour la peau d'un flic",1981,110,NA,6.7,174,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pour la suite du monde",1963,84,NA,8.6,38,0,0,0,4.5,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Pour le meilleur et pour le pire",1975,117,NA,5.8,5,0,0,0,0,64.5,24.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Pour le plaisir",2004,82,NA,6.2,15,0,0,14.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Pour rire!",1996,100,NA,6.7,75,4.5,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pourkoi... passkeu",2003,6,NA,6.4,9,0,0,0,0,14.5,14.5,64.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Pourquoi maman est dans mon lit?",1994,92,NA,4.7,10,34.5,0,0,24.5,24.5,0,0,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Pourquoi pas moi?",1999,94,NA,7.1,258,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Pourquoi pas nous?",1981,85,NA,5.9,7,14.5,0,0,0,0,44.5,44.5,0,0,0,"",0,0,1,0,0,1,0 -"Pourquoi pas!",1977,93,NA,7,40,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Pourquoi se marier le jour de la fin du monde?",2000,71,NA,6.3,22,4.5,0,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Pourvu qu'elles soient douces (Libertine II)",1989,18,NA,8.2,53,0,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,1,1 -"Pouvoir intime",1986,86,NA,7.3,52,0,4.5,0,0,14.5,4.5,34.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Poveri ma belli",1957,101,NA,6.6,46,4.5,0,0,0,14.5,4.5,44.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Povero ricco, Un",1983,92,NA,4.7,22,4.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,0,"",0,0,1,0,0,1,0 -"Poveste la scara 'C'",2003,14,NA,7.2,20,0,0,0,0,14.5,0,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Povratak",1966,70,NA,9,6,0,0,0,0,0,0,14.5,0,45.5,34.5,"",0,0,0,1,0,0,0 -"Povratak",1979,94,NA,8.9,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Povratak lopova",1998,90,NA,3.9,9,34.5,0,0,24.5,0,0,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Povratak otpisanih",1976,95,NA,7.6,43,4.5,0,0,4.5,4.5,0,14.5,14.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Powaqqatsi",1988,99,NA,7.2,962,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Powder",1995,111,NA,6,4666,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Powder River",1953,78,NA,5.7,14,0,4.5,0,4.5,14.5,44.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Powder Town",1942,78,NA,4.5,15,0,24.5,0,24.5,24.5,14.5,4.5,24.5,0,0,"",0,0,1,1,0,0,0 -"Powderburn",1995,87,NA,2.8,21,24.5,4.5,4.5,14.5,4.5,0,0,0,0,34.5,"R",0,0,0,0,0,0,0 -"Powdersmoke Range",1935,72,NA,6.7,15,0,0,0,0,4.5,14.5,44.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Power",1986,111,NA,5.5,414,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Power 98",1996,89,NA,4.4,90,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Power Elite",2002,94,NA,3.6,9,34.5,14.5,14.5,24.5,0,0,0,0,14.5,14.5,"",1,0,0,0,0,0,0 -"Power Games",1989,84,NA,2.3,8,45.5,14.5,0,14.5,0,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Power Play",1978,102,NA,4.9,57,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Power Play",1994,60,NA,2.9,17,24.5,0,0,4.5,4.5,14.5,0,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Power Play",2002,100,NA,3.6,142,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Power Trip",2003,86,NA,7.7,61,0,4.5,0,4.5,4.5,4.5,34.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Power Within, The",1995,97,NA,4.4,44,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"PG-13",1,0,0,0,0,0,0 -"Power and Terror: Noam Chomsky in Our Times",2002,98,NA,6.8,142,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Power and the Glory, The",1933,76,NA,6.5,59,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Power and the Land",1940,38,NA,7.3,17,0,0,4.5,0,14.5,4.5,44.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Power and the Prize, The",1956,98,NA,5.7,34,0,4.5,0,14.5,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Power of Attorney",1995,97,NA,5.6,67,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Power of One, The",1992,127,NA,6.7,1947,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Power of the Press, The",1928,62,NA,8,7,0,0,0,0,0,0,24.5,74.5,0,0,"",0,0,0,1,0,0,0 -"Power of the Whistler, The",1945,66,NA,6.8,15,0,0,0,0,24.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Power, The",1968,108,NA,5.8,216,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Power, The",1984,84,NA,3.1,22,14.5,14.5,14.5,4.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Powerless",2004,116,NA,7.5,12,14.5,4.5,0,0,0,0,0,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Powerplay",2004,3,NA,7.5,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,1,1,0,0,0,1 -"Powerpuff Girls, The",2002,73,10000000,6.2,1334,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",1,1,1,0,0,0,0 -"Powers",2000,28,NA,7.6,6,0,0,0,0,14.5,0,34.5,14.5,34.5,0,"",0,0,1,0,0,0,1 -"Powers Girl, The",1943,93,NA,7.1,5,0,0,0,0,24.5,0,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Powers of Ten",1977,9,NA,8.3,116,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,0,0,1,0,1 -"Powwow Highway",1989,88,NA,7.1,339,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Pozegnania",1958,90,NA,5.7,14,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Pozegnanie jesieni",1990,84,NA,3.5,13,14.5,0,0,4.5,0,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Pozegnanie z Maria",1993,87,NA,7,6,0,0,0,14.5,0,0,45.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Poznan 56",1996,106,NA,4.9,11,0,4.5,14.5,0,0,0,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pozor, vizita!",1981,88,NA,7.1,23,0,0,0,0,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pra Frente, Brasil",1982,105,NA,7.6,36,0,0,0,0,14.5,4.5,14.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Prabhupada: A Lifetime In Preparation",1996,55,NA,6.5,8,0,0,0,14.5,0,0,0,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Practical Magic",1998,103,60000000,5.4,7786,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Practical Pig, The",1939,8,NA,8,40,0,0,0,4.5,4.5,24.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Practically Yours",1944,90,NA,8.1,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Prague",1992,88,NA,6,28,4.5,4.5,14.5,4.5,4.5,4.5,34.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Prague Duet",1998,95,NA,6.3,113,4.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Praha ocima",1999,101,NA,4.2,23,4.5,0,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Prahaar: The Final Attack",1991,166,NA,8,31,4.5,0,4.5,0,0,4.5,14.5,14.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Prairie Dogs",2001,9,NA,8.9,13,0,0,0,14.5,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Prairie Law",1940,59,NA,6,9,0,0,0,0,24.5,44.5,14.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Prairie Moon",1938,58,NA,5.9,8,0,0,14.5,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Prairie Rustlers",1945,56,23300,5.5,5,0,0,0,64.5,24.5,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Prairie Thunder",1937,55,NA,5,19,4.5,0,14.5,24.5,14.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Praise",1998,98,NA,7,217,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Praise Marx and Pass the Ammunition",1970,90,NA,6.3,6,0,14.5,0,0,0,14.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Pramen zivota",2000,107,NA,6.9,59,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Prancer",1989,103,NA,5.5,392,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Pranzo della domenica, Il",2003,96,NA,6.3,19,4.5,0,0,4.5,24.5,24.5,34.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"Pranzo onirico, Il",1997,25,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Pratibandh",1990,159,NA,6.7,15,0,0,0,4.5,4.5,0,4.5,34.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Pratidwandi",1972,110,NA,7.3,38,0,0,0,0,4.5,14.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Prato, Il",1979,115,NA,5.9,29,4.5,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Pravda",1970,58,NA,3.9,9,24.5,0,14.5,14.5,0,14.5,0,0,24.5,24.5,"",0,0,0,0,1,0,0 -"Prawdziwy koniec wielkiej wojny",1957,89,NA,6.2,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Prawo i piesc",1966,90,NA,7.1,9,0,0,0,0,0,24.5,14.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Prawo ojca",2000,87,NA,5.4,27,0,4.5,4.5,14.5,14.5,44.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Praxis Dr. Hasenbein",1997,94,NA,5.6,280,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Pray for Death",1985,92,4000000,4.4,101,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Prayer for the Dying, A",1987,107,6000000,6.1,581,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Prayer of the Rollerboys",1991,95,NA,4.5,390,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Praying with Anger",1992,107,750000,4.6,80,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Prazakum tem je hej",1990,93,NA,5.7,7,0,0,0,14.5,24.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Prazdnik Neptuna",1986,50,NA,7,18,0,0,0,4.5,14.5,0,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Prazdnik svyatogo Yorgena",1930,83,NA,9.1,13,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Pre-Hysterical Hare",1958,7,NA,6.2,27,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Pre-Hysterical Man",1948,7,NA,4.8,5,0,0,0,24.5,24.5,24.5,0,44.5,0,0,"",0,1,1,0,0,0,1 -"Preacher's Wife, The",1996,124,NA,5.2,1768,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Preacherman",1971,87,NA,4.4,25,4.5,14.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Preaching to the Perverted",1997,100,NA,4.8,209,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Prebroyavane na divite zaytzi",1973,69,NA,4.7,13,14.5,0,0,0,0,4.5,0,14.5,0,64.5,"",0,0,1,0,0,0,0 -"Precio de un hombre, El",1966,95,NA,6.9,23,4.5,0,0,4.5,0,4.5,44.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Preciosa puesta de sol, Una",2003,84,NA,7,6,0,0,0,0,14.5,0,64.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Precious Find",1996,85,NA,3.6,148,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Precious Images",1986,8,NA,9.2,64,4.5,4.5,0,4.5,0,4.5,4.5,4.5,4.5,74.5,"",0,0,0,0,1,0,1 -"Predator",1987,107,18000000,7.4,25254,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Predator 2",1990,108,NA,5.5,9858,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Predatori di Atlantide, I",1983,98,NA,4.1,83,14.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Predators From Beyond Neptune",1999,80,NA,4.2,59,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Predmestje",2004,90,NA,6.9,12,14.5,4.5,0,0,0,0,24.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Predsedatel",1964,166,NA,6.9,6,0,0,0,0,0,14.5,45.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Predskazaniye",1993,113,NA,4.9,45,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Predstava Hamleta u Mrdusi Donjoj",1974,96,NA,7.1,20,0,0,0,0,0,24.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Prefabricated Pink",1967,6,NA,6.2,10,0,0,0,0,14.5,44.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Preferans po Pyatnitsam",1984,93,NA,5.1,5,0,0,0,24.5,0,64.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Preferisco il rumore del mare",2000,84,NA,6.5,135,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Prefetto di ferro, Il",1977,110,NA,6.3,14,4.5,0,0,0,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Prefontaine",1997,106,8000000,6.4,949,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Prega il morto e ammazza il vivo",1971,90,NA,5.6,24,4.5,0,4.5,14.5,4.5,14.5,4.5,34.5,0,4.5,"",0,0,0,0,0,0,0 -"Pregi",2004,91,NA,7.4,109,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pregnant Moment, A",1999,24,NA,4.5,6,14.5,14.5,0,34.5,0,0,14.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Prego, O",1997,11,NA,8.4,5,0,0,0,0,24.5,0,24.5,0,0,64.5,"",0,0,1,0,0,0,1 -"Prehistoric Pink",1968,6,NA,6.2,9,0,0,0,0,14.5,64.5,0,24.5,0,0,"",0,1,0,0,0,0,1 -"Prehistoric Porky",1940,7,NA,6.9,15,0,14.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Prehistoric Women",1950,74,NA,2.3,47,24.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Prehistoric Women",1967,90,NA,4.4,84,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Prehysteria!",1993,81,NA,3.8,183,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Preku ezero",1997,102,NA,2.8,12,14.5,0,0,0,14.5,0,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Prelude",2000,6,NA,6.3,18,4.5,0,0,14.5,4.5,0,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Prelude to Fame",1950,78,NA,6.6,10,14.5,0,0,0,14.5,0,34.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Prelude to Love",1995,83,NA,2.8,13,24.5,0,14.5,24.5,4.5,24.5,4.5,0,0,0,"R",0,0,0,1,0,0,0 -"Prelude to War",1943,53,NA,7.7,118,4.5,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Prelude to a Kiss",1992,105,NA,5.5,1899,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Prelude: Dog Star Man",1962,25,NA,6.5,93,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Prem Pujari",1970,192,NA,6.7,7,14.5,0,0,0,14.5,0,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Premature Burial, The",1962,81,NA,6.1,346,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Premeditation",2004,23,NA,2,8,0,84.5,0,0,0,0,0,0,0,14.5,"",0,0,0,1,0,0,1 -"Premier amour",2001,8,NA,6.3,21,0,34.5,4.5,0,0,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Premier juillet, le film",2004,90,NA,5.7,34,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Premier mai",1958,85,NA,6.8,6,0,0,0,0,0,34.5,34.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Premier rendez-vous",1941,91,NA,6.8,7,0,0,0,14.5,0,24.5,0,44.5,0,14.5,"",0,0,1,0,0,0,0 -"Premiere i helvede",1964,78,NA,5.5,8,0,0,0,24.5,0,45.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Preminger: Anatomy of a Filmmaker",1991,119,NA,7.9,17,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Premiya",1974,83,NA,7.6,7,0,0,0,14.5,0,0,45.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Premonition",1972,83,NA,2.8,8,34.5,0,24.5,24.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Premonition, The",1976,94,NA,3.7,21,14.5,14.5,4.5,24.5,14.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Premutos - Der gefallene Engel",1997,110,NA,5.7,248,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Prendimi e portami via",2003,90,NA,5.9,17,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Prendimi l'anima",2002,90,NA,7,143,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Preppies",1982,79,NA,3.2,45,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Prerokbe Ognja",1996,90,NA,8.1,14,0,0,0,0,0,0,24.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Presence of Mind",1999,94,3000000,5.6,98,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Present with a Future, The",1943,3,NA,7.7,70,0,0,0,0,4.5,4.5,24.5,24.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Presenting Lily Mars",1943,102,NA,6.1,101,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Presents",1981,99,NA,7.3,9,24.5,0,0,0,0,0,0,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Preservation",2003,52,NA,9.5,6,0,0,14.5,0,0,0,0,34.5,14.5,34.5,"",0,0,0,1,0,1,0 -"President Clinton: Final Days",2000,6,NA,8.1,240,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"President McKinley Taking the Oath",1901,1,NA,3.8,9,0,0,24.5,24.5,24.5,14.5,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"President McKinley and Escort Going to the Capitol",1901,2,NA,3.5,6,0,0,34.5,45.5,14.5,0,0,0,0,0,"",0,0,0,0,1,0,1 -"President McKinley at Home",1897,1,NA,4.9,62,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,1,0,1 -"President Roosevelt at the Dedication Ceremonies, Saint Louis Exposition",1903,1,NA,3.6,5,0,0,64.5,24.5,24.5,0,0,0,0,0,"",0,0,0,0,1,0,1 -"President Vanishes, The",1934,80,NA,5.7,9,0,14.5,14.5,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"President Versus David Hicks, The",2004,81,NA,7.3,7,0,0,14.5,0,0,14.5,24.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"President's Analyst, The",1967,103,NA,7.1,700,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"President's Lady, The",1953,96,NA,6.3,126,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"President's Mystery, The",1936,80,NA,6.8,8,0,0,0,0,34.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Presidio, The",1988,97,NA,5.8,3175,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Presque rien",2000,100,NA,6.6,735,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Press Any Button",2003,8,NA,5.6,5,0,0,0,44.5,24.5,0,0,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Press Run",1999,93,NA,3.8,40,14.5,14.5,14.5,14.5,14.5,14.5,14.5,0,0,0,"R",0,0,0,0,0,0,0 -"Press for Time",1966,98,NA,4.9,46,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Pressure",1976,120,NA,7.5,10,0,0,0,14.5,14.5,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Pressure Point",1962,91,NA,6.8,124,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pressure Point",1997,97,NA,3.5,20,34.5,4.5,4.5,14.5,24.5,4.5,14.5,0,4.5,0,"",1,0,0,1,0,0,0 -"Pressure Point",2001,90,NA,4.6,58,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,0,4.5,"PG-13",1,0,0,0,0,0,0 -"Pressurecooker",1997,13,NA,2.7,72,4.5,4.5,4.5,0,0,0,0,0,4.5,84.5,"",0,0,0,1,0,0,1 -"Prest-O Change-O",1939,7,NA,6.3,23,0,0,0,4.5,14.5,24.5,24.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Prestami tua moglie",1980,99,NA,2.5,6,14.5,14.5,0,0,34.5,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Prestige",1932,71,NA,6.8,21,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Preston Tylk",2000,93,NA,5.2,131,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Prestupleniye i nakazaniye",1969,221,NA,7.3,50,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Presumed Guilty: Tales of the Public Defenders",2002,116,NA,6.8,8,0,0,0,0,0,14.5,34.5,0,24.5,24.5,"",0,0,0,0,1,0,0 -"Presumed Innocent",1990,127,NA,6.8,5608,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Prete sposato, Il",1971,98,NA,4.8,8,0,0,24.5,0,45.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Pretend",2003,75,150000,7,8,0,0,14.5,0,0,0,24.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Pretender, The",1947,69,NA,7,8,0,0,0,0,24.5,24.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Pretender, The",1987,38,NA,3.7,7,24.5,0,14.5,0,14.5,0,14.5,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Pretfilm",1976,102,NA,7.3,10,0,0,0,0,24.5,14.5,34.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Pretora, La",1976,98,NA,5.4,14,4.5,0,14.5,14.5,4.5,0,4.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Pretty Baby",1950,92,NA,6.2,18,14.5,0,0,4.5,14.5,4.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pretty Baby",1978,109,NA,6.3,1227,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pretty Boy Floyd",1960,96,NA,5.8,17,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Pretty Boys",2002,47,NA,5.9,5,0,0,44.5,0,0,0,24.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Pretty Girl, The",2002,7,NA,6.2,29,0,0,4.5,0,24.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Pretty Maids All in a Row",1971,91,NA,5.6,203,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pretty Peaches",1978,82,NA,5.8,63,4.5,0,0,4.5,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Pretty Peaches 2",1987,82,NA,6.5,24,4.5,0,0,4.5,4.5,14.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Pretty Poison",1968,89,1800000,7.3,263,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Pretty Polly",1967,102,NA,5.5,25,0,0,14.5,14.5,4.5,4.5,34.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Pretty Smart",1986,84,NA,5,87,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Pretty When You Cry",2001,90,NA,4.1,107,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Pretty Woman",1990,125,14000000,6.6,23316,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Pretty Women",1944,10,NA,7.4,7,0,0,0,14.5,0,24.5,0,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Pretty in Pink",1986,96,NA,6.3,6031,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Prettykill",1987,94,NA,2.3,25,24.5,24.5,14.5,14.5,0,4.5,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Preventive Warriors",2004,56,50000,9,12,4.5,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Preview Murder Mystery",1936,60,NA,5.8,6,0,0,14.5,0,45.5,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Prevrashcheniye",2002,80,NA,5.6,21,4.5,4.5,0,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Prey",1978,85,NA,4.3,92,14.5,4.5,14.5,14.5,4.5,4.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Prey",1995,26,NA,7.2,12,0,0,0,0,0,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Prey for Rock & Roll",2003,104,NA,6.2,429,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Prey of the Chameleon",1992,91,NA,4.6,81,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Prey of the Jaguar",1996,96,NA,3.8,28,24.5,4.5,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Prey, The",1984,80,NA,3.2,53,34.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Prezimiti u Riu",2002,90,NA,7.1,8,14.5,0,0,0,0,0,45.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Prezzo del potere, Il",1969,90,NA,6.1,21,0,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Price Above Rubies, A",1998,117,NA,6.6,780,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Price for Peace",2002,88,NA,8.1,39,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Price of Air, The",2000,88,NA,1.9,28,44.5,24.5,0,4.5,0,0,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Price of Desire, The",1997,102,NA,4.6,44,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Price of Fear, The",1956,79,NA,6,17,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Price of Glory",2000,118,10000000,6.2,265,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Price of Kissing, The",1997,93,NA,4.4,95,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Price of Milk, The",2000,87,NA,6.4,451,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,0,0,1,0 -"Price of the American Dream, The",2001,97,NA,2.1,15,34.5,14.5,0,0,0,4.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Prick Up Your Ears",1987,111,NA,7.2,827,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Pride and Prejudice",1940,117,NA,7.5,1321,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Pride and Prejudice",2003,104,NA,5.8,232,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"PG",0,0,1,0,0,1,0 -"Pride and the Passion, The",1957,133,NA,5.3,331,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Pride of Ireland",2000,60,NA,1,5,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Pride of St. Louis, The",1952,93,NA,6.3,119,0,4.5,4.5,4.5,4.5,34.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pride of the Blue Grass",1954,71,NA,6.9,9,0,0,0,14.5,14.5,14.5,24.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Pride of the Bowery",1941,61,NA,5.7,78,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Pride of the Clan, The",1917,84,NA,7,7,0,0,0,14.5,0,0,45.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Pride of the Marines",1945,119,NA,7.5,175,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Pride of the West",1938,56,NA,6.6,21,0,4.5,4.5,0,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Pride of the Yankees, The",1942,128,NA,7.6,1741,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Priest",1994,98,NA,7.2,2813,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Priest of Love",1981,125,NA,6.1,35,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Prigione di donne",1974,90,NA,5.9,11,4.5,0,4.5,0,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Prigioniere dell'isola del diavolo, Le",1962,86,NA,3.7,11,0,44.5,0,0,4.5,4.5,34.5,0,0,0,"",1,0,0,1,0,0,0 -"Prigioniero della montagna",1955,101,NA,3.9,8,0,0,34.5,24.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Prikhodite zavtra",1963,98,NA,7.7,20,0,0,0,14.5,4.5,14.5,24.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Priklyucheniya Buratino",1960,67,NA,8.6,12,0,0,0,0,0,4.5,24.5,0,24.5,44.5,"",0,1,0,0,0,0,0 -"Priklyucheniya zhyoltogo chemodanchika",1970,79,NA,6.3,16,4.5,0,0,0,14.5,0,24.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Prima Veras saga om Olav den hellige",1983,98,NA,5.1,17,4.5,4.5,4.5,4.5,24.5,4.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Prima comunione",1950,84,NA,8.4,10,0,0,0,0,14.5,0,0,45.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Prima dammi un bacio",2003,93,NA,6,18,4.5,0,0,14.5,24.5,4.5,24.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Prima del tramonto",1999,95,NA,5.7,22,0,0,4.5,0,14.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Prima della rivoluzione",1964,105,NA,7,170,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Prima la musica... poi le parole",2000,100,NA,3,12,14.5,0,0,0,24.5,14.5,4.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Prima notte di quiete, La",1972,105,NA,6.8,134,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Prima volta sull'erba, La",1974,94,NA,5,5,0,0,0,0,44.5,0,24.5,0,0,44.5,"",0,0,0,1,0,1,0 -"Primal Fear",1996,129,30000000,7.5,12467,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Primal Rage",1988,91,NA,3.8,26,34.5,14.5,0,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Primary",1960,60,NA,7.1,74,4.5,0,4.5,0,4.5,24.5,14.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Primary Colors",1998,143,65000000,6.8,7756,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Primary Motive",1992,63,NA,4.8,16,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Primary Suspect",2000,91,NA,4.9,125,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Primary Target",1989,85,NA,3.7,7,14.5,0,0,24.5,0,0,0,0,0,45.5,"",1,0,0,1,0,0,0 -"Primate",1974,105,NA,7.5,12,0,0,0,0,24.5,0,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Prime Cut",1972,88,NA,6.4,307,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Prime Gig, The",2000,98,NA,6.4,538,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Prime Minister, The",1941,94,NA,5.5,38,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Prime Risk",1984,98,NA,4.9,50,4.5,4.5,14.5,14.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Prime Suspect",1989,89,NA,3.6,38,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Prime Suspects",1997,93,550000,1.5,10,34.5,34.5,0,14.5,0,14.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Prime Time",1997,16,NA,7.9,7,0,0,0,0,14.5,14.5,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Prime Time, The",1960,76,150000,1.5,10,44.5,14.5,0,0,0,0,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Prime luci dell'alba",2000,86,NA,7.1,13,0,4.5,0,4.5,0,24.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Prime of Miss Jean Brodie, The",1969,116,NA,7.6,1323,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Primeiro Dia, O",1998,75,NA,7.6,202,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Primer",2004,77,7000,6.4,1466,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Primera carga al machete, La",1969,84,NA,7.8,6,0,0,0,0,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Primera noche de mi vida, La",1998,82,NA,7.3,131,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Primera noche, La",2003,94,NA,7.4,27,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Primera vez, La",2001,12,NA,6.4,12,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Primetime Murder",2000,85,NA,6.7,11,0,0,0,24.5,0,4.5,4.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Primiti Too Taa",1988,6,NA,8,14,0,4.5,0,0,0,4.5,14.5,24.5,14.5,34.5,"",0,1,0,0,1,0,1 -"Primitif",1978,87,NA,5,24,14.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Primitive Lover, The",1922,68,NA,7.3,9,0,0,0,0,0,14.5,44.5,34.5,14.5,0,"",0,0,1,0,0,1,0 -"Primitive Pitcairn",1935,10,NA,6.6,6,14.5,0,0,0,0,0,45.5,34.5,0,0,"",0,0,0,0,1,0,1 -"Primitive Pluto",1950,6,NA,6.6,9,0,0,0,24.5,0,14.5,24.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Primo Baby",1988,107,NA,6.4,11,0,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Primo amore",1978,110,NA,5.8,16,0,14.5,0,4.5,0,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Primo amore",2004,94,NA,6.4,94,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Primrose Path",1940,93,NA,6.6,118,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Princ Bajaja",1971,73,NA,4.9,16,0,4.5,4.5,0,24.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Princ a Vecernice",1979,86,NA,6.6,33,4.5,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Prince",1991,75,NA,5.3,10,0,0,0,0,14.5,0,14.5,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Prince & Me, The",2004,111,NA,5.6,2412,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"Prince Jack",1984,100,NA,3.8,5,24.5,0,24.5,24.5,0,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Prince Solitaire",2003,18,NA,6.6,13,0,0,4.5,0,0,4.5,0,0,4.5,74.5,"",0,0,1,0,0,0,1 -"Prince Valiant",1954,100,NA,5.9,300,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Prince Valiant",1997,97,NA,4.8,400,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Prince Violent",1961,7,NA,7,34,0,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Prince Who Was a Thief, The",1951,88,1000000,5.8,95,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Prince and the Pauper, The",1937,118,NA,7.4,264,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Prince and the Pauper, The",1990,24,NA,6.7,122,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Prince and the Showgirl, The",1957,115,NA,6,580,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Prince and the Surfer, The",1999,89,NA,4.2,39,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"PG",0,0,1,0,0,1,0 -"Prince du Pacifique, Le",2000,90,NA,5.1,122,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Prince of Central Park",2000,109,NA,4.9,145,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Prince of Darkness",1987,102,3000000,6.1,2817,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Prince of Egypt, The",1998,99,60000000,6.9,9212,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,1,0,1,0,0,0 -"Prince of Foxes",1949,107,NA,6.6,147,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Prince of Jutland",1994,89,NA,5.3,262,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Prince of Light, The",2000,97,NA,7.2,15,14.5,0,0,0,0,4.5,0,0,14.5,64.5,"",1,1,0,1,0,0,0 -"Prince of Pennsylvania, The",1988,87,NA,5.1,191,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Prince of Pirates",1953,80,NA,4.5,8,0,0,0,34.5,0,34.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Prince of Players",1955,102,NA,6.5,38,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Prince of Thieves, The",1948,72,NA,5.2,6,0,0,64.5,0,0,0,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Prince of Tides, The",1991,132,30000000,6.3,3095,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Prince of the City",1981,167,NA,7.3,581,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Prince's Trust Rock Gala, The",1982,90,NA,8.1,11,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Princes in Exile",1990,103,NA,6.8,51,0,0,4.5,0,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Princes, Les",1983,100,NA,7.3,9,0,0,0,0,0,24.5,0,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Princesa",2001,94,NA,6.7,103,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Princess",1969,90,NA,6.2,9,0,14.5,0,0,0,44.5,0,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Princess Academy, The",1987,90,NA,3.2,54,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Princess Bride, The",1987,98,16000000,8.2,53946,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Princess Caraboo",1994,97,NA,5.9,821,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Princess Charming",1934,78,NA,6.2,9,0,0,0,0,14.5,34.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Princess Comes Across, The",1936,76,NA,6.5,67,4.5,4.5,0,0,4.5,14.5,44.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Princess Diaries 2: Royal Engagement, The",2004,115,40000000,5.3,2605,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Princess Diaries, The",2001,114,37000000,6,6892,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Princess Nicotine; or, The Smoke Fairy",1909,5,NA,7.2,60,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Princess O'Rourke",1943,94,NA,6.3,87,0,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Princess Rajah Dance",1904,1,NA,3.9,6,0,0,34.5,14.5,0,34.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Princess and the Call Girl, The",1984,91,NA,4,18,4.5,4.5,4.5,14.5,34.5,4.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Princess and the Goblin, The",1993,82,NA,5.9,72,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Princess and the Pirate, The",1944,94,2000000,6.7,228,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Princess of the Night",1990,85,NA,4.1,8,14.5,0,0,14.5,14.5,24.5,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Princess of the Nile",1954,71,NA,5.2,31,0,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Princesse Tam Tam",1935,77,NA,6.5,52,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Princesses",2000,100,NA,4.6,25,4.5,24.5,14.5,14.5,4.5,34.5,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Princezna se zlatou hvezdou",1959,70,NA,7.7,26,0,0,0,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Princezna ze mlejna",1994,99,NA,5.6,19,0,4.5,14.5,14.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Principal Don",1997,10,NA,2.7,15,14.5,0,0,0,4.5,0,24.5,34.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Principal, The",1987,109,NA,5.7,1331,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Principe di Homburg, Il",1997,81,NA,4.7,35,4.5,14.5,4.5,14.5,24.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Principessa nuda, La",1976,94,NA,6,6,0,14.5,0,0,0,0,34.5,0,45.5,0,"",0,0,0,0,0,0,0 -"Principio y fin",1993,170,NA,7.4,92,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Principles of Karma, The",1996,20,NA,6.3,6,14.5,0,0,0,34.5,0,14.5,0,0,34.5,"",0,0,0,0,0,0,1 -"Principles of Lust, The",2003,108,NA,4,106,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Prinsessa Ruusunen",1949,99,NA,6,24,0,0,0,0,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Printemps, l'automne et l'amour, Le",1955,95,NA,4.1,7,14.5,0,14.5,0,0,0,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Printer's Devils",1982,90,NA,7.4,5,0,0,0,0,0,0,44.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Printsessa na goroshine",1976,89,NA,6.1,10,0,0,14.5,14.5,0,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Pripyat",1999,100,NA,7.6,17,0,4.5,0,0,0,0,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Prisioneiro da Grade de Ferro, O",2004,123,NA,7.6,40,0,0,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Prisioneiro do Sexo, O",1978,90,NA,5.2,9,24.5,0,14.5,0,24.5,0,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Prison",1988,102,4000000,5.5,316,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Prison Break",1938,72,NA,6.3,17,0,0,0,4.5,24.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Prison Heat",1993,91,NA,2.8,105,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Prison Planet",1992,90,NA,2.2,16,34.5,34.5,4.5,4.5,0,0,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Prison Ship",1984,86,NA,3.1,50,24.5,24.5,14.5,0,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Prison Train",1938,64,NA,6.6,16,0,0,0,0,0,34.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Prison sans barreaux",1938,98,NA,8.4,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Prisoner of Love",1999,93,NA,3.2,89,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Prisoner of Paradise",1980,82,NA,5.6,8,14.5,14.5,14.5,14.5,0,24.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Prisoner of Paradise",2002,96,NA,7.2,72,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Prisoner of Rio",1988,104,NA,7.2,9,0,0,0,14.5,24.5,34.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Prisoner of Second Avenue, The",1975,98,NA,6.3,391,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Prisoner of Shark Island, The",1936,96,NA,7.1,147,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Prisoner of St. Petersburg, The",1989,78,NA,5,13,4.5,0,0,14.5,24.5,4.5,14.5,4.5,24.5,0,"",0,0,0,1,0,0,0 -"Prisoner of War",1954,81,NA,3.3,37,24.5,14.5,14.5,4.5,14.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Prisoner of Zenda, The",1922,125,323062,7.4,58,0,4.5,0,0,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Prisoner of Zenda, The",1937,101,NA,7.7,615,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Prisoner of Zenda, The",1952,96,NA,6.9,422,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Prisoner of Zenda, The",1979,108,12500000,4.3,172,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Prisoner, The",1955,91,NA,7.2,94,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Prisoners of Inertia",1989,92,NA,6.1,21,0,0,0,0,14.5,0,14.5,14.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Prisoners of the Casbah",1953,78,NA,4.3,5,0,0,24.5,0,44.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Prisoners of the Sun",1990,108,NA,6.7,174,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Pritza Hagdola, Ha-",1970,90,NA,4.5,14,14.5,0,24.5,14.5,24.5,14.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Privarzaniyat balon",1967,98,NA,9.1,9,0,0,0,14.5,0,0,0,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Private Affairs of Bel Ami, The",1947,112,NA,7,59,4.5,4.5,0,0,14.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Private Afternoons of Pamela Mann, The",1975,83,NA,5.3,37,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Private Angelo",1949,106,NA,6.9,10,0,0,0,0,0,24.5,34.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Private Benjamin",1980,109,NA,6,3936,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Private Buckaroo",1942,68,NA,4.5,49,4.5,4.5,4.5,24.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Private Conversations",1986,82,NA,5.7,18,0,4.5,4.5,0,24.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Private Detective",1939,55,NA,6.1,11,0,4.5,0,0,4.5,44.5,24.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Private Detective 62",1933,67,260000,6.6,21,0,0,0,4.5,4.5,24.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Private Detective: Two Plus Two Plus One",1997,130,200000,3.8,8,34.5,24.5,14.5,0,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Private Dicks: Men Exposed",1999,56,NA,3.6,17,14.5,4.5,4.5,4.5,14.5,0,4.5,4.5,0,44.5,"",0,0,0,0,1,0,0 -"Private Duty Nurses",1972,80,NA,2.6,9,34.5,14.5,14.5,14.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Private Eye Popeye",1954,7,NA,5.6,18,4.5,4.5,0,0,24.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Private Eyes",1953,64,NA,6.7,30,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Private Eyes, The",1981,91,NA,6.1,421,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Private Fantasies V",1985,74,NA,8.7,7,0,0,0,0,24.5,0,0,0,0,74.5,"",0,0,0,0,0,0,0 -"Private Files of J. Edgar Hoover, The",1977,112,NA,6.3,60,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Private Function, A",1984,93,NA,6.2,424,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Private Hell 36",1954,81,NA,6.5,88,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Private Lessons",1934,22,NA,6.8,13,0,14.5,0,0,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,1,1 -"Private Lessons",1981,87,2800000,4.4,306,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Private Lessons II",1993,85,NA,2.1,19,24.5,14.5,14.5,14.5,14.5,4.5,0,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Private Lessons: Another Story",1994,86,NA,3.4,45,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Private Life of Don Juan, The",1934,89,NA,5.8,31,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Private Life of Henry VIII., The",1933,97,NA,7.5,285,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Private Life of Sherlock Holmes, The",1970,125,10000000,7.3,957,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Private Life of a Cat, The",1944,22,NA,7.8,21,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Private Lives",1931,84,NA,6.8,134,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Private Lives of Adam and Eve, The",1960,86,NA,2.6,17,24.5,4.5,14.5,14.5,14.5,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Private Lives of Elizabeth and Essex, The",1939,106,NA,7,602,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Private Navy of Sgt. O'Farrell, The",1968,92,NA,5.1,130,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Private Number",1936,80,NA,7.2,35,0,0,0,0,4.5,14.5,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Private Obsession",1995,103,NA,5.6,105,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"R",0,0,0,0,0,0,0 -"Private Parts",1972,87,NA,6.3,83,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Private Parts",1997,109,20000000,6.6,9289,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Private Pluto",1943,7,NA,6.8,42,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Private Potter",1962,89,NA,5.2,32,0,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Private Property",1960,79,NA,4.8,10,0,14.5,0,0,14.5,24.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Private Property",2002,120,NA,4.4,6,0,0,0,34.5,14.5,0,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Private Public, The",2000,90,NA,4.2,18,24.5,24.5,14.5,0,0,0,4.5,4.5,0,34.5,"R",0,0,0,0,0,0,0 -"Private Resort",1985,82,NA,4,517,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Private Road",1971,89,NA,9.4,7,0,0,0,0,0,0,14.5,0,14.5,74.5,"",0,0,0,1,0,0,0 -"Private School",1983,97,NA,3.9,638,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Private Snafu Vs. Malaria Mike",1944,3,NA,6.8,10,0,0,0,0,24.5,14.5,14.5,44.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Private Teacher",1983,85,NA,6.4,48,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Private War",1990,95,NA,2.3,25,14.5,24.5,24.5,14.5,0,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Private War of Major Benson, The",1955,105,NA,5.9,176,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Private Wars",1993,88,NA,2.3,21,24.5,24.5,4.5,14.5,4.5,0,4.5,4.5,4.5,0,"",1,0,0,0,0,0,0 -"Private Worlds",1935,84,NA,6.2,22,0,0,0,4.5,14.5,14.5,24.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Private's Affair, A",1959,93,NA,4.9,19,0,14.5,4.5,14.5,14.5,14.5,4.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Private's Progress",1956,97,NA,6.3,122,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Privates on Parade",1982,107,NA,4.7,199,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Privilege",1967,103,NA,6.9,91,0,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Privilege",1990,100,NA,6.3,12,0,0,4.5,14.5,4.5,0,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Privileged",1982,96,NA,5.8,26,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Prix du danger, Le",1983,100,NA,6.7,98,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Priyatel pokoynika",1997,100,NA,7.2,142,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"R",0,0,1,1,0,0,0 -"Priyatelite na Emiliya",1996,90,NA,6.3,9,0,0,0,0,14.5,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Prize Fighter, The",1979,99,NA,4.3,64,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Prize Pest, The",1951,7,NA,6.9,21,0,0,4.5,4.5,4.5,24.5,24.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Prize of Gold, A",1955,98,NA,5.6,15,0,0,4.5,4.5,34.5,24.5,24.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Prize, The",1963,129,NA,6.5,574,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Prizefighter and the Lady, The",1933,102,NA,6.3,81,4.5,4.5,4.5,4.5,14.5,24.5,34.5,24.5,4.5,0,"",0,0,1,0,0,1,0 -"Prizzi's Honor",1985,130,NA,6.9,4421,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Pro Football",1934,9,NA,4.9,8,0,24.5,14.5,14.5,0,24.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Pro urodov i lyudey",1998,97,NA,7,276,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Problem Child",1990,81,NA,4,3168,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Problem Child 2",1991,90,NA,3,3575,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Problem Pappy",1941,6,NA,6.7,5,0,0,0,0,24.5,44.5,24.5,0,24.5,0,"",0,1,1,0,0,0,1 -"Problem with Fear, A",2003,92,NA,5.5,124,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Procedure 769: Witnesses to an Execution",1995,85,NA,6.8,17,4.5,0,0,0,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Process",2004,93,NA,7.2,47,4.5,0,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Process of Creative Deception, The",2001,106,NA,6,5,0,0,0,0,24.5,0,44.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Process, The",1998,90,NA,2,17,45.5,14.5,0,0,4.5,0,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Processen",2003,14,NA,8.1,17,4.5,0,0,0,14.5,0,0,0,14.5,74.5,"",0,0,0,0,1,0,1 -"Processo do Rei, O",1990,91,NA,6.5,9,14.5,0,0,0,24.5,14.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Procter",2002,18,NA,5.9,15,0,4.5,0,4.5,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Procuradas",2004,90,NA,4.8,5,24.5,24.5,0,0,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Prode Anselmo e il suo scudiero, Il",1972,98,NA,6.8,5,24.5,0,24.5,0,0,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Prodigal Son, The",1995,29,NA,5.1,5,44.5,0,0,0,24.5,0,0,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Prodigal, The",1955,114,5000000,5.2,62,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Prodigy, The",1999,104,NA,5.2,21,24.5,4.5,0,4.5,14.5,0,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Prodigy, The",2004,120,NA,9.5,53,4.5,0,0,0,0,4.5,0,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Producers, The",1968,88,941000,7.8,8142,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Proefkonijnen, De",1979,88,NA,5.7,7,14.5,14.5,0,0,14.5,44.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Profe, El",1971,120,NA,6.8,34,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Profesionalac",2003,104,NA,7.7,124,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Profesor Punk, El",1988,88,NA,2.5,6,14.5,34.5,0,14.5,0,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Profesor hippie, El",1969,91,NA,5.3,6,0,14.5,34.5,0,0,45.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Professional Affair",1996,92,NA,1.3,19,44.5,4.5,4.5,14.5,0,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Professional Courtesy",2003,27,30000,8,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Professional Soldier",1935,75,NA,5.4,11,0,0,0,0,4.5,14.5,0,64.5,0,4.5,"",0,0,0,0,0,0,0 -"Professional Sweetheart",1933,73,NA,5.7,36,0,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Professionals, The",1966,117,NA,7.4,1125,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Professione: reporter",1975,119,NA,7.3,864,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Professionnel, Le",1981,109,NA,7.4,993,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Professor Beware",1938,95,820000,7.2,25,0,0,0,4.5,0,24.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Professor Columbus",1968,93,NA,9.1,7,14.5,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Professor Kranz tedesco di Germania",1978,113,NA,6.3,11,4.5,0,0,4.5,0,24.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Professor Tom",1948,8,NA,6.5,33,0,4.5,4.5,4.5,0,24.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Professor, The",1919,7,1000,6.6,13,0,0,0,0,4.5,34.5,34.5,24.5,4.5,0,"",0,0,1,0,0,0,1 -"Professori Masa",1950,82,NA,6.7,9,0,0,14.5,14.5,0,0,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Professori Uuno D.G. Turhapuro",1975,86,NA,5.6,85,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Profeta Mimi, El",1973,90,NA,6,8,0,0,0,14.5,14.5,0,0,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Profeta da Fome, O",1970,93,NA,3.4,5,0,24.5,0,24.5,0,24.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Profeta, Il",1968,100,NA,5.3,31,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Profil bas",1993,106,NA,5.5,54,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,"",1,0,0,0,0,0,0 -"Profile for Murder",1996,95,NA,4.7,76,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Profile of Black Narcissus, A",2000,24,NA,9,6,0,0,0,0,0,0,0,34.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Profiles in Science",2002,5,NA,8.4,13,4.5,0,0,0,0,0,0,24.5,0,64.5,"",0,1,1,0,0,0,1 -"Profils paysans: l'approche",2001,88,NA,6.7,8,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Profils paysans: le quotidien",2005,83,NA,5.6,7,0,0,0,14.5,0,14.5,24.5,24.5,0,14.5,"",0,0,0,0,1,0,0 -"Profit & Nothing But! Or Impolite Thoughts On the Class Struggle",2002,52,NA,7,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Profit, The",2001,128,NA,2.5,18,34.5,0,0,0,0,4.5,4.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Profondo rosso",1975,98,NA,7.4,2242,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Profumo",1987,93,NA,6.1,24,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Profumo della signora in nero, Il",1974,101,NA,6.6,50,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Profumo di donna",1974,103,NA,7.5,287,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Progeny",1998,99,2500000,4.2,291,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Program, The",1993,112,NA,5.9,1512,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Programmed to Kill",1987,91,NA,3.1,59,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Progress Island U.S.A",1973,13,NA,1.9,13,45.5,44.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Progulka",2003,90,NA,7.1,118,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Proie pour l'ombre, La",1960,95,NA,6,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Proini peripolos",1987,108,NA,8,24,4.5,0,4.5,0,0,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Project Grizzly",1996,72,NA,7.1,126,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Project Moon Base",1953,63,NA,3.1,81,34.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Project Redlight",2002,5,NA,5.5,7,14.5,0,0,0,14.5,0,0,0,44.5,24.5,"",0,0,1,0,0,0,1 -"Project Shadowchaser II",1994,94,NA,2.9,59,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Project Shadowchaser III",1995,99,NA,2.8,71,34.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Project Vampire",1993,88,NA,2.7,26,34.5,14.5,14.5,4.5,0,0,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Project Viper",2002,85,NA,3.2,145,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Project X",1968,97,NA,5.3,75,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Project X",1987,108,NA,5.9,1870,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Project: Assassin",1997,89,NA,2.4,15,44.5,0,14.5,4.5,4.5,4.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Project: Kill",1976,90,NA,3.8,43,0,24.5,24.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",1,0,0,1,0,0,0 -"Project: Metalbeast",1995,92,NA,3.6,115,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Project: Valkyrie",2002,83,NA,5.3,17,14.5,0,0,0,4.5,24.5,14.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Projected Man, The",1967,77,NA,3.1,163,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Projectionist, The",1971,88,NA,4.7,52,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Projectionist, The",2002,14,NA,6.3,19,4.5,0,0,4.5,14.5,14.5,4.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Prokhindiada, ili beg na meste",1984,89,NA,5.7,5,0,0,0,0,44.5,44.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Prologue: The Artist Who Did Not Want to Paint",1965,13,NA,6.4,6,0,0,0,0,0,45.5,34.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Prom Fight: The Marc Hall Story",2002,60,NA,6.7,19,0,0,0,4.5,0,24.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Prom Girls",1988,70,NA,6.3,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Prom Night",1980,80,NA,4.6,1089,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Prom Night III: The Last Kiss",1989,97,NA,3,187,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Prom Night IV: Deliver Us from Evil",1992,115,NA,2.9,150,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Prom Queen, The",2000,18,NA,5.4,5,0,0,0,24.5,24.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,1 -"Promeneur du champ de Mars, Le",2005,117,NA,6.9,86,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Promenons-nous dans les bois",2000,90,NA,4,661,24.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Promesa, La",2004,104,NA,4.5,16,0,4.5,0,4.5,4.5,34.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Promesse, La",1996,94,NA,7.6,712,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Promethean, The",2003,12,NA,9,8,0,0,0,0,0,14.5,0,0,45.5,34.5,"",0,0,0,0,0,0,1 -"Promise Her Anything",1965,98,NA,5.3,89,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Promise at Dawn",1970,102,NA,5,16,4.5,0,0,0,34.5,0,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Promise of Bed, A",1969,85,NA,1.6,11,14.5,24.5,14.5,0,4.5,0,4.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Promise, The",1979,97,NA,4.8,112,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Promise, The",1997,22,NA,2.3,16,14.5,0,0,0,4.5,0,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Promised Land",1987,102,NA,5.5,291,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Promised Land",2002,100,NA,5.7,97,14.5,14.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Promises",2001,106,NA,8.5,453,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Promises in the Dark",1979,118,NA,5.8,43,4.5,4.5,4.5,4.5,24.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Promises! Promises!",1963,75,NA,5.3,40,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pronto ad uccidere",1976,94,NA,5,8,0,0,0,14.5,34.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Proof",1991,86,NA,7.5,1371,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Proof of Life",2000,135,65000000,6.3,9592,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Prooi, De",1985,97,NA,5.9,21,4.5,0,0,4.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Prop og Berta",2000,77,NA,6.6,28,4.5,0,4.5,0,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Propaganda",1999,120,NA,6.3,223,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Propavshaya ekspeditsiya",1975,133,NA,7.8,8,14.5,0,0,0,0,0,0,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Propellerblume",1997,89,NA,2.9,9,24.5,0,0,0,14.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Property Man, The",1914,31,NA,5.9,21,0,0,4.5,14.5,14.5,34.5,14.5,0,4.5,0,"",0,0,1,0,0,0,1 -"Prophecies of Nostradamus",1979,100,NA,5,12,0,0,0,14.5,0,4.5,24.5,0,4.5,44.5,"",0,0,0,0,1,0,0 -"Prophecy",1979,102,12000000,4,427,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Prophecy, The",1995,98,8000000,6.4,4148,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Prophet Without Honor",1939,11,NA,8,7,0,0,0,14.5,14.5,14.5,14.5,0,44.5,0,"",0,0,0,1,0,0,1 -"Prophet's Game, The",1999,110,NA,5,237,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Proposal",2003,8,NA,6.8,6,34.5,0,0,0,0,14.5,0,14.5,0,34.5,"",0,0,0,0,0,1,1 -"Proposal, The",2001,87,NA,5.3,188,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Proposition, The",1997,93,NA,2.9,85,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,1,0,1,0 -"Proposition, The",1998,110,NA,6.1,544,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Proprietor, The",1996,113,NA,5.2,99,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Prorva",1992,108,NA,5.9,35,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pros and Cons",1999,104,NA,4.1,136,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Proshchanie s Matyoroy",1983,108,NA,6.9,32,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Proshschay, Gyulsary!",1968,79,NA,5.9,5,0,0,24.5,0,24.5,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Proshu slova",1975,145,NA,6,13,0,0,0,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Prosopo tis medusas, To",1966,90,NA,6.1,8,0,14.5,14.5,0,0,0,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Prospecting Bear, The",1941,9,NA,5,6,0,0,14.5,14.5,34.5,14.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Prosperity",1932,87,NA,5.8,22,0,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Prospero's Books",1991,124,NA,6.2,1728,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Prosseneti, I",1976,100,NA,5.4,5,24.5,0,24.5,24.5,0,0,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Prosti",1986,84,NA,6,7,0,0,0,24.5,0,0,14.5,44.5,14.5,0,"",0,0,0,1,0,1,0 -"Prosti",2002,100,NA,6.8,20,0,0,0,0,14.5,24.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Protagonists, The",1999,92,NA,5.1,24,24.5,0,4.5,4.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Protection",2000,77,NA,6.2,34,0,0,14.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Protection",2001,96,NA,5.2,129,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Protector, The",1985,94,NA,4.7,337,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Protector, The",1999,89,NA,4.9,29,4.5,0,4.5,24.5,24.5,14.5,4.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Protek the Weakerist",1937,7,NA,6.4,12,0,4.5,0,0,4.5,4.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Protest",1999,2,NA,5.9,18,0,4.5,14.5,0,14.5,4.5,24.5,4.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Proteus",1995,97,NA,2.5,251,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Proteus",2003,97,NA,7.8,106,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Proteus",2004,60,NA,6.9,16,0,0,0,0,14.5,14.5,34.5,4.5,4.5,24.5,"",0,1,0,0,1,0,0 -"Protocol",1984,96,NA,5.2,909,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Protocols of Zion",2005,93,NA,8.3,6,0,0,0,0,0,0,34.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Prototype",1992,91,NA,2.4,72,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Proud Ones, The",1956,90,NA,6.5,49,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Proud Rebel, The",1958,103,NA,6.3,95,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Proud Valley, The",1940,76,NA,7.3,21,0,0,4.5,0,0,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Proud and Profane, The",1956,111,NA,5.4,56,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Proud and the Damned, The",1972,92,NA,3.4,29,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Proud to Be British",1973,42,NA,8.9,11,0,4.5,0,0,0,0,0,4.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Prova d'orchestra",1978,70,NA,7.1,371,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Prova de Fogo",1980,90,NA,4.1,6,14.5,0,0,14.5,45.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Proverb, The",2004,10,5000,5.4,46,0,0,4.5,0,0,0,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,1 -"Proverka na dorogakh",1971,97,NA,7.6,67,4.5,0,0,4.5,0,4.5,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Providence",1977,104,NA,7.5,383,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Provincia meccanica",2005,107,NA,4.4,19,14.5,14.5,14.5,14.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Provinciale, La",1953,92,NA,7.4,14,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Provinciale, La",1981,105,NA,6.1,32,4.5,0,0,4.5,4.5,24.5,34.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Provincie, De",1991,105,NA,6.8,20,0,0,0,0,4.5,14.5,44.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Provocateur",1998,99,NA,4.5,126,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Provocazione",1988,83,NA,4.4,7,24.5,14.5,0,24.5,0,0,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Provokation",1995,80,NA,2.6,9,24.5,44.5,0,34.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Prowler, The",1951,92,NA,7.2,45,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Prowler, The",1981,87,1000000,4.7,332,24.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Proxenio tis Annas, To",1972,87,NA,7.4,28,0,0,0,0,0,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Proximity",2001,98,6000000,4.9,189,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Prozac Nation",2001,99,9000000,6.2,940,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Prudence and the Pill",1968,92,NA,4.7,89,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Pruimenbloesem",1982,80,NA,7.4,7,14.5,0,0,0,0,14.5,14.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Prymas - trzy lata z tysiaca",2000,103,NA,7,43,4.5,0,0,0,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Prywatne sledztwo",1987,94,NA,5.8,8,0,14.5,0,0,24.5,24.5,24.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Przedwiosnie",2001,140,NA,5.1,44,4.5,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Przemiany",2003,76,NA,5.9,21,4.5,0,4.5,4.5,14.5,14.5,24.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Przepraszam, czy tu bija?",1977,90,NA,7.4,20,0,0,0,4.5,4.5,0,34.5,34.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Przesluchanie",1982,118,NA,8.8,151,4.5,0,0,0,4.5,4.5,4.5,14.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Przygoda na Mariensztacie",1954,93,NA,3.4,8,0,14.5,14.5,14.5,24.5,0,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Przygoda z piosenka",1969,93,NA,3.5,6,0,0,34.5,14.5,0,14.5,0,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Przypadek Pekosinskiego",1993,100,NA,6.5,7,14.5,0,0,0,0,14.5,0,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Psalm II: 'Walking Distance'",1999,23,NA,8.8,7,0,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Pseftra, I",1963,92,NA,5.3,12,0,4.5,14.5,0,34.5,24.5,14.5,0,0,0,"",0,0,1,0,0,1,0 -"Psihi kai sarka",1974,100,NA,7,5,0,24.5,24.5,0,0,0,0,0,0,64.5,"",0,0,0,1,0,0,0 -"Psila ta heria Hitler",1962,75,NA,7.7,8,0,0,0,0,0,14.5,45.5,14.5,0,24.5,"",0,0,1,1,0,0,0 -"Psst Pink",1971,7,NA,5.2,6,0,0,0,14.5,14.5,64.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Psy",1992,104,NA,6.7,233,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Psy 2: Ostatnia krew",1994,100,NA,5.5,126,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Psy Show",1999,19,NA,3.9,12,4.5,4.5,4.5,0,4.5,4.5,0,24.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Psych-Out",1968,101,100000,5.5,286,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Psyche '59",1964,94,NA,4.9,13,0,0,4.5,24.5,34.5,4.5,4.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Psyched by the 4D Witch (A Tale of Demonology)",1972,81,NA,2.9,41,45.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Psychedelic Pink",1968,6,NA,5.4,16,0,0,0,4.5,24.5,34.5,4.5,0,0,34.5,"",0,1,1,0,0,0,1 -"Psychedelic Sexualis",1966,104,NA,5.3,7,14.5,0,0,14.5,24.5,0,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Psychic",1992,92,NA,5.3,51,0,4.5,4.5,4.5,44.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Psychic Killer",1975,89,NA,3.8,67,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Psychic Wars",1998,60,NA,5.1,6,14.5,14.5,0,14.5,0,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Psychic, The",1968,90,NA,1.8,13,34.5,14.5,14.5,0,14.5,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Psycho",1960,108,806947,8.6,53962,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Psycho",1998,105,20000000,5,7255,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Psycho Beach Party",2000,95,1500000,5.7,1404,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Psycho Cop",1988,87,NA,3.5,102,24.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Psycho Cop Returns",1993,85,NA,2.7,144,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Psycho Girls",1985,92,NA,3.4,9,34.5,14.5,0,24.5,14.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Psycho II",1983,113,5000000,5.7,2228,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Psycho III",1986,90,NA,4.5,1209,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Psycho Lover, The",1970,71,NA,5.3,8,0,0,0,24.5,14.5,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Psycho a Go-Go",1965,85,NA,1.7,10,44.5,0,0,0,14.5,0,14.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Psycho for Milk",1999,1,NA,5.7,16,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Psycho from Texas",1981,89,NA,2.8,30,14.5,14.5,14.5,4.5,14.5,4.5,0,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Psycho-lettes",1996,10,NA,1.7,6,34.5,0,34.5,0,0,14.5,0,0,0,14.5,"",0,0,1,0,0,0,1 -"Psychomania",1964,90,42000,3.6,11,4.5,0,14.5,14.5,4.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Psychomania",1971,95,NA,4.5,219,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Psychopath, The",1966,82,NA,5.5,35,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Psychopath, The",1975,84,NA,4.2,16,4.5,14.5,0,0,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Psychotronic Man, The",1980,90,NA,1.8,34,64.5,4.5,4.5,0,0,14.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Psycosissimo",1961,88,NA,2.9,7,24.5,14.5,0,0,0,0,24.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Ptak ohnivak",2000,86,NA,5.3,7,0,0,14.5,0,24.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Pterodactyl Woman from Beverly Hills",1994,97,NA,3.4,39,14.5,4.5,4.5,0,14.5,4.5,14.5,4.5,0,24.5,"R",0,0,1,0,0,0,0 -"Ptice koje ne polete",1997,90,NA,7.6,7,14.5,0,0,0,0,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Ptitzi i hratki",1969,79,NA,7.9,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,1,0,0,0,0 -"Pu-san",1953,98,NA,5.7,18,4.5,4.5,0,14.5,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Puberty Blues",1981,87,NA,5.3,137,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Pubis Angelical",1982,115,NA,6.5,6,0,0,0,34.5,0,0,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Public Access",1993,90,NA,5.4,275,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Public Cowboy No. 1",1937,53,NA,6.6,15,0,4.5,0,0,14.5,14.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Public Defender, The",1931,70,NA,6.6,17,0,4.5,0,14.5,14.5,4.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Public Enemies",1996,95,NA,2.9,366,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Public Enemy",1999,87,NA,5.6,33,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Public Enemy, The",1931,83,NA,7.6,1663,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Public Eye, The",1992,99,NA,6.1,665,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Public Ghost No. 1",1935,20,NA,6,7,0,0,0,14.5,24.5,14.5,0,14.5,24.5,0,"",0,0,1,0,0,0,1 -"Public Hero #1",1935,89,NA,6.4,41,4.5,0,0,4.5,24.5,14.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Public Housing",1997,200,NA,6.1,22,4.5,0,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Public Pays, The",1936,19,NA,6,16,0,0,0,14.5,4.5,34.5,34.5,0,0,0,"",0,0,0,1,0,0,1 -"Public Pigeon No. One",1957,79,NA,5.5,15,0,4.5,0,24.5,14.5,0,4.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Public Toilet",1992,33,NA,6.6,5,24.5,0,0,0,24.5,0,24.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Public Wedding",1937,58,NA,5.2,20,4.5,0,4.5,14.5,44.5,14.5,0,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Puce Moment",1949,6,NA,6.4,91,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Puce, La",1999,40,NA,5.9,24,0,0,4.5,14.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Puckoon",2002,82,NA,4.6,62,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Puddle Cruiser",1996,102,160000,6.3,137,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Puddlejumper",2002,13,NA,5.8,10,0,0,0,14.5,14.5,24.5,0,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Puder",2001,90,NA,2.1,22,24.5,14.5,4.5,4.5,0,4.5,4.5,4.5,0,14.5,"",0,0,1,1,0,0,0 -"Pudeur ou l'impudeur, La",1992,58,NA,9.7,6,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,0,0,0,0,0 -"Pudgy Picks a Fight",1937,7,NA,5.1,6,0,0,0,14.5,45.5,0,14.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Pudgy Takes a Bow-wow",1937,7,NA,5.7,8,0,0,0,14.5,24.5,45.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Pueblerina",1949,111,NA,9,13,0,0,0,0,0,0,4.5,4.5,34.5,44.5,"",0,0,0,1,0,1,0 -"Pueblo Legend, A",1912,13,NA,5.6,6,0,0,0,0,34.5,45.5,0,14.5,0,0,"",0,0,0,0,0,1,1 -"Pueblo Pluto",1949,8,NA,6.5,32,4.5,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Pueblo de madera",1990,98,NA,6.5,24,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Puede ser divertido",1995,92,NA,5.7,10,34.5,0,0,0,44.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Puente, El",1977,104,NA,4.6,10,0,0,34.5,14.5,14.5,0,14.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Puerto de Barcelona, El",1966,20,NA,5.4,61,4.5,0,45.5,0,34.5,4.5,0,0,4.5,0,"",0,0,0,0,1,0,1 -"Puerto escondido",1992,110,NA,5.7,155,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Pufnstuf",1970,98,NA,5.5,151,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Pugalo",2000,15,NA,5.9,6,0,0,0,0,34.5,14.5,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Pugni in tasca, I",1965,105,NA,7.8,106,0,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Puhalluskukkapoika ja taivaankorjaaja",2002,24,NA,7.1,8,0,0,0,0,14.5,24.5,24.5,24.5,14.5,0,"",0,0,0,1,0,0,1 -"Puisi tak terkuburkan",2000,90,NA,7.7,8,14.5,0,0,0,0,14.5,14.5,34.5,0,24.5,"",0,0,0,1,1,0,0 -"Puissance de la parole",1988,25,NA,3.8,9,24.5,14.5,0,14.5,14.5,0,0,14.5,24.5,14.5,"",0,0,0,1,0,1,1 -"Puits, Le",1999,8,NA,6.7,17,0,0,0,14.5,0,14.5,24.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Pukar",1983,161,NA,8.3,37,0,0,0,0,4.5,4.5,14.5,14.5,45.5,14.5,"",1,0,0,1,0,0,0 -"Pulapka",1997,105,NA,4.8,6,34.5,0,0,0,14.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Pulcinella",1973,15,NA,5.5,8,0,0,14.5,0,24.5,14.5,0,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Pulkownik Kwiatkowski",1995,123,NA,7.4,56,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Pull My Daisy",1958,30,NA,6.9,75,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Pull Out",2003,69,NA,6.9,13,0,0,0,0,4.5,0,4.5,0,0,84.5,"",0,0,0,0,1,0,0 -"Pull-over rouge, Le",1979,120,NA,7.9,23,0,0,0,0,14.5,4.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pullet Surprise",1997,7,NA,6,7,0,0,0,24.5,0,14.5,44.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Pulling a Bone",1931,10,NA,7.9,12,0,0,4.5,0,14.5,0,44.5,4.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Pulp",1972,95,NA,6.1,188,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Pulp Diction",2003,1,1000,6.5,14,4.5,0,14.5,0,4.5,4.5,4.5,4.5,14.5,34.5,"",1,0,0,0,0,0,1 -"Pulp Fiction",1994,168,8000000,8.8,132745,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,0,1,0,0,0 -"Pulse",1988,95,NA,4.7,246,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pulse: A Stomp Odyssey",2002,40,3000000,8.5,62,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Pulso, O",1997,21,NA,9.3,27,0,14.5,0,0,0,4.5,0,4.5,34.5,44.5,"",0,0,0,0,0,0,1 -"Pump Up the Volume",1990,105,NA,6.8,6054,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Pumping Iron",1977,85,NA,6.6,1167,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Pumping Iron II: The Women",1985,107,NA,4.7,80,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Pumpkin",2002,113,NA,6.2,2344,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Pumpkin Eater, The",1964,118,NA,7.3,128,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Pumpkinhead",1989,86,3500000,5.4,1275,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pumpkinhead II: Blood Wings",1994,84,NA,3.4,377,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Pumuckl und sein Zirkusabenteuer",2003,87,NA,8.2,16,0,4.5,0,4.5,0,0,24.5,4.5,4.5,45.5,"",0,1,1,0,0,0,0 -"Pun mesec nad Beogradom",1993,92,NA,6.5,9,14.5,24.5,14.5,14.5,0,14.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Punainen viiva",1959,97,NA,7.4,24,4.5,0,0,0,4.5,14.5,4.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Punch",2002,90,NA,6.5,156,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Punch Drunks",1934,17,NA,7.9,152,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Punch Trunk",1953,7,NA,7.8,23,0,0,0,0,4.5,4.5,24.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Punch and Judo",1951,6,NA,4.3,8,14.5,0,14.5,34.5,14.5,0,0,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Punch-Drunk Love",2002,95,25000000,7.5,18169,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Punchline",1988,128,NA,5.6,1779,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Punchy Cowpunchers",1950,17,NA,7.5,46,0,0,0,4.5,0,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Punisher, The",1989,92,10000000,4.7,2007,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Punisher, The",2004,124,33000000,6.2,9989,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Punishment Park",1971,88,NA,7.9,246,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Punishment of Anne, The",1976,89,NA,6.5,97,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Punition, La",1973,95,NA,5.9,11,0,0,4.5,0,4.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Punk and Its Aftershocks",1980,85,NA,7.5,6,0,0,0,0,0,0,45.5,34.5,0,14.5,"",0,0,0,0,1,0,0 -"Punk, The",1993,96,NA,2.8,15,4.5,14.5,4.5,14.5,4.5,0,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Punks",2000,91,NA,5.7,88,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Punktur, Punktur, Komma, Strik",1980,90,NA,6.4,10,0,0,0,24.5,0,24.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Punto y aparte",2002,90,NA,4.8,10,34.5,14.5,0,24.5,14.5,0,0,0,0,34.5,"R",0,0,0,1,0,0,0 -"Punto y raya",2004,105,NA,9.5,62,4.5,0,4.5,0,0,4.5,14.5,4.5,4.5,45.5,"",1,0,0,1,0,0,0 -"Pup on a Picnic",1955,7,NA,5.9,24,0,0,4.5,0,4.5,34.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Pupa del gangster, La",1975,95,NA,5.8,29,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Pupendo",2003,114,NA,7.4,273,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Pupilas do Senhor Reitor, As",1935,102,NA,5.7,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,1,0,1,0 -"Puppe, Die",1919,58,NA,8.4,67,4.5,0,0,0,4.5,4.5,4.5,14.5,34.5,44.5,"",0,0,1,0,0,0,0 -"Puppet",1999,93,NA,1.2,6,14.5,14.5,0,0,0,14.5,0,0,14.5,34.5,"",1,0,0,0,0,0,0 -"Puppet Master",1989,90,NA,4.8,703,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Puppet Master 4",1993,79,NA,3.9,244,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Puppet Master 5: The Final Chapter",1994,82,NA,3.8,220,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Puppet Master II",1991,88,780000,4.3,413,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Puppet Master III: Toulon's Revenge",1991,86,800000,5,392,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Puppet Masters, The",1994,109,NA,5.5,1538,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Puppet on a Chain",1970,103,NA,5.4,117,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Puppetoon Movie, The",1987,90,NA,8.1,19,0,0,14.5,0,0,0,4.5,14.5,14.5,44.5,"",0,1,0,0,0,0,0 -"Puppies for Sale",1998,9,3500,7.2,44,4.5,4.5,0,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Puppy Love",1933,8,NA,6.2,27,0,0,4.5,4.5,14.5,44.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,1,1 -"Puppy Tale",1954,7,NA,6.6,20,0,0,4.5,0,4.5,14.5,34.5,34.5,14.5,0,"",0,1,1,0,0,0,1 -"Pups",1999,99,NA,5.8,562,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Pups Is Pups",1930,20,NA,7.7,33,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Pups' Christmas, The",1936,8,NA,5.6,15,4.5,0,0,4.5,24.5,24.5,34.5,0,4.5,0,"",0,1,1,0,0,0,1 -"Pups' Picnic, The",1936,8,NA,4.1,5,0,0,24.5,24.5,0,44.5,0,0,0,24.5,"",0,1,0,0,0,0,1 -"Pupu no monogatari",1998,75,NA,6.4,20,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Pura Handa Kaluwara",1997,74,NA,7.1,6,0,0,0,0,14.5,0,45.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Pura vida Ibiza",2004,89,NA,3.2,73,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Puraido: Unmei no toki",1998,161,NA,6.1,19,4.5,4.5,4.5,4.5,0,4.5,24.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Puratonikku sekusu",2001,104,NA,4.9,45,14.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Purchase Price, The",1932,68,NA,5.9,74,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Pure",2002,96,NA,6.6,234,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Pure Blood",2000,90,NA,5,6,14.5,14.5,0,0,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Pure Country",1992,112,NA,6,642,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Pure Danger",1996,99,NA,3.9,41,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Pure Feud",1934,9,NA,4.5,11,0,14.5,4.5,4.5,24.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,1 -"Pure Fiction",1998,100,NA,6.7,15,4.5,0,0,0,4.5,24.5,34.5,4.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Pure Hell of St. Trinian's, The",1960,94,NA,5.9,88,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Pure Luck",1991,96,NA,4.9,1055,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pure Race",1995,115,NA,8.2,27,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Pure S",1976,85,NA,6,6,0,0,0,0,0,14.5,45.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Purely Belter",2000,99,NA,6.6,450,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Purely Physical",1982,80,NA,5,6,0,0,14.5,0,0,14.5,14.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Purgatory Flats",2002,102,NA,5.8,85,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Purgatory House",2004,97,NA,7.3,97,4.5,0,4.5,0,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Purifiers, The",2004,85,NA,3.9,67,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Puritaine, La",1986,86,NA,4.3,18,4.5,0,14.5,0,14.5,14.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Purity Squad",1945,20,NA,5.3,8,0,0,0,24.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Purloined Pup, The",1946,7,NA,6.7,18,0,0,0,0,14.5,24.5,44.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Puro cashmere",1986,89,NA,5,5,24.5,0,0,24.5,0,44.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Purojekuto A-ko",1986,86,NA,7.7,296,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,1,0,0,0,0 -"Purple Gang, The",1960,85,NA,4.7,12,0,4.5,4.5,0,4.5,44.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Purple Gas",2003,81,NA,4.1,8,14.5,0,0,24.5,0,0,14.5,0,0,45.5,"",1,0,1,0,0,0,0 -"Purple Haze",1982,97,NA,5.3,39,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Purple Heart, The",1944,99,NA,7.3,122,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Purple Hearts",1984,116,NA,5.4,162,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Purple Mask, The",1955,82,NA,5.2,48,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Purple Monster Strikes, The",1945,209,NA,6.3,30,4.5,0,0,4.5,4.5,24.5,14.5,24.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Purple People Eater",1988,90,NA,2.8,144,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Purple Plain, The",1954,100,2000000,6.3,166,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Purple Rain",1984,111,NA,5.6,2470,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Purple Rose of Cairo, The",1985,84,15000000,7.5,5273,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Purple Triangles",1991,25,NA,8.1,22,14.5,0,0,4.5,0,0,0,4.5,4.5,64.5,"",0,0,0,0,1,0,1 -"Purpose",2002,96,NA,5.2,513,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Purr-Chance to Dream",1967,6,NA,5.4,16,0,14.5,14.5,14.5,14.5,24.5,14.5,4.5,0,0,"",0,1,1,0,0,0,1 -"Pursued",1947,101,NA,7.8,248,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Pursuit",1935,60,NA,5.9,8,0,0,0,24.5,24.5,14.5,24.5,14.5,0,0,"",1,0,1,0,0,1,0 -"Pursuit",1991,95,NA,2.8,15,14.5,4.5,0,0,0,4.5,0,0,4.5,64.5,"",1,0,0,0,0,0,0 -"Pursuit of D.B. Cooper, The",1981,105,NA,5.6,193,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Pursuit of Happiness",2001,93,NA,5.5,125,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Pursuit of Happiness, The",1971,93,NA,5.6,36,4.5,0,4.5,14.5,4.5,34.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Pursuit to Algiers",1945,65,NA,6.3,189,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Push Comes to Shove",1991,6,NA,7.2,46,4.5,4.5,0,4.5,4.5,0,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Push-Button Kitty",1952,7,NA,6.6,25,0,0,0,14.5,4.5,24.5,24.5,14.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Pusher",1996,105,NA,7.1,1488,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Pusher II",2004,100,NA,6.6,209,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Pusher, The",1960,81,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,44.5,0,"",0,0,0,1,0,0,0 -"Pushing Tin",1999,119,33000000,5.9,7528,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Pushover",1954,88,NA,6.7,101,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Pushpak",1988,125,NA,9.4,107,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Pusong mamon",1998,120,NA,6.5,24,0,4.5,0,4.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Puss 'n' Boats",1966,6,NA,4.3,15,14.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,0,0,"",0,1,1,0,0,0,1 -"Puss Cafe",1950,7,NA,7.4,28,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Puss Gets the Boot",1940,9,NA,7.4,61,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Puss in Boots",1922,9,NA,5.1,13,0,0,4.5,24.5,4.5,24.5,14.5,14.5,0,4.5,"",0,1,0,0,0,0,1 -"Puss n' Booty",1943,7,NA,6.8,6,0,0,0,14.5,0,0,45.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Puss n' Toots",1942,7,NA,6.2,23,0,0,0,4.5,4.5,14.5,44.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Pussycat, Pussycat, I Love You",1970,99,NA,4.1,50,4.5,24.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Pusteblume",1974,92,NA,4.9,25,4.5,14.5,14.5,4.5,24.5,4.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Put More Blood Into the Music",1987,120,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,0,0,1,0,0 -"Put oko sveta",1964,105,NA,7.4,6,0,0,0,14.5,0,14.5,0,45.5,14.5,0,"",0,0,1,0,0,0,0 -"Put the Camera on Me",2003,70,NA,8.9,43,4.5,0,0,0,4.5,0,4.5,14.5,14.5,45.5,"",0,0,1,0,1,0,0 -"Put-Put Pink",1968,6,NA,5.3,10,0,0,14.5,0,44.5,44.5,0,0,0,14.5,"",0,1,0,0,0,0,1 -"Put-Put Troubles",1940,7,NA,7.4,37,0,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Puta de oros",1999,14,NA,1.8,11,45.5,14.5,0,0,0,0,4.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Puta y la ballena, La",2004,122,NA,8,82,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Putain d'histoire d'amour",1981,100,NA,3.9,11,4.5,0,4.5,4.5,4.5,4.5,0,4.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Putain du roi, La",1990,93,NA,5.6,156,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Putain respectueuse, La",1952,75,NA,4.5,15,14.5,0,0,0,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Puteri gunung ledang",2004,145,NA,7.6,93,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Puteshestviye muravya",1983,10,NA,8.3,14,0,0,0,0,0,0,4.5,34.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Putney Swope",1969,84,200000,6.3,371,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Putovanje tamnom polutkom",1996,129,NA,5.3,9,34.5,0,0,14.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Puttin' on the Dog",1944,7,NA,6.5,25,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Puttin' on the Ritz",1930,88,NA,5.3,24,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Putting Pants on Philip",1927,19,NA,6.8,55,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Putty Tat Trouble",1951,7,NA,7,83,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Putyovka v zhizn",1931,105,NA,7.6,17,0,0,0,0,0,14.5,44.5,0,4.5,44.5,"",0,0,0,1,0,0,0 -"Putzfraueninsel, Die",1996,98,NA,4.4,59,14.5,24.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Puzzle of a Downfall Child",1970,105,NA,5.1,33,0,4.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Puzzle, El",2000,20,NA,7.6,7,0,0,0,0,0,0,24.5,44.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Puzzle, The",2000,22,1500,8.5,10,14.5,0,0,14.5,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Puzzlehead",2005,81,500000,7.7,10,14.5,14.5,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Pyaar Kiya To Darna Kya",1998,162,NA,5.1,36,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Pyaar Koi Khel Nahin",1999,165,NA,3.9,16,0,4.5,14.5,34.5,4.5,0,14.5,0,4.5,14.5,"",0,0,0,1,0,1,0 -"Pyaar To Hona Hi Tha",1998,156,NA,6.5,41,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Pyaasa",1957,146,NA,8.1,124,0,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Pyat vecherov",1979,103,NA,7,61,4.5,0,0,4.5,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Pyeon ji",1997,102,NA,4.1,29,4.5,0,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Pygmalion",1937,95,NA,6.8,5,24.5,0,0,0,0,0,0,64.5,24.5,0,"",0,0,0,0,0,0,0 -"Pygmalion",1938,89,350000,7.7,887,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Pygmy Hunt, The",1938,9,NA,4.8,6,0,14.5,0,0,64.5,14.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Pyme (sitiados)",2002,97,NA,4,8,14.5,0,0,24.5,24.5,0,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Pyotr pervyy I",1937,96,NA,8.4,8,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Pyotr pervyy II",1938,96,NA,8.8,7,14.5,0,0,0,0,0,14.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Pyramide des Sonnengottes, Die",1965,102,NA,5,30,0,4.5,14.5,4.5,24.5,34.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Pyramide humaine, La",1961,90,NA,9.2,8,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,0,0,0,0,0 -"Pyromaniac's Love Story, A",1995,94,NA,4.9,335,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Pyshka",1934,70,NA,7.5,8,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Python",2000,99,NA,3.6,587,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Pyx, The",1973,108,NA,5.5,56,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Q",1982,93,1200000,6,578,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Q & A",1990,137,NA,6.3,841,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Q Planes",1939,82,NA,6.3,72,0,0,0,4.5,14.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"QIK2JDG",2002,5,NA,6.2,20,44.5,0,0,4.5,4.5,0,24.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"QM, I Think I Call Her QM",1999,28,NA,5.2,18,14.5,4.5,0,4.5,14.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Qaamarngup uummataa",1998,90,NA,6.4,85,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Qalaqi Anara",1976,90,NA,8.2,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,1,0,0,0,0 -"Qateh-ye natamam",2001,92,NA,7.9,6,0,0,14.5,0,0,14.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Qayamat Se Qayamat Tak",1988,162,NA,8.1,132,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",1,0,0,1,0,1,0 -"Qayamat: City Under Threat",2003,156,NA,6,30,34.5,4.5,14.5,4.5,14.5,14.5,24.5,0,0,4.5,"",0,0,0,0,0,1,0 -"Qi men dun jia",1982,101,NA,7.5,39,0,4.5,0,4.5,0,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Qi qiao fu",1988,112,NA,7.1,34,4.5,0,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Qian yan wan yu",1998,128,NA,7.5,51,0,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Qian zuo guai",1977,101,NA,4.5,23,14.5,4.5,4.5,0,14.5,0,14.5,24.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Qianxi manbo",2001,120,NA,6.3,513,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Qiao tan nu jiao wa",1977,80,NA,3.5,7,14.5,0,14.5,0,0,24.5,14.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Qiji",1989,105,NA,7,494,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"PG-13",1,0,1,1,0,0,0 -"Qin song",1996,134,NA,6.8,173,4.5,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Qin yong",1989,110,NA,7.4,193,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Qing bao long hu men",1985,90,NA,4.6,8,24.5,24.5,14.5,0,14.5,0,0,0,14.5,14.5,"",1,0,1,0,0,0,0 -"Qing cheng zhi lian",1984,95,NA,6.6,32,4.5,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Qing chun zhi ge",1959,170,NA,7.3,9,0,0,14.5,0,0,0,44.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Qing ren jie",2005,113,NA,5.8,18,4.5,0,0,4.5,14.5,34.5,0,0,4.5,34.5,"",0,0,0,0,0,1,0 -"Qing sheng",1991,96,NA,6.2,50,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Qingmei Zhuma",1985,110,NA,8.3,44,4.5,0,0,0,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Qingse ditu",2001,140,NA,3.4,24,24.5,4.5,14.5,4.5,4.5,14.5,0,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Qiu Ju da guan si",1992,100,NA,7.4,858,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Qiuyue",1992,108,NA,7,93,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Qivitoq",1956,119,NA,6,6,0,0,0,0,14.5,34.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Qolga",1966,20,NA,8.1,6,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Qortsili",1964,23,NA,8,6,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,0,1,0,0,1,1 -"Qu'est-ce qui fait courir David?",1982,97,NA,5.3,6,0,0,0,0,64.5,0,0,34.5,0,0,"",0,0,1,1,0,1,0 -"Qua la mano",1980,137,NA,5.1,8,14.5,14.5,0,0,14.5,34.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Quack Shot",1954,7,NA,6.9,21,4.5,0,4.5,0,4.5,4.5,44.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Quacker Tracker",1967,6,NA,6,23,4.5,0,4.5,4.5,4.5,14.5,34.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Quackodile Tears",1962,6,NA,6.9,22,0,0,4.5,4.5,0,4.5,45.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Quackser Fortune Has a Cousin in the Bronx",1970,90,NA,6.3,133,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Quadrille",1938,109,NA,7.3,15,0,4.5,0,0,0,0,24.5,4.5,4.5,64.5,"",0,0,1,0,0,1,0 -"Quadrille",1997,96,NA,6.9,27,0,0,0,14.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Quadrophenia",1979,120,NA,6.8,2081,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Quai des brumes, Le",1938,90,NA,8.5,519,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Qualcosa di biondo",1984,95,NA,5.5,18,4.5,4.5,14.5,0,24.5,24.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Qualcosa striscia nel buio",1971,90,NA,5.2,6,0,34.5,0,0,0,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Qualcuno in ascolto",1988,105,NA,5.9,61,0,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"PG",0,0,0,0,0,0,0 -"Quality Street",1927,80,NA,7.6,13,0,0,0,0,0,4.5,14.5,64.5,0,4.5,"",0,0,1,1,0,1,0 -"Quality Street",1937,83,NA,6.6,116,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Quality of Light, The",2003,81,NA,6.2,8,14.5,0,0,14.5,14.5,24.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Quality of Mercy, The",2002,12,NA,6.2,25,0,0,0,14.5,14.5,4.5,4.5,24.5,14.5,24.5,"",0,0,1,1,0,0,1 -"Quan jing",1978,94,NA,5.3,189,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Quand je serai parti... vous vivrez encore",1999,120,NA,6.2,26,0,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Quand la mer monte...",2004,90,NA,6.8,71,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Quand on sera grand",2000,92,NA,6.6,47,4.5,0,4.5,4.5,14.5,14.5,44.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Quand tu descendras du ciel",2003,95,NA,6.2,22,0,0,0,0,24.5,44.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Quand tu liras cette lettre",1953,104,NA,6.8,16,0,0,0,4.5,4.5,14.5,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Quando Alice ruppe lo specchio",1988,82,NA,5.4,83,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Quando gli uomini armarono la clava e... con le donne fecero din-don",1971,100,NA,2.8,25,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Quando le donne avevano la coda",1970,90,NA,3,54,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Quando le donne persero la coda",1972,94,NA,2.8,29,34.5,24.5,14.5,4.5,0,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Quando o Carnaval Chegar",1972,90,NA,7.1,12,4.5,0,24.5,0,4.5,0,14.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Quando una donna non dorme",2000,107,NA,7.2,7,0,0,24.5,0,0,0,14.5,14.5,0,44.5,"",0,0,1,1,0,1,0 -"Quante volte... quella notte",1972,83,NA,6,42,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Quantez",1957,80,NA,6.3,14,0,0,0,0,14.5,24.5,34.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Quantrill's Raiders",1958,68,NA,4.9,32,0,0,4.5,24.5,14.5,34.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Quantum Project",2000,40,NA,3.8,30,24.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Quarantaine, La",1982,105,NA,6.8,9,0,0,0,0,24.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Quare Fellow, The",1962,85,NA,6.7,16,0,0,4.5,0,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Quaresma",2003,95,NA,5.1,17,4.5,4.5,0,14.5,34.5,4.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Quarrel, The",1991,85,NA,6.5,78,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Quarry, The",1998,112,NA,6.6,76,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Quartet",1949,120,NA,8.1,83,0,4.5,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Quartet",1981,101,NA,6.3,187,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Quartett im Bett",1968,92,NA,3.9,6,0,34.5,0,34.5,0,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Quartetto Basileus, Il",1984,128,NA,8.5,17,0,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Quartier de femmes",1974,97,NA,5.9,6,0,0,0,0,14.5,14.5,14.5,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Quase Nada",2000,100,NA,7.5,16,4.5,0,0,4.5,14.5,0,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Quasimodo d'El Paris",1999,100,NA,5.9,195,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Quatermass",1978,240,NA,5.7,64,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Quatermass 2",1957,85,NA,7,277,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Quatermass Xperiment, The",1955,78,NA,6.7,366,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Quatermass and the Pit",1967,97,NA,7.1,965,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Quatorze Juillet",1933,86,NA,7.6,45,0,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Quatre Charlots mousquetaires, Les",1974,110,NA,3.7,56,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Quatre cents coups, Les",1959,94,NA,8.2,6482,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Quatre cents farces du diable, Les",1906,16,NA,6,13,4.5,0,0,4.5,24.5,14.5,24.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Quatrilho, O",1995,102,NA,7.3,478,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Quattro Noza",2003,96,NA,3.5,35,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Quattro dell'Ave Maria, I",1968,132,NA,6.1,228,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Quattro dell'apocalisse, I",1975,87,NA,6.2,158,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Quattro giornate di Napoli, Le",1962,124,NA,7.6,55,4.5,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Quattro moschettieri, I",1963,105,NA,6.4,5,0,0,0,0,0,64.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Quattro passi fra le nuvole",1942,94,NA,7.7,14,0,0,0,0,0,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Quax, der Bruchpilot",1941,97,NA,5.8,108,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Que faisaient les femmes pendant que l'homme marchait sur la lune?",2000,102,NA,7.1,40,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Quebec",1951,85,NA,4.7,13,0,4.5,14.5,34.5,14.5,14.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Quebracho",1974,95,NA,7.4,12,4.5,0,0,0,0,0,34.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Queda, A",1976,120,NA,6.6,24,14.5,0,0,4.5,4.5,4.5,4.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Queen Bee",1955,95,NA,6.5,139,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Queen Christina",1933,97,1114000,7.7,727,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Queen City Rocker",1986,90,NA,4.9,10,0,0,14.5,0,14.5,14.5,34.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Queen Is Crowned, A",1953,79,NA,6.5,11,0,4.5,0,0,4.5,14.5,0,4.5,0,45.5,"",0,0,0,0,1,0,0 -"Queen Kong",1976,87,NA,3.7,37,14.5,4.5,14.5,14.5,14.5,4.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Queen Live in Rio",1985,60,NA,8.8,34,0,0,4.5,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Queen Sacrifice",1988,30,NA,8.2,5,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,1,0,1,1 -"Queen Was in the Parlor, The",1932,7,NA,5.7,7,0,0,0,14.5,14.5,44.5,24.5,0,0,0,"",0,1,1,0,0,0,1 -"Queen for a Day",1951,107,NA,4.8,7,0,14.5,0,0,44.5,0,24.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Queen for a Day",2000,4,NA,4.9,18,4.5,0,14.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Queen of Blood",1966,81,NA,4.3,135,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Queen of Diamonds",1991,77,NA,3.1,14,24.5,4.5,4.5,0,4.5,0,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Queen of Outer Space",1958,80,NA,3.5,227,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Queen of Shebas Pearls, The",2004,131,NA,6.7,19,0,0,14.5,0,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Queen of Spades, The",1949,95,NA,7.7,103,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Queen of the Amazons",1947,61,NA,2.8,35,4.5,24.5,14.5,14.5,14.5,4.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Queen of the Damned",2002,104,35000000,4.7,6999,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Queen of the Gypsies",2003,80,NA,7.2,8,0,0,34.5,0,0,0,0,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Queen of the Whole Wide World",2001,82,NA,8.2,15,0,0,0,0,0,0,24.5,24.5,14.5,44.5,"",0,0,1,0,1,0,0 -"Queen of the Yukon",1940,73,NA,6.2,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Queen's Guards, The",1961,110,NA,6.2,10,0,0,14.5,0,14.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Queen's Messenger",2000,94,NA,2.6,54,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Queen's Messenger II",2001,90,4000000,6,27,4.5,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,34.5,"R",1,0,0,0,0,0,0 -"Queen's Speech",1999,2,NA,4.4,9,24.5,0,0,24.5,0,14.5,44.5,0,0,0,"",0,0,1,0,0,0,1 -"Queen, The",1968,68,NA,7.7,19,0,0,0,4.5,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Queen: Made in Heaven",1997,43,NA,8.4,11,0,0,0,14.5,0,0,0,24.5,0,45.5,"",0,0,0,0,0,0,1 -"Queen: The Making of an American Beauty",2000,91,NA,6.7,10,0,0,0,0,0,45.5,44.5,0,14.5,0,"",0,0,0,0,1,0,0 -"Queenie in Love",2001,103,NA,6.4,110,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Queens Logic",1991,100,NA,5.8,491,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Queimada",1969,132,NA,6.8,443,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Quel gran pezzo dell'Ubalda tutta nuda e tutta calda",1972,91,NA,6.3,42,14.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Quel maledetto giorno d'inverno... Django e Sartana all'ultimo",1970,90,NA,5.6,7,24.5,0,0,14.5,0,14.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Quel maledetto treno blindato",1977,72,NA,5.6,100,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Quel pomeriggio maledetto",1976,85,NA,3.6,19,4.5,14.5,0,0,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Quella sporca storia nel west",1968,91,NA,6.5,12,0,0,4.5,4.5,4.5,4.5,34.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Quella villa accanto al cimitero",1981,82,NA,6.2,961,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Quelle strane occasioni",1976,95,NA,5.7,22,4.5,4.5,4.5,4.5,4.5,34.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Quelli che contano",1974,83,NA,5.6,19,24.5,0,0,4.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Quello che cerchi",2002,99,NA,7.3,18,4.5,14.5,0,0,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Quello che le ragazze non dicono",2000,91,NA,4.9,13,24.5,14.5,0,4.5,4.5,4.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Quelqu'un de bien",2002,100,NA,5,107,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Quelque chose d'organique",1998,90,NA,5.9,35,4.5,14.5,4.5,4.5,14.5,24.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Quelques jours avec moi",1988,131,NA,7,124,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Quelques messieurs trop tranquilles",1973,92,NA,4.8,26,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Quem Matou Anabela?",1956,95,NA,4.1,8,14.5,0,14.5,14.5,0,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,1,0 -"Quem Matou Pixote?",1996,120,NA,7.8,69,0,4.5,0,0,4.5,4.5,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Quentin Quail",1946,7,NA,6.3,10,0,0,0,14.5,14.5,44.5,44.5,0,0,0,"",0,1,1,0,0,0,1 -"Querelle",1982,108,NA,6.4,742,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Querido Estranho",2002,95,NA,9,7,0,14.5,0,0,14.5,0,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Quest",1983,30,NA,4.1,18,4.5,14.5,4.5,24.5,14.5,0,14.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Quest for Camelot",1998,74,40000000,5.4,974,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,1,1,1,0,0,0 -"Quest for Length, The",2002,17,NA,8.2,12,0,0,4.5,0,0,0,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Quest for Love",1971,87,NA,5.9,90,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Quest for the Lost Tribes",1999,100,NA,6.1,5,0,0,0,0,0,24.5,0,44.5,0,44.5,"",0,0,0,0,1,0,0 -"Quest of the Delta Knights",1993,97,NA,1.7,566,45.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Quest to Ref",2002,15,NA,6.7,8,0,0,0,14.5,0,14.5,0,34.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Quest, The",2003,80,NA,7.3,7,0,0,14.5,0,14.5,14.5,14.5,0,0,44.5,"R",0,0,0,0,1,0,0 -"Questi fantasmi",1968,104,NA,5,31,4.5,4.5,4.5,14.5,34.5,4.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Question of Privilege",1999,94,NA,5,66,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Question to Asclepios, A",2004,26,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,1,0,0,1 -"Question, La",1977,112,NA,7.9,9,0,0,0,0,14.5,0,14.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Questione d'onore, Una",1965,108,NA,5.1,7,0,0,0,14.5,14.5,0,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Qui comincia l'avventura",1975,100,NA,4.3,13,0,4.5,0,14.5,4.5,34.5,14.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Qui perd gagne!",2004,92,NA,5.6,80,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Qui plume la lune?...",1999,96,NA,6.1,73,0,0,4.5,4.5,24.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Qui va Pino va sano",1997,13,NA,5.5,6,14.5,14.5,0,0,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Qui vive",2001,95,NA,6.9,22,0,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Qui-Gon Show, The",1999,6,NA,5.5,43,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Qui?",1970,78,NA,5.6,23,4.5,4.5,0,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Quick",1993,94,NA,5.2,118,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Quick Before It Melts",1964,97,NA,5.1,21,0,0,4.5,4.5,34.5,24.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Quick Change",1990,89,NA,6.6,2934,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Quick Gun, The",1964,87,NA,4.7,45,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Quick Millions",1931,72,NA,7,13,0,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Quick Money",1937,59,NA,5.3,14,0,0,0,24.5,24.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Quick and the Dead, The",1963,92,NA,6.3,11,4.5,0,0,4.5,0,4.5,34.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Quick and the Dead, The",1995,107,32000000,6.1,8837,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Quick on the Vigor",1950,7,NA,4.2,5,0,0,24.5,0,24.5,24.5,0,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Quicker Than the Eye",1989,88,NA,4.1,8,0,0,14.5,34.5,0,34.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Quicker'n a Wink",1940,10,NA,7.7,23,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Quickie, The",2001,99,NA,5.4,211,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Quicksand",1950,79,NA,6.3,149,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Quicksand",2002,92,NA,5.2,44,14.5,4.5,4.5,4.5,14.5,14.5,14.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Quicksilver",1986,105,NA,4.8,636,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Quienes Son?",2002,8,NA,6.2,7,0,0,0,0,45.5,0,24.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Quiero ser (I want to be ...)",2000,35,NA,6.6,143,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Quiet",2002,33,NA,5.2,13,4.5,4.5,0,4.5,0,0,4.5,4.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Quiet American, The",1958,120,NA,7,124,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Quiet American, The",2002,101,30000000,7.4,5957,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",0,0,0,1,0,1,0 -"Quiet Day in Belfast, A",1974,88,NA,7.6,20,14.5,0,0,0,14.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Quiet Days in Hollywood",1997,91,NA,4.7,100,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Quiet Earth, The",1985,91,NA,7,1353,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Quiet Fourth, A",1941,19,NA,6.5,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Quiet Gun, The",1957,77,NA,5.3,17,0,0,4.5,4.5,24.5,14.5,44.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Quiet Man, The",1952,129,NA,7.9,7191,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Quiet One, The",1948,65,NA,6,9,0,0,0,0,14.5,24.5,14.5,0,14.5,44.5,"",0,0,0,0,1,0,0 -"Quiet Please!",1945,7,NA,7.5,66,0,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Quiet Please: Murder",1942,70,NA,5.7,29,0,0,0,4.5,24.5,34.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Quiet Room, The",1996,92,NA,6.9,221,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"PG",0,0,0,1,0,0,0 -"Quiet Storm, The",2004,150,NA,8.2,5,0,0,0,0,0,24.5,24.5,0,44.5,24.5,"",0,0,0,0,0,0,0 -"Quiet Thunder",1988,84,NA,4,9,44.5,0,14.5,24.5,14.5,0,14.5,0,0,0,"",1,0,0,0,0,0,0 -"Quiet Weekend",1947,83,NA,6.3,8,0,0,0,0,14.5,0,14.5,0,14.5,64.5,"",0,0,1,0,0,0,0 -"Quiet! Pleeze",1941,6,NA,6.8,8,0,0,0,0,0,45.5,14.5,14.5,24.5,0,"",0,1,1,0,0,0,1 -"Quigley",2003,89,NA,5.2,30,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Quigley Down Under",1990,119,20000000,6.2,2315,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Quijote sin mancha, Un",1969,100,NA,4.5,13,14.5,0,0,4.5,4.5,14.5,4.5,24.5,0,24.5,"",0,0,1,1,0,0,0 -"Quill",2004,100,NA,6.4,116,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Quiller Memorandum, The",1966,105,NA,6.7,282,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Quills",2000,124,NA,7.3,9155,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Quilombo",1984,114,NA,7.9,90,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Quilt",1996,7,NA,3.7,7,0,0,24.5,24.5,0,0,24.5,0,14.5,0,"",0,1,0,0,0,0,1 -"Quincannon - Frontier Scout",1956,83,NA,5.1,8,34.5,14.5,24.5,0,0,14.5,14.5,0,0,0,"",1,0,0,0,0,1,0 -"Quincy's Quest",1979,80,NA,9.7,26,4.5,0,0,0,0,0,4.5,4.5,0,84.5,"",0,0,0,0,0,0,0 -"Quinta del porro, La",1980,107,NA,4.6,10,14.5,14.5,0,14.5,14.5,34.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Quintana",1969,84,NA,4,5,24.5,0,0,84.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Quintet",1979,116,NA,4.2,373,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Quinto Macaco, O",1990,105,NA,5.7,38,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Quintrala, La",1955,105,NA,9.6,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,1,0,0,0 -"Quiz Show",1994,133,NA,7.5,11316,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Quiz Whizz",1958,16,NA,5.5,27,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Qun long xi feng",1989,95,NA,8.5,77,4.5,0,0,0,4.5,0,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Qunian dongtian",1995,120,NA,7.5,11,0,0,14.5,0,0,0,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Quo Vadis",1951,166,7000000,6.9,1273,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Quo Vadis?",1912,120,NA,8.4,9,14.5,0,0,0,0,14.5,24.5,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Quo Vadis?",2001,165,18000000,6.1,250,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Quondam",2004,9,NA,8,8,14.5,0,0,14.5,0,0,0,0,14.5,64.5,"",0,0,0,1,0,0,1 -"Qurbani",1980,157,NA,5,42,4.5,4.5,0,0,4.5,4.5,4.5,4.5,34.5,34.5,"",1,0,0,0,0,0,0 -"R'coon Dawg",1951,7,NA,6.3,32,4.5,0,0,4.5,14.5,24.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"R. Merthonensis",2001,5,NA,6.1,16,0,0,0,4.5,4.5,34.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,1 -"R.F.D. 10,000 B.C.",1916,10,NA,5.5,9,0,0,0,24.5,34.5,14.5,34.5,0,0,0,"",0,1,0,0,0,0,1 -"R.I.C.C.O.",2002,104,NA,5.6,9,34.5,0,0,0,14.5,0,14.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"R.M., The",2003,101,500000,5.3,213,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"R.O.T.O.R.",1989,90,NA,1.5,334,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"R.P.M.",1970,92,NA,3.9,41,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"R2PC: Road to Park City",2000,83,NA,6.4,22,0,0,0,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"REW-FFWD",1994,31,NA,7.7,6,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,0,1,0,1 -"RPM",1998,91,NA,3.6,231,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"RRRrrrr!!!",2004,98,NA,4.6,507,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"RSVP",1991,23,NA,7.4,10,0,14.5,0,0,14.5,0,14.5,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Ra",1972,96,NA,6.5,54,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Raakh",1989,153,NA,6.8,14,4.5,4.5,4.5,0,0,0,24.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Raam Ke Naam",1992,90,NA,7.7,9,0,0,0,0,0,0,14.5,24.5,0,64.5,"",0,0,0,0,1,0,0 -"Raaste Kaa Patthar",1972,133,NA,7.6,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Raaz",2002,151,NA,6.7,67,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Raba lyubvi",1976,99,NA,7.3,105,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Rabatteuse, La",1978,90,NA,4.6,9,0,0,0,34.5,14.5,14.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Rabbia",1984,90,NA,2.8,10,34.5,0,34.5,0,14.5,0,24.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Rabbia, La",1963,53,NA,9,15,0,0,0,0,14.5,0,34.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Rabbit Every Monday",1951,7,NA,7.8,45,0,0,4.5,0,4.5,4.5,24.5,44.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Rabbit Fire",1951,7,NA,8.5,175,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Rabbit Hood",1949,8,NA,7.7,137,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Rabbit Punch",1948,8,NA,7.7,64,0,0,0,0,4.5,4.5,14.5,44.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Rabbit Rampage",1955,7,NA,7.9,76,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Rabbit Romeo",1957,7,NA,7.2,26,0,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Rabbit Seasoning",1952,7,NA,8.6,267,0,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,1,0,0,0,1 -"Rabbit Test",1978,84,NA,3,181,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rabbit Transit",1947,8,NA,7.2,58,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Rabbit Trap, The",1959,72,NA,6.1,17,0,0,0,0,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Rabbit of Seville",1950,7,NA,8.8,484,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,1,1,0,0,0,1 -"Rabbit's Feat",1960,7,NA,7.9,43,0,0,0,0,4.5,4.5,34.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Rabbit's Kin",1952,7,NA,6.6,97,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Rabbit's Moon",1950,7,NA,6.8,84,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Rabbit, Run",1970,94,NA,4.9,47,14.5,0,0,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Rabbit-Proof Fence",2002,94,6000000,7.7,5079,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"PG",0,0,0,1,0,0,0 -"Rabbits",2002,50,NA,6.4,231,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Rabbitson Crusoe",1956,7,NA,7.1,41,0,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Rabe, Der",1998,8,NA,6.6,18,0,0,14.5,0,4.5,34.5,24.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Rabid",1977,91,NA,6,1225,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rabindranath Tagore",1961,54,NA,6.7,10,0,0,0,0,0,24.5,14.5,24.5,0,45.5,"",0,0,0,0,1,0,0 -"Rabudo gan",2004,111,NA,7.9,11,4.5,0,0,0,0,0,14.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Racconti d'estate",1958,106,NA,6.2,10,0,0,0,0,24.5,44.5,14.5,34.5,0,0,"",0,0,1,1,0,1,0 -"Racconti di Canterbury, I",1972,109,NA,5.6,531,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Racconti romani",1955,110,NA,4.1,10,0,24.5,0,14.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Race Street",1948,79,NA,6.3,35,0,4.5,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Race des 'seigneurs', La",1974,90,NA,6,113,4.5,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Race for Atlantis",1998,4,NA,7,19,0,0,0,14.5,14.5,0,24.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Race for Glory",1989,104,NA,5.3,27,14.5,4.5,0,4.5,0,4.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Race for Your Life, Charlie Brown",1977,78,NA,6.6,393,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Race for the Yankee Zephyr",1981,108,6000000,5.1,83,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Race the Sun",1996,82,NA,5,513,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Race the Wind",1989,39,NA,6.4,6,14.5,0,0,0,0,0,34.5,0,14.5,34.5,"",0,0,0,0,1,0,1 -"Race to Save 100 Years, The",1997,57,NA,8.2,30,0,0,0,4.5,4.5,0,24.5,24.5,14.5,34.5,"PG",0,0,0,0,1,0,0 -"Race to Space",2001,104,NA,5.5,202,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Race with the Devil",1975,88,NA,5.9,361,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Racers, The",1955,88,NA,4.7,63,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rache",1995,78,NA,6.9,8,24.5,0,0,0,0,14.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Rachel Papers, The",1989,95,NA,5.7,432,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Rachel River",1987,85,NA,4.5,33,24.5,4.5,4.5,4.5,4.5,0,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Rachel and the Stranger",1948,80,NA,6.9,220,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Rachel's Attic",2002,112,83000,2.4,58,45.5,14.5,4.5,4.5,4.5,4.5,0,0,4.5,14.5,"R",1,0,0,1,0,0,0 -"Rachel's Daughters: Searching for the Causes of Breast Cancer",1997,106,NA,1.4,8,24.5,14.5,0,0,0,0,0,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Rachel's Man",1974,111,NA,1,9,74.5,0,0,14.5,0,0,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Rachel, Rachel",1968,101,700000,7.1,262,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rachida",2002,100,NA,7.6,76,4.5,4.5,0,0,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Racing Stripes",2005,84,NA,4.8,703,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,1,1,0,0,0,0 -"Racing with the Moon",1984,108,NA,6.6,651,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Rack, The",1956,100,NA,6.6,138,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rackelhane",2000,55,NA,7,7,0,0,14.5,0,0,14.5,44.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Racket Busters",1938,71,NA,5.9,63,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Racket Girls",1951,81,NA,2.3,66,64.5,14.5,4.5,4.5,0,4.5,0,0,0,4.5,"",1,0,0,1,0,0,0 -"Racket, The",1928,84,NA,7.7,52,0,0,0,0,4.5,14.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Racket, The",1951,88,NA,6.8,154,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Racketeer Rabbit",1946,8,NA,7.8,43,0,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Racketeer, The",1929,66,NA,6.8,18,0,0,0,0,24.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Racketeers of the Range",1939,62,NA,5.4,16,0,0,0,14.5,24.5,34.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Raconte",2000,18,NA,5.6,15,4.5,14.5,4.5,4.5,14.5,14.5,0,4.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Rad",1986,91,NA,6.5,674,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Rad na odredjeno vreme",1980,89,NA,7.2,9,0,0,0,0,34.5,24.5,14.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Radar Men From the Moon",1952,167,NA,4.5,123,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Radar Patrol vs. Spy King",1950,167,NA,5.5,9,0,0,0,14.5,24.5,14.5,44.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Radar Secret Service",1950,59,NA,1.7,70,45.5,24.5,4.5,4.5,4.5,0,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Radevou stin Kerkyra",1960,85,NA,6.9,7,14.5,0,0,0,14.5,0,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Radevou ston aera",1966,93,NA,9.1,15,0,0,4.5,0,0,4.5,24.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Radhio Moskha",1995,85,NA,6.1,18,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Radiance",1998,83,NA,6.5,104,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Radiation",1998,90,NA,5.9,6,0,14.5,0,0,14.5,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Radio",2003,109,35000000,6.9,3594,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Radio Bikini",1987,56,NA,7.1,41,0,4.5,4.5,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Radio City Revels",1938,90,810000,6.3,12,0,0,0,4.5,14.5,14.5,34.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Radio Days",1987,85,16000000,7.4,3989,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Radio Dynamics",1942,4,NA,5.4,12,14.5,4.5,0,4.5,0,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Radio Flyer",1992,114,35000000,6.4,2447,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Radio Free Steve",2000,82,NA,6.2,7,0,0,0,0,0,24.5,14.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Radio Hams",1939,10,NA,6.6,13,0,0,0,0,4.5,34.5,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Radio Inside",1994,91,NA,5.9,210,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Radio On",1980,104,NA,5.7,32,4.5,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Radio Parade of 1935",1934,96,NA,6.2,7,0,0,0,24.5,0,14.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Radio Patrol",1932,65,NA,5.4,5,0,24.5,0,24.5,0,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Radio Patrol",1937,242,NA,5.5,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",1,0,0,1,0,0,0 -"Radio Rhythm",1929,9,NA,5.6,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Radio Stars on Parade",1945,69,NA,7.1,9,0,0,14.5,14.5,14.5,14.5,24.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Radioactive Crotch Man",1997,3,NA,5,5,0,44.5,0,0,0,24.5,24.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Radioactive Dreams",1985,98,NA,4.6,114,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Radiofreccia",1998,112,NA,6.5,228,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Radioland Murders",1994,112,NA,5.5,803,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Radiotel Monaco Tijuana",2000,23,NA,5.8,6,34.5,0,0,0,0,0,14.5,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Radium City",1987,110,NA,8.9,7,0,0,0,0,0,0,14.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Radius",2004,33,60000,4.4,22,14.5,0,4.5,0,0,4.5,4.5,14.5,14.5,44.5,"",1,0,0,0,0,0,1 -"Radosti i pechali malen'kogo lorda",2003,105,NA,7.6,5,0,0,0,0,0,0,44.5,64.5,0,0,"",0,0,0,0,0,0,0 -"Raduga",1944,93,NA,7.5,9,0,0,0,0,0,0,24.5,45.5,0,24.5,"",0,0,0,1,0,0,0 -"Radyo",2001,95,NA,6.6,5,0,0,24.5,0,0,24.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Rafales",1990,88,NA,6.1,37,0,0,4.5,4.5,4.5,24.5,44.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Rafferty and the Gold Dust Twins",1975,91,NA,5.1,69,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Raffle, The",1994,100,NA,3.9,60,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Raffles",1930,72,NA,6.5,42,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Raffles",1940,72,NA,6.2,62,0,0,0,14.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Raffles Hotel",1989,90,NA,6.2,11,0,0,0,0,14.5,45.5,0,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Rag Man, The",1925,68,NA,7.1,37,0,0,4.5,4.5,0,24.5,14.5,44.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Rag. Arturo De Fanti, bancario - precario",1979,92,NA,5.4,19,4.5,4.5,14.5,0,24.5,14.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Ragazza che sapeva troppo, La",1963,86,NA,6.5,168,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ragazza con la pistola, La",1968,100,NA,6.8,49,0,0,0,0,14.5,24.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Ragazza con la valigia, La",1960,111,NA,6.7,91,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Ragazza dal pigiama giallo, La",1977,98,NA,6.1,32,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ragazza dalla pelle di luna, La",1972,79,NA,6.5,5,0,24.5,24.5,0,0,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Ragazza del palio, La",1957,102,NA,4.5,7,14.5,14.5,0,14.5,0,24.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Ragazza del vagone letto, La",1980,80,NA,5.6,20,4.5,0,4.5,14.5,14.5,14.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Ragazza di Bube, La",1963,109,NA,6.6,29,4.5,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ragazza di Trieste, La",1983,113,NA,6,24,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ragazza di nome Giulio, La",1970,106,NA,5.2,5,0,0,0,0,64.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Ragazza e il generale, La",1967,103,NA,5.6,64,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Ragazza in vetrina, La",1961,92,NA,6.3,12,0,0,0,0,14.5,24.5,24.5,4.5,24.5,0,"",0,0,0,1,0,0,0 -"Ragazza tutta nuda assassinata nel parco",1972,92,NA,6.5,6,0,0,14.5,0,14.5,14.5,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Ragazze di San Frediano, Le",1955,102,NA,6,10,0,0,0,0,14.5,14.5,24.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Ragazze di piazza di Spagna, Le",1952,85,NA,6,8,0,0,0,0,0,74.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Ragazzi del Juke-Box",1959,102,NA,5.3,15,4.5,0,0,14.5,4.5,4.5,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Ragazzi del massacro, I",1969,92,NA,6.4,22,0,4.5,0,0,14.5,24.5,34.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Ragazzi fuori",1990,110,NA,7.5,29,4.5,0,0,4.5,0,24.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Ragazzina, La",1974,93,NA,6.5,6,0,14.5,0,14.5,0,0,34.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Ragazzo dal kimono d'oro, Il",1987,94,NA,3.4,34,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Ragazzo del pony express, Il",1986,87,NA,2.4,14,45.5,4.5,4.5,4.5,0,4.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Ragazzo di Calabria, Un",1987,108,NA,6.8,39,0,0,0,14.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ragazzo e una ragazza, Un",1984,96,NA,5.8,5,0,0,0,24.5,0,0,44.5,0,44.5,0,"",0,0,1,0,0,1,0 -"Ragbar",1971,120,NA,8.4,10,0,0,0,0,0,0,24.5,14.5,45.5,24.5,"",0,0,0,0,0,0,0 -"Rage",1966,103,NA,4.9,43,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rage",1972,104,NA,5.6,122,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rage",1995,94,NA,4.1,94,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Rage",1999,120,NA,5.4,25,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rage In Placid Lake, The",2003,89,NA,7.1,356,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Rage Net",1988,1,NA,7.6,41,4.5,0,0,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Rage and Honor",1992,89,NA,4,60,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Rage and Honor II",1993,98,NA,4.4,50,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Rage at Dawn",1955,87,NA,5.8,82,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rage in Harlem, A",1991,108,NA,5.7,271,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rage in Heaven",1941,85,NA,5.8,53,4.5,4.5,0,4.5,24.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rage of Honor",1987,91,NA,4.7,39,14.5,4.5,14.5,4.5,14.5,34.5,14.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Rage of Paris, The",1938,78,NA,6.7,65,0,0,0,4.5,14.5,4.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rage of Vengeance",1993,85,NA,1.8,11,44.5,14.5,4.5,14.5,4.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Rage of the Innocents",2000,93,NA,3.3,11,4.5,44.5,14.5,4.5,4.5,0,0,0,0,4.5,"",1,0,0,0,0,0,0 -"Rage to Kill",1987,96,NA,1.7,20,74.5,4.5,4.5,0,0,14.5,0,4.5,0,0,"",1,0,0,0,0,0,0 -"Rage to Live, A",1965,101,NA,4.8,44,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rage to Reason",2003,95,NA,5.8,6,14.5,0,0,0,14.5,14.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Rage: 20 Years of Punk Rock West Coast Style",2001,67,NA,6.6,12,24.5,0,0,0,0,14.5,44.5,0,4.5,4.5,"",0,0,0,0,1,0,0 -"Rage: Carrie 2, The",1999,104,21000000,4.4,3280,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Raggare!",1959,88,NA,2.6,21,14.5,14.5,0,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Raggedy Ann & Andy: A Musical Adventure",1977,84,NA,4.3,101,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Raggedy Ann and Raggedy Andy",1941,17,NA,9.5,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,1,0,0,0,0,1 -"Raggedy Man",1981,94,NA,6.5,254,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Raggedy Rawney, The",1988,103,NA,5.4,91,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Raggio infernale, Il",1968,93,NA,2.2,80,44.5,24.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Raghs dar chobar",2003,95,NA,7.8,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Raghs-e-khak",1998,73,NA,6.1,25,0,4.5,4.5,0,0,4.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Raging Angels",1995,96,NA,2.5,58,34.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,1,0 -"Raging Bull",1980,129,18000000,8.4,26739,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Raging Hormones",1999,93,NA,2.5,50,34.5,4.5,24.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Raging Moon, The",1971,110,NA,6,31,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Raging Sharks",2005,92,NA,4.8,5,44.5,24.5,0,0,0,0,0,0,0,44.5,"R",0,0,0,0,0,0,0 -"Raging Tide, The",1951,93,NA,7.4,12,0,0,0,0,0,4.5,64.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Ragione per vivere e una per morire, Una",1972,92,NA,5.4,106,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ragman's Daughter, The",1972,94,NA,5.2,14,14.5,0,14.5,0,4.5,24.5,4.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Ragtime",1981,155,NA,7.1,1494,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ragu Incident, The",2000,78,NA,6.6,25,4.5,0,4.5,0,4.5,24.5,0,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Raid",2003,124,NA,7.4,338,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",1,0,0,0,0,0,0 -"Raid on Rommel",1971,99,NA,5,173,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Raid, Le",2002,94,NA,3.3,243,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Raid, The",1954,83,NA,7,62,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Raiders of Ghost City",1944,225,NA,6.7,5,0,0,0,0,24.5,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Raiders of Leyte Gulf, The",1963,80,NA,3.6,5,0,24.5,0,24.5,44.5,0,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Raiders of Old California",1957,72,NA,6.4,7,0,0,0,14.5,14.5,0,0,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Raiders of the Golden Triangle",1985,90,NA,7.3,6,0,34.5,0,0,0,0,0,0,0,64.5,"",1,0,0,0,0,0,0 -"Raiders of the Living Dead",1986,86,NA,1.6,63,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Raiders of the Lost Ark",1981,115,20000000,8.7,93511,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",1,0,0,0,0,0,0 -"Raiders of the Seven Seas",1953,88,NA,5.7,23,0,4.5,4.5,14.5,24.5,24.5,24.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Raiders of the Sun",1992,80,NA,2.5,20,24.5,24.5,24.5,14.5,0,4.5,14.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Raiders, The",1963,75,NA,5.8,8,0,0,0,24.5,34.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Railroaded!",1947,72,NA,6.7,126,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Railroadin'",1929,20,NA,7.7,12,0,0,0,14.5,0,0,14.5,44.5,24.5,0,"",0,0,1,0,0,0,1 -"Railrodder, The",1965,24,NA,7.8,98,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Rails Into Laramie",1954,80,NA,5.7,12,4.5,0,0,4.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Railway Children, The",1970,109,NA,7.3,374,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rain",1932,92,NA,7.1,239,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rain",2002,26,NA,7.1,7,0,0,14.5,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Rain Dogs",2004,98,NA,6.2,6,14.5,0,0,34.5,0,0,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Rain Killer, The",1990,94,NA,4.1,35,14.5,4.5,24.5,24.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Rain Man",1988,133,25000000,7.9,42562,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Rain People, The",1969,101,750000,6.7,319,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Rain Without Thunder",1992,85,NA,4.4,46,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Rain or Shine",1930,90,NA,6,27,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rain, Drizzle, and Fog",1998,49,NA,9.8,9,0,0,0,14.5,0,0,0,0,34.5,45.5,"",0,0,0,0,1,0,0 -"Rainbow",1996,98,NA,3.9,73,14.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rainbow 'Round My Shoulder",1952,78,NA,7.3,6,0,0,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Rainbow Avenger, The",1998,12,NA,2,5,44.5,0,0,24.5,44.5,0,0,0,0,0,"",0,0,1,0,0,0,1 -"Rainbow Boys, The",1973,91,NA,7.1,8,0,14.5,14.5,0,0,0,24.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Rainbow Bridge",1972,108,NA,6.8,57,14.5,0,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Rainbow Brite and the Star Stealer",1985,97,NA,6.5,139,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,44.5,"",0,1,0,0,0,0,0 -"Rainbow Dance",1936,4,NA,6.1,18,0,4.5,0,24.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Rainbow Island",1944,98,NA,8.2,12,4.5,0,0,0,0,0,4.5,34.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Rainbow Jacket, The",1954,99,NA,5.4,9,0,0,0,14.5,0,24.5,0,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Rainbow Man/John 3:16, The",1997,41,NA,7.5,15,0,0,0,0,4.5,0,24.5,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Rainbow Thief, The",1990,87,10000000,6,49,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Rainbow Valley",1935,52,NA,3.9,29,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,1,0 -"Rainbow War",1985,20,NA,7.3,56,0,4.5,0,4.5,0,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,0,1,1 -"Rainbow Warrior, The",1992,93,NA,5.2,75,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Rainbow on the River",1936,87,NA,7.2,10,0,0,0,14.5,24.5,14.5,24.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Rainbow, The",1989,113,NA,6.5,185,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Raincoat",2004,120,NA,7.9,154,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Rainer Werner Fassbinder, 1977",1977,28,NA,8.1,5,0,0,0,0,0,24.5,0,44.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Rainha Diaba, A",1974,100,NA,8,23,4.5,0,4.5,0,4.5,4.5,0,24.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Raining Stones",1993,90,NA,7.3,648,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Rainmaker, The",1956,121,NA,7.1,515,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Rainmaker, The",1997,135,40000000,6.8,8620,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Rainmakers, The",1935,78,NA,7.5,11,4.5,0,0,0,0,4.5,4.5,34.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rains Came, The",1939,105,2600000,6.6,111,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Rains of Ranchipur, The",1955,104,NA,5.7,131,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Raintree County",1957,168,5000000,6.2,433,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Rainy Day with the Bear Family, A",1940,7,NA,6,6,0,0,0,0,45.5,0,0,45.5,0,0,"",0,1,1,0,0,0,1 -"Rainy Season",2002,15,NA,3.4,24,14.5,4.5,0,24.5,0,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Raise Your Voice",2004,103,15000000,4.3,1626,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"PG",0,0,0,1,0,1,0 -"Raise the Titanic",1980,115,36000000,4.4,612,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Raisin in the Sun, A",1961,128,1500000,7.6,658,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Raising Arizona",1987,94,6000000,7.6,19991,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Raising Cain",1992,91,11000000,5.4,1885,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Raising Helen",2004,119,NA,5.7,2398,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Raising Heroes",1996,84,NA,4.8,38,24.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Raising Victor Vargas",2002,88,800000,6.7,1785,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Raising a Riot",1955,90,NA,4,6,0,14.5,0,34.5,0,34.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Raising the Stakes",1999,88,100000,4.7,24,4.5,0,4.5,4.5,24.5,0,0,14.5,14.5,34.5,"R",0,0,0,1,0,1,0 -"Raisins de la mort, Les",1978,90,NA,6.2,107,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Raison du plus fou, La",1973,90,NA,3.7,8,14.5,0,0,0,0,14.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Raja",1995,168,NA,5.5,35,24.5,0,4.5,4.5,14.5,4.5,4.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Raja Babu",1994,161,NA,4.9,31,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Raja Hindustani",1996,165,NA,5.3,136,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",1,0,1,1,0,1,0 -"Raja Ko Rani Se Pyar Ho Gaya",2000,148,NA,3.5,6,34.5,0,0,34.5,14.5,14.5,0,0,0,0,"",0,0,1,0,0,1,0 -"Rajio no jikan",1997,103,NA,7.5,270,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Rajita para dos, Una",1984,91,NA,6.8,7,14.5,0,0,0,0,14.5,0,74.5,0,0,"",0,0,0,0,0,0,0 -"Rajnigandha",1974,110,NA,8.3,15,0,0,0,0,0,4.5,4.5,4.5,34.5,44.5,"",0,0,1,1,0,1,0 -"Rake's Progress, The",1945,110,NA,6.2,24,0,4.5,0,0,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rakka suru yugata",1998,106,NA,7.1,14,0,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rakkaudella, Maire",1999,101,NA,6.7,108,4.5,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Rakkauden risti",1946,99,NA,6.4,13,0,0,4.5,0,4.5,24.5,4.5,34.5,24.5,0,"",0,0,0,1,0,0,0 -"Rakkaus kahleissa",1955,80,NA,4,8,0,0,14.5,45.5,0,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Rakkauselokuva",1984,72,NA,7,7,24.5,0,0,0,0,24.5,14.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Rakos... no. 14, kai o protos bounakias",1985,96,NA,6.9,5,0,0,0,0,24.5,0,0,44.5,0,44.5,"",0,0,1,0,0,0,0 -"Rakvickarna",1966,10,NA,7.6,55,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Rallarblod",1979,123,NA,4.9,13,0,4.5,0,4.5,24.5,14.5,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Rally 'Round the Flag, Boys!",1958,106,NA,5.6,140,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ralo, O",1999,16,NA,7.1,19,0,0,0,0,14.5,4.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Ralph Bunche: An American Odyssey",2001,117,NA,6.1,5,24.5,0,0,0,24.5,0,24.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Ralph Ellison: An American Journey",2002,87,NA,5.4,8,0,0,0,0,24.5,45.5,0,14.5,0,14.5,"",0,0,0,1,1,0,0 -"Ram Aur Shyam",1967,171,NA,6.8,13,4.5,0,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Ram Dass, Fierce Grace",2001,93,NA,7.1,37,0,0,0,4.5,0,4.5,4.5,34.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Ram Teri Ganga Maili",1985,178,NA,6.8,19,4.5,14.5,0,0,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Rama Dama",1991,107,NA,6.4,32,4.5,0,4.5,0,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ramayana: The Legend of Prince Rama",1992,170,NA,5.4,17,0,4.5,4.5,0,4.5,4.5,4.5,14.5,0,45.5,"",0,1,0,0,0,0,0 -"Rambling 'Round Radio Row #4",1932,10,NA,6.2,6,0,0,14.5,0,34.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Rambling Rose",1991,112,NA,6.7,1170,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rambo III",1988,101,65000000,4.1,7631,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Rambo: First Blood Part II",1985,94,44000000,5.1,9479,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Rambone the Destroyer",1985,75,NA,5.5,8,0,14.5,14.5,14.5,14.5,14.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Rami og Julie",1988,90,NA,3.8,10,34.5,0,0,44.5,14.5,0,14.5,0,14.5,0,"",0,0,0,0,0,1,0 -"Ramona",1936,90,NA,5.5,32,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Ramona!",1993,94,NA,4.7,15,0,4.5,24.5,4.5,4.5,4.5,14.5,24.5,0,24.5,"",0,0,1,0,0,1,0 -"Ramones Raw",2004,105,NA,7.8,24,0,0,4.5,4.5,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Rampage",1963,98,NA,5.1,41,4.5,4.5,0,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rampage",1988,97,NA,6.2,255,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rampe & Naukkis - Kaikkien aikojen superpari",1990,90,NA,6,33,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rampo",1994,100,NA,6.5,210,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Ramrod",1947,95,NA,6.4,77,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ramrodder, The",1969,92,NA,3.8,19,14.5,14.5,0,14.5,14.5,0,14.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Ramses",2002,70,NA,7.1,47,0,0,0,4.5,4.5,4.5,34.5,34.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Ran",1985,160,11500000,8.4,11981,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Rana: The Legend of Shadow Lake",1975,96,NA,2.2,44,34.5,14.5,14.5,4.5,14.5,4.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rancho Deluxe",1975,93,NA,6.7,270,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Rancho Grande",1940,68,NA,7.2,11,0,0,0,4.5,0,4.5,0,45.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rancho Notorious",1952,89,NA,7,392,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Rancho del miedo",1971,95,NA,2.1,5,24.5,64.5,0,24.5,0,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Rancid",2004,108,NA,4.9,72,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Rancid Aluminium",2000,88,12000000,3.5,352,34.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Randall's Flat",2001,96,NA,1.8,99,64.5,14.5,4.5,0,0,4.5,0,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Random Encounter",1998,90,NA,4.5,98,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Random Harvest",1942,125,NA,7.7,946,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Random Hearts",1999,133,64000000,4.8,5919,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Randonneurs, Les",1997,95,NA,6.1,298,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Randy Rides Alone",1934,53,NA,5,115,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rane",1998,100,NA,7.8,487,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Rang-e khoda",1999,90,NA,7.5,1175,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"PG",0,0,0,1,0,0,0 -"Range Busters, The",1940,56,NA,6.1,7,0,0,0,0,0,24.5,45.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Range Feud",1931,64,NA,4.6,44,14.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Range War",1939,65,NA,7.2,15,0,0,4.5,0,4.5,24.5,4.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Rangeela",1995,142,NA,7.8,228,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Ranger of Cherokee Strip",1949,60,NA,5,5,24.5,0,24.5,0,0,64.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Rani radovi",1969,79,NA,9.3,8,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,0,1,0,0,0 -"Ranjena zemlja",1999,94,NA,2.5,23,45.5,14.5,0,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ransom",1975,98,NA,5.4,169,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ransom",1996,139,80000000,6.6,17678,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Ransom!",1956,109,NA,6.6,250,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ransom, The",1977,90,NA,3.9,28,4.5,14.5,14.5,24.5,14.5,0,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Rant",1996,8,NA,7.4,7,0,0,0,0,14.5,0,0,44.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Rantasalmen sulttaani",1953,72,NA,2.7,8,34.5,14.5,24.5,0,0,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Rantasuon raatajat",1942,90,NA,5.7,6,0,0,0,14.5,45.5,0,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Raoni",1978,84,NA,5.9,7,0,0,14.5,14.5,0,14.5,0,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Rapa Nui",1994,107,20000000,5.8,761,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Rapace, Le",1968,104,NA,6.7,84,0,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Rapado",1992,75,NA,3.6,10,64.5,14.5,0,0,0,0,0,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Rape",1999,14,NA,5.6,7,14.5,0,0,0,24.5,14.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Rape Squad",1974,81,NA,4.2,42,14.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Raped by an Angel 5: The Final Judgement",2000,84,NA,5,12,14.5,14.5,24.5,4.5,4.5,14.5,4.5,0,0,0,"",1,0,0,1,0,0,0 -"Rapid Fire",1990,84,NA,5.4,42,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Rapid Fire",1992,95,NA,5.6,1072,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Raport despre starea natiunii",2004,80,NA,5.9,7,24.5,0,0,14.5,0,0,0,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rappin-n-Rhyming",2002,90,NA,7.7,7,14.5,0,0,0,14.5,0,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Rappresaglia",1973,110,NA,6.1,93,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rapsodiya v byalo",2002,80,NA,7.5,18,0,0,0,0,0,14.5,4.5,45.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rapt",1933,102,NA,4.9,5,0,0,0,24.5,24.5,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Rapto, El",1954,85,NA,7.2,8,0,0,0,0,0,14.5,24.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Raptores, Os",1969,88,NA,5.5,12,4.5,0,45.5,0,0,0,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Rapture",1965,100,NA,6.8,52,4.5,0,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Rapture, The",1991,100,NA,6.7,1218,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rapunzel",1951,11,NA,6.3,6,0,0,0,0,0,34.5,0,34.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Raquetteurs, Les",1958,15,NA,6.3,24,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Rare Birds",2001,99,5000000,6.4,471,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Rare Breed, A",1981,94,NA,4.6,5,44.5,0,24.5,0,0,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Rare Breed, The",1966,97,NA,6.2,278,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Rare Exports Inc.",2003,7,NA,7.6,32,0,0,0,0,0,4.5,4.5,14.5,24.5,44.5,"",1,0,1,0,0,0,1 -"Rarg",1988,30,NA,8.1,20,0,0,0,4.5,0,0,24.5,0,14.5,64.5,"",0,1,0,0,0,0,1 -"Ras del quartiere, Il",1983,88,NA,6.8,29,0,0,0,14.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ras-le-bol sous les ponts de Paris",1985,10,NA,7.8,5,0,0,0,0,0,24.5,24.5,44.5,24.5,0,"",0,0,0,0,0,0,1 -"Rascagnes",2003,10,NA,5.6,6,0,0,0,14.5,0,34.5,14.5,0,14.5,14.5,"",0,1,0,0,0,0,1 -"Rascal",1969,85,NA,6.2,44,4.5,0,4.5,0,14.5,24.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Rasen",1998,97,NA,4.9,247,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rashi: A Light After the Dark Ages",1999,65,NA,6.7,7,0,0,0,0,24.5,0,14.5,14.5,14.5,24.5,"",0,1,0,1,1,0,0 -"Raskenstam",1983,109,NA,6,52,4.5,4.5,0,14.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Raskolnikow",1923,135,NA,8.1,13,0,0,0,0,0,14.5,4.5,24.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Rasmines bryllup",1935,90,NA,5.8,5,0,0,0,0,64.5,0,24.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Rasmus, Pontus och Toker",1956,84,NA,4.3,12,0,0,0,34.5,24.5,14.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Raspad",1990,103,NA,7.2,16,0,0,0,4.5,4.5,14.5,14.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Raspberry Reich, The",2004,90,NA,7,141,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Rasputin and the Empress",1932,121,NA,6.5,79,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rasputin: The Mad Monk",1966,91,NA,5.7,190,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rat",1960,84,NA,5.2,22,4.5,4.5,0,4.5,24.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rat",2000,88,NA,5.4,165,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Rat Bastard",1998,87,NA,5.7,6,0,0,14.5,0,0,0,45.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Rat Life and Diet in North America",1968,14,NA,6,6,0,14.5,14.5,0,0,14.5,0,34.5,14.5,0,"",0,0,0,0,0,0,1 -"Rat Pfink a Boo Boo",1966,72,NA,3.1,117,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,34.5,"",1,0,1,0,0,0,0 -"Rat Race",2001,112,48000000,6.5,13913,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Rat Race, The",1960,105,NA,6.3,105,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Rat uzivo",2000,101,NA,8.6,85,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Rat, Le",2001,61,NA,4.5,27,14.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ratas, ratones, rateros",1999,107,NA,8,142,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Ratataa",1956,107,NA,6.9,30,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Ratataplan",1979,95,NA,6.5,59,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Ratavartijan kaunis Inkeri",1950,85,NA,8.2,8,0,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ratboy",1986,104,NA,3.8,135,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ratcatcher",1999,94,NA,7.1,1111,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ratchet",1996,114,NA,4.1,50,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Rate It X",1985,93,NA,5,12,24.5,0,0,4.5,34.5,0,24.5,4.5,0,0,"",0,0,0,0,1,0,0 -"Rated X",2000,115,NA,5.7,864,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Rated X: A Journey Through Porn",2000,92,NA,2.6,15,24.5,4.5,0,0,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Rationing",1944,93,NA,6.7,8,0,0,0,14.5,14.5,34.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Raton Pass",1951,84,NA,8.1,9,0,0,0,0,0,0,14.5,44.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Ratrace",1998,60,NA,7.2,12,4.5,0,0,0,14.5,0,34.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Rats",2003,90,NA,3.1,151,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Rats & Bullies",2004,102,120000,8.6,8,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,1,0,0 -"Rats - Notte di terrore",1984,97,NA,3.5,147,24.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rats Are Coming! The Werewolves Are Here!, The",1972,91,NA,3.1,34,34.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Rats and Rabbits",2000,90,NA,3.5,30,24.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Rats of Tobruk, The",1944,68,NA,5.8,17,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Ratte, Die",1993,80,NA,5.1,6,0,14.5,14.5,0,0,0,0,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Rattenskat",1999,2,NA,5.2,5,0,0,0,0,24.5,24.5,24.5,0,24.5,24.5,"",0,1,0,0,0,0,1 -"Rattle of a Simple Man",1964,96,NA,5.8,23,0,0,0,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Rattled Rooster, The",1948,7,NA,7.2,16,0,0,0,4.5,4.5,14.5,34.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Rattlers",1976,82,NA,4.3,41,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rattlesnake Jake",2004,6,1000,5.4,16,24.5,14.5,4.5,14.5,0,0,0,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Ratto delle sabine, Il",1945,90,NA,4.8,12,0,0,14.5,0,0,24.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Ratto delle sabine, Il",1961,98,NA,3.9,23,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Ratu ilmu hitam",1979,85,NA,4.2,17,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Raub der Sabinerinnen, Der",1954,89,NA,5.7,18,0,4.5,0,14.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Raulito, La",1975,95,NA,6.3,14,0,4.5,0,0,14.5,14.5,44.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Raus aus seinen Kleidern",1999,8,NA,2.7,6,45.5,14.5,0,0,14.5,0,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Raus ins Leben",2003,89,NA,8.4,11,0,0,0,0,0,4.5,14.5,24.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Rauw!",2001,12,NA,6.3,28,4.5,24.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Ravager",1997,92,NA,5.9,292,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Ravagers",1979,90,NA,3.1,61,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ravagers, The",1965,88,NA,5.3,8,14.5,14.5,24.5,14.5,14.5,0,24.5,0,0,0,"",1,0,0,1,0,0,0 -"Ravanello pallido",2001,90,NA,5.2,39,4.5,4.5,0,14.5,24.5,34.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Ravaryete makdush",2002,83,NA,6.9,14,0,4.5,0,0,4.5,24.5,24.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Rave",2000,85,NA,5.4,55,14.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rave Macbeth",2001,87,3500000,6.2,67,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rave Review",1995,92,NA,5.1,8,0,0,0,14.5,24.5,24.5,0,0,0,34.5,"",0,0,1,1,0,0,0 -"Ravel's Brain",2001,52,NA,3.6,5,44.5,0,0,0,44.5,24.5,0,0,0,0,"",0,0,0,0,1,0,0 -"Raven",1997,93,NA,4.2,131,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Raven's Ridge",1997,77,NA,3.2,22,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,34.5,"R",1,0,0,1,0,0,0 -"Raven, The",1915,57,NA,6.2,6,0,0,0,0,34.5,0,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Raven, The",1935,61,115000,6.8,420,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Raven, The",1963,86,NA,6.6,1087,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Raven, The",2003,11,NA,4.3,13,4.5,0,0,4.5,0,4.5,0,4.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Raven... Nevermore, The",1999,16,NA,5.3,18,14.5,4.5,4.5,0,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Ravenous",1999,108,12000000,6.7,5915,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Ravi Shankar: Between Two Worlds",2001,90,NA,8,7,0,0,0,0,14.5,0,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Ravioli",2003,79,NA,6.4,54,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Ravnovesie",1983,140,NA,9,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Raw Deal",1948,79,NA,7.7,183,4.5,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Raw Deal",1977,94,NA,4.8,11,0,0,0,14.5,14.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Raw Deal",1986,97,NA,4.7,2967,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Raw Deal: A Question of Consent",2001,90,NA,5.6,33,4.5,0,0,0,0,14.5,0,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Raw Edge",1956,76,NA,5.4,14,0,0,4.5,14.5,44.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Raw Force",1982,86,NA,4,30,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Raw Images From the Optic Cross",1998,25,NA,6.9,7,14.5,0,0,0,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,1 -"Raw Justice",1994,95,NA,3.4,232,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Raw Nerve",1990,91,NA,3.2,6,34.5,0,14.5,14.5,0,34.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Raw Nerve",1991,91,NA,3.5,33,14.5,24.5,4.5,24.5,0,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Raw Nerve",1999,105,NA,4.2,117,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Raw Target",1995,92,NA,4.4,11,34.5,0,0,4.5,14.5,4.5,14.5,0,0,4.5,"R",1,0,0,0,0,0,0 -"Raw Wind in Eden",1958,93,NA,5.4,28,4.5,4.5,0,14.5,14.5,24.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Raw! Raw! Rooster!",1956,7,NA,6.7,18,0,0,0,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Rawhead Rex",1986,89,NA,4.1,382,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Rawhide",1938,58,NA,4.8,13,0,0,24.5,4.5,14.5,24.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Rawhide",1951,87,NA,6.7,144,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rawhide Rangers",1941,56,NA,4.6,5,24.5,0,0,0,0,64.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Rawhide Terror, The",1934,52,NA,5.3,5,0,24.5,0,24.5,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Rawhide Years, The",1955,85,NA,5.8,31,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Ray Tracey in Full Tilt",2000,2,NA,5.2,19,0,0,0,24.5,34.5,24.5,14.5,0,4.5,4.5,"",1,1,0,0,0,0,1 -"Ray's Male Heterosexual Dance Hall",1988,23,NA,6.8,31,4.5,0,0,0,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Raya",2001,26,NA,7.4,7,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Raye makhfi",2001,123,NA,6.6,374,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Raymie",1960,72,NA,7.1,7,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Raymundo",2002,127,NA,8.9,11,0,0,0,0,0,0,0,14.5,74.5,4.5,"",0,0,0,0,1,0,0 -"Rayo de luz, Un",1960,110,NA,4.8,25,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Rayon vert, Le",1986,98,NA,7.6,480,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Raz na raz ne prikhoditsya",1987,77,NA,5.7,8,0,0,0,0,24.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Raza",1942,113,NA,2,120,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Razbunarea haiducilor",1968,95,NA,8.4,8,0,0,0,0,0,14.5,14.5,0,34.5,34.5,"",1,0,0,0,0,0,0 -"Raznye sudby",1956,107,NA,6.7,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,0,0,1,0 -"Razones de mis amigos, Las",2000,109,NA,6.5,78,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Razor Blade Smile",1998,101,NA,4.4,453,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Razor Eaters",2003,96,NA,9.7,14,14.5,0,14.5,0,4.5,14.5,4.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Razor's Edge",1999,14,NA,5.4,16,4.5,4.5,4.5,4.5,14.5,4.5,34.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Razor's Edge, The",1946,146,1200000,7.5,473,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Razor's Edge, The",1984,128,NA,6.2,970,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Razorback",1984,95,NA,4.9,396,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Razza violenta",1984,91,NA,3.2,16,34.5,14.5,34.5,4.5,0,0,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Razzia sur la Chnouf",1955,105,NA,7.1,63,0,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Rdece klasje",1971,85,NA,9,7,0,0,0,0,0,0,14.5,0,45.5,24.5,"",0,0,0,1,0,0,0 -"Re dei criminali, Il",1968,87,NA,3.1,17,24.5,4.5,14.5,14.5,4.5,0,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Re di Poggioreale, Il",1961,90,NA,5.8,10,14.5,0,0,0,24.5,14.5,14.5,0,14.5,44.5,"",0,0,1,0,0,0,0 -"Re-Animator",1985,95,900000,6.9,3546,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Re-inventing Eddie",2002,92,NA,4.2,15,0,0,4.5,24.5,0,0,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"ReBoot: The Ride",1997,6,NA,4.6,23,4.5,4.5,4.5,0,0,4.5,0,14.5,4.5,64.5,"",1,1,0,0,0,0,1 -"Reach for Glory",1962,86,NA,6.9,7,0,0,0,0,0,14.5,0,0,14.5,74.5,"",0,0,0,1,0,0,0 -"Reach for the Sky",1956,123,NA,6.8,238,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Reach the Rock",1998,100,NA,6.1,216,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Reaching for the Moon",1930,91,NA,5.7,46,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Reaching for the Sun",1941,90,NA,5.3,9,0,0,0,24.5,0,14.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Ready, Willing & Able",1999,81,NA,3,25,34.5,4.5,14.5,0,4.5,14.5,4.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Ready, Willing and Able",1937,93,NA,5.6,23,0,0,0,34.5,24.5,14.5,14.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"Ready, Woolen and Able",1960,6,NA,7.5,45,0,0,4.5,4.5,0,14.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Ready.. Set.. Zoom!",1955,7,NA,6.7,50,0,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Real Blonde, The",1997,105,NA,6.1,1383,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Real Bruce Lee, The",1973,120,NA,7.1,42,14.5,4.5,0,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",1,0,0,0,1,0,0 -"Real Cancun, The",2003,96,8000000,2.8,1504,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,1,0,0 -"Real Deal, The",2002,86,NA,5.7,12,4.5,4.5,0,0,14.5,4.5,24.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Real Dirt on Farmer John, The",2005,82,NA,8.5,12,0,4.5,0,0,0,4.5,0,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Real Genius",1985,108,NA,6.8,5778,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Real Glory, The",1939,95,NA,6.4,96,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Real Howard Spitz, The",1998,102,NA,5.7,83,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Real Inside",1984,12,NA,8.2,13,0,0,0,0,4.5,14.5,14.5,44.5,0,14.5,"",0,1,1,0,0,0,1 -"Real Job, A",2001,94,NA,6.8,15,4.5,0,4.5,4.5,0,0,34.5,14.5,0,34.5,"",0,0,1,0,0,1,0 -"Real John Lennon, The",2000,90,NA,7.6,6,14.5,0,0,0,0,0,14.5,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Real Life",1979,99,NA,7,312,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Real Life",1983,92,NA,5.9,10,0,0,14.5,14.5,14.5,14.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Real Macaw, The",1998,91,NA,4.8,63,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Real McCoy, The",1993,105,NA,5.2,1467,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Real McCoy, The",1999,92,NA,5.6,110,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Real Men",1987,87,NA,5.6,630,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Real Old Testament, The",2003,88,NA,7.6,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Real Thing, The",2002,97,NA,2.7,19,24.5,14.5,14.5,4.5,0,0,14.5,0,14.5,14.5,"",0,0,0,0,0,1,0 -"Real Women Have Curves",2002,87,3000000,7,1944,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Reality Bites",1994,94,NA,6.2,7860,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Reality Check",2002,88,NA,5.2,25,24.5,4.5,4.5,4.5,4.5,4.5,14.5,0,0,24.5,"R",0,0,0,0,0,0,0 -"Reality School",2002,13,NA,7.4,5,0,0,0,0,24.5,24.5,0,44.5,0,24.5,"",0,0,1,0,0,0,1 -"Reality of Life",2002,115,12000,1,13,44.5,0,0,0,0,0,0,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Really Scent",1959,6,NA,7.1,22,0,0,0,0,0,14.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Realm of Never: Moratorium, The",2002,29,NA,7.8,19,14.5,4.5,0,0,0,0,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Realm of Never: The Bully",2004,29,NA,7.1,10,14.5,0,0,0,0,34.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Realms of Blood",2004,100,NA,6.3,7,14.5,14.5,0,14.5,0,0,14.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Realtor, The",2004,10,25000,7,10,14.5,0,14.5,0,14.5,14.5,0,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Reap the Wild Wind",1942,123,4000000,6.4,353,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Reapers, The",2004,4,NA,8.6,12,0,0,0,0,4.5,0,0,14.5,24.5,45.5,"",0,0,1,0,0,0,1 -"Rear Gunner, The",1943,26,NA,4.3,31,14.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,0,4.5,"",0,0,0,1,1,0,1 -"Rear Window",1954,112,2000000,8.7,41035,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Reason and Emotion",1943,8,NA,7.5,37,0,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Reason to Believe, A",1995,109,NA,4.9,106,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Reason to Live, A",1976,30,NA,7.2,15,4.5,0,0,4.5,14.5,0,4.5,24.5,44.5,0,"",0,0,0,0,0,0,1 -"Reasonable Hypothesis, A",2004,20,40000,9.5,6,0,0,0,0,0,0,14.5,0,0,84.5,"",0,0,0,0,0,0,1 -"Reasonable Man, A",1999,103,61000,7.3,85,0,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Reasons of the Heart",1996,96,NA,5.5,37,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Reassemblage",1982,40,NA,5.7,21,0,0,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,1,0,1 -"Reaux, Reaux, Reaux Your Boat",1966,7,NA,6.3,7,0,0,0,0,24.5,24.5,14.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Reazione a catena",1971,88,NA,6.5,485,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rebecca",1940,130,1288000,8.3,11403,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Rebecca of Sunnybrook Farm",1917,78,NA,7.7,18,0,0,0,0,4.5,4.5,0,34.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Rebecca of Sunnybrook Farm",1938,80,NA,6.4,158,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Rebel",1985,93,NA,4,60,4.5,4.5,4.5,24.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rebel High",1987,92,NA,4.6,14,24.5,4.5,14.5,24.5,4.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Rebel Love",1986,80,167300,7.2,5,24.5,0,0,0,0,0,24.5,24.5,0,44.5,"",0,0,0,0,0,1,0 -"Rebel Rabbit",1949,7,NA,8.1,52,0,0,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Rebel Rousers, The",1970,77,NA,4.3,77,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Rebel Set, The",1959,72,NA,2.6,59,44.5,24.5,14.5,4.5,4.5,0,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rebel Without Claws, The",1961,6,NA,7.2,26,4.5,0,0,0,4.5,4.5,44.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Rebel Without a Cause",1955,111,1500000,7.8,11055,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Rebel, The",1961,105,NA,6.8,115,0,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Rebell, Der",1932,65,NA,6.7,10,0,0,24.5,0,24.5,14.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Rebels with a Cause",2000,110,NA,7.1,13,0,4.5,0,0,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Reborn",1981,105,NA,3.7,33,4.5,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rebound",1931,89,NA,6.4,24,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Rebro Adama",1990,79,NA,7.3,48,0,0,0,0,14.5,4.5,24.5,34.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Rebus",1969,110,NA,5.7,7,0,14.5,0,0,45.5,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Recess: School's Out",2001,82,10000000,6,512,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Rechnung - eiskalt serviert, Die",1966,98,NA,5.9,9,0,0,0,0,34.5,34.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Reckless",1935,97,NA,7.1,109,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Reckless",1984,90,NA,5.3,344,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Reckless Decision",1933,53,NA,5.8,7,0,14.5,0,0,14.5,14.5,44.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Reckless Indifference",2000,94,NA,7.9,25,4.5,0,0,0,0,4.5,24.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Reckless Kelly",1993,80,NA,4.4,359,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Reckless Moment, The",1949,82,NA,7.2,186,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Reckless Ranger",1937,56,NA,4.3,11,0,0,24.5,34.5,14.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Reckless Romeo, A",1917,23,NA,6.3,24,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Reckoning Day",2002,105,NA,5.4,26,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Reckoning, The",1969,109,NA,5.7,16,0,0,14.5,0,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Reckoning, The",2003,112,NA,6.3,641,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Reclusorio",1997,99,NA,7.2,6,0,0,14.5,0,0,14.5,0,45.5,0,14.5,"",0,0,0,1,0,0,0 -"Recoil",1997,96,NA,4.5,97,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Recommendation for Mercy",1975,92,NA,6.2,5,24.5,0,0,0,0,0,44.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Reconstituirea",1968,100,NA,8.7,83,0,0,0,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Reconstruction",1995,21,NA,8.4,13,0,0,0,0,0,0,14.5,34.5,44.5,4.5,"",0,0,0,0,1,0,1 -"Reconstruction",2003,90,NA,7.1,799,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Record City",1978,90,NA,4,7,0,14.5,24.5,0,0,14.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Recreation",1914,7,NA,4.9,18,0,4.5,14.5,14.5,4.5,14.5,24.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Recruit, The",2003,115,NA,6.6,13054,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Recruits",1986,91,NA,3.8,34,4.5,14.5,14.5,14.5,14.5,0,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Recto/Verso",1999,85,NA,4.3,42,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rectuma",2004,95,NA,8,10,0,0,0,0,0,0,14.5,24.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Recycled",1999,93,NA,4.4,17,4.5,14.5,4.5,14.5,4.5,24.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Red",1970,103,NA,7.1,27,0,0,0,4.5,0,4.5,24.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Red",1976,24,NA,6.2,5,24.5,0,0,0,24.5,24.5,0,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Red",1993,35,NA,7.6,30,4.5,0,0,0,0,14.5,4.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Red",2001,12,NA,6.1,12,4.5,0,4.5,0,34.5,14.5,24.5,4.5,0,0,"",0,0,0,1,0,0,1 -"Red Badge of Courage, The",1951,69,1640000,7.4,531,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Red Ball Express",1952,83,NA,6.1,69,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Red Baron, The",1971,97,900000,4.9,120,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Red Barry",1938,256,NA,5.2,5,0,0,0,0,64.5,0,0,44.5,0,0,"",1,0,0,0,0,0,0 -"Red Beret, The",1953,88,NA,5.7,39,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Red Betsy",2003,98,NA,7.1,44,4.5,14.5,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,"PG",0,0,0,1,0,1,0 -"Red Blooded American Girl II",1997,95,NA,4,148,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Red Brick Road, The",2003,95,15000,6.7,7,14.5,0,0,0,14.5,0,14.5,44.5,0,14.5,"",0,0,1,1,0,0,0 -"Red Canyon",1949,82,NA,5.6,10,0,0,0,24.5,24.5,34.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Red Cockroaches",2004,82,2000,7.7,37,4.5,0,4.5,4.5,4.5,14.5,0,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Red Corner",1997,122,NA,5.9,3006,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Red Danube, The",1949,119,NA,4.9,43,4.5,0,4.5,14.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Red Dawn",1984,114,NA,5.7,5587,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Red Deer",2000,104,NA,4.2,17,14.5,0,14.5,4.5,0,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Red Desert Penitentiary",1985,104,NA,4,5,0,0,24.5,24.5,0,44.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Red Diaper Baby",2004,91,NA,7.7,10,14.5,0,0,0,0,14.5,24.5,34.5,34.5,0,"",0,0,0,0,0,0,0 -"Red Dirt",2000,110,NA,5.2,223,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Red Doors",2005,90,NA,8.5,24,0,4.5,0,0,4.5,4.5,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Red Dragon",1945,64,75000,5.5,29,0,0,14.5,4.5,24.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Red Dragon",2002,124,90000000,7.3,21089,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Red Dust",1932,83,408000,7.4,461,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Red Dust",2004,110,NA,6,23,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Red Ensign",1934,69,NA,5.9,25,0,0,0,4.5,24.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Red Fury, The",1984,105,NA,5.3,15,4.5,0,0,4.5,24.5,0,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Red Garters",1954,91,NA,5.8,51,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Red Heat",1985,104,NA,4.4,190,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Red Heat",1988,103,NA,5.4,5860,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Red Hot",1993,95,NA,4.5,71,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Red Hot Mama",1934,7,NA,7.6,12,0,0,0,0,0,24.5,14.5,34.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Red Hot Rangers",1947,8,NA,6.6,26,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Red Hot Riding Hood",1943,7,NA,8.3,144,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Red House, The",1947,100,NA,6.9,281,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Red Kimona, The",1925,77,NA,6.2,41,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Red Letters",2000,103,NA,4.9,197,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Red Light",1949,83,NA,6.5,16,0,0,4.5,4.5,14.5,4.5,24.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Red Light August",1999,30,NA,3.7,15,4.5,4.5,14.5,14.5,4.5,0,0,14.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Red Line",1996,90,NA,3.3,120,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Red Line 7000",1965,110,2425000,5.3,115,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Red Lines",2002,7,NA,4.2,9,14.5,0,0,24.5,14.5,14.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Red Lipstick",2000,90,NA,3.8,17,14.5,4.5,24.5,0,0,0,4.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Red Man's View, The",1909,11,NA,4.7,29,14.5,0,4.5,14.5,14.5,4.5,34.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Red Meat",1997,95,NA,5.3,91,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Red Menace, The",1949,60,NA,3.1,15,24.5,4.5,0,24.5,24.5,0,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Red Mountain",1951,84,NA,6,40,0,0,4.5,4.5,24.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Red Noses",1932,21,NA,6.6,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,1,0,0,0,1 -"Red Planet",2000,106,75000000,5.3,8623,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Red Planet Mars",1952,87,NA,4.6,123,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Red Pony, The",1949,89,NA,6.6,163,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Red Rain",1996,13,NA,7,15,0,0,0,0,0,4.5,24.5,44.5,0,24.5,"",0,0,0,0,0,0,1 -"Red Ribbon Blues",1996,97,3000000,4.5,38,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Red Riding Hood",1989,84,NA,5.3,35,14.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,1,0 -"Red Riding Hoodwinked",1955,7,NA,7,27,0,0,0,4.5,4.5,4.5,45.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Red River Range",1938,56,NA,4.3,23,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Red River Robin Hood",1942,57,NA,5.9,12,0,0,0,4.5,24.5,24.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Red River Valley",1936,60,75000,6.6,20,0,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Red River Valley",1941,62,NA,7.1,7,0,0,0,0,0,14.5,14.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Red Rock West",1992,98,8000000,7,3861,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Red Rope",1937,59,NA,6.3,5,0,0,24.5,24.5,0,44.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Red Salute",1935,80,NA,5.4,14,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Red Scorpion",1989,98,16000000,3.6,711,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Red Scorpion 2",1994,95,NA,3.4,112,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Red Serpent",2002,90,NA,2.6,39,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Red Shadow: Akakage",2001,108,NA,5.7,189,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Red Shoes, The",1948,136,NA,8,2049,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Red Silk",1999,86,NA,4.9,20,14.5,0,4.5,24.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Red Skies of Montana",1952,99,NA,6.4,86,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Red Sky at Morning",1971,112,NA,7.1,111,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Red Sonja",1985,89,17900000,4.3,3947,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Red Spirit Lake",1993,69,NA,4.6,8,34.5,0,0,0,0,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Red Sundown",1956,81,NA,5.8,18,0,4.5,0,4.5,14.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Red Surf",1990,104,NA,3.7,124,24.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Red Thread",2003,25,NA,6.2,7,14.5,0,0,0,14.5,14.5,0,14.5,14.5,24.5,"",0,0,1,1,0,1,1 -"Red Tomahawk",1967,82,NA,4.9,19,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Red Trousers: The Life of the Hong Kong Stuntmen",2003,93,NA,5.7,58,4.5,0,0,4.5,4.5,4.5,14.5,4.5,4.5,64.5,"R",1,0,0,0,0,0,1 -"Red Typewriter, The",1996,10,NA,8.9,14,0,0,0,4.5,0,0,0,4.5,45.5,34.5,"",0,0,0,0,0,0,1 -"Red's Dream",1987,4,NA,6.8,257,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Red, Hot and Blue",1949,84,NA,5.9,20,14.5,0,0,4.5,24.5,14.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Red, White, and Black, The",1970,77,NA,5.7,10,0,0,0,44.5,14.5,0,0,14.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Red-Headed Stranger",1986,105,NA,6.6,78,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Red-Headed Woman",1932,79,401000,7.2,191,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Redada, La",1971,86,NA,4.9,7,0,14.5,14.5,0,74.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Redai yu",1995,107,NA,7.1,32,0,0,4.5,0,0,4.5,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Redball",1999,91,NA,4.7,52,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Redboy 13",1997,93,NA,2.4,22,24.5,0,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Redd barna",2002,6,NA,6.2,12,14.5,4.5,0,0,14.5,4.5,0,34.5,14.5,0,"",0,0,0,0,0,0,1 -"Redeemable in Merchandise",2003,12,NA,6.7,10,0,0,14.5,0,14.5,14.5,44.5,24.5,14.5,0,"",0,0,1,1,0,0,1 -"Redeemer: Son of Satan!, The",1978,84,NA,3.3,65,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Redemption",1930,75,NA,5.3,10,14.5,24.5,14.5,14.5,0,0,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Redemption of the Ghost",2002,111,NA,4.7,41,4.5,4.5,24.5,4.5,14.5,14.5,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Redemption: The Stan Tookie Williams Story",2004,95,75000,6.5,350,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Redes",1936,65,NA,8.5,10,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Redeu-ai",2005,96,NA,4.5,24,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Redhead From Wyoming, The",1953,81,NA,4.4,20,14.5,4.5,24.5,0,34.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Redhead and the Cowboy, The",1951,82,NA,5.9,28,0,0,4.5,0,24.5,44.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Redheads",1992,107,NA,3.4,28,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Redneck Revenge",1996,90,NA,5.5,9,34.5,24.5,0,14.5,0,0,14.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Reds",1981,194,35000000,7.1,2394,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Redskin",1929,90,NA,7.9,14,4.5,0,0,0,0,4.5,14.5,44.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Reducing",1931,77,NA,6.8,22,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Reducing Stanley",1997,25,NA,4.7,7,24.5,14.5,0,0,0,24.5,14.5,0,14.5,0,"",0,0,0,1,0,0,1 -"Reef, The",1999,88,NA,4.9,36,4.5,0,14.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Reefer Madness",1936,63,NA,3.8,971,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Reel Pink",1965,6,NA,5.2,8,0,0,0,14.5,14.5,45.5,14.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Ref, The",1994,93,11000000,6.8,4791,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Reflecment",1997,9,NA,4.2,20,14.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Reflecting Skin, The",1990,95,NA,7.4,775,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Reflection of Fear, A",1973,89,NA,5.8,35,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Reflections",1984,100,NA,5.7,9,0,0,14.5,14.5,14.5,0,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Reflections On Love",1966,14,NA,5.2,5,0,0,0,24.5,64.5,0,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Reflections in a Golden Eye",1967,108,4500000,6.3,579,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Reflections of Evil",2002,138,NA,5.5,98,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Reflections of a Life",2003,10,NA,8.5,10,0,0,14.5,0,0,0,14.5,24.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Reflections on Black",1955,12,NA,7.2,7,0,14.5,0,14.5,0,0,14.5,45.5,0,0,"",0,0,0,1,0,0,1 -"Reflections on a Crime",1994,94,NA,5.1,75,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Reflejos",1985,18,NA,4.8,5,44.5,0,0,0,0,44.5,0,0,0,24.5,"",0,0,0,1,0,0,1 -"Reflejos",2002,110,NA,5.3,30,24.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Reflexus",1998,8,NA,7.3,23,4.5,0,0,0,0,14.5,14.5,4.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Reform School Girl",1957,71,NA,5,35,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Reform School Girls",1986,94,NA,4.6,343,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Reformer and the Redhead, The",1950,90,NA,6.4,42,0,0,4.5,0,14.5,24.5,34.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Refren",1972,11,NA,5.9,18,4.5,0,0,0,24.5,34.5,0,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Refrigerator, The",1991,86,NA,3.4,93,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Refugee",2000,207,NA,6.1,54,4.5,4.5,0,4.5,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Refugio del mal, El",2002,96,NA,4.7,32,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Refugio del miedo, El",1974,96,NA,5,6,0,0,14.5,34.5,0,34.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Regain",1937,127,NA,8,52,0,4.5,0,4.5,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Regalo de Silvia, El",2003,103,NA,6.3,20,4.5,0,0,0,14.5,24.5,44.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Regalo di Natale",1986,101,NA,7.8,114,0,0,0,0,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Regarde la mer",1997,52,NA,6.7,357,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Regarde les hommes tomber",1994,90,NA,6.4,149,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Regarde-moi (en face)",2000,78,NA,2.3,6,14.5,45.5,14.5,14.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Regarding Henry",1991,108,NA,6.5,6137,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Regel nr. 1",2003,87,NA,6.3,94,14.5,4.5,4.5,0,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Regen",1929,12,NA,7.1,69,0,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Regenerated Man",1994,89,NA,3.4,19,34.5,4.5,0,4.5,14.5,4.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Regeneration",1915,72,NA,7.2,104,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Regeneration",1997,105,NA,7.2,583,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Reggie's Prayer",1996,94,NA,3.3,36,34.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Regi Andrej Tarkovskij",1988,97,NA,7.7,74,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Regina degli scacchi",2001,98,NA,3,14,44.5,4.5,4.5,0,4.5,4.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Regina degli uomini pesce, La",1995,94,NA,2.9,16,44.5,4.5,14.5,0,14.5,4.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Regina delle Amazzoni, La",1960,84,NA,4.2,16,14.5,4.5,14.5,14.5,4.5,4.5,24.5,0,4.5,4.5,"",1,0,1,0,0,0,0 -"Regina di Saba, La",1952,99,NA,4.4,6,0,0,14.5,14.5,14.5,0,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Regina per Cesare, Una",1962,90,NA,2.8,7,0,24.5,44.5,0,0,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Regina!",2002,90,NA,5.5,19,4.5,14.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Regine, Le",1970,85,NA,6.4,14,0,0,4.5,0,0,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Registered Nurse",1934,63,NA,5.8,6,0,0,14.5,14.5,14.5,14.5,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Regjeringen Martin",2002,28,NA,6.4,34,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Regreso del viento del Norte, El",1994,77,NA,9,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,1,0,0,0,0,0 -"Regret to Inform",1998,72,NA,7.4,111,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Regular Frankie Fan, A",2000,72,NA,6.4,27,14.5,0,0,4.5,4.5,0,0,4.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Regular Trouper, A",1932,20,NA,6.2,7,0,0,0,14.5,14.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Rehearsal, The",1974,92,NA,8.6,9,0,0,0,0,0,14.5,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Rehearsals for Extinct Anatomies",1988,14,NA,7.6,63,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Rehnaa Hai Terre Dil Mein",2001,160,NA,6.9,23,4.5,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Rei da Noite, O",1975,97,NA,7.5,13,4.5,0,0,0,14.5,0,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Rei das Berlengas, O",1978,115,NA,6.5,13,0,0,0,14.5,4.5,4.5,14.5,4.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Rei do Rio, O",1985,107,NA,3.2,8,24.5,0,0,24.5,14.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Reich",2001,89,NA,4.4,44,14.5,14.5,4.5,14.5,14.5,24.5,0,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Reigen",1973,122,NA,5.4,5,0,24.5,24.5,0,24.5,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Reign of Fire",2002,101,95000000,5.8,11452,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Reign of Terror",1949,89,NA,7.6,58,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Reign of the Dead",2000,17,NA,8.8,8,14.5,0,0,0,0,0,0,0,14.5,74.5,"",1,0,1,0,0,0,1 -"Reina de la noche, La",1994,117,NA,7,57,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Reina del bar Canalla, La",2003,9,NA,5,19,4.5,0,24.5,4.5,0,14.5,34.5,0,4.5,14.5,"",0,0,0,0,0,0,1 -"Reina del chantecler, La",1962,112,NA,6.8,13,0,0,0,4.5,0,4.5,44.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Reina y Rey",1994,100,NA,7.9,8,0,0,0,0,0,24.5,14.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Reinas",2005,107,NA,5.9,43,4.5,0,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Reincarnate, The",1971,122,NA,4.7,28,4.5,0,4.5,4.5,4.5,14.5,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Reincarnation of Peter Proud, The",1975,105,NA,6.4,233,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Reindeer Games",1996,113,NA,2.1,45,24.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Reindeer Games",2000,124,36000000,5.5,7120,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Reine Margot, La",1954,93,NA,6.4,41,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Reine Margot, La",1994,144,NA,7.5,3023,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Reine blanche, La",1991,119,NA,6.4,48,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Reine de nacre, La",2000,16,NA,6,6,14.5,0,0,0,14.5,45.5,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Reines d'un jour",1996,26,NA,7,8,0,0,0,14.5,0,0,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Reines d'un jour",2001,96,NA,7,220,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Reino de los cielos, El",1994,52,NA,8.8,12,0,0,0,14.5,0,0,0,4.5,0,74.5,"",0,0,0,0,0,0,0 -"Reise der Hoffnung",1990,109,NA,7.6,284,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Reise nach Kafiristan, Die",2001,105,NA,6.9,75,4.5,4.5,4.5,14.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Reise, Die",1986,105,NA,7.8,9,0,0,0,0,0,0,24.5,14.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Reivers, The",1969,107,NA,6.9,291,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Rejected",2000,9,NA,8.7,807,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,1,1,0,0,0,1 -"Rejs",1970,65,NA,8.7,367,4.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,74.5,"",0,0,1,0,0,0,0 -"Rejuvenatrix",1988,90,NA,4.9,30,4.5,0,14.5,14.5,34.5,14.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Rekopis znaleziony w Saragossie",1965,175,NA,7.8,390,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Rekrut 67, Petersen",1952,78,NA,4.9,13,4.5,4.5,0,4.5,24.5,34.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Relasyon",1982,114,NA,9.4,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,0,1,0,0,0 -"Relative Fear",1994,94,NA,4.7,72,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Relative Thing, A",2003,102,NA,6,11,4.5,4.5,4.5,14.5,0,0,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Relative Values",2000,87,NA,6.3,439,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Relativity",2001,10,NA,5.3,5,0,0,0,44.5,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Relax",1991,25,NA,5.1,13,0,0,4.5,14.5,14.5,34.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,1 -"Relax... It's Just Sex",1998,110,NA,7.1,624,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Relentless",1948,93,NA,6.4,17,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Relentless",1989,92,NA,5.3,200,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Relentless 3",1993,84,NA,3.8,117,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,0,45.5,"",1,0,0,0,0,0,0 -"Relentless IV: Ashes to Ashes",1994,91,NA,3.8,73,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Relic, The",1997,110,40000000,5.3,5102,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Relics: Einstein's Brain",1994,65,NA,6.2,16,0,4.5,0,0,14.5,14.5,0,4.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Religieuse, La",1966,135,NA,7.9,99,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Religion, Inc.",1989,85,NA,3.6,95,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Reluctant Angel",1998,103,NA,5.6,25,14.5,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Reluctant Astronaut, The",1967,101,NA,5.5,282,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Reluctant Debutante, The",1958,94,NA,6.3,178,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Reluctant Dragon, The",1941,72,NA,6.8,146,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Reluctant Justice",1995,93,NA,5.8,43,4.5,0,0,4.5,14.5,4.5,4.5,14.5,4.5,44.5,"",1,0,0,1,0,0,0 -"Reluctant Prophet",1995,42,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,1 -"Reluctant Saint, The",1962,105,NA,6.5,25,0,0,0,4.5,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Reluctant Widow, The",1951,86,NA,4,13,0,0,14.5,34.5,14.5,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Remains of the Day, The",1993,134,15000000,7.8,10310,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Remains to Be Seen",1953,88,NA,7.1,19,4.5,0,0,0,4.5,24.5,24.5,44.5,0,4.5,"",0,0,1,0,0,0,0 -"Remake",2003,102,NA,6.5,65,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Remando al viento",1988,105,NA,5.3,158,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Remarkable Andrew, The",1942,81,NA,7.5,28,0,0,4.5,0,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Remarkable Mr. Pennypacker, The",1959,87,NA,6.4,51,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rembetiko",1983,110,NA,7.1,157,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Rembrandt",1936,85,NA,7.1,101,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rembrandt",1999,103,NA,6.2,101,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rembrandt",2003,109,3000000,6.8,416,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Rembrandt fecit 1669",1977,120,NA,5.9,13,0,4.5,0,4.5,14.5,14.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Remember Last Night?",1935,81,NA,7.8,37,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Remember Me?",1997,80,NA,4.5,38,14.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Remember My Name",1978,94,NA,5.8,124,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Remember Pearl Harbor",1942,75,NA,6.6,6,0,0,14.5,14.5,0,14.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Remember the Day",1941,86,NA,6.8,49,0,0,4.5,4.5,4.5,14.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Remember the Night",1940,94,NA,7.7,204,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Remember the Titans",2000,113,30000000,7.4,14195,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Remember?",1939,83,NA,5.6,45,0,0,4.5,4.5,34.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Remembering November",2002,37,2000,9.2,12,4.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,1,0,0,1 -"Remembering Sex",1998,85,NA,2.1,51,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Remembering Wei-Yi Fang, Remembering Myself",1996,29,NA,7.8,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Remembrance",1982,117,NA,5.2,11,0,0,4.5,4.5,0,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Remembrance",2001,18,NA,2.8,13,14.5,0,0,4.5,0,0,0,4.5,14.5,45.5,"",0,0,0,0,0,1,1 -"Remembrance of Things Fast: True Stories Visual Lies",1994,60,NA,6,9,24.5,0,0,14.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Remnant, The",2001,101,NA,2.9,40,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Remo Williams: The Adventure Begins",1985,121,NA,5.8,2068,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Remorques",1941,81,NA,7.7,47,0,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Remote Control",1930,65,NA,5.6,13,4.5,0,0,4.5,14.5,24.5,34.5,4.5,4.5,0,"",0,0,1,1,0,0,0 -"Remote Control",2001,24,NA,5.6,26,0,4.5,0,0,14.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,1 -"Removalists, The",1975,93,NA,5.6,11,0,0,4.5,4.5,4.5,4.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Removed",1999,6,NA,4.3,28,4.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Remparts d'argile",1968,87,NA,7.1,20,4.5,0,0,0,14.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ren Sheng",1984,125,NA,9.4,10,0,0,0,0,0,0,14.5,14.5,0,84.5,"",0,0,0,0,0,0,0 -"Ren gui qing",1987,108,NA,7.9,6,0,0,0,0,14.5,14.5,0,64.5,0,0,"",0,0,0,1,0,0,0 -"Ren hai gu hong",1960,104,NA,6.4,9,14.5,0,0,14.5,14.5,0,14.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Ren jian xi ju",2001,117,NA,7.4,5,0,0,0,0,0,44.5,0,64.5,0,0,"",0,0,1,0,0,0,0 -"Ren xia ren",1982,97,NA,6.1,43,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,4.5,"",1,0,1,0,0,0,0 -"Ren xiao yao",2002,112,NA,6.7,261,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Ren ye huang hun",1996,98,NA,6.1,6,0,0,0,0,45.5,0,0,34.5,0,14.5,"",0,0,0,0,0,1,0 -"Rena einai off-side, I",1972,85,NA,4.4,11,0,4.5,4.5,14.5,24.5,4.5,4.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Renaissance Man",1994,128,40000000,5.7,3196,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Renaldo and Clara",1978,235,NA,4.6,143,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Rencontre avec le dragon",2003,109,NA,4.7,71,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rencontre, La",1996,75,NA,6.1,8,24.5,14.5,0,0,14.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Rencor",2002,106,NA,6.4,70,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rend mig i revolutionen",1970,90,NA,4.6,6,0,0,14.5,34.5,0,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Rend mig i traditionerne",1979,105,NA,5.7,40,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Rendan",2001,104,NA,8,21,0,0,0,0,0,0,24.5,24.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Rendering, The",2002,93,NA,5.7,71,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Rendevous unterm Nierentisch",1987,89,NA,4.4,11,14.5,0,0,0,0,0,14.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Rendez-moi ma peau...",1980,85,NA,6.2,15,0,0,4.5,14.5,4.5,24.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rendez-vous",1985,87,NA,6.7,221,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rendez-vous au tas de sable",1990,95,NA,2.1,14,14.5,4.5,0,0,14.5,0,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Rendez-vous d'Anna, Les",1978,127,NA,6.8,44,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Rendez-vous de Paris, Les",1995,94,NA,7,292,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Rendez-vous de juillet",1949,112,NA,7.1,30,0,0,0,0,4.5,24.5,34.5,24.5,0,24.5,"",0,0,1,1,0,0,0 -"Rendez-vous des quais, Le",1955,75,NA,7.1,7,0,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rendez-vous du diable, Les",1958,80,NA,7,6,0,0,0,0,0,34.5,14.5,34.5,14.5,0,"",0,0,0,0,1,0,0 -"Rendezvous",1935,94,NA,6.4,43,0,0,0,0,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rendezvous in Paris",1982,104,NA,7.3,51,4.5,0,0,0,0,4.5,45.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rendezvous mit einem Engel",2002,88,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Rendezvous with Annie",1946,60,NA,5.5,5,0,0,0,0,64.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Rendolepsis",2003,90,NA,6,5,44.5,0,0,0,0,44.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Renegade",1987,92,NA,5.4,215,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Renegade Force",1998,90,NA,5.3,187,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Renegade Girl",1946,65,NA,5.4,6,14.5,0,14.5,0,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Renegade Ranger, The",1938,60,NA,6.3,12,0,0,0,4.5,34.5,4.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Renegade Trail, The",1939,58,NA,7.9,17,0,0,0,0,4.5,0,24.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Renegades",1930,84,NA,4.9,76,34.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Renegades",1946,87,NA,4.6,14,14.5,0,14.5,0,24.5,4.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Renegades",1989,106,NA,4.6,397,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Renegades of the West",1932,55,NA,6.3,10,0,0,0,0,45.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Renfrew of the Royal Mounted",1937,57,NA,5.6,10,0,0,0,44.5,14.5,34.5,14.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Rengeteg",2003,90,NA,6.9,77,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Renglones torcidos de Dios, Los",1983,103,NA,4.8,9,0,0,14.5,14.5,14.5,0,0,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Rennie's Landing",2001,103,NA,4.8,142,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Reno",1939,73,NA,5.9,14,0,4.5,0,4.5,14.5,45.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Reno Finds Her Mom",1998,89,NA,2.8,21,34.5,4.5,0,0,14.5,14.5,0,14.5,0,4.5,"",0,0,1,0,1,0,0 -"Reno: Rebel Without a Pause",2002,75,NA,3.1,10,0,24.5,0,0,0,14.5,64.5,0,14.5,0,"",0,0,1,0,1,0,0 -"Rent Control",1984,95,100000,5.6,9,24.5,0,14.5,0,24.5,0,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Rent Control",2002,95,NA,3.6,70,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"Rent a Friend",2000,90,NA,7.1,308,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Rent's Due",2004,9,3500,9.6,17,0,0,0,0,0,0,0,4.5,24.5,64.5,"",0,0,1,0,0,0,1 -"Rent-a-Cop",1988,96,NA,3.8,299,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Rent-a-Girl",1965,77,NA,5,11,0,4.5,0,14.5,24.5,14.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Rent-a-Person",2004,12,NA,7.1,9,0,0,0,0,0,14.5,0,24.5,34.5,34.5,"",0,0,1,0,0,0,1 -"Rentadick",1972,94,NA,4.6,43,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rented Lips",1988,82,NA,3.2,65,24.5,4.5,14.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rentun ruusu",2001,100,NA,6.7,263,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Repair Shop, The",1998,48,NA,5.3,6,34.5,0,14.5,0,0,0,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Repairman, The",1999,7,NA,9.2,11,4.5,0,0,0,0,4.5,0,0,34.5,44.5,"",0,0,1,0,0,0,1 -"Repas des fauves, Le",1964,99,NA,3.9,12,34.5,0,0,4.5,0,4.5,4.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Repeat Performance",1947,91,NA,7.4,35,0,0,0,4.5,0,4.5,4.5,34.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Repelsteeltje",1973,57,NA,5.9,5,0,24.5,0,0,0,0,44.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Repentie, La",2002,125,NA,4.3,133,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Repete",1995,8,NA,6.6,9,0,0,14.5,0,24.5,14.5,0,34.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Repetition Compulsion",1997,7,NA,2.8,18,14.5,4.5,14.5,0,24.5,14.5,4.5,4.5,0,24.5,"",0,1,0,1,0,0,1 -"Replacement Killers, The",1998,87,30000000,5.8,6825,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Replacements, The",2000,114,50000000,6.2,7617,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Replacing Delphine",2004,10,NA,8.5,6,0,0,0,0,0,14.5,0,14.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Repli-Kate",2002,121,4000000,5.6,791,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Replicant",2001,95,NA,4.9,1686,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Repo",1982,75,NA,2.6,12,14.5,4.5,0,0,0,0,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Repo Jake",1990,86,NA,5.9,8,24.5,14.5,0,0,14.5,0,0,14.5,0,34.5,"",1,0,0,0,0,0,0 -"Repo Man",1984,92,1500000,6.8,4954,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Report",1967,13,NA,6.4,34,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Report from the Aleutians",1943,47,NA,6.4,15,0,0,4.5,24.5,0,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Report to the Commissioner",1975,112,NA,5.9,115,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Reportaje",1953,103,NA,8.1,12,0,0,4.5,4.5,4.5,0,14.5,4.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Reportaje a la muerte",1993,95,NA,6.2,12,0,0,0,0,4.5,24.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Repos du guerrier, Le",1962,102,NA,5.2,30,4.5,14.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Repossessed",1990,80,NA,4.1,1289,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Repossessed",2002,8,NA,6.4,39,0,4.5,4.5,4.5,4.5,44.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Reprisal!",1956,71,NA,6,27,0,4.5,0,4.5,14.5,24.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Reprise",1996,192,NA,8.6,14,0,0,0,0,0,0,4.5,24.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Reproduction interdite",1957,90,NA,6.6,7,0,0,0,0,24.5,14.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Reptile, The",1966,90,NA,5.9,254,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Reptilicus",1961,81,NA,3.2,454,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Republic of Love, The",2003,95,NA,6.3,72,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Repulsion",1965,104,NA,7.8,3292,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Request",2002,12,NA,4,22,14.5,4.5,4.5,4.5,4.5,14.5,14.5,0,4.5,24.5,"",0,0,0,1,0,0,1 -"Requiem",1981,103,NA,5.6,13,4.5,0,0,0,0,0,14.5,4.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Requiem",1998,105,NA,6.5,25,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Requiem for Murder",1999,95,NA,4.6,98,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Requiem for a Dream",2000,102,4500000,8.4,47845,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,0,1,0,0,0 -"Requiem for a Gunfighter",1965,91,NA,5.7,9,0,0,0,14.5,24.5,14.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Requiem for a Heavyweight",1962,95,NA,7.6,384,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Requiem per un agente segreto",1967,102,NA,5,8,0,0,14.5,24.5,0,34.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Requiem pour un beau sans-coeur",1992,93,NA,6.7,78,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Requiem pro panenku",1991,99,NA,6.6,21,4.5,0,0,0,0,14.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Rerum novarum",2001,82,NA,8.8,8,0,0,14.5,0,0,0,14.5,0,0,74.5,"",0,0,0,1,1,0,0 -"Resa dei conti, La",1966,84,NA,7.2,170,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Resan",1987,873,NA,5.5,12,0,0,4.5,0,0,0,14.5,4.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Resan till Melonia",1989,104,NA,7.2,143,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Resan till dej",1953,90,NA,6.1,13,0,0,4.5,24.5,4.5,14.5,24.5,14.5,0,4.5,"",0,0,0,0,0,1,0 -"Rescue Dog",1947,7,NA,6.2,13,0,0,0,4.5,34.5,24.5,14.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Rescue Me",1993,99,NA,5,94,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Rescued by Rover",1905,7,NA,6.8,90,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Rescued from an Eagle's Nest",1908,6,NA,4.7,27,4.5,0,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,1 -"Rescuers Down Under, The",1990,74,NA,6.5,1649,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Rescuers, The",1977,77,NA,6.7,1917,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Reserveheld, Der",1965,79,NA,5.5,5,0,24.5,0,0,44.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Reservoir Dogs",1992,99,1200000,8.3,69240,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,0,0,0,0 -"Reshimat Ahava",2000,90,NA,9.2,6,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,0,0,1,0,0 -"Reshma Aur Shera",1971,158,NA,7.8,8,0,0,0,0,0,0,24.5,14.5,34.5,24.5,"",0,0,0,1,0,1,0 -"Residencia, La",1969,99,NA,6.8,170,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Resident Alien",1990,85,NA,6.1,11,4.5,0,0,4.5,0,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Resident Evil",2002,100,35000000,6.2,18978,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Resident Evil: Apocalypse",2004,94,50000000,5.6,10486,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Resin",2001,87,NA,6.9,11,0,0,0,0,4.5,0,0,14.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Resist!: To Be with the Living",2004,90,NA,6.6,10,14.5,0,0,14.5,0,34.5,14.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Resistance",1992,112,NA,4.6,25,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Resistance",2003,92,NA,6.2,54,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Resisting Enemy Interrogation",1944,66,NA,7.1,19,0,0,0,0,14.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Resisting Paradise",2003,80,NA,6.6,8,14.5,0,0,0,24.5,14.5,0,24.5,14.5,14.5,"",0,0,0,1,1,0,0 -"Resolution",2001,86,70000,3,14,34.5,0,4.5,24.5,0,0,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Resonance",1991,11,NA,5.1,7,24.5,0,14.5,0,0,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Respect the Law",1941,20,NA,6.4,6,0,0,0,0,14.5,45.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Respiro",2002,90,NA,6.9,1067,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Responsive Eye, The",1966,30,NA,4.8,11,0,0,0,14.5,34.5,24.5,4.5,4.5,0,0,"",0,0,0,0,1,0,1 -"Ressources humaines",1999,100,NA,7.3,551,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rest ist Schweigen, Der",1959,106,NA,8,17,0,0,0,0,4.5,0,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Rest of My Life, The",1997,46,NA,9,6,0,0,0,0,0,0,0,14.5,64.5,14.5,"",0,0,0,1,0,0,0 -"Restaurant",1998,107,NA,5.8,170,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Resting Rough",1979,26,NA,5.9,7,0,0,0,0,24.5,24.5,0,0,0,44.5,"",0,0,1,0,0,0,1 -"Restless",1998,100,NA,5.4,32,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Restless Breed, The",1957,86,NA,5.3,30,0,4.5,4.5,24.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Restless Conscience: Resistance to Hitler Within Germany 1933-1945, The",1991,113,NA,7.4,5,0,0,0,0,0,24.5,24.5,44.5,0,24.5,"",0,0,0,0,1,0,0 -"Restless Knights",1935,17,NA,6.8,67,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Restless Natives",1985,89,NA,6.9,245,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Restless Ones, The",1965,103,NA,4.7,18,24.5,0,0,14.5,0,0,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Restless Years, The",1958,86,NA,5.4,23,0,0,0,14.5,14.5,24.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Restoration",1995,117,18000000,6.6,1874,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Restoration of the Priesthood, The",1982,20,NA,7.5,5,24.5,0,0,0,0,0,24.5,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Restraining Order",1999,98,NA,4.1,93,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Resultado final",1998,95,NA,3.1,26,45.5,14.5,4.5,0,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Resurrected",1989,96,NA,4.1,21,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Resurrected, The",1992,108,NA,6.3,205,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Resurrection",1980,103,NA,7.4,501,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Resurrection Man",1998,102,4000000,4.6,214,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Resurrection of Broncho Billy, The",1970,23,2500,4.4,27,4.5,4.5,0,4.5,4.5,4.5,4.5,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Resurrection of Eve",1973,85,NA,5.4,27,0,0,4.5,0,24.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Resurrection of Zachary Wheeler, The",1971,100,NA,5.6,31,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Retiring Tatiana",2000,108,NA,7.8,12,4.5,4.5,0,0,4.5,0,4.5,4.5,0,45.5,"",0,0,1,0,0,0,0 -"Retorno de Walpurgis, El",1973,73,NA,5.4,52,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Retorno del Hombre-Lobo, El",1980,92,NA,4,34,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Retour de Casanova, Le",1992,98,NA,5.6,123,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Retour de Don Camillo, Le",1953,115,NA,7.1,208,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Retour de Martin Guerre, Le",1982,120,NA,7.4,1008,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Retour de manivelle",1957,103,NA,5.7,7,0,0,0,24.5,0,14.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Retour des charlots, Le",1992,90,NA,1.6,15,44.5,34.5,0,0,0,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Retour du grand blond, Le",1974,81,NA,5.9,218,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Retour en force",1980,94,NA,4.4,16,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,0,"",1,0,1,0,0,0,0 -"Retrato de familia",1976,92,NA,5.6,9,0,0,0,14.5,44.5,0,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Retrato de mujer con hombre al fondo",1997,96,NA,5,18,24.5,0,4.5,14.5,0,14.5,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Retreat, Hell!",1952,95,NA,6.3,43,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Retreat, The",2003,30,NA,8.8,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,1,0,0,1 -"Retribution",1988,107,NA,5.5,72,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Retro vtroyem",1998,100,NA,3.6,10,0,14.5,34.5,0,0,0,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Retroactive",1997,103,NA,6.3,796,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Retrograde",2004,93,NA,3,65,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Retsept yeyo molodosti",1983,92,NA,6,9,24.5,0,0,24.5,0,0,44.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Return",1985,78,NA,4.5,12,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,1,0 -"Return Engagement",1983,90,NA,5.7,13,0,0,0,4.5,0,24.5,14.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Return From the Sea",1954,79,NA,6.3,11,0,0,0,0,4.5,44.5,34.5,4.5,0,0,"",0,0,0,1,0,1,0 -"Return Home",1990,87,NA,5.1,25,0,0,0,14.5,14.5,24.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Return from Witch Mountain",1978,95,NA,5.4,548,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return from the Ashes",1965,105,NA,6.9,70,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Return from the River Kwai",1988,97,NA,4.5,114,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Return of Boston Blackie, The",1927,77,NA,6.5,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Return of Bruno, The",1988,55,NA,5.1,99,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Return of Bulldog Drummond, The",1934,73,NA,4.2,5,0,0,0,44.5,0,24.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Return of Captain Invincible, The",1983,90,NA,4.5,103,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Return of Count Yorga, The",1971,97,NA,4.7,122,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return of Doctor X, The",1939,62,NA,5,152,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return of Dr. Fu Manchu, The",1930,73,NA,6.9,16,0,0,0,0,34.5,4.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Return of Dracula, The",1958,77,125000,4.6,61,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Return of Draw Egan, The",1916,50,NA,7.6,6,0,0,0,0,0,14.5,0,14.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Return of Frank James, The",1940,92,NA,6.5,246,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return of Jack Slade, The",1955,79,NA,5.4,18,0,0,0,4.5,34.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Return of Jesse James, The",1950,75,NA,5.7,22,4.5,0,4.5,24.5,4.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Return of Josey Wales, The",1986,90,NA,2.4,15,14.5,14.5,0,4.5,0,0,0,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Return of Monte Cristo, The",1946,91,NA,7.3,15,0,0,0,0,0,14.5,34.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Return of Mr. Hook, The",1945,2,NA,5,17,24.5,0,0,0,24.5,14.5,14.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Return of Mr. Moto, The",1965,71,NA,3.3,23,34.5,4.5,4.5,14.5,24.5,0,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return of October, The",1948,98,NA,5.2,15,0,0,0,14.5,24.5,34.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Return of Peter Grimm, The",1935,84,NA,6.2,14,0,0,4.5,14.5,4.5,4.5,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Return of Rin Tin Tin, The",1947,65,NA,5.1,12,4.5,0,0,4.5,24.5,4.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Return of Ruben Blades, The",1985,82,NA,4.3,6,0,0,0,14.5,0,0,34.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Return of Secret Rivals",1972,88,NA,6.4,9,0,0,14.5,14.5,0,24.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Return of Sherlock Holmes, The",1929,71,NA,1.1,6,84.5,14.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Return of Superfly, The",1990,95,NA,3.7,46,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Return of Tommy Tricker, The",1994,97,NA,4.5,50,14.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return of Wild Bill, The",1940,60,NA,6.7,5,0,0,0,0,0,24.5,64.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Return of a Man Called Horse, The",1976,129,NA,5.6,173,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Return of the Aliens: The Deadly Spawn",1983,81,25000,5,173,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Return of the Ape Man",1944,60,NA,4.5,23,4.5,0,24.5,4.5,24.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Return of the Bad Men",1948,90,NA,5.7,63,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return of the Cisco Kid",1939,70,NA,7.5,8,0,0,0,14.5,14.5,0,14.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Return of the Durango Kid, The",1945,58,NA,5.6,16,0,0,4.5,4.5,34.5,34.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Return of the Family Man",1989,88,NA,3.6,14,34.5,14.5,4.5,14.5,4.5,0,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Return of the Fly",1959,80,225000,5.2,402,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return of the Forest Monster, The",2003,75,0,5,13,14.5,0,0,0,14.5,0,4.5,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Return of the Frontiersman",1950,74,NA,5.1,22,0,4.5,4.5,34.5,34.5,4.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Return of the Killer Tomatoes!",1988,98,NA,4.2,823,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Return of the Living Dead 3",1993,97,2000000,5.3,1386,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Return of the Living Dead Part II",1988,86,6200000,4.8,1275,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Return of the Living Dead, The",1985,91,4000000,6.7,3344,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Return of the Monster",2002,9,NA,6,7,0,0,14.5,0,0,45.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Return of the Musketeers, The",1989,102,NA,5.7,303,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Return of the Pink Panther, The",1975,113,5000000,6.8,3136,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Return of the Scarlet Pimpernel",1937,88,NA,5.1,21,4.5,0,4.5,24.5,4.5,34.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Return of the Secaucus 7",1980,110,60000,7.1,525,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Return of the Seven",1966,95,NA,5,342,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return of the Soldier, The",1982,99,NA,6,67,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Return of the Texan",1952,88,NA,6.2,10,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Return of the Texas Chainsaw Massacre, The",1994,86,600000,2.6,2634,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Return of the Vampire, The",1944,70,NA,5,145,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return of the Whistler, The",1948,60,NA,5.8,5,24.5,0,0,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Return to Boggy Creek",1977,85,NA,2,98,44.5,14.5,4.5,4.5,4.5,4.5,0,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Return to Glennascaul",1951,23,NA,7.1,74,0,0,4.5,0,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Return to Horror High",1987,95,NA,3.6,300,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Return to Innocence",2001,98,100000,7.5,477,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Return to Kandahar",2003,65,NA,6.7,35,0,4.5,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Return to Macon County",1975,90,NA,4.8,112,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Return to Me",2000,115,24000000,6.9,5057,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,1,0,1,0 -"Return to Never Land",2002,72,20000000,5.8,988,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Return to Oz",1985,113,27000000,6.3,2225,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Return to Paradise",1953,88,NA,4.7,60,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Return to Paradise",1998,111,NA,6.8,3223,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Return to Peyton Place",1961,123,NA,5.4,116,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Return to Pontianak",2001,81,NA,3.4,30,45.5,0,14.5,0,4.5,4.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Return to Salem's Lot, A",1987,96,NA,3.7,449,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Return to Sender",2004,103,NA,6.2,133,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Return to Snowy River",1988,99,NA,5.7,359,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Return to Treasure Island",1954,75,NA,4.4,9,44.5,0,14.5,14.5,14.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Return to Two Moon Junction",1994,96,NA,3.8,102,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Return to Warbow",1958,67,NA,4,12,4.5,0,34.5,14.5,14.5,4.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Return to the Blue Lagoon",1991,98,NA,4.1,1237,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Return to the Edge of the World",1978,85,NA,6.8,29,0,0,0,0,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Return with Honor",1998,102,1000000,8.5,91,4.5,4.5,0,0,0,4.5,4.5,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Return, The",1980,86,NA,3.4,54,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Returner",2002,116,NA,6.7,1730,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Returning Mickey Stern",2002,92,NA,3.7,31,4.5,4.5,14.5,4.5,0,4.5,4.5,14.5,4.5,34.5,"PG-13",0,0,1,0,0,0,0 -"Returning, The",1983,90,NA,1.8,11,34.5,4.5,4.5,14.5,4.5,4.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Reuben, Reuben",1983,101,NA,6.6,221,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Reunion",1989,110,NA,7,113,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Reunion in France",1942,99,NA,5.7,111,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Reunion in Vienna",1933,98,NA,5.1,74,34.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Reunion, The",1998,84,NA,5.2,15,24.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Revanche",1983,105,NA,6.9,6,14.5,0,0,0,0,14.5,14.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Revanche de Lucy, La",1998,93,NA,5.5,13,0,0,0,0,24.5,34.5,4.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Revanche des mortes vivantes, La",1987,82,NA,3.6,41,24.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Revanche, La",2004,110,NA,4.6,5,24.5,0,24.5,0,24.5,0,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Reveille",2001,7,NA,5.6,19,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Reveille with Beverly",1943,78,40000,5.2,14,4.5,4.5,4.5,4.5,4.5,24.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Revelation",1999,98,5000000,4.5,203,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"PG-13",1,0,0,1,0,0,0 -"Revelation",2001,111,NA,4.6,393,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Revenants, Les",2004,105,NA,6.1,84,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Revenge",1990,124,NA,5.2,1859,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Revenge",2000,94,NA,3.5,78,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Revenge Is My Destiny",1971,95,NA,5.8,5,24.5,0,0,24.5,0,0,0,64.5,0,0,"",0,0,0,0,0,0,0 -"Revenge Rider, The",1935,60,NA,4.2,7,14.5,0,14.5,14.5,14.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Revenge in the House of Usher",1982,78,NA,2.9,47,34.5,24.5,14.5,0,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Revenge of Frankenstein, The",1958,90,NA,6.4,317,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Revenge of the Calendar Girls",1995,88,NA,2.5,6,14.5,14.5,14.5,14.5,0,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Revenge of the Cheerleaders",1976,88,NA,4,94,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Revenge of the Creature",1955,82,NA,5.1,496,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Revenge of the Dead Indians, The",1993,130,NA,6.2,9,14.5,0,0,0,14.5,14.5,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Revenge of the Nerds",1984,90,8000000,6,6007,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Revenge of the Nerds II: Nerds in Paradise",1987,98,NA,3.9,2202,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Revenge of the Ninja",1983,90,NA,4.9,333,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Revenge of the Pink Panther",1978,98,NA,6.3,2491,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Revenge of the Radioactive Reporter",1991,84,NA,4.8,31,34.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Revenge of the Red Balloon",2000,8,NA,4.9,11,14.5,0,0,0,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Revenge of the Shogun Women",1977,98,NA,6.4,14,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Revenge of the Stolen Stars",1985,76,NA,1.8,17,44.5,14.5,14.5,14.5,0,4.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Revenge of the Unhappy Campers",2002,102,175000,8.3,28,4.5,0,0,4.5,0,0,0,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Revenge of the Virgins",1959,53,NA,2.1,18,24.5,14.5,14.5,0,14.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Revenge of the Zombies",1943,61,NA,4.6,53,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Revengers Tragedy",2002,109,NA,6.2,157,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Revengers' Comedies, The",1998,86,NA,5.9,374,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Revengers, The",1972,106,NA,4.6,57,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Reversal of Fortune",1990,111,NA,7.2,2140,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Revisited",1998,23,NA,8.2,6,0,0,0,0,0,0,45.5,14.5,0,34.5,"",0,0,0,1,0,0,1 -"Revizor",1933,71,NA,6.7,7,0,0,0,0,24.5,24.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Revizor",1996,100,NA,6.9,28,0,4.5,4.5,0,14.5,4.5,14.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Revoir Julie",1998,92,NA,5.9,49,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Revolt at Fort Laramie",1957,73,NA,5.2,19,0,4.5,0,4.5,44.5,24.5,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Revolt in the Big House",1958,79,NA,6,7,0,0,0,14.5,0,24.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Revolt of Mamie Stover, The",1956,89,NA,5.6,46,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Revolt of the Zombies",1936,65,NA,3,82,14.5,14.5,24.5,14.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Revoltoso, El",1951,90,NA,7.8,11,0,0,0,0,0,0,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Revolution",1985,126,28000000,4.6,937,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Revolution #9",2001,96,300000,7.1,141,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Revolution OS",2001,85,NA,7.1,279,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,1,0,0 -"Revolutionary, The",1970,100,NA,4.3,44,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Revolver",1973,111,NA,6.3,75,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Revolver",1988,115,NA,7.6,5,0,0,0,0,0,0,44.5,0,0,64.5,"",1,0,0,1,0,0,0 -"Revolver",1993,8,NA,8.3,5,0,0,0,0,0,0,0,64.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Reward, The",1965,92,NA,4.3,33,4.5,4.5,14.5,24.5,14.5,4.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Rewind",1998,92,NA,3.7,19,34.5,14.5,14.5,14.5,4.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Rex the Runt: Dreams",1991,2,NA,3.9,15,14.5,0,0,24.5,4.5,44.5,4.5,0,0,4.5,"",0,1,0,0,0,0,1 -"Rex the Runt: How Dinosaurs Became Extinct",1994,73,NA,7.8,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,1,0,0,0,0,0 -"Rex: kyoryu monogatari",1993,106,8000000,4.5,9,14.5,0,24.5,14.5,0,34.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Rey de la granja, El",2002,95,NA,4.8,10,34.5,14.5,0,0,34.5,24.5,0,0,0,14.5,"",0,1,0,0,0,0,0 -"Rey del barrio, El",1950,100,NA,8.8,38,0,0,0,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Rey muerto",1995,12,NA,8.1,17,0,0,14.5,0,0,0,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Rey pasmado, El",1991,106,NA,7.6,147,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Reyes del sablazo, Los",1984,90,NA,7.4,10,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Reyes magos, Los",2003,76,NA,5.4,20,0,14.5,4.5,4.5,4.5,0,44.5,4.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Reykjavik Guesthouse: Rent a Bike",2002,78,NA,3.7,16,4.5,4.5,24.5,0,24.5,0,0,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Reza motori",1970,110,NA,8,6,0,0,0,0,0,34.5,0,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Rezervni deli",2003,87,NA,6.5,55,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Rhapsody",1954,115,NA,5.9,105,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rhapsody Rabbit",1946,7,NA,8.1,102,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Rhapsody in Bloom",1998,92,2200000,6.2,104,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Rhapsody in Blue",1945,135,NA,7.1,168,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rhapsody in Rivets",1941,7,NA,8.3,28,0,0,0,4.5,0,4.5,14.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Rheingold",1978,91,NA,5.5,19,14.5,0,0,14.5,0,24.5,14.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Rheinsberg",1967,88,NA,6.6,11,0,0,0,0,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Rhinestone",1984,111,NA,3,930,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rhino Brothers, The",2001,93,850000,5.4,54,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rhino!",1964,91,NA,6.2,13,4.5,0,4.5,4.5,14.5,34.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Rhinoceros",1974,104,NA,5.3,130,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Rhinoceros Eyes",2003,92,NA,7.1,73,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Rhinoceros Hunting In Budapest",1997,115,NA,6.9,11,4.5,0,0,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Rhodes of Africa",1936,90,NA,6.5,13,0,0,0,0,14.5,14.5,44.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Rhubarb",1951,94,NA,6.6,158,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Rhubarb Rhubarb",1980,28,NA,5,18,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Rhythm",1957,1,NA,8.7,7,0,0,0,0,0,0,14.5,0,74.5,14.5,"",0,0,0,0,0,0,1 -"Rhythm Is It!",2004,100,NA,7.6,104,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Rhythm Nation 1814",1989,30,NA,7,21,4.5,4.5,0,0,0,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Rhythm Thief",1994,88,30000,6.5,71,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rhythm and Weep",1946,17,NA,6.2,39,0,4.5,0,14.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Rhythm in the Ranks",1941,10,NA,7.5,6,0,0,0,0,0,14.5,34.5,34.5,14.5,0,"",0,1,0,0,0,0,1 -"Rhythm of the Saints",2003,83,NA,3.6,9,14.5,24.5,0,24.5,0,14.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Rhythm on the Range",1936,87,NA,6,35,4.5,0,0,4.5,14.5,4.5,34.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Rhythm on the Reservation",1939,6,NA,5.2,8,0,0,0,24.5,24.5,24.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Rhythm on the River",1940,92,NA,6.9,50,4.5,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Rhythmitis",1936,20,NA,5.8,15,14.5,0,0,0,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Rhythmus 21",1921,3,NA,6.6,32,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Rhythmus 23",1923,2,NA,7.5,11,14.5,0,0,14.5,14.5,0,0,24.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Riarizumu no yado",2003,83,NA,5.8,27,0,4.5,0,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ribald Tales of Canterbury",1985,90,NA,4.8,17,14.5,0,14.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Ribald Tales of Robin Hood, The",1969,83,NA,1.8,11,45.5,4.5,0,0,14.5,4.5,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Ribatejo",1949,115,NA,6.2,5,0,0,0,0,64.5,24.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Ribelle, La",1993,100,NA,5.4,25,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Ribelli per caso",2001,100,NA,9.2,27,4.5,0,0,0,4.5,4.5,24.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Riben guizi",2001,160,NA,7.5,15,0,0,0,0,0,24.5,14.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Rice & Potatoes",1998,58,NA,4.7,14,0,4.5,0,0,0,24.5,4.5,44.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Rice Girl",2003,90,NA,3,13,14.5,0,4.5,4.5,0,0,4.5,4.5,0,45.5,"",0,0,1,0,0,1,0 -"Rice They Carried, The",2004,36,NA,8.8,8,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,1,0,1 -"Rich Are Always with Us, The",1932,73,NA,6.5,105,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,1,1,0,1,0 -"Rich Girl",1991,96,NA,4.9,53,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Rich Kids",1979,96,2500000,5.6,84,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Rich Man's Wife, The",1996,94,NA,4.7,521,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Rich Man, Poor Girl",1938,72,NA,6.3,25,0,0,0,4.5,24.5,34.5,24.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Rich and Famous",1981,117,NA,5.3,326,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rich and Strange",1931,83,NA,6,423,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Rich in Love",1993,105,18000000,6,216,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rich, Young and Pretty",1951,95,NA,5.6,33,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Richard III",1911,23,NA,7.4,15,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,1 -"Richard III",1912,55,30000,6.9,24,4.5,4.5,0,0,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Richard III",1955,161,NA,7.6,405,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Richard III",1995,104,NA,7.5,3388,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Richard Lester!",1998,31,NA,2.6,11,14.5,0,0,14.5,4.5,4.5,14.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Richard Pryor Here and Now",1983,83,NA,6.1,162,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,1,0,0 -"Richard Pryor Live on the Sunset Strip",1982,82,NA,7.1,247,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,1,0,0 -"Richard Pryor: Live and Smokin'",1985,48,NA,4.6,54,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,1,0,0 -"Richard Pryor: Live in Concert",1979,78,300000,7.7,334,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,1,0,0 -"Riches, belles, etc.",1998,90,NA,5.2,9,14.5,24.5,0,0,0,0,0,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Richest Girl in the World, The",1934,76,NA,6.6,78,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Richiamo del lupo, Il",1975,95,NA,3.3,16,14.5,0,24.5,34.5,4.5,0,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Richter und sein Henker, Der",1975,106,NA,5.8,140,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Richtung Zukunft durch die Nacht",2002,60,NA,5.7,9,0,0,0,0,34.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Rick",2003,100,NA,6.3,173,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Rick & Steve the Happiest Gay Couple in All the World",1999,8,NA,8.7,58,4.5,0,4.5,0,4.5,4.5,14.5,14.5,4.5,44.5,"",0,1,1,0,0,0,1 -"Rick, The",2004,21,18000,8.7,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Ricky e Barabba",1992,83,NA,4.5,24,4.5,4.5,14.5,4.5,34.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Ricochet",1991,109,NA,5.6,2095,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Ricochet River",1998,112,NA,5.2,63,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Ricomincio da tre",1981,110,NA,7.8,141,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Riconciliati",2001,95,NA,6.3,6,14.5,14.5,0,0,14.5,34.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Ricordati di me",2003,125,NA,6.3,410,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Rid i natt!",1942,106,NA,6.7,16,0,0,4.5,0,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Riddle of the Sands, The",1979,102,NA,5,146,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Riddle, The",1996,87,NA,6.7,8,0,0,0,0,0,34.5,24.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Riddles of the Sphinx",1977,92,NA,5.5,8,14.5,24.5,0,0,0,14.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Ride",1998,90,NA,3.6,137,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Ride",2002,15,NA,9.4,9,0,0,0,0,0,0,14.5,14.5,0,74.5,"",0,0,0,0,0,0,1 -"Ride 'Em Cowboy",1942,82,NA,6.1,115,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ride Back, The",1957,79,NA,6.8,61,0,0,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ride Beyond Vengeance",1966,101,650000,5.5,59,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ride Clear of Diablo",1954,80,NA,6.8,60,0,0,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ride Him, Cowboy",1932,55,NA,4.8,73,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ride Lonesome",1959,73,NA,7.5,193,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ride Out for Revenge",1957,78,NA,5.1,6,0,0,14.5,0,34.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ride Ranger Ride",1936,63,NA,4.6,32,4.5,0,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ride a Crooked Mile",1938,70,NA,7.5,9,0,0,0,0,14.5,14.5,24.5,44.5,0,14.5,"",0,0,0,0,0,0,0 -"Ride a Crooked Trail",1958,87,NA,6.6,40,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Ride a Violent Mile",1957,80,NA,5.1,5,44.5,0,0,0,24.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Ride a Wild Pony",1975,91,NA,5.6,25,0,0,0,4.5,14.5,24.5,0,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Ride for Your Life",1995,28,NA,8.2,6,14.5,0,0,0,0,0,0,14.5,0,64.5,"PG",0,0,0,0,0,0,1 -"Ride in the Whirlwind",1965,82,70000,6,172,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ride or Die",2003,88,NA,3.9,84,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,1,0 -"Ride the High Country",1962,94,813000,7.5,1383,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Ride the Man Down",1952,90,NA,5.6,22,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ride the Pink Horse",1947,101,NA,7.3,234,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ride the Wild Surf",1964,101,NA,4.8,63,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Ride to Hangman's Tree",1967,90,NA,4.9,39,4.5,0,14.5,24.5,34.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Ride, Tenderfoot, Ride",1940,65,NA,6.9,11,0,4.5,0,0,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ride, The",1997,85,NA,5.9,100,4.5,0,0,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"PG",0,0,0,1,0,0,0 -"Ride, The",2003,90,NA,9.5,29,0,0,0,0,0,4.5,4.5,4.5,14.5,74.5,"",0,0,0,0,0,0,0 -"Ride, Vaquero!",1953,90,NA,6,86,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Rideau cramoisi, Le",1953,44,NA,8.1,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Rideaux blancs, Les",1965,92,NA,9.4,6,0,0,0,0,0,14.5,0,0,45.5,34.5,"",0,0,0,1,0,0,0 -"Rider Pride",2001,13,NA,9.4,11,0,0,0,0,0,0,0,24.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Rider from Tucson",1950,60,NA,5.4,14,0,0,0,24.5,24.5,34.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Rider of Death Valley, The",1932,78,NA,4.1,5,0,0,0,24.5,0,0,0,0,64.5,24.5,"",0,0,0,0,0,0,0 -"Rider on a Dead Horse",1962,72,NA,4.2,6,14.5,0,0,14.5,64.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Riders",2001,95,NA,6.1,59,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Riders",2002,83,15000000,5.1,922,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Riders In the Sky",1949,69,NA,6,15,0,0,4.5,14.5,14.5,4.5,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Riders of Death Valley",1941,283,1000000,6.9,7,14.5,0,0,0,14.5,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Riders of Destiny",1933,53,15000,5.3,101,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Riders of the Deadline",1943,70,NA,5.9,20,4.5,0,4.5,0,24.5,14.5,14.5,4.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Riders of the Northwest Mounted",1943,57,NA,5.7,7,0,0,14.5,0,24.5,24.5,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Riders of the Purple Sage",1925,56,NA,6.8,26,0,0,0,0,14.5,24.5,44.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Riders of the Purple Sage",1931,58,NA,7.2,5,0,0,0,0,24.5,0,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Riders of the Purple Sage, The",1941,58,NA,4.9,12,14.5,0,0,0,0,44.5,0,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Riders of the Range",1950,60,NA,5.8,12,0,0,0,4.5,4.5,45.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Riders of the Storm",1986,92,NA,5,116,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Riders of the Timberline",1941,59,NA,6.9,16,0,4.5,0,0,14.5,14.5,4.5,4.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Riders of the Whistling Pines",1949,70,NA,6.9,20,0,0,0,4.5,34.5,4.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Riders of the Whistling Skull, The",1937,58,NA,6.6,19,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Riders to the Stars",1954,81,NA,6.3,34,4.5,0,0,4.5,14.5,34.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ridicule",1996,102,NA,7.3,1879,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"R",0,0,1,1,0,1,0 -"Ridin' on a Rainbow",1941,79,NA,5,7,0,14.5,14.5,0,14.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Riding Giants",2004,105,NA,7.7,511,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,0,1,0,0 -"Riding High",1943,88,NA,5.5,10,14.5,0,14.5,34.5,24.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Riding High",1950,112,NA,5.4,59,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Riding Shotgun",1954,73,NA,6,46,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Riding Wild",1935,57,NA,5.7,5,0,0,0,0,44.5,0,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Riding in Cars with Boys",2001,132,48000000,6.2,4627,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Riding on Air",1937,70,NA,5.7,5,0,0,0,24.5,44.5,0,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Riding the Bullet",2004,98,5000000,5.2,438,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Riding the Edge",1989,100,NA,3,12,14.5,4.5,24.5,4.5,4.5,4.5,4.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Riding the Rails",1997,72,NA,6,24,4.5,0,0,0,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Riding the Wind",1942,60,NA,5.9,12,0,0,0,4.5,44.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Riding to Fame",1927,60,NA,5.7,11,34.5,0,0,0,44.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Riding with Death",1976,97,NA,1.7,430,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Riding with James Dean",1998,93,NA,4.5,6,45.5,0,0,0,34.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Rien ne va plus",1997,101,NA,6.6,408,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rien qu'un jeu",1983,89,NA,4,5,0,24.5,0,24.5,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Rien que du bonheur",2003,105,NA,5.1,31,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rien que les heures",1926,45,NA,7,16,4.5,0,4.5,0,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Rien sur Robert",1999,107,NA,6.7,329,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Riens du tout",1992,95,NA,6.3,94,4.5,0,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Riesenrad, Das",1961,110,NA,2.8,10,24.5,0,24.5,0,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Riff Raffy Daffy",1948,7,NA,7.2,25,0,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Riff-Raff",1990,95,NA,7.3,544,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Riffa, La",1991,93,NA,5.5,38,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Riffraff",1936,94,NA,6.3,91,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Riffraff",1947,80,NA,6.9,29,0,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Rift",1993,87,NA,2.8,9,24.5,14.5,14.5,14.5,0,0,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Rift, The",1990,79,NA,3.9,97,14.5,4.5,4.5,4.5,14.5,14.5,4.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Right Approach, The",1961,92,NA,6.4,17,0,4.5,4.5,14.5,34.5,24.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Right Cross",1950,90,NA,6.4,44,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Right Hand Man, The",1987,97,NA,3.4,17,14.5,4.5,14.5,24.5,24.5,4.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Right Hand of the Devil, The",1963,75,NA,7,5,24.5,0,0,0,0,0,44.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Right Here, Right Now",2003,28,NA,9.5,17,0,0,0,0,4.5,0,0,4.5,4.5,84.5,"",0,0,0,0,0,0,1 -"Right Hook, The",2000,10,NA,7,23,0,0,14.5,0,4.5,4.5,0,14.5,14.5,44.5,"",1,0,1,0,0,0,1 -"Right Side of My Brain, The",1985,23,NA,5.7,61,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Right Stuff, The",1983,193,27000000,7.9,12907,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Right Temptation, The",2000,102,NA,5.2,310,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"Right or Wrong?",1951,11,NA,3.3,5,24.5,0,0,24.5,44.5,24.5,0,0,0,0,"",0,0,0,1,0,0,1 -"Right to Live, The",1935,75,NA,6,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Right to Romance, The",1933,67,NA,3.5,10,24.5,14.5,14.5,24.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,1,0 -"Rigor mortis",1981,63,NA,2,10,24.5,0,0,0,0,24.5,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Rigtigt menneske, Et",2001,96,NA,6.7,216,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rih al awras",1966,95,NA,5.6,9,0,0,0,0,14.5,24.5,24.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Riisuminen",1986,87,NA,3,22,34.5,4.5,4.5,14.5,4.5,4.5,24.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Rikki-Tikki-Tavi",1966,20,NA,7.3,19,0,0,0,0,4.5,14.5,24.5,4.5,24.5,34.5,"",0,1,0,0,0,0,1 -"Rikky and Pete",1988,101,NA,5.8,91,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Rikos ja rakkaus",1999,102,NA,6.2,140,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Rikos ja rangaistus",1983,93,NA,7.5,118,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Rikugun",1944,87,NA,5,6,0,0,0,0,34.5,0,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Rikugun Nakano gakko",1966,95,NA,7.7,9,0,0,0,0,0,0,44.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rikyu",1989,115,NA,6.9,59,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Riley the Cop",1928,68,NA,5.5,18,14.5,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,0,"",0,0,1,1,0,0,0 -"Rillenfieber",2000,43,NA,8,9,14.5,0,14.5,0,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,1 -"Rim of the Canyon",1949,70,NA,6.4,21,0,0,0,4.5,24.5,4.5,14.5,44.5,4.5,0,"",0,0,0,0,0,0,0 -"Rime of the Ancient Mariner",1976,60,NA,7.9,10,14.5,0,0,0,0,24.5,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Rimpatriata, La",1963,110,NA,9,6,0,0,0,0,0,0,0,34.5,34.5,34.5,"",0,0,1,1,0,0,0 -"Rindu kami padamu",2004,100,NA,8.2,6,0,0,0,14.5,0,0,0,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Ring",1999,108,NA,7,721,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ring Thing, The",2004,80,NA,3.3,59,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ring Two, The",2005,110,NA,5.1,5483,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Ring of Bright Water",1969,107,NA,6.3,180,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Ring of Desire",1981,57,NA,5,7,14.5,0,0,0,14.5,14.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ring of Fear",1954,93,NA,4.3,10,24.5,0,0,14.5,34.5,14.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Ring of Fire",1961,91,NA,6.5,47,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ring of Fire",2000,15,NA,7.2,23,0,0,0,0,4.5,24.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Ring of Spies",1963,90,NA,6.3,8,0,0,0,0,0,34.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ring of Terror",1962,71,NA,1.4,135,64.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Ring of the Buddha, The",2000,92,NA,5.2,8,0,14.5,24.5,14.5,0,14.5,24.5,0,0,14.5,"",0,0,0,1,1,0,0 -"Ring, The",1927,72,NA,6.1,240,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ring, The",1952,79,NA,5.8,300,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ring, The",2002,115,45000000,7.4,30687,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Ringards, Les",1978,95,NA,2,7,0,45.5,0,0,0,24.5,0,0,0,14.5,"",0,0,1,1,0,0,0 -"Ringens disipler",2004,25,NA,6,21,24.5,4.5,4.5,0,0,0,4.5,14.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Ringer",1996,90,NA,4,41,14.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Ringer, The",1952,78,NA,6.3,8,0,0,14.5,0,24.5,0,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Ringers: Lord of the Fans",2005,97,NA,7.1,45,4.5,4.5,0,0,0,0,4.5,4.5,24.5,45.5,"",0,0,1,0,1,0,0 -"Ringgit Kasorrga",1995,109,NA,9.4,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Ringmaster",1998,90,NA,2.9,1494,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Ringo del Nebraska",1966,91,NA,6.4,5,0,24.5,0,24.5,0,24.5,0,0,44.5,0,"",0,0,0,0,0,0,0 -"Rings on Her Fingers",1942,86,NA,6,23,0,0,0,4.5,24.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Ringside",1949,68,NA,5.8,5,0,0,24.5,24.5,24.5,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Ringside Maisie",1941,95,NA,6.4,27,0,14.5,4.5,0,14.5,14.5,24.5,24.5,0,0,"",0,0,1,1,0,0,0 -"Ringu",1998,96,1200000,7.4,8091,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ringu 2",1999,95,NA,6.2,2199,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rink, The",1916,30,NA,7.2,292,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Rio",1939,77,NA,7.1,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Rio 40 Graus",1955,100,NA,8.1,47,4.5,0,0,0,4.5,4.5,4.5,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Rio Bravo",1959,141,NA,8,7193,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Rio Conchos",1964,107,NA,6.5,175,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Rio Grande",1938,58,NA,6.3,5,0,0,0,24.5,24.5,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Rio Grande",1950,105,1214899,7.3,1732,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Rio Grande Patrol",1950,60,NA,5.7,9,0,0,0,14.5,0,34.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Rio Lobo",1970,114,4000000,6.6,977,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Rio Peligroso: A Day in the Life of a Legendary Coyote",2004,25,5000,8.8,9,0,0,0,0,0,0,14.5,34.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Rio Rita",1929,105,NA,6.5,56,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Rio Rita",1942,91,NA,5.2,79,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rio Zona Norte",1957,90,NA,8.7,21,0,0,0,0,0,4.5,4.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Rio de Jano",2003,73,NA,8.2,12,0,0,0,0,0,14.5,14.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Rio do Ouro, O",1998,97,NA,7.2,46,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rio, El",1999,26,NA,5.9,5,0,0,0,0,44.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Riot",1969,96,NA,5.7,71,4.5,4.5,0,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Riot",1996,94,NA,4.6,78,14.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Riot On!",2004,75,NA,5.3,29,0,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Riot Squad",1941,60,NA,6.2,5,0,0,0,24.5,0,64.5,24.5,0,0,0,"",1,0,0,1,0,0,0 -"Riot in Cell Block 11",1954,80,NA,7,99,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Riot in Juvenile Prison",1959,71,NA,5.7,8,0,0,0,14.5,24.5,0,24.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Riot in Rhythm",1950,7,NA,5.9,5,0,0,24.5,0,24.5,0,24.5,0,0,44.5,"",0,1,1,0,0,0,1 -"Riot on Sunset Strip",1967,87,NA,4.1,58,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rip Leaving Sleepy Hollow",1896,4,NA,2.1,5,44.5,0,0,24.5,24.5,0,0,0,0,24.5,"",0,0,0,1,0,0,1 -"Rip Roarin' Buckaroo",1936,57,NA,4.4,5,0,44.5,0,24.5,0,0,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Rip, Sew and Stitch",1953,17,NA,6.3,43,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Rip-Off",1971,89,NA,5.6,11,4.5,0,0,0,14.5,0,24.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Ripa ruostuu",1993,80,NA,5.5,68,4.5,4.5,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ripacsok",1981,94,NA,8.2,35,4.5,0,0,0,0,4.5,0,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Ripe",1996,92,NA,4.4,275,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Ripley's Believe It or Not!",1981,60,NA,5.4,6,0,0,0,14.5,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Ripley's Game",2002,112,30000000,6.6,2680,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Ripoux contre ripoux",1990,107,NA,5.8,234,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Ripoux, Les",1984,107,NA,7.2,514,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ripper",2001,114,NA,4.4,593,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Ripper 2: Letter from Within",2004,85,NA,3.4,32,14.5,24.5,14.5,4.5,4.5,4.5,4.5,0,14.5,14.5,"R",0,0,0,0,0,0,0 -"Ripple",1995,20,NA,7.2,18,4.5,0,4.5,0,4.5,0,4.5,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Riptide",1934,92,500000,6.3,61,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Riri Shushu no subete",2001,146,NA,7.5,579,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Riri yeye",2004,85,NA,6.3,12,0,0,4.5,0,14.5,24.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Risa en vacaciones, La",1990,90,NA,5,11,4.5,24.5,0,4.5,0,14.5,4.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Risate di gioia",1960,106,NA,5.7,42,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Rise and Fall of Idi Amin",1980,91,NA,4.6,54,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rise and Fall of Legs Diamond, The",1960,101,NA,6.5,85,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rise and Fall of the Great Lakes, The",1968,17,NA,7.5,19,4.5,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Rise and Fall of the Legendary Anglobilly Feverson, The",2002,10,NA,4.1,15,4.5,4.5,4.5,0,4.5,4.5,4.5,24.5,0,44.5,"",0,1,0,0,0,0,1 -"Rise and Rise of Michael Rimmer, The",1970,100,NA,7.3,65,4.5,0,4.5,0,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Rise and Shine",1941,92,NA,6.9,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Rising Damp",1980,98,NA,5.1,93,0,4.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rising Low",2002,88,NA,6.9,36,0,0,0,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Rising Place, The",2001,93,NA,5,49,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Rising Sun",1993,129,NA,6,6504,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Rising of the Moon, The",1957,81,NA,6.2,80,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Rising of the Moon, The",2002,6,1500,8.3,6,0,0,0,0,0,0,34.5,14.5,34.5,14.5,"",0,0,0,1,0,0,1 -"Rising to the Top",1999,101,NA,7.4,15,4.5,0,0,0,4.5,24.5,14.5,4.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Risk",1994,90,NA,3.4,24,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Risk",2000,91,NA,6.2,185,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Risk/Reward",2003,88,NA,7.9,20,0,0,0,4.5,0,4.5,44.5,34.5,0,24.5,"",0,0,0,0,1,0,0 -"Risky Business",1983,98,6200000,6.7,8622,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Riso amaro",1949,107,NA,7.6,241,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Ristumine peateega",1999,68,NA,7.2,35,0,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Rita la zanzara",1966,110,NA,5.7,7,0,0,0,0,24.5,14.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Rita nel West",1967,97,NA,3.3,36,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Rita, Sue and Bob Too",1986,89,NA,5.8,371,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Rita, la figlia americana",1965,101,NA,4.6,5,24.5,0,0,0,0,84.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Ritam zlocina",1981,89,NA,8.1,38,4.5,0,0,0,4.5,0,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Rites of Passage",1999,95,NA,5.9,328,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Rito terminal",2000,110,NA,6.1,14,0,0,0,0,24.5,24.5,0,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ritorno dalla morte",1991,93,NA,2.6,14,14.5,24.5,24.5,14.5,4.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Ritorno del Monnezza, Il",2005,93,NA,5.8,10,14.5,14.5,0,24.5,0,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Ritorno di Ringo, Il",1965,104,NA,6.5,40,0,0,4.5,4.5,14.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ritorno di Robin Hood, Il",1991,92,NA,4.1,5,0,0,0,44.5,24.5,0,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Ritorno di Zanna Bianca, Il",1974,100,NA,5.2,20,4.5,14.5,14.5,4.5,14.5,24.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Ritos sexuales del diablo, Los",1980,84,NA,2.7,35,14.5,24.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Ritterinnen, Die",2003,96,NA,5.9,21,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,1,0,0 -"Ritterschlag",2003,6,NA,7.1,13,0,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Ritual in Transfigured Time",1946,15,NA,6.4,74,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Rituals",1977,89,NA,4.9,59,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Rituals and Resolutions",1999,29,NA,6.7,12,0,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Rituel de Fontainebleau, Le",2000,30,NA,4.1,7,14.5,14.5,0,0,14.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Rituel pour Pierre",1987,10,NA,8.1,6,0,0,0,0,0,14.5,0,45.5,34.5,0,"",1,0,0,0,0,0,1 -"Rituel pour un autre",1975,20,NA,7.4,6,0,0,0,0,0,14.5,64.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Rituelen",1989,90,NA,5.2,25,0,4.5,4.5,14.5,4.5,14.5,24.5,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Ritz, The",1976,91,NA,6.6,304,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Ritzar bez bronya",1966,85,NA,9.1,14,0,0,0,0,0,4.5,0,0,34.5,45.5,"",0,0,0,0,0,0,0 -"Riusciranno i nostri eroi a ritrovare l'amico misteriosamente scomparso in Africa?",1968,128,NA,6.6,51,0,4.5,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Rivale, La",1974,95,NA,4.2,10,0,14.5,14.5,0,14.5,34.5,14.5,0,0,34.5,"",0,0,1,0,0,1,0 -"Rivalen der Manege",1958,96,NA,3.9,6,0,0,34.5,14.5,45.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Rivelazioni di un maniaco sessuale al capo della squadra mobile",1972,88,NA,4,32,14.5,14.5,4.5,4.5,4.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"River Lady",1948,78,NA,7.5,12,0,0,4.5,0,4.5,24.5,14.5,24.5,0,14.5,"",1,0,0,1,0,0,0 -"River Made to Drown In, A",1997,98,NA,5.6,93,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"River Niger, The",1976,105,NA,5.3,23,0,4.5,0,4.5,14.5,24.5,4.5,0,0,34.5,"",0,0,0,1,0,0,0 -"River Rat, The",1984,93,NA,6,189,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"River Rats",1995,108,NA,6.9,9,14.5,0,0,0,0,14.5,44.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"River Red",1998,104,NA,5.5,63,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"River Runs Through It, A",1992,123,NA,7.1,7933,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"River Street",1996,90,NA,6.3,32,4.5,4.5,0,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"River Wild, The",1994,111,45000000,6.1,4942,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"River of Death",1989,103,NA,3.8,115,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"River of Grass",1994,100,NA,5.6,23,0,0,4.5,14.5,0,14.5,0,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"River of No Return",1954,91,NA,6.6,1057,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"River's Edge",1986,99,1700000,7.1,2139,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"River's Edge, The",1957,87,NA,6,68,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"River's End",1930,74,NA,4.5,26,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"River's End",1940,69,NA,5.8,19,0,0,0,4.5,34.5,34.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"River, The",1929,73,NA,9.1,25,4.5,0,0,14.5,0,0,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"River, The",1938,31,NA,6.5,81,4.5,4.5,4.5,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,1 -"River, The",1951,99,NA,7.4,338,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"River, The",1984,122,NA,6.2,1009,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Riverdance: The Show",1995,71,NA,6.4,171,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Riverplay",2000,82,NA,4.8,18,14.5,0,34.5,4.5,14.5,14.5,0,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Rivers and Tides",2001,92,NA,8.1,445,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Rivers of Babylon",1998,102,NA,4.3,22,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Riveter, The",1940,8,NA,7,48,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Rivincita di Natale, La",2004,99,NA,7,66,0,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Rivolta degli schiavi, La",1961,102,NA,4.3,19,0,14.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rivolta dei barbari, La",1964,99,NA,6.9,5,0,0,0,0,44.5,0,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Rivolta dei gladiatori, La",1958,82,NA,5.2,13,0,4.5,4.5,24.5,34.5,0,24.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Rivolta dei pretoriani, La",1964,95,NA,7.7,7,0,0,14.5,0,0,14.5,44.5,0,14.5,14.5,"",1,0,0,1,0,0,0 -"Rivolta dei sette, La",1964,85,NA,2.6,17,14.5,24.5,14.5,24.5,0,4.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Rizal sa Dapitan",1997,100,NA,3.1,11,24.5,4.5,0,0,0,14.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Ro 20",2004,110,NA,5.5,16,0,4.5,4.5,0,24.5,34.5,0,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ro.Go.Pa.G.",1963,85,NA,6.2,125,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Road",1987,67,NA,6.9,30,4.5,0,4.5,0,0,0,4.5,4.5,14.5,74.5,"",0,0,0,0,0,0,0 -"Road",2002,134,NA,6.1,75,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Road Agent",1952,60,NA,6.4,7,0,0,0,0,14.5,44.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Road Back, The",1937,97,NA,8.2,18,0,0,4.5,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Road Dogs",2003,90,NA,5.7,16,14.5,0,4.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Road Ends",1997,96,NA,5.2,148,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Road Gang",1936,61,NA,6.4,13,0,0,0,4.5,4.5,24.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Road Hog",1999,1,NA,6.9,11,0,0,4.5,0,4.5,4.5,24.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Road Home, The",2003,104,NA,2.6,66,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Road House",1934,76,NA,4.3,6,14.5,14.5,0,0,64.5,0,0,0,0,0,"",0,0,0,0,0,1,0 -"Road House",1948,95,NA,7.4,184,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Road House",1989,114,NA,5.4,3475,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Road Hustlers, The",1968,94,NA,5,7,24.5,14.5,14.5,0,0,0,0,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Road Killers, The",1994,89,NA,4.4,311,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Road Movie",1974,88,NA,5.9,21,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Road Movie",2002,114,NA,5.8,60,4.5,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Road Scholar",1993,82,NA,6,71,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"PG",0,0,0,0,0,0,0 -"Road Show",1941,87,NA,4.7,75,34.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Road Trip",2000,94,15600000,6.3,15981,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Road to Andalay",1964,7,NA,6.9,14,0,0,0,0,24.5,4.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Road to Bali",1952,91,NA,6.5,558,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Road to Denver, The",1955,90,NA,5.8,30,0,4.5,4.5,0,24.5,34.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Road to Dracula, The",1999,35,NA,6.7,59,4.5,0,4.5,4.5,4.5,14.5,44.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Road to El Dorado, The",2000,89,95000000,6.3,2838,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",1,1,1,0,0,0,0 -"Road to Elsewhere, A",1999,54,NA,6.9,7,24.5,0,0,0,0,14.5,24.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Road to Glory, The",1926,93,NA,7.6,6,0,14.5,14.5,0,0,0,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Road to Glory, The",1936,103,NA,6.8,35,0,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Road to God Knows Where, The",1990,90,NA,6.3,25,0,0,0,4.5,4.5,4.5,24.5,24.5,0,34.5,"",0,0,0,0,1,0,0 -"Road to Hollywood, The",1946,56,NA,5.2,26,14.5,0,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Road to Hong Kong, The",1962,91,NA,5.8,349,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Road to Morocco",1942,83,NA,7.1,701,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Road to Nhill",1997,95,NA,6,71,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Road to Perdition",2002,117,80000000,7.7,30526,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Road to Redemption",2001,89,NA,4.9,90,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,34.5,"PG",1,0,1,0,0,0,0 -"Road to Revenge",1993,90,NA,8.1,20,24.5,4.5,14.5,0,4.5,0,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Road to Rio",1947,100,NA,6.9,394,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Road to Ruin",1991,90,NA,4.5,31,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"Road to Ruin, The",1934,62,NA,5.7,7,0,0,14.5,14.5,0,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Road to Saddle River",1994,110,NA,5,34,4.5,0,0,4.5,4.5,0,4.5,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Road to Salina",1971,96,NA,5.3,53,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Road to Singapore",1940,85,NA,6.5,432,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Road to Singapore, The",1931,69,NA,5.8,24,0,0,0,4.5,14.5,44.5,24.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Road to Sundance",2000,50,NA,4,8,14.5,14.5,0,14.5,0,0,14.5,0,0,45.5,"",0,0,0,0,1,0,0 -"Road to Utopia",1946,90,NA,7.3,421,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Road to Victory",1944,10,NA,5.4,10,24.5,0,24.5,0,0,0,24.5,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Road to Wellville, The",1994,118,NA,5.2,3056,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Road to Yesterday, The",1925,107,NA,7.4,11,0,4.5,0,0,0,4.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Road to Zanzibar",1941,91,NA,6.7,389,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Road-Kill U.S.A.",1993,84,NA,7.3,9,14.5,0,0,0,14.5,0,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Roadblock",1951,73,NA,6.7,83,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Roadgames",1981,101,NA,6.4,292,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Roadhouse 66",1984,90,NA,4.6,86,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Roadhouse Murder, The",1932,73,NA,7,8,0,0,0,0,14.5,45.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Roadhouse Nights",1930,68,NA,4.9,6,0,0,0,34.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Roadie",1980,106,NA,3.9,194,24.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Roadkill",1989,80,NA,6.8,194,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Roadkill",2001,15,NA,6.8,17,4.5,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Roadkill",2003,5,NA,6.4,36,0,4.5,0,14.5,4.5,4.5,24.5,24.5,4.5,4.5,"",1,0,1,0,0,0,1 -"Roadracers",1959,73,NA,4.6,11,4.5,14.5,4.5,24.5,4.5,0,0,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Roadrunner a Go-Go",1965,6,NA,7,42,0,0,4.5,4.5,4.5,24.5,4.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Roads and Bridges",2001,105,NA,6.1,12,0,4.5,4.5,0,14.5,4.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Roadside Attractions",2004,15,6500,8.2,8,0,0,0,0,0,14.5,0,45.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Roadside Convenience",2003,15,1000,7.6,6,0,0,0,14.5,0,0,0,34.5,0,45.5,"",1,0,0,0,0,0,1 -"Roadside Diner",2004,11,NA,8.2,12,0,0,0,0,14.5,14.5,4.5,0,0,45.5,"",0,0,0,0,0,0,1 -"Roadside Prophets",1992,96,NA,5.4,286,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Roam",2001,14,NA,7.4,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,0,0,1,0,0,1 -"Roaming Cowboy, The",1937,56,NA,4.9,6,0,0,14.5,45.5,14.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Roaming the Emerald Isle",1927,10,NA,1,5,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Roar",1981,102,17000000,5.3,72,14.5,4.5,0,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Roar of the Dragon",1932,69,NA,6.3,28,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Roar: Lions of the Kalahari",2003,40,NA,8.2,14,0,0,14.5,4.5,0,4.5,4.5,34.5,24.5,0,"",0,0,0,0,1,0,1 -"Roaring Guns",1944,19,NA,4.5,9,14.5,0,14.5,24.5,34.5,24.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Roaring Road, The",1919,58,NA,7.4,6,0,0,0,0,14.5,0,64.5,14.5,0,0,"",0,0,1,1,0,0,0 -"Roaring Twenties, The",1939,104,NA,7.7,901,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Roast-Beef and Movies",1934,16,NA,4.4,16,14.5,4.5,4.5,4.5,34.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Rob Roy",1995,133,28000000,6.8,6652,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,1,0,1,0 -"Rob Roy, the Highland Rogue",1954,81,NA,5.7,69,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Roba da ricchi",1987,110,NA,3.3,21,14.5,4.5,14.5,34.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Robber Kitten, The",1935,8,NA,6.8,54,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Robber Symphony, The",1936,136,NA,8.2,15,0,0,0,0,0,4.5,4.5,24.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Robbers of the Range",1941,61,NA,5.2,14,0,0,4.5,0,45.5,4.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Robbers' Roost",1955,83,NA,7,7,14.5,0,0,0,0,24.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Robbery",1967,110,NA,6.4,88,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Robbery Under Arms",1957,83,NA,4.4,22,4.5,4.5,4.5,4.5,34.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Robbie Williams: Nobody Someday",2002,99,NA,6,71,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Robbie's Brother",2001,88,1000000,7,8,14.5,0,0,0,24.5,0,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Robbing Peter",2004,95,NA,6.6,19,0,4.5,14.5,0,0,4.5,14.5,4.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Robby",1968,60,NA,5.5,35,4.5,0,14.5,0,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"RobbyKallePaul",1989,95,NA,6.2,35,4.5,4.5,4.5,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Robe, The",1953,135,5000000,6.6,1074,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Robert Capa: In Love and War",2003,90,NA,7.4,43,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Robert et Robert",1978,105,NA,7.5,47,4.5,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Robert. Schastlivaya zhizn",1996,26,NA,8.8,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Roberta",1935,106,610000,6.9,260,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Roberta",1999,85,NA,4,15,0,4.5,14.5,24.5,14.5,0,14.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Roberta Loved",2002,24,NA,8.8,19,14.5,0,4.5,0,0,0,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Roberta Wells",2004,8,1000,4,15,4.5,0,0,4.5,0,0,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Roberto Carlos e o Diamante Cor-de-Rosa",1968,97,NA,4.1,15,0,14.5,24.5,4.5,0,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Roberto Carlos em Ritmo de Aventura",1968,90,NA,4.7,31,4.5,4.5,0,14.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Roberto Rossellini: Frammenti e battute",2000,65,NA,8,9,14.5,0,0,14.5,0,0,0,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Roberto Succo",2001,127,NA,7,304,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Robin Hood",1922,127,1000000,7.5,143,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Robin Hood",1973,83,15000000,7.2,3396,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Robin Hood",1998,14,NA,5.8,14,24.5,0,0,14.5,0,4.5,24.5,0,4.5,24.5,"",1,0,0,0,0,0,1 -"Robin Hood Daffy",1958,6,NA,8,230,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Robin Hood e i pirati",1960,88,NA,4.2,12,4.5,14.5,0,4.5,4.5,14.5,14.5,4.5,14.5,0,"",1,0,0,1,0,0,0 -"Robin Hood of El Dorado, The",1936,85,NA,4.8,34,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Robin Hood of Texas",1947,71,NA,5.9,23,14.5,14.5,0,4.5,24.5,34.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Robin Hood of the Pecos",1941,59,NA,6.3,8,0,14.5,0,0,24.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Robin Hood-Winked",1948,7,NA,5.4,9,0,0,0,24.5,34.5,24.5,14.5,0,14.5,0,"",0,1,1,0,0,0,1 -"Robin Hood: Men in Tights",1993,104,NA,5.7,10426,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Robin Hood: Prince of Thieves",1991,155,50000000,6.5,20286,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Robin Hoodwinked",1958,6,NA,6,29,0,0,4.5,14.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Robin and Marian",1976,106,5000000,6.6,1703,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Robin and the 7 Hoods",1964,123,NA,6.1,825,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Robin's Nest",1999,19,NA,9.4,17,0,0,0,0,4.5,14.5,4.5,0,24.5,44.5,"",0,0,1,0,0,0,1 -"Robinhood Makes Good",1939,8,NA,6.1,35,0,0,14.5,0,14.5,34.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Robinson Crusoe",1969,110,NA,7.8,6,14.5,0,0,0,0,0,0,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Robinson Crusoe",1997,105,NA,5.8,685,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Robinson Crusoe on Mars",1964,110,1200000,6.6,657,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Robinson Crusoe, Jr.",1941,8,NA,7.8,6,0,0,0,0,0,14.5,14.5,64.5,0,0,"",0,1,1,0,0,0,1 -"Robinson in Space",1997,82,NA,6.9,36,0,0,0,0,14.5,0,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Robinson soll nicht sterben",1957,90,NA,6.2,14,0,4.5,4.5,0,14.5,14.5,4.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Robinson und seine wilden Sklavinnen",1972,80,NA,4.2,11,0,4.5,24.5,4.5,0,4.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Robinzoniada, anu chemi ingliseli Papa",1986,76,NA,6.8,8,0,0,0,0,0,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Robo Vampire",1988,90,2500000,1.8,90,45.5,4.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Robo Warriors",1996,89,NA,3.8,42,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,"PG-13",0,0,0,0,0,0,0 -"RoboCop",1987,103,13000000,7.1,15974,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"RoboCop 3",1993,104,22000000,3.2,4519,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Robobo de la jojoya, El",1991,100,NA,2.7,58,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Robocop 2",1990,117,NA,4.7,6443,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Robokip",1993,6,NA,5.4,7,24.5,0,0,14.5,0,0,14.5,24.5,14.5,0,"",0,0,1,0,0,0,1 -"Robokon",2003,118,NA,7.4,7,0,0,14.5,0,0,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Robot Bastard!",2002,14,NA,8.6,20,4.5,0,0,0,0,0,14.5,24.5,14.5,44.5,"",1,0,1,0,0,0,1 -"Robot Holocaust",1987,79,NA,1.8,161,64.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Robot Jox",1990,85,10000000,3.9,592,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Robot Monster",1953,66,16000,2.4,723,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Robot Rabbit",1953,7,NA,7.2,36,0,4.5,0,4.5,4.5,4.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Robot Stories",2003,85,NA,6.4,310,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Robot Wars",1993,60,NA,3.3,144,24.5,14.5,14.5,14.5,4.5,4.5,0,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Robot Wrecks",1941,11,NA,5.5,6,14.5,0,14.5,14.5,14.5,0,0,0,0,34.5,"",0,0,1,0,0,0,1 -"Robot, The",1932,7,NA,5.9,9,0,0,0,0,34.5,14.5,45.5,0,0,0,"",0,1,0,0,0,0,1 -"Robots",2005,91,75000000,6.4,4089,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,1,1,0,0,0,0 -"Rocco e i suoi fratelli",1960,177,NA,7.7,1217,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Rocha que Voa",2002,94,NA,7.1,21,4.5,0,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Rocher d'Acapulco, Le",1996,70,NA,6.4,8,0,0,0,0,0,45.5,14.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Rock 'N' Roll Goldmine: The Sixties",1986,39,NA,6,10,0,0,0,0,14.5,0,64.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Rock 'n' Rodent",1967,6,NA,5.3,15,0,24.5,0,14.5,44.5,4.5,0,14.5,0,0,"",0,1,1,0,0,0,1 -"Rock 'n' Roll Frankenstein",1999,88,250000,4.3,66,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Rock 'n' Roll High School",1979,93,300000,6.6,1221,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rock 'n' Roll High School Forever",1990,95,NA,3.7,294,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rock 'n' Roll Junkie",1994,90,NA,6.5,25,0,0,0,4.5,14.5,4.5,14.5,44.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Rock 'n' Roll Nightmare",1987,83,NA,2.5,142,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Rock All Night",1957,62,NA,4.8,32,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rock Around the Clock",1956,77,300000,5.4,123,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rock Baby: Rock It",1957,84,NA,4,17,14.5,14.5,4.5,14.5,24.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Rock Estrela",1986,74,NA,6,7,0,0,0,0,24.5,14.5,44.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Rock Hudson's Home Movies",1992,63,NA,5.8,59,4.5,4.5,14.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Rock Island Trail",1950,90,NA,6,22,0,0,0,0,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Rock River Renegades",1942,56,NA,5.1,6,0,0,0,34.5,14.5,0,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Rock School",2005,93,NA,5.3,39,24.5,0,0,14.5,0,4.5,14.5,4.5,14.5,34.5,"R",0,0,0,0,1,0,0 -"Rock Star",2001,105,38000000,5.8,5100,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Rock and Roll Fantasy",1992,90,50000,4.4,37,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Rock and a Hard Place, A",1997,99,NA,3.2,23,0,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,24.5,"R",0,0,0,0,0,0,0 -"Rock the Boat",1998,89,NA,5.4,19,0,0,14.5,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Rock, Paper, Scissors",2000,13,NA,5.2,15,4.5,0,14.5,4.5,24.5,0,24.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Rock, Pretty Baby",1956,89,NA,6.5,22,4.5,0,0,4.5,4.5,4.5,24.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Rock, Rock, Rock",1956,85,NA,4.5,54,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rock, The",1967,9,NA,6.7,13,0,0,0,24.5,0,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Rock, The",1996,136,75000000,7,46184,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Rock-A-Doodle",1991,77,NA,4.4,400,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Rock-a-Bye Baby",1958,103,NA,6.3,189,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Rock-a-Bye Bear",1952,7,NA,8.7,29,0,0,0,0,0,14.5,4.5,14.5,4.5,64.5,"",0,1,1,0,0,0,1 -"Rockabilly Vampire",2001,90,NA,4,35,24.5,4.5,0,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Rockabye",1932,70,NA,5.5,13,0,4.5,0,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Rockers",1978,100,NA,7.2,160,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Rocket Attack, U.S.A.",1961,68,NA,1.6,140,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rocket Brothers",2003,87,NA,7.2,66,4.5,0,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Rocket Gibraltar",1988,99,NA,6.3,422,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rocket Man",1997,95,NA,5.2,1208,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"Rocket Man, The",1954,79,NA,4.6,28,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Rocket Squad",1956,7,NA,7.3,57,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Rocket to Mars",1946,6,NA,6.7,13,4.5,0,0,0,14.5,0,44.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Rocket to the Moon",1967,95,NA,5.2,90,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Rocket-bye Baby",1956,7,NA,6.9,35,0,0,0,14.5,0,14.5,34.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Rocketeer, The",1991,108,NA,6,5946,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Rockets Galore!",1957,94,NA,5,31,4.5,0,4.5,4.5,34.5,14.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Rockets Redglare!",2003,89,NA,5.7,27,4.5,0,4.5,4.5,0,24.5,14.5,0,4.5,34.5,"",0,0,0,0,1,0,0 -"Rocketship X-M",1950,77,94000,4.9,294,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rockfish",2003,9,NA,7.6,55,0,0,0,4.5,4.5,4.5,24.5,34.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Rockin' Road Trip",1985,101,NA,2.4,18,24.5,14.5,14.5,14.5,0,4.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Rockin' Thru the Rockies",1940,17,NA,7,49,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Rockin' in the Rockies",1945,63,NA,5.5,22,4.5,4.5,4.5,0,4.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rockin' with Seka, or Seka's Cruise",1980,77,NA,6.6,13,0,0,0,0,0,14.5,24.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Rocking Horse Winner, The",1950,91,NA,7.4,136,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rocking Horse Winner, The",1997,23,NA,6.2,24,0,4.5,0,4.5,14.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Rocking Silver",1983,94,NA,6,22,0,0,0,14.5,0,34.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rocks and Chocolate",2002,12,NA,7.9,9,14.5,0,0,0,0,0,34.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Rockshow",1980,105,NA,6.5,34,0,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Rockstar",2000,3,NA,6.9,48,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Rocktober Blood",1984,93,NA,3.7,32,14.5,14.5,24.5,14.5,0,4.5,0,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Rockula",1990,87,1500000,4.5,89,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Rockwell",1994,105,NA,2.8,23,34.5,14.5,4.5,4.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Rocky",1948,76,NA,6,13,14.5,0,0,0,14.5,0,4.5,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Rocky",1976,119,1100000,7.8,22893,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Rocky Carambola",1981,90,NA,4.8,6,34.5,0,0,0,14.5,14.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Rocky Horror Picture Show, The",1975,98,1200000,6.8,16737,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Rocky II",1979,119,NA,6.3,9412,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Rocky III",1982,99,NA,5.7,9809,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Rocky IV",1985,91,31000000,5.3,11503,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Rocky IV: An Animation",1999,2,NA,4,14,14.5,14.5,4.5,4.5,0,14.5,4.5,0,0,34.5,"",0,1,1,0,0,0,1 -"Rocky Mountain",1950,83,NA,5.9,60,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Rocky Mountain Mystery",1935,63,NA,6.3,39,0,0,0,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rocky Mountain Rangers",1940,58,NA,5.7,8,0,0,14.5,0,74.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Rocky Road",2001,90,NA,4.2,10,45.5,14.5,0,0,0,0,14.5,0,24.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Rocky Road, The",1910,11,NA,4.9,5,24.5,0,0,0,0,44.5,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Rocky V",1990,104,NA,4,7465,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Rocky VI",1986,9,NA,4.5,201,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Roda, tsanta kai kopana",1982,96,NA,4.1,36,14.5,0,4.5,14.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Roda, tsanta kai kopana No 2",1983,94,NA,4.7,12,4.5,0,4.5,0,14.5,0,0,14.5,0,45.5,"",0,0,1,0,0,0,0 -"Roda, tsanta kai kopana No 3",1984,94,NA,3.7,11,24.5,0,4.5,0,4.5,0,0,4.5,0,44.5,"",0,0,1,0,0,0,0 -"Rode zwaan, De",1999,100,NA,5.4,16,0,0,4.5,14.5,4.5,14.5,4.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Rodent to Stardom",1967,6,NA,6.6,12,0,4.5,0,0,14.5,14.5,4.5,44.5,0,4.5,"",0,1,1,0,0,0,1 -"Rodeo Romeo",1946,7,NA,7.5,6,0,0,0,0,14.5,0,0,34.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Rodina akroyialia, Ta",1998,101,NA,3.9,11,0,4.5,24.5,0,0,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Rodjen kao ratnik",1994,84,NA,5,8,45.5,0,0,14.5,0,0,24.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Rodnya",1981,98,NA,7.4,44,0,0,0,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rodrigo D: No futuro",1990,93,NA,6,57,4.5,4.5,0,4.5,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Rodriguez au pays des merguez",1980,87,NA,3.3,5,44.5,0,0,24.5,0,0,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Roger",1996,32,NA,8,5,24.5,0,0,0,0,0,0,84.5,0,0,"",0,0,0,0,1,0,1 -"Roger & Me",1989,91,160000,7.7,7674,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,1,0,0 -"Roger Corman: Hollywood's Wild Angel",1977,60,NA,4.6,9,14.5,14.5,14.5,14.5,0,14.5,0,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Roger Dodger",2002,106,NA,7.3,3358,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Roger Touhy, Gangster",1944,65,NA,6.3,6,0,0,0,34.5,0,34.5,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Rogers' Cable, The",1998,10,NA,7.8,6,0,0,0,0,0,14.5,45.5,0,0,34.5,"",0,0,0,0,0,0,1 -"Rogue Cop",1954,92,NA,7,110,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Rogue River",1951,81,NA,5.9,11,0,0,4.5,0,4.5,4.5,44.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Rogue Song, The",1930,101,NA,5.1,9,14.5,0,14.5,24.5,14.5,14.5,0,14.5,0,24.5,"",0,0,0,0,0,1,0 -"Rogue Trader",1999,101,12800000,6.1,1379,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rogue's March",1953,84,NA,6.5,11,0,0,0,0,4.5,34.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Rogues Tavern, The",1936,70,NA,5.4,27,4.5,4.5,4.5,24.5,24.5,4.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Rogues of Sherwood Forest",1950,79,NA,4.8,26,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Rogues' Gallery",1944,60,NA,6,6,0,0,0,45.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Rogues' Regiment",1948,86,NA,7.2,16,4.5,0,0,4.5,4.5,14.5,24.5,34.5,14.5,0,"",1,0,0,0,0,0,0 -"Roi danse, Le",2000,115,21000000,5.9,422,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Roi de Paris, Le",1995,102,NA,6.1,10,0,14.5,0,14.5,14.5,24.5,14.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Roi de coeur, Le",1966,100,NA,7.3,890,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Roi des cons, Le",1981,97,NA,3.6,17,34.5,0,14.5,14.5,14.5,4.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Roi du maquillage, Le",1904,3,NA,6.6,82,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Roi et l'oiseau, Le",1980,81,NA,8.6,293,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",0,1,0,0,0,0,0 -"Rois du gag, Les",1985,98,NA,4.8,106,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rois du sport, Les",1937,102,NA,4.5,18,14.5,4.5,0,14.5,14.5,14.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Rois et reine",2004,150,NA,7.1,213,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Rois mages, Les",2001,102,NA,5.9,241,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Roja",1992,137,NA,6.9,173,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Rojo amanecer",1989,96,NA,8.6,115,4.5,4.5,0,0,0,4.5,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Rok spokojnego slonca",1984,110,NA,7.7,109,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Rokoko",1997,81,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,1,1,0,0,0 -"Rokugatsu no hebi",2002,77,NA,6.9,381,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Role of a Lifetime",2001,98,NA,5.1,39,4.5,0,0,14.5,24.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Roll on Texas Moon",1946,54,NA,4.4,16,14.5,14.5,0,0,24.5,4.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Rolle Duschen, Eine",1987,5,NA,4.6,27,0,14.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Roller Blade",1985,88,NA,3.1,69,44.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Roller Boogie",1979,103,NA,2.6,223,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Roller Coaster Rabbit",1990,7,NA,7.7,167,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Rollerball",1975,129,NA,6.4,3609,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Rollerball",2002,97,70000000,2.8,5328,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Rollercoaster",1977,119,NA,5.8,862,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rollercoaster",1999,88,NA,5.4,123,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Rollin' Plains",1938,57,NA,3.7,8,0,0,45.5,24.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Rolling",1997,93,NA,1.7,7,24.5,0,0,0,0,14.5,24.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Rolling Kansas",2003,89,NA,6.2,164,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Rolling Stones Rock and Roll Circus, The",1996,65,NA,7.7,133,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Rolling Thunder",1977,95,NA,6.4,327,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Rolling Vengeance",1987,90,NA,4.5,44,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Rollover",1981,118,NA,4.9,200,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rolls-Royce Baby",1975,84,NA,4.4,19,0,14.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Roma",1972,126,NA,7.2,1306,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Roma",2004,155,2763806,7.5,105,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Roma a mano armata",1976,95,NA,5.8,55,4.5,0,4.5,0,4.5,14.5,14.5,14.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Roma bene",1971,100,NA,7.4,12,0,0,0,0,4.5,0,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Roma contro Roma",1964,93,NA,6.1,6,0,14.5,34.5,0,14.5,0,34.5,0,0,0,"",1,0,0,1,0,0,0 -"Roma ore 11",1952,107,NA,8.4,14,0,0,0,0,4.5,0,4.5,45.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Roma violenta",1975,89,NA,6.4,33,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Roma. L'antica chiave dei sensi",1984,84,NA,3.2,33,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Romaine",1997,80,NA,7.6,20,4.5,0,0,0,0,24.5,14.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Roman Candles",1966,40,NA,7.3,15,14.5,0,4.5,0,4.5,4.5,0,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Roman Holiday",1953,117,1500000,8.1,9431,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Roman Legion-Hare",1955,7,NA,7.2,50,0,0,0,4.5,4.5,4.5,44.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Roman Scandals",1933,85,1000000,6.2,89,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Roman Spring of Mrs. Stone, The",1961,103,NA,6.4,247,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Roman Za'ir",1984,85,NA,4.2,57,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Roman d'un tricheur, Le",1936,85,NA,8.5,128,0,4.5,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Roman de Lulu, Le",2001,88,NA,5.4,60,4.5,4.5,14.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Roman de Renard, Le",1930,65,NA,8.4,36,0,0,0,0,0,4.5,14.5,4.5,24.5,44.5,"",0,1,1,0,0,0,0 -"Roman i Magda",1979,87,NA,8.3,6,0,0,0,0,0,14.5,14.5,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Romana, La",1954,96,NA,5.5,11,0,0,4.5,4.5,4.5,24.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Romance",1930,76,496000,5.3,52,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Romance",1988,90,NA,8.7,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Romance",1999,99,NA,5.3,2261,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Romance",2004,14,NA,7.1,12,14.5,0,0,4.5,0,4.5,4.5,4.5,14.5,34.5,"",0,0,1,1,0,0,1 -"Romance Road",1938,19,NA,2.7,6,34.5,0,14.5,0,14.5,14.5,0,14.5,0,0,"",0,0,0,0,0,1,1 -"Romance da Empregada",1987,90,NA,7.2,46,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Romance de Paris, La",1941,110,NA,6.1,7,0,0,0,0,24.5,14.5,14.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Romance del Aniceto y la Francisca, El",1967,90,NA,8.6,15,0,0,0,0,0,4.5,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Romance in Manhattan",1935,78,NA,6.9,50,0,0,0,0,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Romance of Digestion, The",1937,8,NA,6.4,8,0,0,14.5,24.5,0,0,34.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Romance of Happy Valley, A",1919,60,NA,7.5,18,0,0,0,4.5,0,4.5,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Romance of Radium",1937,10,NA,6.5,13,0,0,0,4.5,14.5,4.5,24.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Romance of Rosy Ridge, The",1947,105,NA,6.5,48,4.5,0,0,4.5,4.5,14.5,44.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Romance of Transportation in Canada, The",1952,12,NA,7.5,10,0,0,0,0,14.5,34.5,14.5,34.5,24.5,0,"",0,1,0,0,0,0,1 -"Romance of a Horsethief",1971,101,NA,4.1,25,4.5,0,24.5,4.5,4.5,4.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Romance of the Rails",1903,3,NA,4.6,12,4.5,0,4.5,14.5,44.5,4.5,4.5,4.5,0,0,"",0,0,0,0,0,1,1 -"Romance of the West",1946,58,NA,6.9,8,0,0,14.5,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Romance on the High Seas",1948,99,NA,6.9,181,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Romance on the Range",1942,63,NA,7.5,7,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Romance pro kridlovku",1966,86,NA,8.1,10,0,0,0,0,0,24.5,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Romance sentimentale",1930,20,NA,6.7,28,0,0,4.5,4.5,0,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Romance with a Double Bass",1974,40,NA,7,95,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,1 -"Romancing Sara",1995,84,NA,4.2,33,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Romancing the Stone",1984,105,NA,6.8,9986,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Romanoff and Juliet",1961,103,NA,6.8,82,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Romans o vlyublyonnykh",1974,135,NA,6.7,26,0,0,4.5,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Romantic Comedy",1983,102,NA,4.7,117,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Romantic Englishwoman, The",1975,115,1200000,6,119,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Romantic Fighter",1999,96,NA,5.5,16,34.5,0,0,0,14.5,4.5,0,4.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Romantic Melodies",1932,11,NA,3.7,6,0,14.5,14.5,14.5,34.5,0,0,0,0,14.5,"",0,1,0,0,0,0,1 -"Romantik",2004,100,NA,2.8,5,84.5,0,0,0,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Romanze in Moll",1943,100,NA,6.8,32,0,0,0,4.5,4.5,0,14.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Romanze in Venedig",1962,90,NA,3.4,5,0,24.5,64.5,0,0,24.5,0,0,0,0,"",0,0,0,0,0,1,0 -"Romanzo di un giovane povero",1995,120,NA,6,31,0,0,0,0,24.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Romanzo popolare",1974,105,NA,6.9,33,0,4.5,0,0,4.5,14.5,14.5,44.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Romasanta",2004,90,NA,5.1,208,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Rome Adventure",1962,119,NA,5.7,148,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Rome Express",1932,94,NA,6.3,32,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Romeo & Julia",1992,92,NA,2.3,18,24.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Romeo + Juliet",1996,120,14500000,6.7,22306,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",1,0,0,1,0,1,0 -"Romeo Division, The",2004,25,6000,7.2,13,34.5,0,0,0,0,0,0,0,0,64.5,"",1,0,0,0,0,0,1 -"Romeo Is Bleeding",1993,104,NA,6.2,2643,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Romeo Must Die",2000,115,25000000,5.8,10229,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Romeo and Juliet",1936,125,NA,7,159,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Romeo and Juliet",1954,138,NA,6.7,115,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Romeo and Juliet",1966,124,NA,6.3,49,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Romeo e Giulietta",1912,34,NA,6,13,0,0,0,24.5,4.5,14.5,34.5,24.5,0,0,"",0,0,0,1,0,1,1 -"Romeo i Zhulietta",1955,92,NA,7.1,8,0,0,0,0,0,24.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Romeo und Julia auf dem Dorfe",1941,102,NA,4.6,12,0,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Romeo und Julia im Schnee",1920,34,NA,7.4,21,4.5,0,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Romeo y Julieta",1943,100,NA,6.3,9,0,0,0,14.5,0,34.5,14.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Romeo, Julia a tma",1960,92,NA,6.8,17,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Romeo-Juliet",1990,120,NA,4.8,40,14.5,4.5,0,0,4.5,14.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Romero",1989,102,NA,7.3,400,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Romie-O and Julie-8",1979,30,NA,5.1,17,0,0,14.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,1,0,0,0,1,1 -"Romios ehei filotimo, O",1968,91,NA,8.2,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,1,0,0,0,0 -"Romola",1924,91,NA,6.2,13,0,0,0,14.5,14.5,4.5,34.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Romolo e Remo",1961,89,NA,5.7,53,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Romp",1999,117,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Romper Stomper",1992,94,NA,7,4171,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Romuald et Juliette",1989,108,NA,7.1,331,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Romy and Michele's High School Reunion",1997,92,NA,5.8,7372,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ron's Night Out",1999,30,50000,5.6,5,0,0,0,0,24.5,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Roncsfilm",1992,89,NA,7.1,110,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Ronda nocturna",2005,81,NA,6.5,9,0,0,0,14.5,0,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Ronde de l'amour, La",1985,98,NA,4.4,14,14.5,0,4.5,14.5,24.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Ronde de nuit",1984,95,NA,3.7,14,24.5,0,4.5,24.5,0,24.5,24.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Ronde, La",1950,97,NA,7.5,385,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ronde, La",1964,110,NA,5,50,24.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ronin",1998,121,55000000,7,21982,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,0,0,0,0 -"Roof Sex",2003,2,NA,4.9,10,14.5,14.5,0,0,0,34.5,0,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Roof to Roof",2001,70,NA,6.1,9,0,0,14.5,0,14.5,14.5,14.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Rooftop",1996,26,NA,7.7,10,0,0,0,0,14.5,14.5,24.5,34.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Rooftops",1989,98,NA,3.6,85,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Roogie's Bump",1954,71,NA,4.9,12,4.5,14.5,4.5,4.5,4.5,0,4.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Rooie Sien",1975,108,NA,6.1,31,4.5,0,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Rook, The",1994,85,NA,3.2,13,24.5,0,0,4.5,4.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rookie Bear, The",1941,8,NA,6.7,9,0,0,0,0,24.5,24.5,24.5,14.5,24.5,0,"",0,1,1,0,0,0,1 -"Rookie Cop, The",1939,61,NA,5.2,13,0,0,0,24.5,24.5,34.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Rookie Revue",1941,7,NA,6.3,15,0,0,0,0,14.5,34.5,45.5,0,0,0,"",0,1,1,0,0,0,1 -"Rookie of the Year",1993,103,NA,5.2,2229,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rookie, The",1960,84,NA,2,7,24.5,0,14.5,0,0,0,14.5,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Rookie, The",1990,121,NA,5.2,2651,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Rookie, The",2002,127,24000000,7.2,5135,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Room 36",2002,89,NA,7.2,9,0,0,14.5,14.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Room Service",1938,78,NA,6.6,595,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Room and Bird",1951,7,NA,6.5,40,0,0,0,4.5,14.5,24.5,34.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Room at the Top",1959,115,NA,8,431,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Room for Romeo Brass, A",1999,90,NA,7.4,357,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"R",0,0,1,1,0,0,0 -"Room to Let",1950,68,NA,4.6,9,0,14.5,0,14.5,34.5,0,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Room to Rent",2000,95,NA,6.5,136,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Room with a View, A",1985,117,3000000,7.4,6369,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Room, The",2003,99,6000000,2.7,81,34.5,4.5,0,0,0,4.5,4.5,4.5,4.5,45.5,"R",0,0,1,1,0,1,0 -"Roommates",1971,97,NA,5.8,6,0,0,0,0,34.5,45.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Roommates",1981,89,NA,5.8,29,4.5,4.5,0,0,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Roommates",1995,108,22000000,6.1,456,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Rooney",1958,88,NA,6.8,22,0,0,0,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Roop Ki Rani Choron Ka Raja",1993,190,NA,4,23,24.5,4.5,0,0,14.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,1,0 -"Roost, The",2005,80,NA,5,10,0,0,0,14.5,0,24.5,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Rooster Cogburn",1975,108,NA,6.4,1236,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Rooster: Spurs of Death!",1983,92,NA,2.6,11,14.5,24.5,0,0,4.5,0,4.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Roosters",1993,110,NA,5,21,4.5,0,4.5,24.5,4.5,4.5,14.5,0,4.5,24.5,"R",0,0,0,1,0,0,0 -"Root of All Evil",1947,110,NA,7.2,36,4.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Root of All Evil, The",2004,101,150000,6.6,5,24.5,0,0,0,24.5,0,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Rootin' Tootin' Rhythm",1937,60,NA,6.5,15,0,0,24.5,0,24.5,24.5,0,4.5,24.5,0,"",0,0,0,0,0,0,0 -"Roots",1995,4,NA,5.2,5,24.5,0,0,0,44.5,24.5,0,0,0,24.5,"",0,1,0,0,0,0,1 -"Roots & Wings",2002,25,NA,5,9,14.5,0,24.5,0,0,0,24.5,24.5,0,24.5,"",0,0,0,1,0,0,1 -"Roots of Heaven, The",1958,121,4500000,6,91,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rooty Toot Toot",1951,7,NA,8.2,11,0,0,0,4.5,0,0,14.5,0,14.5,45.5,"",0,1,1,0,0,0,1 -"Roozi khe zan shodam",2000,78,180000,7.3,227,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rope",1948,80,1500000,7.8,7916,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Rope of Sand",1949,104,NA,6.3,73,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ropin' Fool, The",1921,22,NA,8.4,12,4.5,0,0,0,0,14.5,0,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Rosa",1992,15,NA,6.9,8,14.5,0,0,0,0,14.5,34.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Rosa Funzeca",2002,89,NA,5.4,18,14.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Rosa Luxemburg",1986,122,NA,7.1,166,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rosa Was Here",1994,51,NA,4,18,14.5,14.5,0,14.5,14.5,14.5,4.5,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Rosa blanca",1961,105,NA,6.2,7,0,0,0,14.5,0,0,0,44.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rosa blanca, La",1955,106,NA,7.8,5,0,0,0,0,0,64.5,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Rosa dei nomi, La",1987,61,NA,4.9,7,0,0,24.5,0,0,0,0,44.5,0,24.5,"",0,0,0,0,1,0,0 -"Rosa di Bagdad, La",1949,76,NA,7.7,15,4.5,0,0,0,0,24.5,24.5,24.5,24.5,14.5,"",0,1,0,0,0,0,0 -"Rosa e Cornelia",2000,90,NA,6.5,24,4.5,4.5,0,14.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rosa la china",2002,109,NA,4.3,15,24.5,0,4.5,4.5,44.5,4.5,0,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Rosa la rose, fille publique",1986,92,NA,5.5,16,4.5,0,4.5,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Rosales, La",1984,80,NA,6.8,5,0,0,0,44.5,0,0,44.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Rosalie",1937,123,2000000,6.2,73,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rosalie Goes Shopping",1989,94,NA,5.5,211,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rosarigasinos",2001,90,NA,5.7,35,0,4.5,0,4.5,4.5,24.5,4.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Rosary Murders, The",1987,105,NA,5.4,198,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rosas blancas para mi hermana negra",1970,96,NA,5.6,5,24.5,0,0,0,24.5,44.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Rosas danst rosas",1997,57,NA,7.4,8,24.5,0,0,0,14.5,0,0,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Rosaura a las 10",1958,100,NA,7.8,35,4.5,0,0,0,14.5,0,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Rose & Alexander",2002,40,4800,8.9,7,0,0,0,0,0,0,14.5,24.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Rose Bowl Story, The",1952,73,NA,2.8,10,14.5,24.5,44.5,0,14.5,0,0,24.5,0,0,"",0,0,1,1,0,1,0 -"Rose Garden, The",1989,112,NA,6.6,88,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rose Hobart",1936,19,NA,7.1,70,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Rose Marie",1954,104,NA,6,65,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Rose Red",1994,18,NA,8.3,11,0,4.5,0,0,0,4.5,14.5,0,4.5,45.5,"",0,0,0,0,0,0,1 -"Rose Tattoo, The",1955,117,NA,7.1,483,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Rose Technique, The",2002,97,NA,3.6,50,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rose de Pierrot, La",1992,17,NA,1.8,10,14.5,14.5,0,0,0,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Rose de fer, La",1973,85,NA,5.3,24,4.5,0,4.5,14.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rose for Emily",1982,27,NA,8.1,47,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Rose of Cimarron",1952,72,NA,5.4,16,0,4.5,0,14.5,14.5,34.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Rose of Washington Square",1939,86,NA,6.6,55,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Rose of the Rancho",1936,85,NA,7.7,5,0,0,0,24.5,0,0,24.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Rose, The",1979,125,8500000,6.6,1076,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rose-Marie",1936,113,NA,7,203,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Roseanna McCoy",1949,100,NA,5.3,35,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Roseanna's Grave",1997,98,NA,6.9,839,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Roseaux sauvages, Les",1994,115,NA,7.4,1195,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Rosebud",1975,121,NA,4.1,85,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Rosebud",1991,14,NA,6.5,9,0,0,0,14.5,14.5,0,0,14.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Rosebud Beach Hotel, The",1984,83,NA,4,34,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Roseland",1930,12,NA,5.1,16,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Roseland",1977,104,NA,5.2,72,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Roselyne et les lions",1989,115,NA,6.3,101,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Rosemary's Baby",1968,136,3200000,7.9,12033,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rosen im Herbst",1955,107,NA,5.9,11,0,4.5,0,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rosencrantz & Guildenstern Are Dead",1990,117,NA,7.3,5039,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Rosenkavalier, Der",1962,192,NA,7.9,15,0,0,0,0,4.5,0,24.5,0,4.5,64.5,"",0,0,1,0,0,1,0 -"Rosenstrasse",2003,136,NA,6.7,396,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Rosenzweigs Freiheit",1998,89,NA,5.9,9,0,0,14.5,0,14.5,34.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Roser og persille",1993,105,NA,6.6,7,0,0,0,14.5,24.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Rosetta",1999,92,NA,6.8,1378,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Rosewood",1997,140,31000000,6.8,1840,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Rosie",1998,97,NA,7.6,259,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Rosie Dixon - Night Nurse",1978,90,NA,3.4,41,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rosie the Riveter",1944,75,NA,7,6,0,0,14.5,0,14.5,0,14.5,14.5,34.5,0,"",0,0,1,0,0,0,0 -"Rosie!",1967,98,NA,5.6,54,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Rosier de Madame Husson, Le",1950,84,NA,3.3,5,24.5,0,24.5,0,0,24.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Rosine",1994,100,NA,8.2,16,0,0,0,0,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Rosita",1923,90,NA,6.9,15,0,0,0,4.5,24.5,4.5,34.5,4.5,24.5,4.5,"",0,0,1,0,0,1,0 -"Rosmunda e Alboino",1962,96,NA,5,14,0,4.5,4.5,24.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Rospiggar",1942,89,NA,5.3,7,0,0,14.5,14.5,14.5,14.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Rossini",1997,114,NA,6.5,663,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Rosso",1985,86,NA,7.1,101,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Rosso fango",2002,12,NA,7.2,19,0,0,0,0,14.5,14.5,24.5,34.5,0,24.5,"",0,0,0,0,0,0,1 -"Rosso sangue",1982,90,NA,4.7,140,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rosso segno della follia, Il",1970,83,NA,5.7,210,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rosszemberek",1979,90,NA,5.5,7,0,0,0,14.5,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rosvo Roope",1949,99,NA,6.7,20,0,0,0,0,4.5,24.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Rosy-Fingered Dawn: a Film on Terrence Malick",2002,90,NA,6,16,4.5,4.5,4.5,0,14.5,14.5,14.5,4.5,0,34.5,"",0,0,0,0,1,0,0 -"Rot und blau",2003,112,NA,8.8,33,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Rotaie",1929,91,NA,8.4,7,0,0,0,0,0,0,14.5,24.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Rotation",1949,80,NA,8.5,16,0,0,0,0,0,0,4.5,45.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rote Jacke, Die",2002,21,NA,7.9,40,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Rote Kreis, Der",1960,92,NA,6.1,29,4.5,0,0,4.5,24.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rote Sonne",1970,89,NA,6.3,74,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Rote Strumpfband, Das",2000,28,NA,7.6,5,0,0,0,0,0,24.5,24.5,44.5,24.5,0,"",0,0,0,0,0,0,1 -"Rotten to the Core",1965,90,NA,4.5,22,4.5,0,14.5,14.5,24.5,4.5,0,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Rou pu tuan zhi tou qing bao jian",1992,81,NA,5.3,272,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Rouge Venise",1989,120,NA,5.8,6,0,0,14.5,14.5,34.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Rouge baiser",1985,112,NA,6.6,99,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rouge est mis, Le",1957,95,NA,5.5,20,0,14.5,4.5,0,14.5,14.5,14.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Rouge et le noir, Le",1954,171,NA,6.1,55,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rouge midi",1985,110,NA,6.8,8,14.5,0,14.5,0,14.5,34.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Rough Cut",1980,112,NA,5.2,190,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Rough Diamonds",1994,90,NA,3.1,27,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rough Draft",1997,95,NA,3.4,152,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Rough House, The",1917,22,NA,6.7,48,0,0,4.5,0,14.5,34.5,34.5,14.5,4.5,0,"",0,0,1,0,0,0,1 -"Rough Magic",1995,104,NA,5.3,487,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Rough Night in Jericho",1967,104,NA,5.6,84,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rough Riders' Round-up",1939,55,NA,6.3,18,0,0,0,0,24.5,24.5,24.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Rough Riding",1954,9,NA,5.7,6,0,0,0,0,45.5,14.5,0,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Rough Romance",1930,55,NA,5.1,9,14.5,14.5,14.5,0,14.5,0,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Rough Sea",1900,1,NA,4.5,25,4.5,4.5,24.5,4.5,24.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Rough Shoot",1953,88,NA,5.7,23,0,0,4.5,4.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Rough Sketch of a Proposed Film Dealing with the Powers of Ten and the Relative Size of Things in the Universe",1968,8,NA,7.8,21,4.5,0,0,0,0,4.5,34.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Rough South of Larry Brown, The",2002,85,NA,3.4,20,4.5,14.5,14.5,0,4.5,0,0,0,14.5,45.5,"",0,0,0,0,1,0,0 -"Rough and the Smooth, The",1959,96,NA,5.2,8,0,0,0,14.5,14.5,0,45.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Rough for Theatre II",2000,29,NA,7.3,9,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Rough, Tough West, The",1952,54,NA,6.2,8,0,0,0,14.5,24.5,14.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Roughest Africa",1923,29,NA,6.4,25,0,4.5,4.5,4.5,14.5,24.5,4.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Roughly Speaking",1945,117,NA,6.7,47,0,0,0,4.5,14.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Roughly Squeaking",1946,7,NA,6.8,29,0,0,0,4.5,0,14.5,44.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Roughshod",1949,88,NA,6.6,32,4.5,0,4.5,0,4.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Roula",1995,97,NA,7.3,20,0,14.5,0,0,4.5,34.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Roulez jeunesse!",1993,116,NA,5.1,6,0,0,0,14.5,45.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Rouli-roulant",1966,16,NA,8.2,7,0,0,0,14.5,0,0,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Round Numbers",1992,98,NA,4,19,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Round Trip to Heaven",1992,97,NA,4.2,65,14.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Round of Golf, A",1931,11,NA,4.8,6,0,0,0,14.5,14.5,0,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Round-Up Time in Texas",1937,63,NA,6.1,25,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Roundabout",2002,16,NA,6.9,16,0,0,4.5,14.5,4.5,14.5,4.5,24.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Rounder, The",1930,20,NA,7,21,4.5,4.5,0,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Rounders",1998,121,12000000,7.2,13621,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Rounders, The",1914,16,NA,6.2,96,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Rounders, The",1965,85,NA,6,184,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Roustabout",1964,101,NA,5.1,316,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"PG",0,0,0,0,0,1,0 -"Route 181: Fragments of a Journey in Palestine-Israel",2004,270,NA,5.9,28,24.5,4.5,0,0,0,0,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Route 666",2001,86,2300000,4,487,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Route 66: Ein amerikanischer Albtraum",2004,104,NA,7,20,0,0,4.5,4.5,24.5,4.5,24.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Route One USA",1989,240,NA,6.4,22,0,0,0,4.5,0,14.5,4.5,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Route de Corinthe, La",1967,90,NA,5.4,27,4.5,0,4.5,4.5,34.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Routemaster",2000,16,NA,8.3,6,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Routine, La",2004,5,NA,7,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,1,0,0,0,0,1 -"Routine, The",2002,5,NA,7,9,14.5,0,0,0,0,14.5,0,24.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Rouz-Karnameh",2003,92,NA,2.6,5,44.5,44.5,0,0,0,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Rovaniemen markkinoilla",1951,79,NA,5.6,34,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Rover Dangerfield",1991,74,NA,5.2,187,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Rover's Rival",1937,7,NA,6.6,6,0,0,0,0,0,34.5,14.5,45.5,0,0,"",0,1,1,0,0,0,1 -"Rovin' Tumbleweeds",1939,62,NA,5.5,12,0,0,14.5,0,24.5,24.5,0,4.5,24.5,0,"",0,0,0,0,0,0,0 -"Row Your Boat",2000,106,NA,4.8,82,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Rowan & Martin at the Movies",1968,11,NA,5.6,29,4.5,4.5,14.5,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,1,0,1 -"Rowdy Ann",1919,21,NA,6.8,15,0,0,0,4.5,4.5,24.5,24.5,34.5,0,4.5,"",0,0,1,0,0,0,1 -"Rowdy Girls, The",2000,90,NA,3.6,86,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,1,0 -"Rowdyman, The",1972,95,NA,6.7,41,4.5,4.5,4.5,0,0,4.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Rowing Through",1996,116,NA,5.8,29,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Rowlandson's England",1955,11,NA,7.4,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,0,0,0,1,0,1 -"Roxanna",1970,51,NA,3.7,19,14.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Roxanne",1987,107,NA,6.8,7414,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Roxie Hart",1942,75,NA,6.7,175,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Roy",2000,11,500000,6.9,15,4.5,0,4.5,0,0,14.5,4.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Roy Cohn/Jack Smith",1994,90,NA,3.4,11,14.5,0,0,24.5,0,4.5,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Roy Colt e Winchester Jack",1970,86,NA,3.6,26,14.5,14.5,14.5,14.5,4.5,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Royal Academy, The",2004,60,NA,7.8,6,0,0,14.5,0,0,0,0,34.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Royal Bed, The",1931,75,NA,4.1,6,0,0,14.5,14.5,14.5,0,45.5,0,0,0,"",0,0,1,0,0,0,0 -"Royal Blues",1997,52,NA,6.4,27,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Royal Bonbon",2002,85,NA,5.6,19,0,0,0,14.5,4.5,24.5,24.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Royal Cat Nap",1958,7,NA,5.8,26,0,4.5,4.5,0,4.5,24.5,34.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Royal Family of Broadway, The",1930,82,NA,6,32,0,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Royal Flash",1975,102,NA,6.2,264,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Royal Four-Flusher, The",1947,7,NA,7,11,0,0,0,0,4.5,24.5,34.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Royal Hunt of the Sun, The",1969,118,NA,6,92,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Royal Rodeo, The",1939,15,NA,5.4,17,4.5,0,0,14.5,24.5,4.5,44.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Royal Scandal, A",1945,94,NA,6.7,56,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Royal Tenenbaums, The",2001,111,21000000,7.6,31227,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Royal Wedding",1951,93,1590920,6.6,545,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Roz gatos, O",1986,98,NA,7.7,23,0,4.5,0,0,0,14.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Rozbijemy zabawe...",1957,8,NA,6,104,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Rozhdestvo obitatelei lesa",1913,7,NA,7.2,15,0,0,0,0,4.5,44.5,24.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Rozmowa z czlowiekiem z szafy",1993,90,NA,6.6,5,0,0,0,0,24.5,0,84.5,0,0,0,"",0,0,0,0,0,0,0 -"Rozmowy kontrolowane",1991,93,NA,7.9,76,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Rozygrysh",1976,96,NA,8.2,9,0,0,0,0,0,0,34.5,0,24.5,44.5,"",0,0,0,0,0,1,0 -"Ruang rak noi nid mahasan",2003,112,NA,7.9,749,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,1,0 -"Ruang talok 69",1999,115,NA,7.1,267,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",1,0,1,0,0,0,0 -"Rub & Tug",2002,90,NA,5,234,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Ruba al prossimo tuo",1969,110,NA,4.3,34,14.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Rubber Gloves",1999,7,NA,4.6,18,0,0,4.5,14.5,4.5,0,14.5,0,24.5,34.5,"",0,0,0,0,0,0,1 -"Rubber Gun, The",1977,86,NA,4.5,9,14.5,24.5,14.5,0,0,14.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Ruben",1999,6,NA,4.9,6,0,0,0,34.5,0,34.5,14.5,0,0,14.5,"",0,0,1,1,0,0,1 -"Rubia de Kennedy, La",1995,96,NA,5,5,44.5,0,0,0,0,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Rubin and Ed",1991,82,NA,7.2,422,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Rubios, Los",2003,89,NA,5.7,49,14.5,4.5,4.5,0,14.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Ruby",1977,85,NA,4.2,61,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ruby",1992,111,NA,5.3,325,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ruby Cairo",1993,90,NA,4.2,376,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ruby Gentry",1952,82,NA,6.6,173,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ruby and Rata",1990,111,NA,4.8,19,0,4.5,4.5,24.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Ruby in Paradise",1993,114,800000,7,827,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ruckus",1982,93,NA,5.2,104,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Rudaali",1993,128,NA,3.3,24,4.5,4.5,0,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Rude",1995,89,NA,5.4,76,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Rude Awakening",1989,100,NA,4.4,218,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rude Boy",1980,133,NA,6.3,200,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rude Boy: The Jamaican Don",2003,90,NA,2.8,23,24.5,0,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Rudi, benimm dich",1971,88,NA,2.9,19,24.5,34.5,14.5,14.5,4.5,4.5,4.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Rudolph Valentino and His 88 American Beauties",1923,13,0,4.1,9,14.5,14.5,14.5,0,14.5,14.5,14.5,24.5,0,14.5,"",0,0,0,0,1,0,1 -"Rudolph the Red-Nosed Reindeer",1948,8,NA,6.5,51,0,14.5,0,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Rudra Veena",1988,170,NA,9,12,4.5,0,0,0,0,0,0,4.5,4.5,74.5,"",0,0,0,0,0,0,0 -"Rudy",1993,116,NA,7.2,6251,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Rudy Blue",1999,97,NA,7.1,9,0,0,0,0,0,14.5,34.5,24.5,24.5,14.5,"R",0,0,0,0,0,0,0 -"Rudy Vallee Melodies",1932,11,NA,6.1,13,0,0,0,0,44.5,34.5,4.5,4.5,4.5,0,"",0,1,0,0,0,0,1 -"Rudyland",2001,52,NA,6.3,12,24.5,0,0,0,4.5,24.5,24.5,14.5,0,0,"",0,0,0,0,1,0,0 -"Rue barbare",1984,107,NA,5.4,57,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rue de l'estrapade",1953,97,NA,7.1,35,0,0,4.5,0,4.5,24.5,44.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Rue des Prairies",1959,87,NA,5.6,10,0,0,0,0,34.5,24.5,24.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Rue des plaisirs",2002,91,NA,5.7,171,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Rue haute",1976,94,NA,8.7,6,0,0,0,0,34.5,0,0,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Ruffian, Le",1983,108,NA,6.3,139,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Rufus",1975,90,NA,5.7,11,0,0,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rufus Jones for President",1933,21,NA,6.2,24,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Rugantino",1973,110,NA,5,5,0,0,0,24.5,44.5,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Rugged Bear",1953,6,NA,8,29,0,0,0,0,4.5,0,24.5,34.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Ruggles of Red Gap",1935,90,NA,8.1,319,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Rugrats Go Wild!",2003,81,25000000,4.8,423,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG",0,1,1,0,0,0,0 -"Rugrats Movie, The",1998,79,28000000,5.4,1455,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Rugrats in Paris: The Movie - Rugrats II",2000,78,30000000,5.7,755,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Ruka",1965,18,NA,8.7,39,4.5,4.5,0,0,0,4.5,14.5,14.5,24.5,44.5,"",0,1,1,0,0,0,1 -"Ruki vverkh!",1982,67,NA,4.6,7,44.5,0,0,0,0,14.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Rule No. 3",1993,90,NA,4.4,8,24.5,14.5,0,0,24.5,14.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Rulers of the Sea",1939,96,NA,6.6,17,0,0,4.5,0,14.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Rules (For Men), The",1999,90,NA,4.8,5,44.5,24.5,0,0,0,0,0,0,0,44.5,"R",0,0,0,0,0,0,0 -"Rules of Attraction, The",2002,110,4000000,6.7,8552,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Rules of Engagement",2000,128,60000000,6.3,7903,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Rules of the Game",2003,11,NA,5.4,8,24.5,0,24.5,0,14.5,0,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Rules, The",2004,29,20000,8.9,9,0,14.5,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,0,0,1 -"Ruleta",1999,11,NA,5.7,20,14.5,0,0,0,14.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Ruling Class, The",1972,154,NA,7.4,866,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ruling Voice, The",1931,72,NA,5.3,21,0,0,4.5,4.5,14.5,44.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Rum 703",2002,28,NA,5.4,6,0,0,0,14.5,0,34.5,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Rum and Coke",1999,93,NA,4.5,16,14.5,0,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Ruma Elsa",1949,73,NA,7,7,0,0,0,0,0,14.5,74.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Rumba",1935,71,NA,5.8,8,14.5,0,0,14.5,14.5,24.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Rumba, La",1987,95,NA,3.4,12,0,14.5,14.5,0,14.5,14.5,4.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Rumble",2002,55,NA,8.1,23,0,0,0,0,0,14.5,4.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Rumble Fish",1983,94,10000000,6.8,3354,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rumble in the Jungle, The",1974,80,NA,8.5,26,0,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Rumble in the Streets",1996,74,NA,3.6,5,44.5,0,24.5,0,0,24.5,24.5,0,0,0,"R",0,0,0,1,0,0,0 -"Rumburak",1984,90,NA,6.5,24,0,0,4.5,4.5,4.5,14.5,45.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Rumeurs",2003,6,NA,6.4,10,0,0,0,0,14.5,24.5,45.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Rumi: Poet of the Heart",1998,58,NA,6.1,5,0,0,0,0,0,24.5,24.5,0,0,64.5,"",0,0,0,0,1,0,0 -"Rumor of Angels, A",2000,105,NA,6.6,255,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Rumori di fondo",1996,73,NA,6.3,7,14.5,0,0,0,0,44.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Rumors",1943,4,NA,7.5,10,0,0,0,0,24.5,14.5,24.5,44.5,0,14.5,"",0,1,0,0,0,0,1 -"Rumpelstiltskin",1996,87,3000000,3,265,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Rumpelstilzchen",1955,82,NA,5.5,20,14.5,0,14.5,14.5,24.5,34.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Rumpus in the Harem",1956,16,NA,5.8,33,24.5,14.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Run",1991,91,NA,5.3,459,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Run",2002,180,NA,4.9,11,0,0,4.5,0,14.5,14.5,24.5,4.5,0,14.5,"",1,0,1,1,0,0,0 -"Run Away",1995,106,NA,3.7,9,24.5,14.5,14.5,0,34.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Run Chrissie Run!",1984,90,NA,3.9,7,0,14.5,0,24.5,0,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Run Home Slow",1965,75,NA,6.5,14,4.5,4.5,0,4.5,0,4.5,24.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Run Leia Run",2003,16,0,5.5,32,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",1,1,1,0,0,0,1 -"Run Like a Thief",1968,91,NA,4.9,7,14.5,0,14.5,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Run Ronnie Run",2002,100,NA,6.3,977,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Run Silent Run Deep",1958,88,NA,7.3,1193,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Run Wild, Run Free",1969,100,NA,5.6,63,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Run for Cover",1955,93,NA,6.4,123,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Run for Your Money, A",1949,83,NA,6.7,53,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Run for the Money",2002,116,NA,4.6,610,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Run for the Roses",1977,93,NA,4.8,50,24.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Run for the Sun",1956,99,NA,6,111,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Run of the Arrow",1957,86,NA,6.5,195,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Run of the Country, The",1995,109,NA,5.8,145,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Run, Angel, Run",1969,95,96000,5.4,28,0,14.5,4.5,14.5,24.5,4.5,24.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Run, Appaloosa, Run",1966,47,NA,7.3,8,0,0,0,0,0,24.5,14.5,45.5,0,14.5,"",0,0,0,1,0,0,0 -"Run, Girl, Run",1928,20,NA,6.3,8,0,0,0,14.5,14.5,24.5,24.5,0,14.5,14.5,"",0,0,1,0,0,0,1 -"Run, Run, Sweet Road Runner",1965,6,NA,5.5,16,0,4.5,14.5,14.5,0,14.5,34.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Runaround, The",1946,86,NA,6.6,13,0,0,0,0,4.5,34.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Runaway",1984,100,NA,5.6,1308,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Runaway Brain",1995,7,NA,7.3,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Runaway Bride",1999,116,70000000,5.4,12624,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,1,0 -"Runaway Bride, The",1930,69,NA,3.6,15,4.5,4.5,24.5,24.5,4.5,24.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Runaway Bus, The",1954,74,NA,6.6,34,0,0,0,0,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Runaway Daughters",1956,92,NA,3.8,15,4.5,4.5,24.5,24.5,24.5,4.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Runaway Divas",2004,98,NA,6.9,8,24.5,0,14.5,0,0,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Runaway Dreams",1989,92,NA,6.2,5,24.5,0,0,0,24.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Runaway Jury",2003,127,60000000,7.1,10761,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Runaway Nightmare",1982,105,NA,4.8,6,0,45.5,0,0,0,14.5,14.5,0,0,14.5,"",1,0,1,0,0,0,0 -"Runaway Railway",1965,55,NA,4.5,5,0,0,0,24.5,0,64.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Runaway Train",1985,111,NA,7,3251,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Rundown, The",2003,104,85000000,6.5,8067,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Runestone, The",1990,105,NA,4.4,115,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Runner Stumbles, The",1979,109,NA,4.4,49,14.5,4.5,4.5,14.5,4.5,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Runner, The",1999,94,NA,5.7,328,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Runners",1983,107,NA,5,19,0,4.5,0,24.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Runnin' Kind, The",1989,105,NA,3.2,26,4.5,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Running",1979,102,NA,5.4,104,4.5,4.5,14.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Running Around San Francisco for an Education",1938,2,NA,5,15,0,0,14.5,4.5,34.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Running Blind",1979,50,NA,7.7,10,0,0,0,0,0,0,14.5,14.5,34.5,45.5,"",0,0,0,0,0,0,0 -"Running Brave",1983,106,8000000,6.1,156,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Running Fence",1978,58,NA,8.4,14,0,0,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Running Free",1994,91,NA,5.5,9,44.5,0,0,0,0,44.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Running Free",1999,81,NA,4.6,91,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Running From the Guns",1987,87,NA,4.9,5,0,24.5,0,0,24.5,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Running Hollywood",1932,20,NA,3.5,8,24.5,14.5,0,24.5,0,24.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Running Hot",1984,95,NA,4.9,23,14.5,14.5,4.5,0,4.5,4.5,14.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Running Jumping & Standing Still Film, The",1959,11,NA,7.3,78,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Running Man, The",1963,103,NA,6.2,95,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Running Man, The",1987,101,27000000,6.2,11847,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Running Mates",1985,78,NA,3.7,11,4.5,24.5,0,34.5,14.5,0,4.5,0,0,0,"",0,0,0,0,0,1,0 -"Running Out",2001,97,50000,7.6,73,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Running Red",1999,92,NA,4.8,91,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Running Scared",1972,98,NA,4.9,12,0,0,4.5,0,0,34.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Running Scared",1980,96,NA,5.5,130,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Running Scared",1986,107,NA,6.1,1676,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Running Target",1956,82,NA,6.8,6,0,0,14.5,0,0,14.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Running Time",1997,70,120000,7,305,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Running Time",2002,7,NA,8.4,13,4.5,0,0,0,14.5,0,0,4.5,0,64.5,"",0,0,0,0,0,0,1 -"Running Wild",1973,103,NA,4.7,9,14.5,0,14.5,14.5,34.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Running Wild",1992,94,NA,5.3,62,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Running Without Sound",2004,10,NA,8.6,9,14.5,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,0,0,0,1,1 -"Running Woman",1998,87,NA,3.3,81,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Running on Empty",1982,83,NA,4.8,37,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Running on Empty",1988,116,NA,7.3,2274,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Running on the Sun: The Badwater 135",2000,100,NA,8,45,4.5,0,0,4.5,4.5,0,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Runoilija ja muusa",1978,105,NA,5.7,7,14.5,0,14.5,0,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Runt Page",1932,10,NA,4.7,6,14.5,0,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Ruo sha",1994,91,NA,5.6,97,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ruoma de shi sui",2002,88,NA,7.5,19,0,0,0,0,4.5,0,14.5,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Rupa u dusi",1994,52,NA,7.6,7,0,0,0,0,0,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Rupan sansei: Arukatorazu konnekushion",2001,90,NA,7.6,7,14.5,0,0,0,0,0,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Rupan sansei: Dead or Alive",1996,95,NA,6.4,41,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",1,1,0,0,0,0,0 -"Rupan sansei: Kariosutoro no shiro",1979,100,NA,7.6,1886,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",1,1,0,0,0,1,0 -"Rupan sansei: Kutabare! Nastradamus",1995,100,NA,5.9,32,4.5,0,4.5,4.5,0,4.5,24.5,24.5,14.5,14.5,"",1,1,1,0,0,0,0 -"Rupan sansei: Mamo karano chousen",1978,100,NA,6.7,101,4.5,0,4.5,0,4.5,4.5,24.5,24.5,4.5,14.5,"",1,1,1,0,0,0,0 -"Rupert and the Frog Song",1985,13,NA,7.9,51,4.5,4.5,0,0,0,4.5,24.5,14.5,4.5,44.5,"",0,1,0,0,0,0,1 -"Rupert's Land",1998,93,NA,6.2,36,14.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Rupture, La",1970,124,NA,7.1,146,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Rural Life in Maine",1930,12,NA,5.8,10,0,0,14.5,14.5,24.5,44.5,0,0,24.5,0,"",0,0,0,0,1,0,1 -"Rurales de Texas, Los",1964,94,NA,3.1,7,0,24.5,0,14.5,45.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Rusa, La",1987,117,NA,4.2,7,0,0,0,24.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Rusalka",1997,10,NA,8.8,9,14.5,0,0,0,0,0,0,24.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Rusalochka",1976,84,NA,7.3,17,0,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Rusar i hans famn",1996,82,NA,4,16,14.5,4.5,4.5,14.5,0,4.5,14.5,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Rusari Abi",1995,85,NA,6,21,4.5,0,14.5,0,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Rush",1983,77,NA,3.2,19,24.5,14.5,24.5,24.5,0,0,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Rush",1991,120,NA,6.4,1294,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Rush Hour",1998,93,35000000,6.7,18336,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Rush Hour 2",2001,86,90000000,6.5,16581,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Rush It",1976,78,NA,5.7,16,0,0,14.5,0,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Rush Night",2004,105,NA,4.4,15,14.5,24.5,0,4.5,14.5,4.5,0,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Rush Week",1989,96,NA,3.8,52,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Rush of the Palms",2001,27,NA,8.8,5,0,0,0,0,24.5,0,0,0,24.5,64.5,"",0,0,0,1,0,0,1 -"Rush to Judgment",1967,98,NA,7.9,19,4.5,0,0,14.5,0,0,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Rushin' Art",1936,10,NA,5.2,9,0,0,0,14.5,45.5,34.5,0,0,0,0,"",0,0,1,0,0,0,1 -"Rushing Roulette",1965,6,NA,5.6,17,0,0,0,14.5,14.5,34.5,24.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Rushmore",1998,93,10000000,7.7,22209,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"R",0,0,1,1,0,1,0 -"Ruslan i Lyudmila",1972,85,NA,7.7,23,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Russia House, The",1990,122,NA,6,2609,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Russian Ark",2002,96,NA,7,2300,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Russian Doll",2001,90,NA,5.9,213,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Russian Holiday",1992,89,NA,3.4,16,14.5,14.5,4.5,24.5,14.5,0,0,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Russian Pizza Blues",1995,93,NA,6.4,108,4.5,0,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Russian Rhapsody",1944,7,NA,8.2,59,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Russian Roulette",1975,93,NA,4.8,42,0,4.5,4.5,14.5,24.5,4.5,14.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Russian Terminator",1990,87,NA,2.5,43,45.5,4.5,4.5,4.5,4.5,4.5,0,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Russians Are Coming, the Russians Are Coming, The",1966,126,NA,6.8,1295,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Russicum - I giorni del diavolo",1989,111,NA,4.3,25,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Russiske sangerinde, Den",1993,119,NA,4.6,28,4.5,0,4.5,4.5,34.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Russkies",1987,99,NA,4.7,241,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Russkiy biznes",1993,78,NA,2.6,13,14.5,34.5,14.5,4.5,4.5,0,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Russkiy bunt",2000,130,NA,6,65,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Russkiy shchyot",1994,77,NA,2.5,9,14.5,24.5,24.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Russkoye chudo",1994,78,NA,2,13,64.5,4.5,4.5,4.5,4.5,0,0,0,4.5,0,"",0,0,1,0,0,0,0 -"Rust Never Sleeps",1979,103,NA,7,152,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Rustin",2001,101,NA,5.7,39,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,34.5,"PG-13",0,0,0,0,0,0,0 -"Rustler's Valley",1937,61,NA,7.9,17,0,0,0,0,4.5,14.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Rustlers",1949,61,NA,5,18,0,24.5,0,0,0,34.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Rustlers of Red Dog",1935,231,NA,6.1,6,0,0,0,0,14.5,34.5,0,14.5,34.5,0,"",0,0,0,0,0,0,0 -"Rustlers' Rhapsody",1985,88,NA,5.7,478,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Rusty Romeos",1957,17,NA,5.7,24,24.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Rusty: A Dog's Tale",1998,90,NA,4.2,34,14.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Ruta natural, La",2004,11,NA,8.9,10,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Rutanga Tapes, The",1990,88,NA,4.7,7,14.5,0,0,0,14.5,0,24.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Rutherford County Line, The",1987,98,NA,3.5,6,0,0,14.5,0,34.5,0,14.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Ruthie and Connie: Every Room in the House",2002,56,NA,5.8,19,14.5,0,0,14.5,0,14.5,14.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Ruthless",1948,104,NA,6.9,75,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ruthless People",1986,93,NA,6.7,4724,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Rutland, USA",2002,100,4000,3.9,15,24.5,0,4.5,0,4.5,4.5,4.5,24.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Ruy Blas",1948,93,NA,6.9,13,0,0,0,34.5,0,0,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Ruz-e vagh'e",1995,105,NA,8.1,7,0,0,0,0,14.5,14.5,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Rx",2004,89,NA,7.6,20,14.5,4.5,0,0,4.5,4.5,0,0,24.5,45.5,"",0,0,0,0,0,1,0 -"Ryan",2004,14,NA,7.9,215,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,1,0,1,0,0,1 -"Ryan's Babe",2000,90,NA,4.1,21,4.5,0,4.5,4.5,4.5,0,0,4.5,0,64.5,"",0,0,0,0,0,0,0 -"Ryan's Daughter",1970,202,15000000,7.4,965,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Ryder P.I.",1986,92,NA,1.9,37,44.5,4.5,4.5,0,4.5,0,4.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Rymdinvasion i Lappland",1959,81,40000,2.9,122,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Ryoma ansatsu",1974,118,NA,8,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Rysopis",1964,76,NA,7.3,20,0,0,0,0,14.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Rythmetic",1956,9,NA,7.9,16,0,0,4.5,0,4.5,14.5,0,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Rzeczpospolita babska",1969,96,NA,5.6,9,0,0,14.5,14.5,14.5,24.5,24.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"S",2001,8,NA,7.1,6,0,0,0,0,14.5,14.5,0,14.5,0,45.5,"",0,0,0,0,0,0,1 -"S Club Seeing Double",2003,91,NA,2.7,209,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"PG-13",0,0,1,1,0,0,0 -"S certy nejsou zerty",1984,95,NA,8.4,62,4.5,0,0,0,0,4.5,4.5,4.5,24.5,45.5,"",0,0,0,0,0,0,0 -"S detza na more",1972,80,NA,9,21,0,0,0,0,0,4.5,0,14.5,4.5,74.5,"",0,0,0,0,0,0,0 -"S lyubimymi ne rasstavaytes",1979,76,NA,7.3,6,0,0,0,14.5,0,14.5,34.5,0,0,34.5,"",0,0,0,1,0,1,0 -"S lyubovyu. Lilya",2003,98,NA,6.5,44,0,0,0,4.5,14.5,14.5,44.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"S' agapo",1971,103,NA,6.7,6,14.5,0,0,0,14.5,0,34.5,0,0,34.5,"",0,0,0,1,0,0,0 -"S'il vous plait",1988,3,NA,5.3,7,0,0,0,14.5,45.5,24.5,0,0,0,0,"",0,0,0,0,0,0,1 -"S*P*Y*S",1974,100,NA,3.4,138,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"S.",1998,96,NA,4.7,79,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"S.C.I.E.N.C.E",2004,96,3000,7.8,8,0,0,0,14.5,0,0,24.5,34.5,0,24.5,"",0,0,1,0,0,1,0 -"S.E.R. - Svoboda eto rai",1989,76,NA,5.6,26,4.5,0,0,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"S.F.W.",1994,96,NA,5.4,1222,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"S.O.B.",1981,122,NA,6,1177,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"S.O.S.",1932,7,NA,6.5,10,0,0,0,14.5,14.5,14.5,24.5,34.5,24.5,0,"",0,1,0,0,0,0,1 -"S.O.S.",1999,90,NA,6.1,67,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"S.O.S. Coast Guard",1937,224,NA,5.8,25,4.5,0,0,0,14.5,34.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"S.O.S. Eisberg",1933,77,NA,3.2,25,34.5,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"S.O.S. Planet",2002,40,NA,6.1,11,14.5,0,0,4.5,24.5,4.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"S.P.C.E.",2002,15,NA,5.9,14,0,4.5,0,0,4.5,34.5,34.5,14.5,0,0,"",0,0,0,1,0,0,1 -"S.P.I.T.: Squeegee Punks in Traffic",2001,80,NA,6.8,15,0,0,0,4.5,0,4.5,34.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"S.P.Q.R. 2000 e 1/2 anni fa",1994,95,NA,2.1,212,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"S.W.A.T.",2003,117,80000000,5.9,12732,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"S1m0ne",2002,117,NA,6.3,7422,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"S:TREAM:S:S:ECTION:S:ECTION:S:S:ECTIONED",1971,42,NA,7,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,0,0,0,1 -"SF Shinseiki Lensman",1984,107,NA,5.6,115,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,1,1,1,0,0,0 -"SF-paraati",1940,86,NA,6.9,9,0,0,14.5,0,14.5,24.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"SF: Episode One",1998,111,NA,7.1,723,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",1,0,1,0,0,0,0 -"SLC Punk!",1999,98,NA,7.1,3748,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"SOPOR",1981,96,NA,5.6,87,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"SOS Pacific",1959,92,NA,5.5,25,0,0,4.5,14.5,14.5,24.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"SS Lager 5 l'inferno delle donne",1977,92,NA,3.8,19,24.5,0,4.5,4.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"SSSSSSS",1973,99,1300000,4.4,383,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"SV - Spalnyy vagon",1989,93,NA,6.8,5,0,0,0,0,0,64.5,24.5,0,24.5,0,"",0,0,0,0,0,1,0 -"SW 2.5 (The Pitch Wars)",2003,17,NA,8.5,17,4.5,4.5,0,0,0,0,0,24.5,4.5,45.5,"",0,1,1,0,0,0,1 -"Sa pusod ng dagat",1998,114,NA,7.6,16,14.5,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Saadia",1953,82,1250000,4.6,8,0,0,14.5,14.5,14.5,14.5,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Saagar",1985,186,NA,7.4,37,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Saamy",2003,140,NA,7.6,11,0,0,0,4.5,14.5,0,0,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Saan chuen liu shut",1999,85,NA,4.2,16,4.5,0,24.5,14.5,34.5,4.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Saan chuen liu shut II: Sik ji nyn gwai",2000,81,NA,5.8,8,0,0,0,0,45.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Saanjhbatir Roopkathara",2002,120,NA,8.7,12,0,0,0,0,4.5,4.5,0,4.5,44.5,34.5,"",0,0,0,1,0,0,0 -"Saaraba",1988,90,NA,6.3,7,0,0,0,0,0,45.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Saaransh",1984,137,NA,7.9,28,4.5,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Saat Hindustani",1969,144,NA,7.6,11,0,0,4.5,4.5,0,4.5,4.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Saathiya",2002,138,NA,7.2,171,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Saaz",1997,29,NA,7.1,11,0,4.5,0,0,0,14.5,0,24.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Sababa",1983,90,NA,4.5,35,24.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sabaka",1954,77,NA,3.7,7,0,24.5,24.5,14.5,0,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Sabirni centar",1989,98,NA,7.9,76,0,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Sabishinbou",1985,112,NA,8.5,14,0,0,0,4.5,0,0,0,34.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Sabor de la venganza, El",1963,97,NA,5.4,10,0,0,0,24.5,34.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Sabotage",1936,76,NA,7.3,1452,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sabotage",1996,99,NA,5.8,272,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Sabotage Agent",1943,103,NA,6.7,73,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sabotage!",2000,97,NA,5.6,36,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Saboteur",1942,108,NA,7.3,1952,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Sabotier du Val de Loire, Le",1955,26,NA,7,13,4.5,0,0,0,14.5,0,24.5,44.5,0,4.5,"",0,0,0,1,1,0,1 -"Sabre Jet",1953,90,NA,6,14,14.5,0,0,0,24.5,34.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Sabretooth",2002,90,NA,3,277,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Sabrina",1954,113,2238813,7.6,5933,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Sabrina",1995,127,58000000,6.1,7547,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",0,0,1,1,0,1,0 -"Sabu and the Magic Ring",1957,61,NA,5.3,15,0,4.5,0,4.5,24.5,44.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Sac de noeuds",1985,90,NA,5.4,34,0,0,4.5,4.5,14.5,24.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Sacco bello, Un",1980,99,NA,7.2,135,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Sacco e Vanzetti",1971,120,NA,7.3,188,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sacerdote, El",1979,109,NA,5.9,18,14.5,0,4.5,0,0,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sachcha Jhutha",1970,143,NA,5.5,11,0,0,0,4.5,14.5,4.5,4.5,34.5,0,14.5,"",1,0,1,1,0,0,0 -"Sache der Natur, Eine",1999,20,NA,6.6,5,0,0,0,44.5,0,0,24.5,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Saci, O",1951,65,NA,6.1,5,0,0,0,0,24.5,44.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Sacra Corona",2001,200,NA,3.8,52,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Sacrament, Het",1990,90,NA,6.3,48,14.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Sacre du printemps, Le",2004,38,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Sacred Flesh",2000,75,NA,3.9,37,24.5,14.5,14.5,4.5,14.5,0,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sacred Ground",1983,100,NA,5.8,24,4.5,4.5,4.5,0,4.5,24.5,14.5,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Sacred Hearts",1985,95,NA,6.1,6,14.5,0,0,0,0,14.5,34.5,0,34.5,0,"",0,0,1,1,0,0,0 -"Sacred Is the Flesh",2001,94,300000,9.4,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,0,0,0,0,0 -"Sacred Planet",2004,47,NA,5.6,13,0,0,14.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Sacrifice",1999,90,NA,5.6,21,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Sacrifice, The",2003,20,NA,6.2,6,14.5,0,14.5,0,0,0,34.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Sad Sack, The",1957,98,NA,5.3,89,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sad Song of Yellow Skin",1970,59,NA,7.9,6,0,0,0,0,0,14.5,14.5,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Sada",1998,132,NA,6.3,36,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sadae solimsa",1984,90,NA,6.4,7,14.5,0,0,0,14.5,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Saddest Music in the World, The",2003,99,NA,7.1,990,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Saddle Buster, The",1932,59,38000,4.7,15,0,4.5,4.5,24.5,4.5,34.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Saddle Legion",1951,60,NA,6.5,9,0,0,0,0,14.5,34.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Saddle Pals",1947,72,NA,5.9,6,0,0,0,14.5,34.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Saddle Silly",1941,7,NA,7.4,8,0,0,0,0,14.5,34.5,14.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Saddle Tramp",1950,90,NA,6.5,24,0,0,4.5,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Saddle the Wind",1958,84,NA,6.2,84,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Saddlemates",1941,56,NA,6.5,6,0,0,14.5,14.5,14.5,0,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Sade",2000,106,NA,6.4,390,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sadie McKee",1934,93,NA,6.6,89,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Sadie Thompson",1928,97,NA,7.5,101,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sadiyata",1986,89,NA,6.7,7,0,0,0,0,0,14.5,14.5,14.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Sadko",1953,79,NA,4.4,88,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sadness",1999,52,NA,5.6,7,14.5,0,14.5,14.5,0,0,14.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Sadness of Johnson Joe Jangles, The",2004,19,NA,6.5,7,0,0,14.5,0,0,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,1 -"Sadness of Sex, The",1995,87,NA,4.7,35,24.5,14.5,4.5,4.5,0,4.5,14.5,4.5,0,34.5,"",0,0,1,0,0,1,0 -"Sado",1978,102,NA,8.3,9,0,0,0,0,0,0,14.5,44.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Sae sang bakuro",1994,100,NA,4.9,22,4.5,0,0,4.5,24.5,24.5,34.5,4.5,4.5,0,"",0,0,1,1,0,0,0 -"Saekjeuk shigong",2002,96,NA,6.5,377,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Saenggwabu uijaryo cheonggu sosong",1998,116,NA,5.4,7,24.5,0,0,14.5,0,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Saenghwalui balgyeon",2002,115,NA,7.4,163,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Safar",1994,84,NA,6.7,6,0,0,0,14.5,14.5,0,45.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Safar barlek",1966,115,NA,9.8,14,0,0,0,0,0,0,0,4.5,4.5,84.5,"",0,0,0,1,0,0,0 -"Safar e Ghandehar",2001,81,NA,6.6,1429,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Safari",1956,90,NA,5.6,26,4.5,4.5,0,4.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Safari 3000",1982,92,NA,3.6,58,4.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Safari Drums",1953,71,NA,5.8,7,14.5,0,0,0,44.5,0,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Safe",1995,119,NA,6.9,1510,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Safe Journey",1999,15,NA,6.2,11,4.5,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Safe Men",1998,88,1000000,6.1,590,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Safe Passage",1994,98,NA,5.9,369,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Safe Place, A",1971,94,NA,5.1,49,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Safe Sex",1999,100,NA,6,332,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Safe at Home!",1962,84,NA,3.5,75,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Safe in Hell",1931,73,NA,6.6,49,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Safecracker, The",1958,96,NA,5.6,41,0,0,4.5,4.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Safer",1999,13,NA,4.8,9,0,0,0,14.5,0,24.5,34.5,0,14.5,24.5,"",0,0,0,1,0,0,1 -"Safety Last!",1923,70,NA,8.2,757,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",1,0,1,0,0,1,0 -"Safety Second",1950,7,NA,6.8,27,0,4.5,0,4.5,14.5,4.5,34.5,34.5,0,4.5,"",0,1,1,0,0,0,1 -"Safety in Numbers",1930,80,NA,6.2,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Safety of Objects, The",2001,116,NA,6.6,875,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Saffo, venere di Lesbo",1960,105,NA,5.7,11,4.5,0,0,4.5,14.5,34.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Saga of Death Valley",1939,55,NA,7.8,9,14.5,0,0,0,0,44.5,0,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Saga of Hemp Brown, The",1958,80,NA,5.1,12,0,0,24.5,4.5,14.5,4.5,24.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Saga of Windwagon Smith, The",1961,13,NA,7,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Saga of the Viking Women and Their Voyage to the Waters of the Great Sea Serpent, The",1957,66,65000,2.5,144,34.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Sagara Sangamam",1983,160,NA,9.5,47,4.5,0,0,0,0,0,4.5,4.5,4.5,84.5,"",0,0,0,1,0,1,0 -"Sagarika",1956,152,NA,5.1,10,14.5,0,0,0,14.5,0,14.5,14.5,0,64.5,"",0,0,0,0,0,0,0 -"Sagebrush Trail",1933,54,NA,4.5,96,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sagebrush Troubadour",1935,58,NA,6.9,6,0,0,14.5,0,0,0,14.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Saginaw Trail",1953,56,NA,4.6,7,0,14.5,14.5,0,24.5,0,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Sagitario",2001,109,NA,5.8,14,14.5,0,0,4.5,4.5,24.5,34.5,4.5,0,0,"",0,0,1,1,0,0,0 -"Sagkoshi",2001,135,NA,8.5,58,4.5,4.5,0,4.5,0,4.5,4.5,14.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Sagojoga minister",1997,85,NA,4.9,27,0,0,0,24.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Sagolandet",1988,177,NA,6.5,34,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Sahara",1943,97,NA,7.4,815,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sahara",1983,111,25000000,3.5,157,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sahara",2005,124,130000000,5.8,3004,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Sahara Hare",1955,7,NA,7.7,51,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Sahara Marathon",2004,55,NA,7.8,11,4.5,0,0,0,0,4.5,4.5,4.5,45.5,4.5,"",0,0,0,0,1,0,0 -"Sahib Bibi Aur Ghulam",1962,152,NA,9,76,4.5,0,4.5,4.5,0,4.5,4.5,4.5,4.5,74.5,"",0,0,1,1,0,1,0 -"Sahkanim",1995,92,NA,7.1,8,0,0,14.5,0,0,0,45.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Sai da Frente",1952,80,NA,7.9,8,0,0,0,0,0,14.5,34.5,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Saigon",1948,93,NA,5.3,23,0,4.5,4.5,14.5,4.5,24.5,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Saigon Baby",1995,91,NA,6.2,14,0,0,0,14.5,14.5,24.5,0,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Saikaku ichidai onna",1952,133,NA,8.4,352,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Sail a Crooked Ship",1961,88,NA,6,23,0,0,0,0,14.5,34.5,34.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Sailing Along",1938,97,NA,6.3,15,0,0,0,0,14.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Sailor Beware",1952,108,NA,5.6,164,4.5,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sailor Beware",1956,81,NA,5.2,29,0,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sailor Takes a Wife, The",1945,92,NA,5.8,31,0,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sailor Who Fell from Grace with the Sea, The",1976,105,NA,5.6,233,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sailor from Gibraltar, The",1967,88,NA,5,38,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Sailor in the Wild",1983,100,NA,9.5,14,0,0,0,0,4.5,4.5,0,4.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Sailor's Luck",1933,64,NA,5.5,5,0,24.5,0,0,0,0,0,44.5,44.5,0,"",0,0,1,0,0,0,0 -"Sailor-Made Man, A",1921,47,NA,7.2,66,4.5,0,4.5,0,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sailor-fuku to kikanju",1981,131,NA,6.1,14,0,0,0,0,14.5,14.5,24.5,34.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Sailors Don't Cry",1988,90,NA,4.6,11,0,0,4.5,14.5,4.5,4.5,14.5,0,14.5,14.5,"",0,0,0,1,0,1,0 -"Sailors Three",1940,77,NA,6,9,0,14.5,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Saimin",1999,110,NA,6,151,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Saimir",2004,88,NA,6.6,11,0,0,0,0,4.5,14.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Saimt el Qusur",1994,120,NA,7.7,160,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Saint",1996,10,NA,7.1,67,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Saint Ange",2004,98,NA,5.6,80,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Saint Inspector, The",1996,5,NA,8.1,10,0,0,0,0,0,0,14.5,45.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Saint Jack",1979,112,NA,6.5,222,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Saint Joan",1957,110,NA,5.8,90,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Saint Jude",2000,90,NA,6.3,31,4.5,0,4.5,4.5,4.5,34.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Saint Meets the Tiger, The",1941,70,NA,6,29,0,0,4.5,4.5,14.5,24.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Saint Monica",2002,82,NA,6.4,33,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Saint Ralph",2004,98,NA,7.8,82,4.5,0,0,4.5,4.5,4.5,4.5,34.5,24.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Saint Strikes Back, The",1939,64,NA,6.4,55,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Saint Takes Over, The",1940,69,NA,6.9,40,0,0,0,0,4.5,24.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Saint in London, The",1939,72,NA,6.2,57,4.5,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Saint in New York, The",1938,72,NA,6.7,71,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Saint in Palm Springs, The",1941,66,NA,5.9,38,0,4.5,4.5,0,24.5,34.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Saint of Fort Washington, The",1993,103,NA,6.5,433,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Saint's Double Trouble, The",1940,67,NA,5.9,78,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Saint's Vacation, The",1941,61,NA,5.2,33,0,0,4.5,14.5,34.5,24.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Saint, The",1997,116,70000000,5.7,12591,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,1,0 -"Saint-Cyr",2000,122,NA,6.3,236,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Saint-Ex",1996,82,NA,4.9,29,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"PG",0,0,0,1,0,0,0 -"Sainted Sisters, The",1948,89,NA,6.1,6,0,0,0,14.5,0,14.5,34.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Saints and Sinners",1949,85,NA,7,8,24.5,0,0,0,24.5,0,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Saints and Sinners",1994,100,NA,5.5,45,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Saints and Sinners",2004,80,NA,7.7,18,4.5,14.5,0,0,0,4.5,14.5,0,24.5,34.5,"",0,0,0,0,1,0,0 -"Saints and Soldiers",2003,90,780000,6.9,689,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"PG-13",1,0,0,1,0,0,0 -"Saison des hommes, La",2000,124,NA,6.4,96,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Saisons du plaisir, Les",1988,88,NA,4.9,35,0,14.5,0,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Sait-on jamais...",1957,96,NA,5.6,16,14.5,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Saiyu-ki",1960,84,NA,4.4,46,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Sakana kara daiokishin!!",1992,121,NA,7.3,6,0,0,0,0,0,45.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Sakay",1993,90,NA,8.6,7,0,0,0,0,0,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Sakura no sono",1990,96,NA,9.4,22,14.5,0,0,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Sal de la vida, La",1996,95,NA,5.2,5,44.5,0,0,0,0,24.5,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Sal gorda",1984,96,NA,4.5,15,0,0,14.5,14.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Salaam Bombay!",1988,112,NA,7.9,808,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Salaam Cinema",1995,75,NA,7.5,127,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,1,0,0 -"Salaire de la peur, Le",1953,148,NA,8.2,2820,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Salam",1999,28,NA,7.5,7,0,0,0,24.5,0,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Salamandre, La",1971,125,NA,7,71,0,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Salaryman 6",2002,17,NA,8.4,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Salas u Malom Ritu",1976,126,NA,7.3,12,0,0,0,0,0,4.5,44.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sale battars",1998,24,NA,6.3,15,0,0,0,0,14.5,0,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Sale comme un ange",1991,102,NA,6.6,13,4.5,0,0,0,24.5,0,34.5,34.5,0,0,"",0,0,0,1,0,1,0 -"Sale gosse",1995,90,NA,5.4,5,0,0,0,24.5,0,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Sale temps pour les mouches",1966,89,NA,2.8,12,24.5,0,14.5,24.5,4.5,4.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Salesman",1969,85,NA,8.1,358,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Salim Langde Pe Mat Ro",1989,111,NA,8.5,6,0,0,0,0,0,14.5,0,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Salinnabileul ggotneun yeoja",1978,110,NA,8.5,8,0,0,0,0,0,0,0,45.5,0,45.5,"",0,0,0,0,0,0,0 -"Salinui chueok",2003,127,NA,8,1139,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Salivation Army, The",2002,22,NA,7.1,5,0,24.5,0,0,0,0,64.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Salka Valka",1954,132,NA,6.4,7,0,0,0,14.5,44.5,0,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Salkim hanimin taneleri",1999,120,NA,6.4,90,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Salla, La",1996,8,NA,7.4,46,4.5,0,0,0,14.5,14.5,4.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Sallah Shabati",1964,110,NA,6.4,87,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Sally",1929,103,NA,7,38,0,0,0,4.5,4.5,4.5,44.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sally",2000,79,NA,4.8,62,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Sally Swing",1938,7,NA,4.9,9,0,0,14.5,0,45.5,14.5,0,0,0,24.5,"",0,1,0,0,0,0,1 -"Sally and Angela",2001,12,5000,6.5,14,0,0,14.5,4.5,0,24.5,34.5,4.5,0,14.5,"",1,0,1,0,0,0,1 -"Sally and Saint Anne",1952,90,NA,6.8,26,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Sally och friheten",1981,102,NA,7.1,10,0,0,24.5,0,0,34.5,0,44.5,0,14.5,"",0,0,0,0,0,0,0 -"Sally of the Sawdust",1925,104,NA,7.2,70,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Sally, Irene and Mary",1925,58,NA,7.8,10,0,0,0,0,0,14.5,14.5,24.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Sally, Irene and Mary",1938,86,NA,6.1,5,0,0,0,0,24.5,44.5,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Salmonberries",1991,95,NA,6,210,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Salome",1953,103,NA,5.4,146,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Salome",1973,18,NA,4.6,72,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Salome",1986,105,NA,3.2,13,14.5,14.5,14.5,4.5,0,0,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Salome's Last Dance",1988,89,NA,6,260,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Salome, Where She Danced",1945,90,NA,4.9,33,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Salon Kitty",1976,110,NA,4.7,234,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Salsa",1988,98,NA,4.1,175,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Salsa",2000,100,NA,6,134,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Salsa rosa",1992,86,NA,4.9,56,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Salt",2003,86,NA,7.1,43,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Salt Lake Raiders",1950,60,NA,5.8,9,14.5,0,14.5,0,34.5,24.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Salt Water Daffy",1933,21,NA,6.3,9,0,0,0,0,14.5,24.5,44.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Salt Water Moose",1996,93,NA,6.5,75,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Salt Water Tabby",1947,7,NA,7.1,39,0,0,0,0,4.5,4.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Salt of the Earth",1954,94,NA,7.8,356,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Salt on Our Skin",1992,110,NA,5.5,227,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Salteadores, Os",1993,14,NA,7.9,9,0,0,0,0,0,0,34.5,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Saltimbank",2003,92,NA,2.8,19,24.5,0,14.5,4.5,4.5,14.5,14.5,24.5,0,4.5,"",0,0,1,1,0,0,0 -"Salto",1965,104,NA,5.9,19,0,0,4.5,0,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Salto nel vuoto",1980,120,NA,5.8,19,0,4.5,4.5,0,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Salto, salmiakk og kaffe",2004,106,NA,6.3,31,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Salton Sea, The",2002,107,18000000,7.2,5070,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Saltwater",2000,97,NA,5.9,81,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Salty",1975,90,NA,4.9,9,0,0,0,24.5,14.5,34.5,0,14.5,0,24.5,"",0,0,1,1,0,0,0 -"Salty O'Rourke",1945,100,NA,6.5,25,0,14.5,0,14.5,0,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Saludos Amigos",1942,43,NA,6.4,213,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Salut Victor",1989,83,NA,7.2,14,14.5,0,0,0,0,4.5,14.5,45.5,0,4.5,"",0,0,0,1,0,0,0 -"Salut cousin!",1996,97,NA,7.2,98,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Salut l'artiste",1973,96,NA,6.1,21,4.5,0,0,0,24.5,4.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Salut les cubains",1963,30,NA,4.7,7,14.5,0,0,0,14.5,0,14.5,44.5,0,14.5,"",0,0,0,0,0,0,1 -"Salute",1929,84,NA,4.1,35,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Salute to the Marines",1943,101,NA,6.9,35,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Salvador",1986,123,4500000,7.4,2568,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Salvador Allende",2004,100,NA,7.6,61,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Salvajes",2001,98,NA,6.9,69,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Salvation",2002,20,NA,4.9,13,14.5,0,0,4.5,0,0,4.5,0,14.5,45.5,"",0,0,0,1,0,0,1 -"Salvation!",1987,80,NA,4,32,4.5,4.5,4.5,34.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Salvatore Giuliano",1962,125,NA,7.8,147,0,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Salzburg Connection, The",1972,93,NA,4.8,37,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sam & Janet",2002,90,NA,3.7,79,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"PG-13",0,0,1,1,0,1,0 -"Sam & Joe",2003,93,NA,7.4,7,14.5,14.5,0,0,0,14.5,0,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Sam & Me",1991,94,NA,7.1,21,4.5,4.5,4.5,4.5,0,14.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Sam Fooi",1999,50,NA,6.9,27,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sam Whiskey",1969,96,NA,5.5,99,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Sam and Mike",1999,30,NA,8.5,6,0,0,0,0,0,34.5,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Sam suffit",1992,91,NA,6.5,21,0,4.5,4.5,4.5,0,4.5,34.5,14.5,0,24.5,"",0,0,1,1,0,0,0 -"Sam the Man",2000,87,NA,3.1,68,34.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Sam yuen yi ma",1999,98,NA,5,17,4.5,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sam's Lake",2002,27,NA,7.3,18,4.5,0,0,4.5,0,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Sam's Son",1984,104,NA,4.7,38,4.5,14.5,0,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sam's Song",1969,92,NA,3.3,156,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Samantha",1992,96,NA,6.1,137,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Samar",1962,89,NA,5.9,6,0,0,0,14.5,0,0,45.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Samaria",2004,95,NA,7.3,650,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Samaritan",2004,2,NA,3.5,6,64.5,14.5,0,0,0,14.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Samay: When Time Strikes",2003,136,NA,7.7,42,4.5,0,4.5,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Samaya obayatelnaya i privlekatelnaya",1985,89,NA,6.6,44,0,4.5,0,0,14.5,14.5,4.5,34.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Samba",1965,106,NA,6.8,13,4.5,0,4.5,0,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sambizanga",1972,96,NA,7.7,8,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Sambolico",1996,29,NA,5.7,20,14.5,0,4.5,14.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Same Difference",2003,14,7000,8.9,8,0,0,14.5,0,0,0,0,14.5,0,74.5,"",0,0,0,0,0,0,1 -"Same Player Shoot Again",2002,15,NA,6.1,6,0,0,0,0,14.5,0,64.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Same Player Shoots Again",1968,12,NA,4.9,15,24.5,4.5,4.5,4.5,24.5,0,14.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"Same River Twice",1996,103,NA,3.7,35,14.5,0,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Same River Twice, The",2003,78,NA,7.3,82,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Same Time, Next Year",1978,119,NA,6.7,1188,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Same, The",2001,13,NA,5.3,21,4.5,4.5,4.5,0,0,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Samedi, dimanche et aussi lundi",1999,13,NA,4.6,7,0,0,14.5,0,0,45.5,14.5,0,14.5,0,"",0,0,1,0,0,0,1 -"Samehada otoko to momojiri onna",1998,108,NA,6.9,373,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,1,0,0,0,0 -"Sami swoi",1967,81,NA,8.8,136,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Samia",2000,73,NA,6.4,93,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Samkauli satrposatvis",1972,75,NA,6,5,0,0,0,0,0,44.5,0,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Sammy Stops the World",1978,105,NA,2.2,5,24.5,24.5,44.5,0,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Sammy and Rosie Get Laid",1987,100,NA,6.2,418,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Sammy's Super T-Shirt",1978,58,NA,8.4,21,4.5,0,0,0,4.5,0,4.5,24.5,0,45.5,"",0,0,0,0,0,0,0 -"Sammyville",1999,94,NA,4,31,24.5,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,"PG-13",0,0,0,0,0,0,0 -"Samo jednom se ljubi",1981,103,NA,5.7,33,4.5,0,0,4.5,14.5,14.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Samo ti, sartze",1987,115,NA,8,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Samogonshchiki",1961,19,NA,8.2,93,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Samorastniki",1963,95,NA,8.4,10,0,0,0,0,24.5,0,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Samostoyatelnaya zhizn",1992,97,NA,7.4,17,0,0,0,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Samowolka",1993,62,NA,7,22,4.5,0,4.5,4.5,0,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sample People",2000,97,NA,4.8,108,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sampo",1959,67,NA,3.1,146,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sampo Lappelill",1949,88,NA,6.6,6,0,0,0,14.5,34.5,0,34.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Sampson-Schley Controversy",1901,3,NA,3.4,8,0,14.5,24.5,45.5,14.5,0,0,0,0,0,"",0,0,0,1,0,0,1 -"Sams",1974,95,NA,5,5,0,0,0,44.5,0,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Samsara",1991,28,NA,8.7,6,0,0,0,0,14.5,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Samsara",2001,138,3000000,7.6,636,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,0,1,0,1,0 -"Samson",1936,90,NA,7,6,0,0,0,0,0,34.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Samson and Delilah",1949,134,NA,6.5,503,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Samson og Sally",1984,63,NA,7.4,64,4.5,0,0,4.5,0,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Samuel Lount",1985,97,NA,4.8,8,0,14.5,14.5,0,0,0,24.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Samundar",1986,144,NA,5.2,10,0,14.5,0,14.5,14.5,34.5,34.5,0,14.5,0,"",1,0,0,1,0,0,0 -"Samurai",1965,123,NA,7.6,104,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Samurai Cop",1989,95,NA,1.9,24,44.5,24.5,0,4.5,4.5,0,0,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Samurai Cowboy",1993,96,NA,5.3,21,0,0,4.5,0,24.5,14.5,4.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Samurai Vampire Bikers From Hell",1992,82,NA,6.8,24,4.5,0,0,0,0,4.5,0,0,0,94.5,"",1,0,0,0,0,0,0 -"Samy y yo",2002,85,NA,6.4,103,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"San",1966,73,NA,8.6,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"San Antone",1953,90,NA,5.8,21,0,0,4.5,0,14.5,44.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"San Antonio",1945,109,NA,6.3,148,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"San Antonio",2004,95,NA,3.3,70,14.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"San Antonio Kid, The",1944,59,NA,6.9,8,0,0,0,0,14.5,34.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"San Antonio Rose",1941,63,NA,7.7,8,0,0,0,0,0,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"San Bernardo",2000,105,NA,6.1,20,14.5,0,0,0,14.5,34.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"San Demetrio, London",1943,104,NA,6.7,26,0,0,0,4.5,0,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"San Diego I Love You",1944,83,NA,7.1,12,0,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"San Francisco",1936,115,1300000,7.5,676,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"San Francisco",1968,15,NA,6.2,15,4.5,0,4.5,0,4.5,44.5,4.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"San Francisco Chinese Funeral",1904,2,NA,3.6,5,0,0,44.5,44.5,24.5,0,0,0,0,0,"",0,0,0,0,1,0,1 -"San Francisco Story, The",1952,80,NA,5.3,18,0,0,0,24.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"San Francisco: Aftermath of Earthquake",1906,1,NA,7.2,66,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"San Giovanni decollato",1940,89,NA,7.1,20,0,0,0,0,14.5,24.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"San Michele aveva un gallo",1972,90,NA,5.9,32,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"San Pietro",1945,32,NA,7.9,117,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,1 -"San Quentin",1937,70,NA,6.4,100,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"San Quentin",1946,66,NA,5.5,46,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"San Sebastian 1746 in 1968",1968,10,NA,6.3,15,0,0,0,4.5,14.5,34.5,0,4.5,24.5,24.5,"",0,0,0,0,1,0,1 -"San ge heshang",1981,19,NA,9.1,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,1,0,0,0,0,1 -"San ge xiang ai de shao nian",1994,96,NA,7,8,14.5,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"San geng",2002,120,NA,6.6,229,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"San giu cheung yee sang",1999,94,NA,2.4,9,44.5,14.5,0,14.5,14.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"San goo waak chai ji siu nin gik dau pin",1998,117,NA,6.2,55,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"San ju chi lian",1999,60,NA,4.8,21,4.5,4.5,4.5,14.5,24.5,4.5,24.5,14.5,0,0,"",0,0,0,0,0,1,0 -"San o ruzi",1986,87,NA,7.2,11,0,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"San shi liu mi xing quan",1977,90,NA,4.4,87,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"San tau chi saidoi",2000,89,NA,6.3,84,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"San tau dip ying",1997,90,NA,5.8,136,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"San tau jin zi lei saam",1996,97,NA,3.7,18,14.5,0,0,0,14.5,14.5,14.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"San tiao ren",1999,95,NA,5.4,79,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"San zimske noci",2004,95,NA,6.7,57,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sanada Yukimura no bouryaku",1979,148,NA,9.1,7,0,0,0,0,0,0,14.5,14.5,0,74.5,"",1,0,0,1,0,0,0 -"Sanada fuunroku",1963,100,NA,6,6,0,0,0,0,0,64.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Sanam",1999,88,NA,6.7,15,0,0,0,4.5,4.5,14.5,24.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sanatorium pod klepsydra",1973,124,NA,7.6,60,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Sanbiki no samurai",1964,95,NA,7.2,64,0,0,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"",1,0,0,1,0,0,0 -"Sanbuingwa",1997,95,NA,5.9,22,4.5,0,4.5,0,0,14.5,44.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sanchaeg",2000,100,NA,6.4,15,4.5,0,0,0,24.5,24.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Sancta mortale",1997,13,NA,7,7,14.5,0,0,0,0,0,45.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Sanctimony",2000,83,NA,3.7,248,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sanctuary",1961,90,NA,7,25,4.5,0,0,4.5,0,24.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sanctuary",1997,104,NA,4.3,172,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Sanctuary",2004,80,NA,3.7,15,24.5,0,24.5,0,24.5,0,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sanctus Ex",2003,18,NA,8.1,7,0,0,0,0,0,14.5,0,45.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Sand",1949,78,NA,6.1,9,14.5,0,0,24.5,0,0,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sand Castle, The",1961,70,NA,4.9,22,14.5,14.5,0,4.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Sand Pebbles, The",1966,193,12000000,7.6,1773,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,1,0,1,0 -"Sand Trap",1998,100,NA,5,42,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Sandakan hachibanshokan bohkyo",1974,120,NA,7.4,54,4.5,4.5,4.5,0,0,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sandbox, The",1995,13,NA,8.4,9,14.5,0,0,0,0,0,14.5,14.5,0,64.5,"",0,1,0,0,0,0,1 -"Sandcastles",2004,79,NA,9.6,20,0,4.5,0,0,0,0,0,0,14.5,84.5,"",0,0,0,1,0,0,0 -"Sanders of the River",1935,98,NA,6,52,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sandino",1990,135,NA,4.9,15,0,4.5,0,0,14.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Sandland",1999,13,NA,7.8,5,0,0,0,0,24.5,0,0,64.5,0,24.5,"",0,1,0,0,0,0,1 -"Sandlot, The",1993,101,NA,7,4681,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Sandman",1991,10,NA,6.2,62,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,45.5,"",0,1,0,0,0,0,1 -"Sandman, The",2001,56,NA,8,6,14.5,0,0,0,0,0,0,0,45.5,34.5,"",0,0,0,1,0,0,0 -"Sandmann, Der",1993,104,NA,5.3,7,0,0,14.5,0,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Sandok, il Maciste della giungla",1964,85,NA,5.7,10,14.5,14.5,0,0,34.5,0,34.5,0,14.5,14.5,"",1,0,0,1,0,0,0 -"Sandokan contro il leopardo di Sarawak",1964,88,NA,4.2,9,0,0,34.5,14.5,24.5,0,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Sandokan, la tigre di Mompracem",1963,105,NA,4.5,19,14.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Sandpiper, The",1965,117,5300000,5.4,268,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sandpit Generals, The",1971,102,NA,6.1,42,4.5,4.5,4.5,0,0,14.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Sandra, the Making of a Woman",1970,79,NA,6.2,5,0,0,0,0,24.5,0,24.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Sands of Iwo Jima",1949,109,1000000,7,1353,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,1,0 -"Sands of the Desert",1960,92,NA,4.2,26,24.5,4.5,14.5,24.5,4.5,14.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sands of the Kalahari",1965,119,NA,6.9,144,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sandstone",1976,85,NA,3.5,9,14.5,14.5,0,0,14.5,24.5,14.5,0,14.5,24.5,"",0,0,0,0,1,0,0 -"Sandwich Man, The",1966,95,NA,5.8,36,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Sandy Claws",1954,7,NA,7,38,0,0,0,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Sandy Hook Lingerie Party Massacre",2000,88,NA,2.6,21,34.5,4.5,4.5,4.5,24.5,0,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Sandy Insatiable",1995,137,NA,8.5,6,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Sanford Meisner: The American Theatre's Best Kept Secret",1985,60,NA,4.7,18,14.5,0,0,0,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Sang des autres, Le",1984,130,NA,5.1,96,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sangam",2004,28,NA,8.8,8,0,0,0,0,0,0,24.5,24.5,0,45.5,"",0,0,0,1,0,0,1 -"Sangaree",1953,94,NA,5.6,16,0,0,14.5,34.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sangatsu no raion",1991,118,NA,4.2,21,4.5,0,0,4.5,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Sangraal, la spada di fuoco",1983,83,NA,3.1,41,14.5,14.5,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Sangre de Nostradamus, La",1961,98,NA,4,10,24.5,0,14.5,14.5,34.5,0,14.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Sangre eterna",2002,108,25000,4.6,148,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Sangre y arena",1989,22,NA,3.8,163,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,1 -"Sangrita",2004,91,NA,6.2,15,24.5,4.5,0,24.5,24.5,4.5,0,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Sangue di sbirro",1976,100,NA,4,11,4.5,0,24.5,24.5,4.5,4.5,4.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Sangue vivo",2000,95,NA,7.4,43,0,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sangue, O",1989,95,NA,7.4,26,4.5,0,4.5,4.5,0,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Sanguinaires, Les",1997,67,NA,6,32,0,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sankarialokas",1955,80,NA,4.6,5,0,0,0,64.5,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Sankofa",1993,125,1000000,5.9,106,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Sanma no aji",1962,133,NA,8.3,305,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Sanmon yakusha",2000,126,NA,7.9,9,0,0,14.5,0,0,0,24.5,45.5,14.5,0,"",0,0,0,1,0,1,0 -"Sanning eller konsekvens",1997,77,NA,5.8,140,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sanpeet",2001,27,NA,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,1,0,1 -"Sans famille",1958,100,NA,6.6,11,0,0,0,4.5,0,14.5,44.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Sans kapiyi kirinca",2005,107,NA,5.5,42,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Sans laisser d'adresse",1951,90,NA,7.8,8,0,0,0,0,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Sans lendemain",1939,82,NA,7.4,22,0,0,0,0,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sans mobile apparent",1971,100,NA,6.3,52,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Sans peur et sans reproche",1988,100,NA,5.1,46,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sans plomb",2000,88,NA,5.2,20,4.5,0,24.5,14.5,14.5,4.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Sans soleil",1983,100,NA,8.2,429,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Sans sommation",1973,95,NA,4.8,8,0,0,0,14.5,24.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Sans toit ni loi",1985,105,NA,7.6,489,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sans un cri",1992,86,NA,6.8,15,14.5,24.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Sansa",2003,116,NA,6.7,51,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sansibar oder Der letzte Grund",1987,164,NA,7.6,21,4.5,0,4.5,0,4.5,14.5,14.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Sansone",1961,99,NA,3.5,5,0,24.5,24.5,24.5,24.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Sansone contro il corsaro nero",1964,93,NA,4.8,8,0,0,14.5,34.5,14.5,14.5,14.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Sansone e il tesoro degli Incas",1964,90,NA,3.2,8,14.5,34.5,14.5,0,24.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Santa",1932,81,NA,7.3,11,0,4.5,0,0,0,0,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Santa Claus",1959,94,NA,2,276,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Santa Claus",1985,107,50000000,4.7,983,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Santa Claus Conquers the Martians",1964,81,200000,2.3,1876,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Santa Claus vs. Cupid",1915,16,NA,5.1,30,0,4.5,24.5,34.5,4.5,14.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,1 -"Santa Clause 2, The",2002,105,60000000,5.8,2616,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Santa Clause, The",1994,97,NA,5.9,5561,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Santa Claws",1996,83,NA,1.8,52,44.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Santa Fe",1997,97,NA,5.2,73,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Santa Fe Marshal",1940,68,NA,8.1,18,0,0,0,4.5,0,0,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Santa Fe Passage",1955,91,NA,5.8,39,4.5,0,0,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Santa Fe Saddlemates",1945,58,NA,6.8,7,0,0,14.5,0,0,14.5,14.5,44.5,0,14.5,"",0,0,0,0,0,0,0 -"Santa Fe Stampede",1938,58,NA,3,35,24.5,4.5,14.5,4.5,4.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Santa Fe Trail",1940,110,NA,5.8,452,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Santa Maradona",2001,99,NA,6.5,326,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Santa Santita",2004,113,NA,7.1,14,4.5,0,0,0,4.5,14.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Santa Smokes",2002,85,NA,9,8,0,0,0,0,0,0,24.5,14.5,45.5,14.5,"",0,0,1,1,0,0,0 -"Santa Tsikita",1953,92,NA,7.3,26,0,4.5,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Santa and the Ice Cream Bunny",1972,96,NA,1.4,42,84.5,14.5,0,0,0,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Santa and the Three Bears",1970,76,NA,7.1,30,4.5,0,0,14.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,1,0,0,0,0,0 -"Santa sangre",1989,123,787000,7.2,1165,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Santa vs. the Snowman 3D",2002,32,NA,7.6,72,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Santa with Muscles",1996,97,NA,1.8,2612,84.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Santa's Surprise",1947,9,NA,4.6,13,0,34.5,0,0,14.5,4.5,0,14.5,0,24.5,"",0,1,0,0,0,0,1 -"Santa/Claws",1997,7,NA,1.4,12,44.5,4.5,4.5,0,0,0,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Santee",1973,93,NA,5.3,32,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Santiago",1956,93,NA,5.5,20,4.5,0,14.5,0,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Santitos",1999,105,NA,7,176,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Santo Forte",1999,80,NA,4.6,14,0,4.5,4.5,4.5,4.5,0,34.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Santo Milagroso, O",1966,105,NA,8.9,5,0,0,0,0,0,24.5,0,64.5,0,24.5,"",0,0,1,0,0,0,0 -"Santo contra Capulina",1968,80,NA,6.2,10,0,0,14.5,14.5,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Santo contra el doctor Muerte",1973,95,NA,7.1,15,0,0,0,4.5,4.5,14.5,0,4.5,0,64.5,"",1,0,0,0,0,0,0 -"Santo contra la hija de Frankenstein",1971,97,NA,7,20,4.5,0,0,4.5,24.5,4.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Santo contra las lobas",1972,89,NA,7.2,8,0,0,0,0,24.5,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Santo contra los zombies",1962,78,NA,6.1,17,14.5,0,4.5,4.5,4.5,4.5,0,14.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Santo contras las mujeres vampiro, El",1962,89,NA,2.5,159,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Santo de la espada, El",1970,120,NA,3.9,16,24.5,4.5,0,4.5,0,14.5,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Santo en el museo de cera",1963,92,NA,4.7,45,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Santo oficio, El",1974,127,NA,5.7,15,0,0,0,14.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Santo y Blue Demon contra el doctor Frankenstein",1974,95,NA,6.9,21,4.5,0,4.5,14.5,4.5,24.5,4.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Santo: Infraterrestre",2001,85,NA,5.1,18,14.5,14.5,0,4.5,4.5,0,4.5,0,0,45.5,"",1,0,0,0,0,0,0 -"Santos inocentes, Los",1984,107,NA,8.5,325,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Santos peregrinos",2004,94,900000,4.5,20,44.5,0,4.5,4.5,4.5,4.5,14.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Sap",2002,8,NA,8.5,27,0,0,0,0,0,4.5,0,14.5,24.5,45.5,"",0,1,0,0,0,0,1 -"Sap saam taai bo",1970,117,NA,6.3,54,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Sapatos Pretos",1998,95,NA,5,33,14.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Saphead, The",1920,77,NA,6.3,195,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sapihes",1982,100,NA,3.8,85,14.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sapore del grano",1986,93,NA,6.4,19,0,0,4.5,4.5,0,24.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sapore di mare",1983,94,NA,5.6,57,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sapore di mare 2 - un anno dopo",1983,103,NA,4.4,15,14.5,4.5,0,14.5,14.5,34.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Sapphire",1959,92,NA,7.2,63,0,0,0,0,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sappy Bullfighters",1959,16,NA,4.7,43,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Saps at Sea",1940,57,NA,6.9,238,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Saptapadi",1961,163,NA,8.7,20,4.5,0,0,0,0,14.5,0,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Sara",1993,102,NA,6.4,25,4.5,0,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sara",1997,105,835000,6.3,175,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,1,0 -"Sara Akash",1969,100,NA,8.6,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,0,1,0,0,0 -"Sara Goes to Lunch",2004,20,NA,8.9,8,0,14.5,0,0,14.5,0,14.5,24.5,0,34.5,"",0,0,1,0,0,0,1 -"Saraba hakobune",1984,127,NA,8.5,9,0,0,0,0,0,24.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Saraba itoshiki hito yo",1987,102,NA,6.1,6,0,0,0,0,14.5,0,14.5,0,34.5,34.5,"",1,0,0,1,0,0,0 -"Saraband for Dead Lovers",1948,96,NA,6.8,38,0,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Saracen Blade, The",1954,76,NA,5.3,19,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,0,0,0,1,0 -"Sarafina!",1992,115,NA,5.5,313,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sarah and Son",1930,86,NA,6.1,17,0,0,0,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sarah's Child",1994,90,NA,3.6,7,24.5,0,24.5,14.5,0,0,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Sarajevski atentat",1975,111,NA,5.5,17,4.5,0,0,14.5,14.5,24.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Saranggola",1999,85,NA,8.2,5,0,0,0,0,0,44.5,0,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Saratoga",1937,92,NA,6.3,193,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Saratoga Trunk",1945,135,1750000,5.9,153,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sardar",1993,175,NA,9.4,14,0,0,0,0,0,0,4.5,4.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Sarek al-farah",1994,120,NA,5.9,6,0,0,0,14.5,34.5,0,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Sarg aus Hongkong, Ein",1964,93,NA,1.2,5,44.5,0,0,24.5,24.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Sarge Goes to College",1947,63,NA,7,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,1,0,0,0,0 -"Sari & Trainers",1999,15,NA,6.5,17,0,0,0,4.5,14.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,1,1 -"Sarons ros och gubbarna i Knohult",1968,100,NA,2.7,12,4.5,14.5,45.5,4.5,0,4.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Sarraounia",1986,120,NA,6.3,13,0,4.5,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sarrasine, La",1992,109,NA,7.7,20,0,0,0,0,0,14.5,14.5,44.5,34.5,0,"",0,0,0,1,0,0,0 -"Sartana nella valle degli avvoltoi",1970,78,NA,4,19,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Sasame-yuki",1983,140,NA,7.6,100,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Saseul",2000,93,NA,4.6,6,14.5,0,14.5,45.5,0,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Saskatchewan",1954,87,NA,6.1,68,4.5,0,0,4.5,4.5,34.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Saskatchewan",2002,5,NA,8,5,0,0,0,0,0,0,0,64.5,44.5,0,"",0,0,0,0,0,0,1 -"Sasori in U.S.A.",1997,86,NA,4.5,7,0,14.5,24.5,24.5,0,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Sasquatch Hunters",1997,73,NA,2.7,15,14.5,14.5,14.5,0,4.5,0,14.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Sasquatch, the Legend of Bigfoot",1977,102,NA,3.9,88,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sass",2001,112,NA,6.9,222,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sassy Sue",1972,84,NA,3.7,21,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Sat sau ji wong",1998,103,NA,5.9,803,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Satan",1991,106,NA,7.4,7,0,0,14.5,0,24.5,0,0,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Satan Bug, The",1965,114,NA,6,279,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Satan Met a Lady",1936,76,NA,6.2,196,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Satan Never Sleeps",1962,125,NA,5.2,88,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Satan Was a Lady",2001,80,NA,3.7,30,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Satan in High Heels",1962,90,NA,7.6,27,4.5,4.5,0,4.5,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Satan's Bed",1965,72,NA,4.9,14,4.5,14.5,0,14.5,4.5,14.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Satan's Black Wedding",1975,61,NA,4.8,8,14.5,0,14.5,14.5,24.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Satan's Cheerleaders",1977,92,NA,3.6,140,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Satan's Cradle",1949,60,NA,6.1,5,0,0,0,0,24.5,64.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Satan's Little Helper",2004,99,NA,5.3,129,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Satan's Mistress",1981,98,NA,3.2,28,4.5,14.5,14.5,24.5,14.5,4.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Satan's Princess",1990,90,NA,2.3,45,24.5,4.5,14.5,4.5,14.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Satan's Sadists",1969,86,NA,3.6,91,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Satan's Satellites",1958,70,NA,3.9,9,14.5,14.5,24.5,0,34.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Satan's Skin",1970,100,NA,5.4,249,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Satan's Slave",1976,86,NA,4.2,69,4.5,14.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Satan's Waitin'",1954,7,NA,7.2,34,0,0,0,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Satanades sta skoleia",1982,85,NA,6,8,24.5,14.5,0,0,0,0,0,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Satanic Rites of Dracula, The",1974,87,NA,5.1,489,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Satanik",1968,80,NA,3.8,33,14.5,14.5,4.5,14.5,4.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Satansbraten",1976,112,NA,7.4,162,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Satellite",2002,17,NA,9.2,12,0,0,0,0,14.5,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Satellite in the Sky",1956,85,NA,5.7,15,0,0,0,4.5,24.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Sathi Leelavathi",1995,151,NA,8,19,4.5,0,0,0,0,4.5,44.5,4.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Satin rouge",2002,100,NA,6.9,223,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Satisfaction",1988,92,NA,3.9,640,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Satisfiers of Alpha Blue, The",1981,86,NA,5.1,45,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Satomi hakken-den",1983,133,NA,5.8,110,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Satorare",2001,128,NA,6.9,63,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Satree lek",2000,104,NA,7.4,368,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Satree lek 2",2003,100,NA,4,42,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Satsujin ken 2",1974,88,NA,5.9,201,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Satsujin kyo jidai",1967,69,NA,9.6,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,1,0,0,0,0 -"Satta",2003,153,NA,7.4,32,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Satte Pe Satta",1982,160,NA,6.8,90,4.5,4.5,4.5,4.5,4.5,0,14.5,14.5,24.5,34.5,"",1,0,1,1,0,0,0 -"Saturday Afternoon",1926,30,NA,6.8,21,0,0,0,0,14.5,24.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Saturday Evening Puss",1950,6,NA,6.5,32,0,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Saturday Island",1952,102,NA,5.8,19,0,4.5,0,14.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Saturday Night",2000,88,NA,6.8,12,0,0,0,0,0,4.5,24.5,44.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Saturday Night Fever",1977,113,NA,6.6,8179,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Saturday Night Kid, The",1929,63,NA,7.3,28,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Saturday Night Out",1963,100,NA,1.6,6,34.5,0,0,0,0,0,0,34.5,0,34.5,"",0,0,1,0,0,0,0 -"Saturday Night Sleazies, Vol. 1",1990,150,NA,1,6,64.5,0,0,0,0,14.5,0,0,0,14.5,"",0,0,0,0,1,0,0 -"Saturday Night Sleazies, Vol. 2",1991,150,NA,1.1,5,84.5,0,0,0,0,0,24.5,0,0,0,"",0,0,0,0,1,0,0 -"Saturday Night and Sunday Morning",1960,89,NA,7.7,590,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Saturday Night at the Baths",1975,86,NA,5.7,5,24.5,0,0,0,0,24.5,24.5,0,24.5,24.5,"",0,0,1,1,0,0,0 -"Saturday Night at the Palace",1987,87,NA,9.1,7,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Saturday the 14th",1981,75,NA,4,448,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Saturday the 14th Strikes Back",1988,79,NA,2,111,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Saturday's Children",1940,102,NA,6.2,54,0,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Saturday's Hero",1951,111,NA,6.5,20,0,0,4.5,0,4.5,34.5,34.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Saturn",1999,94,350000,5.5,43,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Saturn 3",1980,88,NA,4.4,1089,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Satya",1998,170,NA,8.5,207,4.5,0,4.5,0,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Satyakam",1969,175,NA,9.4,20,0,0,0,4.5,0,0,0,4.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Satyam Shivam Sundaram: Love Sublime",1978,172,NA,7.4,85,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,0,0,1,0 -"Satyricon",1968,120,NA,7.2,7,0,0,14.5,0,14.5,0,24.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Satyricon",1969,129,3000000,6.5,1879,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Saudade - Sehnsucht",2003,80,NA,5.4,16,14.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Saudade do Futuro",2000,94,NA,6.7,13,14.5,0,0,24.5,0,0,34.5,24.5,4.5,0,"",0,0,0,0,1,0,0 -"Saudagar",1991,213,NA,6.1,21,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,"",1,0,0,1,0,1,0 -"Sauerbruch - Das war mein Leben",1954,104,NA,4.7,16,0,0,14.5,4.5,4.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Sauf-conduits, Les",1991,56,NA,6.5,8,0,0,0,0,0,34.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Saurians",1994,83,NA,4.9,11,45.5,0,0,0,0,0,0,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Sausages",1997,20,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,1,0,0,1,1 -"Saut de l'ange, Le",1971,90,NA,6,14,0,4.5,4.5,4.5,14.5,14.5,24.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Saute ma ville",1968,11,NA,5.7,31,4.5,0,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Sauvage innocence",2001,123,NA,6.4,38,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Sauvage, Le",1975,103,NA,6.2,131,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Sauve qui peut (la vie)",1980,87,NA,7,147,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sauve-moi",2000,100,NA,5.1,25,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Savage",1995,99,5000000,4.1,93,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Savage Beach",1989,92,NA,3.3,94,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Savage Dawn",1985,98,NA,3.5,41,14.5,14.5,24.5,14.5,4.5,4.5,0,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Savage Drums",1951,73,NA,5.7,5,0,0,0,24.5,0,0,44.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Savage Encounter",1980,86,NA,2.2,5,24.5,44.5,0,0,0,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Savage Eye, The",1960,68,NA,6,24,0,0,4.5,4.5,4.5,0,24.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Savage Frontier",1953,54,NA,5.2,6,0,14.5,0,14.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Savage Harbor",1987,85,NA,1.8,7,24.5,45.5,0,0,0,14.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Savage Harvest",1981,83,NA,4.8,50,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Savage Honeymoon",2000,90,NA,5.6,53,4.5,0,0,24.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Savage Horde, The",1950,90,NA,6.9,16,0,0,0,0,0,34.5,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Savage Innocents, The",1959,110,NA,7.2,129,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Savage Is Loose, The",1974,114,NA,4.2,40,4.5,4.5,14.5,4.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Savage Island",1985,74,NA,3.8,51,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Savage Island",2003,92,NA,6.8,44,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Savage Land",1994,98,NA,3.7,35,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Savage Messiah",1972,103,NA,6.7,154,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Savage Messiah",2002,94,NA,6.4,239,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Savage Mutiny",1953,73,NA,4.9,18,4.5,4.5,4.5,14.5,4.5,0,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Savage Pampas",1966,112,NA,5.1,29,0,14.5,14.5,14.5,24.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Savage Roses",2002,90,15000,2.7,17,44.5,4.5,0,0,0,4.5,4.5,24.5,14.5,0,"",0,0,0,1,0,1,0 -"Savage Sam",1963,103,NA,5.8,56,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Savage Seven, The",1968,94,NA,4.5,47,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Savage Streets",1984,80,NA,5.3,166,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Savage Weekend",1979,88,NA,3.6,196,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Savage, The",1952,95,NA,5.3,48,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Savage, The",2003,93,NA,5.5,1064,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Savages",1972,106,NA,5.2,55,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Savamala",1982,115,NA,4.2,6,0,34.5,0,14.5,0,0,45.5,0,0,0,"",0,0,0,1,0,0,0 -"Savana violenta",1976,85,NA,3.3,22,14.5,14.5,14.5,4.5,4.5,4.5,24.5,4.5,0,4.5,"",0,0,0,0,1,0,0 -"Savannah Smiles",1982,105,NA,6.1,298,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Savates du bon Dieu, Les",2000,107,NA,6.3,39,4.5,0,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Save It for Later",2003,93,NA,5.5,11,0,0,0,0,24.5,14.5,0,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Save Jesus",2004,19,NA,4.2,5,44.5,0,24.5,0,0,24.5,0,0,0,24.5,"",0,0,1,0,0,0,1 -"Save My Lost Nigga Soul",1993,24,NA,7.9,10,24.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,0,0,0,0,1 -"Save Virgil",2004,14,NA,5.8,9,14.5,14.5,0,0,14.5,0,0,14.5,0,45.5,"",0,0,1,0,0,0,1 -"Save the Last Dance",2001,112,13000000,6.1,7613,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Save the Tiger",1973,100,NA,6.7,502,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Saved From the Titanic",1912,10,NA,7.9,23,14.5,0,4.5,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,0,0,0,1 -"Saved by the Belle",1939,18,NA,6.7,58,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Saved by the Belles",2003,90,NA,4.1,50,14.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Saved!",2004,92,5000000,7.1,6504,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Saving Face",2004,91,NA,5.9,79,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"R",0,0,1,1,0,1,0 -"Saving Grace",1985,112,NA,5.8,167,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Saving Grace",1997,87,NA,6.1,41,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Saving Grace",2000,94,NA,6.9,3912,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Saving Private Ryan",1998,170,70000000,8.3,100267,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"R",1,0,0,1,0,0,0 -"Saving Ryan's Privates",1998,8,6500,6,74,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Saving Silverman",2001,96,22000000,5.4,6684,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Saving Souls",1995,24,NA,6.3,8,0,0,0,0,14.5,24.5,0,24.5,0,34.5,"",0,0,0,0,0,0,1 -"Savior",1998,104,10000000,7.2,1775,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Savrseni krug",1997,110,NA,8,173,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Savulun Battal Gazi geliyor",1973,85,NA,6,24,4.5,4.5,0,0,4.5,0,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Saw",2004,100,1200000,7.5,17191,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Sawdust Tales",1998,87,NA,8.2,32,4.5,0,0,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Saxo",1987,116,NA,6.5,5,0,0,24.5,0,0,44.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Saxon Charm, The",1948,88,NA,5.9,15,0,0,4.5,0,24.5,24.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Say Amen, Somebody",1982,100,NA,7.2,62,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Say Anything...",1989,100,NA,7.6,10822,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Say Hello to Yesterday",1971,96,NA,4.5,20,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Say It Isn't So",2001,93,25000000,4.6,3144,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Say It with Songs",1929,95,NA,5.9,10,0,14.5,34.5,0,0,24.5,0,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Say Nothing",2001,94,NA,5.2,180,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Say One for Me",1959,120,NA,5.2,41,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Say Yes",1986,91,NA,3.4,34,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Say Yes",2001,104,NA,5.4,103,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Say You'll Be Mine",1999,96,NA,5.7,17,14.5,0,4.5,14.5,0,4.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Say a Little Prayer",1993,95,NA,6.6,33,4.5,0,0,0,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sayat Nova",1970,79,NA,7.7,318,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Sayew",2003,110,NA,7.6,30,4.5,0,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Sayonara",1957,147,NA,7,583,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Saz Dahani",1974,75,NA,3.8,12,14.5,0,0,0,14.5,0,0,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Sazesh",1974,100,NA,6.8,5,0,0,0,0,24.5,0,64.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Sballato, gasato, completamente fuso",1982,96,NA,5.6,14,0,0,14.5,0,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sbandati, Gli",1955,102,NA,7.4,6,0,0,0,0,14.5,0,14.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Sbatti il mostro in prima pagina",1972,90,NA,6.6,30,0,0,0,4.5,4.5,24.5,24.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Scalawag",1973,92,NA,4.9,46,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Scalp Trouble",1939,7,NA,7,11,0,0,0,0,0,24.5,34.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Scalpers",2000,84,NA,5.1,28,14.5,4.5,0,4.5,34.5,4.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Scalphunters, The",1968,102,NA,6.5,251,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Scalps",1983,82,NA,3,52,24.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scam Artist, The",2004,76,500000,7.1,12,44.5,0,0,0,0,0,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Scampolo",1958,89,NA,6.3,31,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Scandal",1989,106,NA,6.2,971,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Scandal - Joseon namnyeo sangyeoljisa",2003,124,NA,7.4,222,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Scandal Sheet",1931,77,NA,8,10,0,0,0,0,0,0,45.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Scandal Sheet",1952,82,NA,7.1,65,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Scandal at Scourie",1953,90,NA,5.9,40,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Scandal in Paris, A",1946,100,NA,6.8,43,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Scandal: Lawful Entry",2000,80,NA,3.3,33,14.5,4.5,24.5,14.5,4.5,4.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Scandal: On the Other Side",1999,85,NA,2.7,30,24.5,14.5,4.5,14.5,4.5,0,4.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Scandal: Sweet Revenge",2001,92,NA,3.6,33,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Scandal: The Big Turn On",2000,80,NA,4.9,21,0,4.5,14.5,0,0,14.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Scandale",1982,81,NA,4.9,12,34.5,14.5,0,0,14.5,0,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Scandale, Le",1967,105,NA,5.6,63,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Scandalize My Name: Stories from the Blacklist",1998,54,NA,8.4,16,4.5,4.5,0,0,4.5,0,14.5,4.5,0,45.5,"",0,0,0,0,0,0,0 -"Scandalo",1976,110,NA,5.1,44,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Scandalo segreto",1989,85,NA,6,5,24.5,0,0,0,0,24.5,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Scandalosa Gilda",1985,95,NA,6.3,13,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,0,4.5,"R",0,0,0,1,0,0,0 -"Scandalous",1984,92,NA,3.7,35,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Scandalous John",1971,114,NA,5.4,13,0,0,4.5,4.5,24.5,34.5,4.5,0,4.5,4.5,"",0,0,1,1,0,1,0 -"Scanner Cop",1994,95,NA,3.8,151,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scanner Cop II",1995,95,4000000,3.7,81,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Scanners",1981,103,NA,6.4,3328,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scanners II: The New Order",1991,104,NA,4.6,264,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scanners III: The Takeover",1992,101,NA,3.8,193,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Scant Sanity",1996,12,NA,6.5,19,0,14.5,4.5,4.5,24.5,14.5,0,24.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Scapegoat, The",1959,91,NA,7.2,219,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Scapolo, Lo",1955,92,NA,6,15,0,0,0,0,34.5,4.5,44.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Scar City",1998,100,NA,4.8,229,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scar of Shame, The",1927,76,NA,5.7,44,4.5,4.5,0,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Scaramouche",1923,101,858723,7.4,52,0,4.5,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Scaramouche",1952,115,3500000,7.6,779,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Scare Their Pants Off",1968,75,NA,3,13,24.5,14.5,0,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Scarecrow",1973,108,NA,6.8,993,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Scarecrow in a Garden of Cucumbers",1972,82,NA,1.6,6,14.5,0,0,0,0,14.5,0,0,14.5,45.5,"",0,0,1,1,0,0,0 -"Scarecrow, The",1920,19,NA,8.4,154,0,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Scarecrow, The",1982,88,NA,5.3,36,0,0,4.5,4.5,34.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scarecrows",1988,83,NA,6.7,221,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Scared",2002,90,NA,3.1,34,24.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Scared Crows, The",1939,6,NA,5.5,17,0,0,4.5,4.5,24.5,24.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Scared Stiff",1945,65,NA,5.9,19,0,0,14.5,14.5,14.5,14.5,0,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Scared Stiff",1953,108,NA,6,261,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Scared Stiff",1986,83,NA,2.8,37,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Scared to Death",1947,65,NA,3.8,163,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scared to Death",1982,90,NA,3.8,37,24.5,14.5,4.5,14.5,14.5,14.5,0,4.5,0,0,"",0,0,0,1,0,1,0 -"ScaredSacred",2004,105,NA,6.1,15,0,0,0,0,24.5,0,44.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Scaredy Cat",1948,7,NA,7.3,107,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Scarf, The",1951,87,NA,6.4,37,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Scarface",1932,93,NA,7.8,2378,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Scarface",1983,170,25000000,7.9,28300,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Scarfies",1999,94,NA,6.5,359,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Scarlet Angel",1952,81,NA,5.3,27,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Scarlet Blade, The",1963,83,NA,4.9,22,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Scarlet Bride, The",1989,70,NA,6.3,6,0,0,0,14.5,0,14.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Scarlet Car, The",1917,50,NA,4.4,6,0,0,0,34.5,34.5,0,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Scarlet Claw, The",1944,85,NA,7.2,340,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Scarlet Clue, The",1945,65,75000,6.2,51,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Scarlet Coat, The",1955,101,NA,6.1,70,0,4.5,4.5,4.5,24.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Scarlet Countess",2001,80,NA,1.8,14,24.5,14.5,24.5,4.5,0,4.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Scarlet Dawn",1932,57,NA,5.2,33,0,4.5,4.5,4.5,34.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Scarlet Diva",2000,90,NA,5.2,438,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Scarlet Empress, The",1934,104,900000,7.5,579,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Scarlet Hour, The",1956,95,NA,6.2,9,0,0,14.5,14.5,0,24.5,24.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Scarlet Letter, The",1926,98,430290,8,132,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Scarlet Letter, The",1934,69,NA,4.3,38,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Scarlet Letter, The",1995,135,50000000,4.4,2426,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Scarlet Pages",1930,63,NA,4.5,14,0,4.5,4.5,4.5,44.5,14.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Scarlet Pimpernel, The",1934,97,NA,7.5,590,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Scarlet Pumpernickel, The",1950,7,NA,7.3,141,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Scarlet River",1933,61,NA,5.3,26,4.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Scarlet Street",1945,103,NA,7.6,898,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Scarlett Mecca and the Pentagram Girl",2000,20,20000,6.3,8,0,0,0,0,0,14.5,24.5,14.5,0,45.5,"",0,0,0,1,0,0,1 -"Scarred",1984,85,NA,3.3,12,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Scars Don't Sweat",1999,42,NA,8.8,8,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,1,0,1 -"Scars That Heal",1993,41,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Scars of Dracula",1970,96,NA,5.7,413,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scary Movie",2000,88,19000000,5.5,23293,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Scary Movie 2",2001,83,45000000,4.2,12035,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Scary Movie 3",2003,84,45000000,5.3,9225,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Scatenato, Lo",1967,95,NA,5.9,9,0,0,0,0,24.5,14.5,0,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Scatterbrain",1940,73,NA,6.7,7,0,14.5,0,0,0,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Scavenger Hunt",1979,116,NA,5.2,515,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Scavengers",1988,94,NA,2.4,7,14.5,14.5,24.5,24.5,0,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Scavengers, The",1959,79,NA,6.8,6,0,0,34.5,0,14.5,0,0,0,0,45.5,"",0,0,0,1,0,0,0 -"Sceicco bianco, Lo",1952,83,NA,7.3,373,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Scemo di guerra",1985,108,NA,5.3,39,0,4.5,14.5,4.5,14.5,34.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Scene Smoking: Cigarettes, Cinema & the Myth of Cool",2001,59,145000,2.6,28,64.5,4.5,0,4.5,0,4.5,0,0,0,24.5,"",0,0,0,0,1,0,0 -"Scene Stealers",2004,99,75000,8.6,14,24.5,14.5,0,0,0,0,0,0,24.5,34.5,"",0,0,0,1,0,0,0 -"Scene of the Crime",1949,94,NA,6.6,60,0,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Scenes from a Mall",1991,89,NA,4.8,1184,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Scenes from the Class Struggle in Beverly Hills",1989,95,NA,5.7,317,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Scenes from the Goldmine",1987,99,NA,4.3,22,14.5,0,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Scenes from the Life of Andy Warhol: Friendships and Intersections",1982,38,NA,6,25,4.5,4.5,0,0,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Scenes of the Crime",2001,81,NA,5.7,366,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Scenic Route, The",1978,76,NA,8.2,11,0,0,0,0,0,0,14.5,4.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Scent of Heather, A",1981,99,NA,5.3,18,4.5,4.5,0,14.5,0,14.5,0,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Scent of Mystery",1960,125,NA,5.2,14,0,0,0,24.5,34.5,0,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Scent of Passion",1990,84,NA,3.6,16,4.5,4.5,14.5,0,14.5,0,4.5,0,4.5,44.5,"",0,0,0,1,0,0,0 -"Scent of a Woman",1992,157,NA,7.4,16312,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Scent of the Matterhorn, A",1961,6,NA,7.4,39,4.5,0,0,0,14.5,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Scent-imental Over You",1947,7,NA,6.7,36,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Scent-imental Romeo",1951,6,NA,7.1,25,0,4.5,0,4.5,4.5,4.5,44.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Sceny narciarskie z Franzem Klammerem",1980,21,NA,9.2,5,0,0,0,0,0,24.5,0,0,0,84.5,"",0,0,0,0,1,0,1 -"Sceriffo extraterrestre - poco extra e molto terrestre, Uno",1979,95,NA,5.4,209,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Schachnovelle",1960,102,NA,6.7,87,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Schacko Klak",1991,90,NA,5,5,0,24.5,0,0,0,0,0,44.5,0,44.5,"",0,0,0,0,0,0,0 -"Schaduwlopers, De",1995,90,NA,8.4,15,0,0,4.5,0,4.5,4.5,0,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Scharlachrote Buchstabe, Der",1973,90,NA,5.7,72,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Schartl",1994,90,NA,5.8,5,24.5,0,0,0,0,24.5,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Schastye",1932,95,NA,7.7,48,4.5,0,0,4.5,4.5,4.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Schastye",1996,25,NA,6.9,14,4.5,0,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Schat van de zeerover, De",1968,70,NA,6.8,34,0,4.5,24.5,4.5,24.5,4.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Schatjes!",1984,101,NA,6.2,357,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Schatt's Last Shot",1985,10,NA,7.8,10,0,0,0,0,14.5,0,34.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Schatten der Engel",1976,101,NA,7.3,34,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Schatten der Zeit",2004,122,NA,6,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,1,0,1,0 -"Schatten des Schreibers, Der",1994,90,NA,4,5,0,24.5,0,24.5,44.5,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Schattenboxer",1992,77,NA,3.5,11,4.5,0,0,0,24.5,4.5,4.5,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Schatz der Azteken, Der",1965,101,NA,4.9,38,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Schatz im Silbersee, Der",1962,111,NA,6.1,222,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Schaukel, Die",1983,133,NA,7.5,9,14.5,0,0,14.5,0,0,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Schauspielerin, Die",1988,88,NA,1.9,11,14.5,0,0,0,4.5,0,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Schedule, The",1997,104,NA,2.3,19,24.5,0,0,0,4.5,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Scheherazade",2001,84,NA,5.4,16,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scheinheiligen, Die",2001,80,NA,7.6,94,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Scheitern als Chance",2000,94,NA,7.7,6,0,0,0,0,0,0,45.5,0,0,45.5,"",0,0,0,0,1,0,0 -"Schelme von Schelm, Die",1995,77,NA,5.2,18,0,0,14.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Schemer",2003,25,NA,7.8,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Schemering",2002,14,NA,6.5,8,0,0,0,14.5,14.5,14.5,0,24.5,34.5,0,"",0,0,0,0,0,0,1 -"Scheming Schemers",1956,16,NA,6.3,35,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Scherbentanz",2002,95,NA,7.2,46,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Scherzi da prete",1978,90,NA,5.1,7,24.5,0,14.5,0,14.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Scherzo - Verwitterte Melodie",1943,10,NA,8.9,5,0,0,0,0,0,0,24.5,0,44.5,44.5,"",0,1,0,0,0,0,1 -"Schiave bianche: violenza in Amazzonia",1985,85,NA,4.9,73,14.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Schiave esistono ancora, Le",1964,90,NA,3.8,5,0,0,24.5,0,64.5,0,24.5,0,0,0,"",0,0,0,1,1,0,0 -"Schiff der verlorenen Menschen, Das",1929,121,NA,7.3,20,0,14.5,0,14.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Schiff wird kommen, Ein",2003,100,NA,7.1,22,4.5,4.5,0,0,4.5,0,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Schimanski - Zahn um Zahn",1985,95,NA,6.5,74,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Schimkent Hotel",2003,90,NA,6.6,9,14.5,0,0,14.5,0,24.5,44.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Schimmelpenninck",2002,4,NA,2.8,8,0,14.5,24.5,0,0,0,0,0,0,64.5,"",0,1,0,0,0,0,1 -"Schimmelreiter, Der",1934,86,NA,5.2,8,14.5,0,0,14.5,0,24.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Schimmelreiter, Der",1978,96,NA,6.9,20,0,0,14.5,14.5,0,0,34.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Schinderhannes, Der",1958,115,NA,6.4,33,0,0,0,4.5,24.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Schindler's List",1993,195,25000000,8.8,97667,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",0,0,0,1,0,0,0 -"Schippers van de Kameleon, De",2003,100,NA,6.3,135,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Schizo",1976,109,NA,3.7,63,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Schizo",2001,90,NA,4,12,14.5,34.5,14.5,14.5,4.5,0,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Schizoid",1980,89,NA,3.7,50,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Schizopolis",1996,96,250000,7,917,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Schlacht der Idioten, Die",1986,21,NA,9.2,8,14.5,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,0,0,0,0,1 -"Schlafes Bruder",1995,127,NA,7.5,391,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Schlangengrube und das Pendel, Die",1967,85,NA,6,106,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Schlaraffenland",1999,114,NA,6.1,173,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Schlock",1973,80,NA,5.3,148,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Schloss, Das",2003,15,NA,6.6,13,0,0,0,0,14.5,34.5,34.5,14.5,0,4.5,"",0,1,0,0,0,0,1 -"Schluss mit Mudder",2002,88,NA,5.4,22,14.5,4.5,0,4.5,4.5,4.5,0,14.5,4.5,34.5,"",1,0,1,0,0,0,0 -"Schmetterling",2002,12,NA,4.7,6,0,0,34.5,0,14.5,0,0,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Schmetterlinge",1988,57,NA,8.6,14,0,0,0,0,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Schmetterlinge weinen nicht",1970,88,NA,2.4,7,45.5,14.5,24.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Schmutz",1985,100,NA,7.1,6,14.5,0,0,0,0,14.5,0,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Schneckentraum",2001,15,NA,8.3,27,14.5,0,0,0,4.5,0,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Schnee in der Neujahrsnacht",1999,100,NA,5.5,64,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Schneemann, Der",1985,106,NA,6.3,23,0,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Schneewittchen und die sieben Zwerge",1955,76,NA,4.8,31,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Schneewittchen und die sieben Zwerge",1961,63,NA,5.2,12,0,0,0,4.5,14.5,4.5,0,4.5,4.5,45.5,"",0,0,0,0,0,1,0 -"Schneider's 2nd Stage",2001,17,NA,7.2,42,0,0,4.5,0,0,14.5,4.5,45.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Schock",1977,93,NA,5.6,252,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scholastic England",1948,9,NA,5.7,6,0,0,0,0,34.5,45.5,0,0,0,14.5,"",0,0,0,0,1,0,1 -"School Daze",1988,121,6500000,5.3,955,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"School Killer",2001,86,NA,3.2,73,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"School Spirit",1985,90,NA,3.7,52,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"School Ties",1992,106,NA,6.6,3327,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"School for Scoundrels or How to Win Without Actually Cheating!",1960,94,NA,7.6,309,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"School for Secrets",1946,108,NA,7.2,27,0,0,0,4.5,4.5,14.5,44.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"School for Seduction",2004,104,NA,5,65,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,1,0 -"School for Sex",1968,68,NA,6.4,8,14.5,0,14.5,14.5,0,14.5,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"School for Unclaimed Girls",1969,95,NA,3.4,17,24.5,4.5,14.5,4.5,24.5,4.5,0,0,4.5,14.5,"",0,0,0,1,0,0,0 -"School of Rock, The",2003,108,20000000,7.4,16452,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"School's Out",1930,20,NA,7.3,56,0,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Schoolgirls in Chains",1973,86,NA,4.8,28,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Schorpioen, De",1984,105,NA,6.2,28,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Schotter wie Heu",2002,104,NA,7.7,16,0,0,0,0,4.5,4.5,24.5,44.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Schpaaa",1998,73,NA,5.8,169,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Schpountz, Le",1938,160,NA,6.8,87,0,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Schpountz, Le",1999,84,NA,3.2,32,44.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,0,0,"",0,0,1,0,0,1,0 -"Schramm",1993,75,NA,5.5,223,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Schrammeln",1944,93,NA,5.8,6,0,0,0,0,34.5,34.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Schreie in der Nacht",1969,83,NA,6.1,10,0,0,0,0,24.5,24.5,0,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Schrott - Die Atzenposse",2000,91,NA,3.1,14,45.5,0,0,4.5,4.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Schtonk!",1992,115,NA,7.3,570,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Schuh des Manitu, Der",2001,86,NA,6.4,2508,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Schuld der Liebe, Die",1997,117,NA,5.4,7,0,0,14.5,0,14.5,14.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Schule",2000,99,NA,6,452,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Schulgespenst, Das",1986,81,NA,6.9,11,0,0,0,4.5,0,4.5,45.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Schultze Gets the Blues",2003,114,NA,7.4,510,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG",0,0,1,1,0,0,0 -"Schussangst",2003,105,NA,6.5,65,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Schut, Der",1964,107,NA,6.1,48,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Schwanensee",1967,112,NA,7.8,15,0,0,0,0,4.5,4.5,14.5,24.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Schwarze Abt, Der",1963,88,NA,6,73,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Schwarze Kugel oder Die geheimnisvollen Schwestern, Die",1913,39,NA,6,19,0,0,24.5,4.5,14.5,14.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,1 -"Schwarze Panther von Ratana, Der",1963,94,NA,4.2,5,24.5,0,24.5,0,44.5,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Schwarze Schaf, Das",1960,90,NA,5.6,105,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Schwarze Tanner, Der",1985,107,NA,5.9,16,0,0,0,0,24.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Schwarzfahrer",1993,12,NA,8,138,4.5,0,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Schwechater",1958,1,NA,8.1,5,0,0,0,0,0,0,0,64.5,0,44.5,"",0,0,0,0,0,0,1 -"Schweigende Stern, Der",1960,79,NA,4.1,195,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Schweitzer",1990,100,NA,6,13,0,0,0,0,24.5,4.5,24.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Schweizermacher, Die",1978,107,NA,7.5,169,0,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Schwestern",1999,14,NA,4.7,14,4.5,0,14.5,24.5,4.5,0,4.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Sci-Fighter",2004,90,NA,3.7,20,44.5,14.5,4.5,4.5,4.5,4.5,0,0,0,34.5,"PG-13",1,0,0,0,0,0,0 -"Sci-fighters",1996,94,NA,3.6,103,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Sciamane, Le",2000,89,NA,3,8,34.5,0,24.5,24.5,0,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Science Fiction",2002,90,NA,5.9,99,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Science Fiction",2003,112,NA,6.4,43,0,0,0,4.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Scimitarra del Saraceno, La",1959,92,NA,6.5,8,0,0,0,0,24.5,14.5,45.5,14.5,0,0,"",1,0,0,1,0,1,0 -"Scipione detto anche l'africano",1971,114,NA,4.7,20,4.5,0,0,0,14.5,24.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Scipione l'africano",1937,117,NA,4.8,20,14.5,14.5,4.5,0,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Scissors",1991,105,NA,4.5,430,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scomparsa",1998,10,NA,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Scontri stellari oltre la terza dimensione",1979,94,NA,3.1,330,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scooby Doo 2: Monsters Unleashed",2004,93,NA,4.7,2778,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Scooby-Doo",2002,86,84000000,4.8,9618,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Scope",2004,41,0,4.9,8,45.5,0,0,0,14.5,0,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Scopone scientifico, Lo",1972,116,NA,7.8,199,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Scorched Heat",1987,90,NA,3.2,25,24.5,14.5,14.5,0,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scorcher",2002,91,NA,3.7,253,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Scorchers",1991,81,NA,5.2,188,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Scorchy",1976,99,NA,4.3,49,24.5,14.5,14.5,4.5,14.5,4.5,14.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Score",1973,90,NA,6,113,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Score",1995,88,NA,6.2,39,0,4.5,0,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Score 2: The Big Fight",1999,84,NA,6,8,0,0,14.5,0,45.5,0,14.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Score, The",2001,124,68000000,6.8,16106,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Scoring",1995,90,NA,3.6,31,24.5,14.5,14.5,4.5,4.5,0,4.5,14.5,4.5,0,"R",1,0,0,0,0,0,0 -"Scorned",1994,100,NA,4.6,327,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Scorned 2",1997,98,NA,3.8,68,14.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Scorpio",1973,114,NA,6.2,368,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scorpio Nights",1985,126,NA,7.9,25,4.5,4.5,0,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Scorpio One",1997,92,NA,3.9,90,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scorpio Rising",1964,30,16000,6.6,284,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Scorpion King, The",2002,92,60000000,5.3,10111,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Scorpion Spring",1997,90,NA,4.8,61,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Scorta, La",1993,92,NA,6.9,191,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Scorticateli vivi",1978,95,NA,2.4,5,44.5,24.5,24.5,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Scot-free",1995,85,NA,8.8,12,14.5,0,0,0,0,0,0,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Scotch",2003,26,NA,8.7,6,0,14.5,0,0,0,0,14.5,14.5,34.5,14.5,"",0,0,1,0,0,0,1 -"Scotch and Milk",1998,117,NA,4.8,47,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Scotched in Scotland",1954,15,NA,7.4,37,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Scotland Yard",1930,75,NA,3.4,6,0,14.5,14.5,14.5,14.5,0,0,14.5,0,14.5,"",0,0,0,0,0,1,0 -"Scotland Yard jagt Dr. Mabuse",1963,90,NA,3.1,45,24.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scotland, Pa.",2001,104,NA,6.8,1542,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Scott Joplin",1977,96,NA,5.9,37,4.5,0,0,4.5,14.5,24.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Scott of the Antarctic",1948,111,NA,6.7,161,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Scott's Play",1999,17,NA,5.9,11,0,0,4.5,0,0,14.5,0,4.5,0,64.5,"",0,0,1,0,0,0,1 -"Scottish Tale, The",1996,81,NA,4.1,31,14.5,0,4.5,0,4.5,4.5,14.5,14.5,4.5,24.5,"PG-13",0,0,0,0,0,0,0 -"Scottsboro: An American Tragedy",2000,84,NA,8,59,0,0,0,4.5,0,4.5,14.5,34.5,34.5,4.5,"",0,0,0,0,1,0,0 -"Scoumoune, La",1972,100,NA,6.8,172,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Scoundrel's Wife, The",2002,95,NA,6.7,132,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,0,1,0,1,0 -"Scoundrel, The",1935,76,NA,6.4,25,0,4.5,0,0,4.5,24.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Scout toujours...",1985,98,NA,5.1,77,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Scout with the Gout, A",1947,7,NA,4.9,6,0,14.5,0,14.5,45.5,0,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Scout's Honor",2001,57,NA,7.2,38,4.5,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Scout, The",1994,101,NA,5.1,1090,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Scoutman",2000,114,NA,5.3,30,14.5,0,0,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Scouts to the Rescue",1939,231,NA,7,6,0,0,0,0,34.5,0,0,64.5,0,0,"",0,0,0,0,0,0,0 -"Scrabylon",2003,50,NA,7.1,13,0,0,0,0,4.5,0,14.5,14.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Scram!",1932,20,NA,7.4,102,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Scrambled Aches",1957,7,NA,6.7,40,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Scrambled Brains",1951,16,NA,7.7,37,0,4.5,0,4.5,0,14.5,4.5,4.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Scrambled Eggs",2004,34,NA,8.3,11,4.5,0,4.5,0,0,0,0,4.5,4.5,64.5,"",0,0,1,0,0,0,1 -"Scrap Happy Daffy",1943,8,NA,7.7,32,0,0,0,4.5,4.5,14.5,4.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Scrapbook",1999,110,NA,6.4,27,4.5,14.5,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Scrapple",1998,93,NA,6.7,43,0,14.5,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Scrapple",2004,11,NA,7.6,9,0,0,0,14.5,0,14.5,34.5,0,24.5,24.5,"",0,0,1,0,0,0,1 -"Scratch",2005,25,NA,6.9,7,24.5,0,0,0,0,0,14.5,0,14.5,44.5,"",0,0,0,0,1,1,1 -"Scratch the Surface",1997,75,NA,4.7,23,14.5,0,0,4.5,14.5,14.5,4.5,14.5,0,34.5,"PG",0,0,0,0,1,0,0 -"Scream",1996,111,15000000,7,43652,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Scream 2",1997,120,24000000,5.9,21533,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Scream 3",2000,116,40000000,5.4,15403,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Scream Blacula Scream",1973,96,NA,4.4,171,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Scream Bloody Murder",1973,90,NA,1.9,36,44.5,24.5,4.5,0,24.5,0,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scream Dream",1989,69,NA,1.4,12,64.5,14.5,0,0,0,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Scream Free!",1969,80,NA,6.3,6,0,0,14.5,0,0,14.5,34.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Scream Queens' Naked Christmas",1996,60,NA,1.4,17,34.5,14.5,0,0,0,4.5,4.5,0,4.5,24.5,"",0,0,0,0,1,0,0 -"Scream and Scream Again",1969,95,NA,5.3,307,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scream for Help",1985,89,NA,4,60,14.5,14.5,14.5,14.5,4.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Scream in the Dark, A",1943,53,NA,7.4,11,0,0,4.5,0,0,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Scream in the Night, A",1935,58,NA,5.5,13,0,4.5,0,14.5,44.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Scream in the Streets, A",1973,96,NA,3.2,21,24.5,4.5,24.5,4.5,0,14.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Scream, Baby, Scream",1969,83,NA,2.4,27,34.5,4.5,14.5,4.5,4.5,14.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Scream, Teen, Scream",1996,37,NA,2.7,31,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Scream... and Die!",1973,96,NA,2.9,37,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Screamers",1995,108,11000000,5.6,2725,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Screamin' Jay Hawkins: I Put a Spell On Me",2001,102,NA,8,25,4.5,0,0,0,0,0,24.5,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Screaming Eagles",1956,79,NA,6.3,24,0,0,0,4.5,44.5,4.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Screaming Mimi",1958,79,NA,6.2,40,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Screaming Skull, The",1958,68,NA,2.4,485,44.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Screamplay",1984,90,NA,7.4,19,4.5,0,0,0,0,14.5,34.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Screams of a Winter Night",1979,91,NA,3.8,33,14.5,14.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Screamtime",1983,87,NA,3.7,35,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Screen Actors",1950,9,NA,6,15,0,0,0,4.5,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,1,0,1 -"Screen Director, The",1951,9,NA,5,17,14.5,14.5,0,14.5,14.5,24.5,4.5,0,4.5,14.5,"",0,0,0,0,1,0,1 -"Screen Play",1992,11,NA,8.6,23,4.5,0,0,0,0,0,4.5,14.5,4.5,64.5,"",0,1,0,0,0,0,1 -"Screen Snapshots Series 23, No. 1: Hollywood in Uniform",1943,10,NA,4,12,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,1,0,1 -"Screen Snapshots: Hollywood Awards",1951,10,NA,3.3,8,24.5,14.5,14.5,14.5,14.5,0,0,0,0,24.5,"",0,0,0,0,1,0,1 -"Screen Snapshots: Hollywood Night Life",1952,9,NA,3.8,7,14.5,14.5,14.5,0,0,0,14.5,0,0,44.5,"",0,0,0,0,1,0,1 -"Screen Snapshots: Memories in Uniform",1954,11,NA,4.7,6,14.5,0,0,0,34.5,0,14.5,0,14.5,14.5,"",0,0,0,0,1,0,1 -"Screen Snapshots: The Great Al Jolson",1955,10,NA,5.9,5,0,0,0,0,44.5,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Screen Test",1985,84,1000000,3.3,38,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Screw",2004,18,NA,9.6,11,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,0,0,0,1 -"Screwball Football",1939,8,NA,6.1,11,0,14.5,0,0,24.5,4.5,14.5,0,24.5,0,"",0,1,1,0,0,0,1 -"Screwball Hotel",1988,101,NA,3.3,57,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Screwball Squirrel",1944,7,NA,7.7,55,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Screwballs",1983,80,800000,4.3,241,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Screwed",1996,85,NA,3.7,24,24.5,4.5,0,0,14.5,4.5,4.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Screwed",2000,78,10000000,4.8,1592,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Screwy Truant, The",1945,7,NA,8.2,26,0,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Script Doctor",1999,9,NA,5.4,23,0,0,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Scrooge",1935,78,NA,6.2,99,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Scrooge",1951,74,NA,8,3699,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Scrooge",1970,113,NA,7.1,994,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Scrooge McDuck and Money",1967,15,NA,4.9,53,14.5,4.5,0,0,4.5,4.5,24.5,4.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Scrooged",1988,101,NA,6.6,8457,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Scrub Me Mama with a Boogie Beat",1941,7,NA,6.6,40,4.5,0,0,4.5,24.5,4.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Scrubbers",1983,90,NA,5.1,75,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Scudda Hoo! Scudda Hay!",1948,95,NA,5.4,46,0,4.5,0,4.5,24.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Scugnizzi",1989,122,NA,7.3,12,0,0,0,4.5,0,4.5,0,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Sculptor's Nightmare, The",1908,11,NA,4.8,15,14.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,1 -"Sculptress, The",2000,101,NA,3.1,34,24.5,14.5,24.5,4.5,14.5,4.5,4.5,0,4.5,4.5,"R",0,0,0,0,0,0,0 -"Scum",1979,98,NA,7.1,641,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Scum Manifesto",1976,26,NA,8.2,12,44.5,0,0,0,0,0,0,4.5,0,45.5,"",0,0,0,0,0,0,1 -"Scum of the Earth",1963,73,NA,3.7,56,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Scum of the Earth",1974,90,NA,4.2,34,24.5,0,14.5,4.5,14.5,0,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Scumrock",2004,79,NA,6,7,0,0,14.5,0,0,0,0,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Scuola di ladri",1986,96,NA,4.7,59,4.5,4.5,4.5,14.5,14.5,24.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Scuola, La",1995,104,NA,6.8,119,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Se Segura, Malandro!",1978,110,NA,4.7,9,24.5,0,0,0,0,0,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Se buscan fulmontis",1999,87,NA,5.7,23,14.5,0,0,4.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Se devo essere sincera",2004,107,NA,5.7,13,0,0,0,4.5,14.5,45.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Se fossi in te",2001,101,NA,6.8,53,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Se incontri Sartana prega per la tua morte",1968,95,NA,4.4,35,0,0,14.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Se jiang II zhi xie mei gui",1994,90,NA,2.6,6,34.5,14.5,0,0,34.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Se mig nu",2001,25,NA,7.4,22,0,0,4.5,0,4.5,0,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Se permettete parliamo di donne",1964,110,NA,6.1,14,0,4.5,0,0,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Se permuta",1984,103,NA,7.5,17,0,0,0,0,0,24.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Se sei vivo spara",1967,117,NA,6.1,147,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Se souvenir des belles choses",2002,105,NA,7.3,269,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Se tutte le donne del mondo",1966,106,NA,6.1,28,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Se7en",1995,127,30000000,8.4,88371,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Sea Around Us, The",1952,61,NA,8.2,12,0,0,0,4.5,0,4.5,24.5,34.5,0,24.5,"",0,0,0,0,1,0,0 -"Sea Bat, The",1930,67,NA,5.5,16,0,4.5,0,14.5,24.5,4.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Sea Change, The",1998,88,NA,5.9,75,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sea Chase, The",1955,117,NA,5.7,299,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Sea Devils",1937,88,NA,5.3,13,0,0,0,34.5,14.5,34.5,4.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Sea Devils",1953,91,NA,4.9,39,0,0,4.5,24.5,34.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Sea Fury",1958,97,NA,5.4,14,0,0,14.5,0,24.5,44.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Sea Ghost",2004,90,1500000,3.7,10,24.5,0,34.5,0,24.5,0,14.5,14.5,0,14.5,"R",0,0,0,0,0,0,0 -"Sea Gull, The",1968,141,NA,5.9,57,4.5,0,0,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Sea Gypsies, The",1978,102,NA,4.8,83,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sea Hawk, The",1924,123,NA,7.6,48,0,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Sea Hawk, The",1940,127,1700000,7.8,1124,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Sea Hornet, The",1951,84,NA,5.8,8,14.5,0,0,14.5,24.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Sea Monsters",2003,16,NA,8.9,8,0,0,0,0,0,0,0,34.5,34.5,24.5,"",0,0,0,1,0,0,1 -"Sea Raiders",1941,229,NA,5.7,6,0,0,0,0,34.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Sea Salts",1949,7,NA,6.9,18,0,14.5,0,0,0,4.5,34.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Sea Scouts",1939,8,NA,7.4,52,0,0,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Sea Shall Not Have Them, The",1954,91,NA,6.5,30,0,0,0,4.5,14.5,34.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sea Spoilers",1936,63,NA,3.3,16,14.5,14.5,4.5,14.5,14.5,0,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Sea Wife",1957,82,NA,5.1,43,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sea Wolf, The",1941,87,NA,7.9,355,0,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Sea Wolf, The",1997,94,NA,3.3,14,34.5,24.5,4.5,4.5,0,4.5,4.5,4.5,4.5,0,"R",0,0,0,0,0,0,0 -"Sea Wolves: The Last Charge of the Calcutta Light Horse, The",1980,120,NA,6,431,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Sea and Stars",2002,11,NA,3.9,5,0,0,24.5,44.5,0,24.5,0,24.5,0,0,"",0,1,0,0,0,0,1 -"Sea in the Blood",2000,24,NA,6.3,11,0,14.5,0,0,0,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Sea of Grass, The",1947,123,NA,6.5,182,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sea of Lost Ships",1954,85,NA,5.2,6,0,0,0,14.5,34.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Sea of Love",1989,113,NA,6.7,5072,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sea of Sand",1958,97,NA,6.3,42,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sea, The",2003,30,NA,7.6,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"R",0,0,0,0,0,0,1 -"Seabiscuit",2003,141,86000000,7.5,11552,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Seabo",1977,117,NA,3.5,12,14.5,4.5,4.5,4.5,0,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Seafarers, The",1953,30,NA,6.3,152,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Seafood",2004,10,NA,8.4,10,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,0,0,1,0,0,1 -"Seagulls Over Sorrento",1954,92,NA,4.9,34,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Sealed Cargo",1951,90,NA,6.6,41,0,0,0,0,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sealed Room, The",1909,11,NA,5.3,46,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Seamless: Kidz Rule",1999,91,NA,2.1,127,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Seams",1993,30,NA,7.9,12,0,0,0,0,4.5,0,14.5,45.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Sean O'Casey: The Spirit of Ireland",1965,8,NA,2.5,10,44.5,24.5,14.5,14.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Seance on a Wet Afternoon",1964,115,NA,7.9,407,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Search and Destroy",1979,92,NA,4,31,14.5,0,14.5,14.5,14.5,4.5,0,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Search and Destroy",1988,99,NA,2.4,18,45.5,14.5,4.5,14.5,4.5,4.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Search and Destroy",1995,90,4000000,5,402,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Search for Beauty",1934,78,NA,7.7,11,0,0,0,0,0,4.5,14.5,24.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Search for Bridey Murphy, The",1956,84,NA,5.1,21,4.5,0,4.5,14.5,34.5,4.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Search for Evidence, A",1903,3,NA,3.8,7,14.5,0,14.5,0,45.5,0,0,14.5,0,0,"",0,0,0,1,0,0,1 -"Search for John Gissing, The",2001,91,NA,6.8,45,14.5,0,0,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Search for Paradise",1957,120,NA,7.4,5,0,0,0,24.5,0,0,24.5,44.5,0,24.5,"",0,0,0,0,1,0,0 -"Search for Signs of Inteligent Life in the Universe, The",1991,120,NA,7.1,61,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Search for the Great Sharks",1995,38,NA,6.8,24,0,0,4.5,4.5,4.5,24.5,44.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Search for the Snow Leopard",1999,135,NA,6.2,37,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Search, The",1948,105,NA,7.8,512,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Searchers for a Special City",1965,9,NA,6,9,0,0,0,0,24.5,45.5,14.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Searchers, The",1956,119,3750000,8.2,10211,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Searching Wind, The",1946,108,NA,5.8,13,0,4.5,4.5,0,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Searching for Angela Shelton",2004,93,300000,8.7,14,4.5,0,0,0,0,4.5,4.5,4.5,0,74.5,"",0,0,0,0,1,0,0 -"Searching for Bobby Fischer",1993,110,NA,7.6,7771,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Searching for Debra Winger",2002,97,600000,5.6,301,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Searching for Haizmann",2003,96,NA,4.4,28,24.5,4.5,0,4.5,4.5,0,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Searching for the Wendigo",2002,35,NA,6.4,14,14.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Searching for the Wrong-Eyed Jesus",2003,82,NA,6.3,46,4.5,0,0,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Seas Beneath",1931,90,NA,4.3,30,14.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Seasin's Greetinks!",1933,6,NA,5.6,9,0,0,0,14.5,14.5,44.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Season's Greetings",1996,4,NA,6.7,21,4.5,4.5,0,0,4.5,4.5,4.5,14.5,34.5,14.5,"",0,1,1,0,0,0,1 -"Seasoned Veteran: Journey of a Winter Soldier",2002,41,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",1,0,0,0,1,0,1 -"Seasons Alter, The",2002,4,NA,7.7,11,0,4.5,0,4.5,0,0,24.5,4.5,0,44.5,"",0,0,0,0,0,0,1 -"Seasons...",2002,20,NA,8.1,9,0,0,0,0,24.5,0,0,14.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Seattle: Gateway to the Northwest",1940,9,NA,6,6,0,0,0,0,0,64.5,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Seawards the Great Ships",1961,28,NA,7.5,6,14.5,0,0,0,0,0,34.5,0,0,45.5,"",0,0,0,0,1,0,1 -"Sebastian",1968,100,NA,6.4,107,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Sebastian Kneipp",1958,117,NA,5.1,11,4.5,0,0,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sebastian and the Sparrow",1990,88,NA,5.5,7,14.5,0,0,0,24.5,24.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Sebastiane",1976,90,NA,6.3,219,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Secerna vodica",1983,105,NA,7.2,17,0,0,0,4.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Secha pri Kerzhentse",1971,10,NA,7,16,0,0,0,0,4.5,34.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Sechinku",1996,93,NA,6.6,23,0,0,0,4.5,0,4.5,14.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Sechs Schwedinnen auf der Alm",1983,90,NA,2.2,7,14.5,44.5,0,0,44.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Sechs Schwedinnen im Pensionat",1979,90,NA,5.7,13,0,0,4.5,0,24.5,14.5,24.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Sechs Schwedinnen von der Tankstelle",1980,75,NA,4.1,7,0,0,14.5,14.5,14.5,14.5,0,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Sechse kommen durch die Welt",1972,71,NA,9.1,7,0,0,0,0,0,14.5,0,14.5,0,74.5,"",0,0,0,0,0,0,0 -"Secleto de la tlompeta, El",1995,17,NA,7.8,129,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Second Arrival, The",1998,105,NA,3.6,658,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Second Best",1994,105,NA,7,358,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Second Best",2004,86,NA,4.3,53,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Second Chance",1953,82,NA,6.1,109,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Second Chances",1998,107,NA,4.5,40,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Second Chorus",1940,84,NA,5.6,122,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Second Coming",2001,95,NA,6.8,7,14.5,0,0,0,0,14.5,24.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Second Coming of Suzanne, The",1974,90,NA,4.1,30,34.5,0,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Second Coming, The",1992,30,NA,8.2,5,0,0,0,24.5,0,0,24.5,0,0,64.5,"",0,0,0,0,0,0,1 -"Second Coming, The",1995,53,NA,4.3,7,24.5,0,14.5,24.5,0,0,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Second Cousin, Once Removed",1994,86,NA,3.8,14,24.5,0,4.5,0,4.5,14.5,0,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Second Date",1999,11,NA,7.1,14,0,0,4.5,0,14.5,14.5,0,0,4.5,45.5,"",0,0,0,0,0,1,1 -"Second Fiddle",1939,85,NA,6.6,27,0,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Second Fiddle to a Steel Guitar",1966,107,NA,7.1,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,1,0,0,0,0 -"Second Floor Mystery, The",1930,58,NA,7.4,12,0,0,0,0,4.5,24.5,34.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Second Generation",2000,80,NA,3.7,12,45.5,4.5,0,0,0,0,0,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Second Glance",1992,50,NA,3.1,37,24.5,4.5,4.5,0,0,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Second Greatest Sex, The",1955,87,NA,4.8,18,0,14.5,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Second Honeymoon",1937,84,NA,6.2,9,0,0,0,0,24.5,34.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Second Jungle Book: Mowgli & Baloo, The",1997,88,NA,4.7,113,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Second Renaissance Part I, The",2003,9,NA,7.5,704,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Second Renaissance Part II, The",2003,10,NA,7.6,653,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Second Sight",1989,83,NA,2.9,236,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Second Thoughts",1983,98,NA,3.4,11,24.5,0,0,24.5,44.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Second Time Around, The",1961,99,NA,6.3,54,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Second Time Lucky",1984,101,NA,3.5,41,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Second Victory, The",1986,95,NA,3.8,13,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Second Wind",1976,93,NA,5.2,9,0,0,14.5,0,24.5,14.5,14.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Second Woman, The",1951,91,NA,5.9,60,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Second to Die",2002,89,NA,4.3,31,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Second-Hand Hearts",1981,102,NA,5.6,18,14.5,0,0,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Seconda moglie, La",1998,122,NA,6.9,20,4.5,0,0,0,4.5,14.5,24.5,34.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Seconda volta, La",1996,80,NA,7.4,186,4.5,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Secondary High",2002,90,NA,5.6,14,0,4.5,0,4.5,4.5,0,4.5,14.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Secondhand Lions",2003,120,30000000,7.4,5543,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,1,1,0,0,0 -"Secondo Giovanni",2000,52,NA,8.7,24,4.5,0,0,0,0,0,4.5,24.5,34.5,34.5,"",0,0,1,0,0,0,0 -"Secondo Ponzio Pilato",1987,105,NA,7.3,12,0,0,0,4.5,14.5,4.5,4.5,34.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Secondo tragico Fantozzi, Il",1976,90,NA,7.8,195,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Seconds",1966,103,NA,7.5,1698,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Secret Admirer",1985,97,NA,5.7,770,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Secret Adventures of Tom Thumb, The",1993,60,NA,7.6,232,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Secret Agent",1936,86,NA,6.9,926,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Secret Agent",1943,8,NA,6.4,32,0,0,4.5,4.5,4.5,34.5,14.5,4.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Secret Agent Club, The",1996,90,NA,2.7,148,44.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",1,0,1,0,0,0,0 -"Secret Agent X-9",1937,294,NA,8.9,9,0,0,0,0,14.5,14.5,14.5,45.5,0,14.5,"",1,0,0,0,0,0,0 -"Secret Agent X-9",1945,246,NA,6.5,10,0,0,0,0,14.5,14.5,45.5,0,0,34.5,"",1,0,0,0,0,0,0 -"Secret Agent of Japan",1942,72,NA,6.3,9,0,0,0,0,24.5,24.5,14.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Secret Agent, The",1996,95,NA,5.4,382,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Secret Beyond the Door...",1948,99,615065,6.8,208,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Secret Bride, The",1934,64,NA,5.7,48,4.5,4.5,4.5,4.5,14.5,44.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Secret Ceremony",1968,109,3200000,5.4,146,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Secret Cinema, The",1968,30,5000,7.7,22,0,0,0,0,0,14.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Secret Command",1944,82,NA,7,7,0,0,14.5,14.5,14.5,0,14.5,44.5,0,0,"",1,0,0,1,0,0,0 -"Secret Diary of Sigmund Freud, The",1984,90,NA,3.1,24,24.5,4.5,14.5,4.5,4.5,24.5,4.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Secret File: Hollywood",1962,85,NA,2.4,8,24.5,24.5,24.5,14.5,14.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Secret Friends",1991,97,NA,6.5,25,4.5,0,24.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Secret Fury, The",1950,85,NA,6.6,107,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Secret Game, The",1917,67,NA,6.4,12,0,0,0,4.5,0,45.5,4.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Secret Games",1992,90,NA,4.4,85,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Secret Games 3",1995,87,NA,5.2,127,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Secret Games II (The Escort)",1993,85,NA,4.6,57,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Secret Garden, The",1949,92,NA,7.6,259,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Secret Garden, The",1993,102,NA,7,3073,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Secret Glory, The",2001,90,NA,6.2,12,0,0,14.5,0,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,1,1,0,0 -"Secret Heart, The",1946,97,NA,6.4,59,0,0,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Secret Honor",1984,90,NA,7.2,221,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Secret Invasion, The",1964,95,600000,5.7,87,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Secret Journal of Benny Travis, The",2003,29,51000,8.6,140,0,0,0,0,0,4.5,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Secret Kingdom, The",1998,90,800000,3.9,47,14.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,0,4.5,"PG",0,0,0,0,0,0,0 -"Secret Land, The",1948,71,NA,7.7,21,0,0,0,0,4.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Secret Laughter of Women, The",1999,99,NA,5.3,115,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Secret Life of Algernon, The",1997,106,NA,5.5,47,4.5,0,0,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Secret Life of Girls, The",1999,90,2500000,5,145,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Secret Life of Sergei Eisenstein, The",1987,60,NA,4.8,15,14.5,0,0,4.5,4.5,24.5,4.5,24.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Secret Life of Walter Mitty, The",1947,110,NA,7.2,710,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Secret Life of an American Wife, The",1968,92,NA,5,25,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Secret Life: Jeffrey Dahmer, The",1993,99,NA,5.8,57,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Secret Lives of Dentists, The",2002,105,NA,6.5,1253,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Secret Lives of Sock Monkeys, The",2004,2,NA,7.8,16,4.5,0,0,0,4.5,4.5,14.5,24.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Secret Lives: Hidden Children and Their Rescuers During WWII",2002,90,NA,7.1,26,0,0,0,0,0,14.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Secret Mission",1942,94,NA,5,31,4.5,4.5,4.5,24.5,14.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Secret Mission",2004,103,NA,7.2,6,14.5,0,0,0,0,0,14.5,14.5,45.5,0,"",1,0,0,0,0,0,0 -"Secret Nation",1992,110,NA,6,25,4.5,0,4.5,0,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Secret Needs",2001,90,NA,3.4,19,14.5,14.5,34.5,14.5,4.5,0,0,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Secret Paris",2000,105,NA,8.4,17,0,0,4.5,0,0,14.5,0,14.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Secret Partner, The",1961,91,NA,6.3,77,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Secret People, The",1952,96,NA,5.9,34,0,0,4.5,4.5,14.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Secret Place, The",1957,98,NA,4.7,19,0,0,4.5,24.5,14.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Secret Places",1984,98,NA,6.4,31,0,0,0,4.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Secret Places",1996,90,NA,3.2,23,14.5,14.5,14.5,24.5,4.5,0,4.5,0,4.5,14.5,"R",0,0,0,0,0,0,0 -"Secret Pleasures",1999,88,NA,2.9,56,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"R",0,0,0,1,0,0,0 -"Secret Policeman's Other Ball, The",1982,60,NA,6.5,211,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,1,0,0 -"Secret Policeman's Private Parts, The",1984,77,NA,7.1,43,0,0,4.5,0,14.5,24.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Secret Policeman's Third Ball, The",1987,96,NA,6.4,19,0,0,0,24.5,14.5,14.5,24.5,14.5,14.5,0,"",0,0,1,0,1,0,0 -"Secret Rapture, The",1993,97,NA,5.5,35,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Secret Sea, The",2002,22,NA,8.2,5,0,24.5,0,0,0,0,0,0,24.5,64.5,"",0,0,0,1,0,0,1 -"Secret Service in Darkest Africa",1943,100,NA,6.8,17,0,0,0,14.5,0,4.5,14.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Secret Service of the Air",1939,61,NA,3.6,25,24.5,4.5,4.5,4.5,4.5,24.5,24.5,0,4.5,4.5,"",1,0,0,1,0,0,0 -"Secret Sex Lives of Romeo and Juliet, The",1970,96,NA,3.5,23,14.5,4.5,14.5,14.5,0,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Secret Six, The",1931,83,NA,6.3,108,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Secret Society",2000,98,NA,4.7,66,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Secret War of Harry Frigg, The",1968,110,NA,5.8,213,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Secret Ways, The",1961,112,NA,5.3,25,0,0,0,14.5,24.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Secret Window",2004,96,40000000,6.3,13260,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Secret Witness, The",1931,66,NA,5.4,10,0,0,34.5,14.5,0,34.5,14.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Secret de banlieue",2002,90,NA,6.5,34,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Secret of Convict Lake, The",1951,83,NA,6.7,40,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Secret of Dr. Kildare, The",1939,84,NA,5.9,30,4.5,0,4.5,14.5,24.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Secret of Life on Earth, The",1993,42,NA,6.7,15,4.5,0,4.5,0,0,24.5,4.5,4.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Secret of Madame Blanche, The",1933,84,NA,5.9,17,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Secret of My Succe$s, The",1987,110,NA,6.1,4389,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Secret of My Success, The",1965,99,NA,4.8,37,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Secret of NIMH, The",1982,82,NA,7.3,4008,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,1,0,0,0 -"Secret of Navajo Cave, The",1976,87,NA,7.1,6,14.5,0,0,0,34.5,0,0,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Secret of Roan Inish, The",1994,103,NA,7.3,2080,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Secret of Santa Vittoria, The",1969,136,NA,6.7,250,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Secret of Year Six, The",2004,11,NA,8.9,7,0,0,0,0,0,0,14.5,14.5,44.5,24.5,"",0,0,0,1,0,0,1 -"Secret of the Andes",1999,95,NA,4.4,15,4.5,4.5,14.5,24.5,34.5,24.5,0,0,0,0,"PG",0,0,0,0,0,0,0 -"Secret of the Blue Room",1933,65,NA,6.7,32,0,0,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Secret of the Ice Cave, The",1989,106,NA,2.3,11,24.5,4.5,4.5,14.5,14.5,4.5,0,0,0,4.5,"",1,0,0,0,0,0,0 -"Secret of the Incas",1954,100,NA,5.6,85,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Secret of the Loch, The",1934,80,NA,5.2,13,0,0,4.5,4.5,14.5,34.5,24.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Secret of the Purple Reef, The",1960,81,86000,5.3,12,0,0,4.5,4.5,0,34.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Secret of the Sword, The",1985,100,NA,7.1,309,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,45.5,"",1,1,0,0,0,0,0 -"Secret of the Whistler, The",1946,65,NA,5.9,12,0,0,0,4.5,34.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Secret, Le",1974,102,NA,6.5,73,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Secret, Le",2000,107,NA,6.3,187,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Secret, The",1954,80,NA,4.2,8,0,0,14.5,45.5,14.5,0,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Secretary",2002,104,NA,7.2,9481,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Secreto de Esperanza, Un",2002,130,NA,6.8,25,0,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Secreto de Romelia, El",1988,100,NA,4.9,5,0,0,24.5,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,1,0 -"Secreto de los hombres azules, El",1961,87,NA,6.4,5,0,0,24.5,24.5,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Secreto del Dr. Orloff, El",1964,99,NA,4.7,55,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Secretos compartidos",1998,104,NA,5.1,31,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Secrets",1933,90,531641,6.5,16,0,0,4.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Secrets",1971,92,NA,5.1,52,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Secrets",1983,77,NA,5.2,12,0,0,14.5,0,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Secrets & Lies",1996,136,4500000,7.9,7747,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Secrets of Life",1956,70,NA,8.1,16,4.5,0,0,0,0,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Secrets of Love, The",1986,93,NA,7.2,30,4.5,0,4.5,4.5,0,4.5,4.5,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Secrets of My Heart, The",1998,96,NA,5.9,15,0,0,0,34.5,4.5,14.5,4.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Secrets of Sex",1970,91,NA,2.4,19,34.5,24.5,14.5,4.5,14.5,4.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Secrets of Silicon Valley",2001,60,NA,6.6,7,0,0,0,0,24.5,0,44.5,14.5,14.5,0,"",0,0,0,0,1,0,0 -"Secrets of a Chambermaid",1998,99,NA,5.4,68,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Secrets of a Windmill Girl",1966,86,NA,5.3,6,14.5,0,0,0,34.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Secrets of an Actress",1938,70,NA,6.1,24,0,0,0,4.5,24.5,24.5,24.5,24.5,0,4.5,"",0,0,0,1,0,1,0 -"Secrets of the City",1994,8,NA,1.4,5,44.5,44.5,0,24.5,0,0,0,0,0,0,"",0,1,0,0,0,0,1 -"Secrets of the French Police",1932,59,NA,5.1,17,0,0,4.5,14.5,24.5,24.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Secrets of the Wasteland",1941,66,NA,7.3,18,0,4.5,0,0,14.5,0,14.5,14.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Secretul armei secrete",1988,88,NA,8.2,8,14.5,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Secretul lui Bachus",1984,120,NA,9.4,15,0,0,0,0,0,4.5,14.5,0,24.5,45.5,"",1,0,1,0,0,0,0 -"Section Anderson, La",1967,65,NA,8.1,34,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Security",2003,95,NA,8.1,15,0,0,0,0,4.5,0,14.5,24.5,44.5,14.5,"",0,0,1,0,0,0,0 -"Security, Colorado",2001,93,NA,6.1,38,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sed, La",1961,91,NA,9,8,0,0,0,0,0,14.5,14.5,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Seddok, l'erede di Satana",1960,87,NA,2.7,96,14.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sedem jednou ranou",1988,88,NA,5.3,6,0,0,0,0,14.5,45.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Sedicianni",1974,95,NA,7,5,0,0,24.5,0,0,0,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Sediu yinghung tsun tsi dung sing sai tsau",1993,100,NA,6.8,134,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Sedmikrasky",1966,79,NA,7.5,233,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Sedmoy sputnik",1967,89,NA,8,11,0,0,0,0,0,4.5,4.5,45.5,24.5,0,"",0,0,0,1,0,0,0 -"Sedotta e abbandonata",1964,115,NA,7.5,121,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Seduce Me: Pamela Principle 2",1994,97,NA,3.5,62,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Seducing Maarya",1999,109,NA,4.6,27,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Seduction of Innocence",1995,101,NA,5.2,30,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,44.5,"R",0,0,0,1,0,0,0 -"Seduction of Joe Tynan, The",1979,107,NA,5.9,293,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Seduction of Lyn Carter, The",1974,76,NA,4.9,10,14.5,14.5,0,0,14.5,24.5,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Seduction, The",1982,104,NA,4,156,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Seductor, El",1995,88,NA,3.8,16,14.5,4.5,4.5,45.5,0,0,14.5,0,0,14.5,"",0,0,1,0,0,1,0 -"Seduto alla sua destra",1968,93,NA,5.9,20,0,0,0,0,24.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Seduttore, Il",1954,85,NA,6.5,6,0,0,0,0,14.5,14.5,34.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Seduzione, La",1973,99,NA,7.4,7,0,0,0,14.5,0,0,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"See Dick Die",1999,84,NA,6.6,12,4.5,0,0,0,0,4.5,4.5,0,24.5,45.5,"",0,0,0,0,0,0,0 -"See Grace Fly",2003,91,NA,6.2,26,4.5,0,4.5,4.5,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"See Here, Private Hargrove",1944,100,NA,7.2,50,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"See Jane Run",2001,90,NA,3.1,31,4.5,0,4.5,0,0,4.5,4.5,24.5,4.5,44.5,"",0,0,1,1,0,0,0 -"See No Evil, Hear No Evil",1989,103,NA,5.8,3264,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"See Spot Run",2001,94,16000000,5,1193,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"See This Movie",2005,82,NA,7,6,34.5,0,0,0,0,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"See Ya Later Gladiator",1968,6,NA,5.3,17,14.5,14.5,0,14.5,14.5,4.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"See You Off to the Edge of Town",2002,87,NA,7.7,8,0,0,0,0,0,24.5,34.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"See You in the Morning",1989,119,NA,5.5,196,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"See, Der",1996,120,NA,7,8,0,0,0,0,0,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Seed",1931,96,NA,6.7,81,0,0,4.5,4.5,4.5,14.5,45.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Seed",1997,17,NA,3,15,14.5,0,0,4.5,0,4.5,14.5,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Seed of Chucky",2004,87,12000000,5.1,1342,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Seed of Innocence",1980,91,NA,3.8,9,14.5,14.5,0,0,44.5,14.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Seedpeople",1992,87,NA,2.7,101,24.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Seeds",1968,78,NA,5,23,14.5,0,24.5,24.5,4.5,4.5,0,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Seeds of Evil",1975,97,NA,2.9,28,34.5,24.5,14.5,4.5,14.5,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Seein' Red, White 'n' Blue",1943,7,NA,7,29,0,0,4.5,4.5,0,24.5,44.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Seeing Hands",1943,11,NA,7.5,9,0,0,14.5,0,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Seeing Is Believing: Handicams, Human Rights and the News",2002,60,NA,7.7,8,0,0,0,0,0,14.5,0,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Seeing Other People",2004,90,NA,6.1,526,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Seeing Red",1939,19,NA,6.2,14,4.5,0,0,4.5,24.5,14.5,24.5,4.5,24.5,0,"",0,0,1,0,0,0,1 -"Seeing Red",1983,100,NA,5.7,19,4.5,0,0,0,24.5,14.5,14.5,0,14.5,44.5,"",0,0,0,0,1,0,0 -"Seeing Red",1992,115,NA,5.7,6,0,0,34.5,0,0,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Seeing the Light",2002,5,NA,3.1,12,14.5,4.5,14.5,0,0,0,0,0,0,45.5,"",0,0,0,1,0,0,1 -"Seekers, The",1954,90,NA,5.5,26,0,0,0,14.5,34.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Seelische Konstruktionen",1927,7,NA,8.4,14,4.5,4.5,0,0,0,0,4.5,14.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Seemabaddha",1971,110,NA,7.9,33,0,0,0,4.5,0,14.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Seems Like Old Times",1980,100,NA,6.4,1195,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Seesaw Game",1997,29,NA,5.8,6,14.5,0,0,14.5,0,34.5,34.5,0,0,0,"",0,0,0,1,0,0,1 -"Seesaw and the Shoes, The",1945,11,NA,7.1,6,0,0,0,0,14.5,14.5,0,64.5,0,0,"",0,0,0,0,0,0,1 -"Segimal",1999,102,NA,6,25,0,0,4.5,14.5,14.5,24.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Segment 76",2003,80,NA,6.6,5,24.5,0,24.5,0,0,0,0,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Segni particolari: bellissimo",1983,95,NA,4.9,35,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Segno del coyote, Il",1964,80,NA,4,5,0,24.5,64.5,0,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Segno di Venere, Il",1955,101,NA,6.5,31,4.5,0,0,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Segno di Zorro, Il",1963,90,NA,4.7,14,4.5,0,14.5,4.5,14.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Segodnya uvolneniya ne budet",1959,45,NA,6.8,22,0,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,64.5,"",0,0,0,0,0,0,1 -"Segrete esperienze di Luca e Fanny, Le",1980,82,NA,6.2,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Segreti di stato",2003,85,NA,6,19,4.5,0,0,24.5,0,14.5,44.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Segreti segreti",1985,92,NA,6.8,7,0,0,0,0,0,24.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Segreto del bosco vecchio, Il",1993,134,NA,6.1,29,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Segreto del giaguaro, Il",2000,95,NA,2.6,15,44.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Segreto, Il",1990,110,NA,3.4,7,45.5,0,0,14.5,14.5,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Segua, La",1984,102,NA,2.1,9,34.5,0,0,0,0,24.5,14.5,0,0,34.5,"",0,0,0,1,0,1,0 -"Segunda piel",2000,110,NA,6.5,344,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"R",0,0,0,1,0,1,0 -"Segundo aire, El",2001,98,NA,7.1,62,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Segundo nombre, El",2002,93,NA,5.8,249,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Segurista",1996,111,NA,5.2,18,0,4.5,0,14.5,14.5,14.5,4.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Sehnsucht der Veronika Voss, Die",1982,104,NA,7.8,525,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sei donne per l'assassino",1964,84,NA,7.4,332,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sei ju gakuen",1974,91,NA,6,51,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Seins de glace, Les",1974,105,NA,5.5,119,4.5,4.5,4.5,4.5,14.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Seis en punta, Las",1987,16,NA,5.9,9,0,0,14.5,14.5,0,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Seisaku no tsuma",1965,93,NA,8,23,0,0,4.5,4.5,0,0,14.5,34.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Seishun no kiryu",1942,87,NA,7.8,5,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Seishun no satsujin sha",1976,132,NA,7.8,14,4.5,0,0,0,14.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Seishun no yume imaizuko",1932,92,NA,7.4,16,0,0,4.5,0,0,4.5,34.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Seishun zankoku monogatari",1960,96,NA,6.9,156,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Seitenstechen",1985,88,NA,3,68,24.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Seize the Day",1986,93,NA,5.6,208,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Seizure",1974,94,NA,4.2,106,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Seja o que Deus Quiser",2002,90,NA,8.7,57,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Sekai daisenso",1961,79,NA,5.7,21,0,4.5,4.5,0,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Seksmisja",1984,117,NA,7.8,759,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Sekten",1997,87,NA,3.6,115,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sekula i njegove zene",1986,97,NA,4.5,12,24.5,0,4.5,0,0,0,24.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Selena",1997,127,20000000,6.1,2870,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Selestenje",2002,90,NA,7,13,0,4.5,0,0,0,4.5,34.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Self Control",1938,9,NA,7.2,46,0,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Self Defense",1983,84,NA,5.7,34,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,24.5,4.5,"",1,0,0,1,0,0,0 -"Self Defense... for Cowards",1962,8,NA,9.8,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,1,1,0,0,0,1 -"Self Made Maids",1950,16,NA,5.9,34,4.5,0,4.5,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Selfish Giant, The",1971,26,NA,8.1,30,0,0,0,0,0,14.5,4.5,4.5,14.5,64.5,"",0,1,0,0,0,0,1 -"Selfless, Cold and Composed",2004,19,NA,4.9,7,24.5,0,0,44.5,0,0,0,0,0,24.5,"",0,0,1,1,0,0,1 -"Seljaci",2001,86,NA,2.9,6,34.5,14.5,34.5,0,0,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Seljacka buna 1573",1975,161,NA,4.6,7,0,0,14.5,14.5,0,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Selkie",2000,88,NA,5,25,0,14.5,0,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sell Your Body Now!",1999,25,NA,6.5,6,0,0,0,0,0,14.5,14.5,0,45.5,14.5,"",0,0,0,0,0,0,1 -"Sell-Out, The",1976,88,NA,4.6,29,4.5,4.5,4.5,24.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sella d'argento",1978,100,NA,6,28,4.5,4.5,0,14.5,14.5,14.5,24.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Seller, The",1997,113,NA,5.7,32,4.5,0,4.5,4.5,0,4.5,4.5,14.5,4.5,45.5,"",0,0,1,1,0,0,0 -"Selling Wizard, The",1954,10,NA,2.2,20,34.5,44.5,14.5,14.5,0,4.5,0,0,4.5,0,"",0,0,0,0,0,0,1 -"Sellout, The",1952,83,NA,6,26,0,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Selma & Johanna - en roadmovie",1997,91,NA,5,40,4.5,4.5,14.5,14.5,14.5,34.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Selon Matthieu",2000,108,NA,6.5,125,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Selubung",1992,107,NA,9.4,6,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Selva, A",2002,105,NA,5.7,60,14.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Selvaggi",1995,120,NA,3.4,36,24.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Selvmordseksperterne",1999,35,NA,4.6,10,14.5,0,24.5,24.5,0,44.5,14.5,0,0,0,"",0,0,0,1,0,0,1 -"Selvmordsskolen",1964,86,NA,7.6,7,0,0,0,24.5,0,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Selyaninut s koleloto",1974,102,NA,8.9,9,0,0,0,0,0,14.5,24.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Sem Ela",2003,100,NA,6.4,5,0,0,0,0,0,64.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Sem Essa, Aranha",1970,102,NA,8.5,9,14.5,0,14.5,14.5,0,0,14.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Sem nevest efreytora Zbrueva",1970,97,NA,6.6,8,0,0,0,0,34.5,34.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Sem nyanek",1962,76,NA,6.8,6,0,0,0,14.5,0,0,84.5,0,0,0,"",0,0,1,0,0,0,0 -"Semana Santa",2002,91,NA,3.8,150,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Semana del asesino, La",1972,98,NA,6,92,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sembilu II",1995,122,NA,9.1,6,34.5,0,0,0,0,14.5,0,0,0,45.5,"",0,0,0,1,0,1,0 -"Seme dell'uomo, Il",1969,113,NA,4.3,12,4.5,4.5,0,4.5,24.5,0,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Semi-Tough",1977,108,NA,5.7,378,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Seminarista, El",1949,94,NA,7.7,8,0,0,0,0,0,0,64.5,0,34.5,0,"",0,0,1,0,0,0,0 -"Seminary Girls",1897,1,NA,5.7,97,4.5,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Seminole",1953,87,NA,5.7,66,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Seminole Uprising",1955,74,NA,3.6,11,4.5,4.5,44.5,14.5,4.5,0,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Semmelweis",2001,20,NA,8,7,0,0,0,0,0,14.5,0,24.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Sempre Xonxa",1990,112,NA,7.8,10,14.5,0,0,0,0,34.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Sen de Gitme",1995,107,NA,5.3,16,0,0,14.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sen no Rikyu",1989,107,NA,7.2,47,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sen noci svatojanske",1959,76,NA,8.6,24,0,0,4.5,0,0,4.5,4.5,14.5,34.5,44.5,"",0,1,0,0,0,0,0 -"Sen to Chihiro no kamikakushi",2001,125,NA,8.6,24253,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG",0,1,0,1,0,0,0 -"Senario lagi",2000,118,NA,4.7,11,14.5,4.5,4.5,0,0,0,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Senaste Nytt",1996,3,NA,8.5,13,0,0,0,0,0,0,14.5,34.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Senator Was Indiscreet, The",1947,88,NA,7,80,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Senator's Daughter, The",1979,72,NA,5.6,6,0,14.5,0,14.5,34.5,0,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Senatorul melcilor",1995,100,NA,7.9,44,4.5,0,0,4.5,0,0,24.5,14.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Senba zuru",1969,96,NA,6.2,8,0,0,0,0,0,45.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Send Me No Flowers",1964,100,NA,6.8,668,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Send Me an Angel",2003,45,NA,8.9,17,0,4.5,0,0,0,0,0,24.5,34.5,24.5,"",0,0,0,0,0,1,0 -"Sender, The",1982,91,NA,5.2,145,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sender, The",1998,98,NA,3.5,176,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Sengoku burai",1952,135,NA,8.6,7,14.5,0,0,0,0,14.5,14.5,14.5,0,44.5,"",1,0,0,1,0,0,0 -"Sengoku gunto-den",1959,115,NA,8,7,0,0,0,0,0,14.5,24.5,0,14.5,44.5,"",1,0,0,1,0,0,0 -"Sengoku jieitai",1979,85,NA,6.3,74,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Senior Prom",1958,82,NA,5.7,5,0,0,0,24.5,0,0,44.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Senior Trip",1995,91,NA,4.8,982,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Seniors, The",1978,87,NA,4.5,53,4.5,4.5,24.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Senke uspomena",2000,122,NA,6,7,14.5,14.5,0,0,14.5,0,0,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Senkrechtstarter, Die",1989,88,NA,2.1,15,64.5,14.5,0,14.5,0,0,0,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Sennen joyu",2001,87,NA,8,970,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"PG",0,1,1,1,0,1,0 -"Sennen no koi - Hikaru Genji monogatari",2002,143,NA,5.7,28,4.5,4.5,0,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sennen tabito",1999,114,NA,6.7,6,14.5,0,0,0,0,0,34.5,34.5,14.5,0,"",0,0,0,1,0,1,0 -"Senrei",1996,93,NA,5,14,14.5,0,4.5,4.5,14.5,0,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Senrigan",2000,100,NA,5.5,9,0,0,14.5,0,34.5,24.5,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Sens des affaires, Le",2000,92,NA,6.7,35,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Sens interdits",1985,88,NA,3.6,6,0,0,14.5,14.5,0,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Sensation",1995,101,NA,5.1,172,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sensation",2002,90,NA,7.6,5,0,0,0,0,0,64.5,0,0,0,44.5,"",0,0,0,0,1,0,0 -"Sensation Hunters",1933,73,NA,3.7,6,0,14.5,0,34.5,0,34.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Sensations",1975,86,250000,5.1,23,4.5,0,0,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sensations of 1945",1944,86,NA,5.5,20,0,0,0,24.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sense and Sensibility",1995,136,16500000,7.7,13904,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,1,1,0,1,0 -"Sense of Loss, A",1972,135,NA,6.9,9,0,0,0,0,14.5,24.5,0,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Senseless",1998,96,NA,5.3,1656,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Sensi",1986,89,NA,4.4,20,0,4.5,14.5,24.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Sensin - Du bist es!",1995,11,NA,7.6,8,0,0,0,0,0,0,64.5,0,0,34.5,"",0,0,0,0,0,1,1 -"Sensitive New-Age Killer",2000,88,1000000,4.2,31,14.5,4.5,0,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Senso",1954,115,NA,7.5,385,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Senso '45",2002,128,NA,5.4,104,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sensual Friends",2001,93,NA,3.7,46,14.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Sensualidad",1951,96,NA,8.6,9,0,0,0,0,0,0,24.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Sensuela",1973,104,NA,5,26,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sensuous Summer, A",1991,80,NA,3.2,13,24.5,14.5,14.5,0,14.5,0,0,0,0,34.5,"",0,0,0,1,0,1,0 -"Senta a Pua!",1999,112,NA,7.4,11,0,0,0,0,0,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Sentenza di morte",1968,90,NA,7,14,0,0,4.5,4.5,0,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sentimental Journey",1946,94,NA,6.2,58,0,0,0,4.5,4.5,14.5,14.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Sentimental Reasons",1984,90,NA,3.7,5,24.5,64.5,0,0,0,24.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Sentiments, Les",2003,94,NA,6.5,217,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Sentimientos: Mirta de Liniers a Estambul",1987,100,NA,4.7,8,0,14.5,14.5,0,14.5,34.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Sentinel 2099",1995,75,NA,6,5,24.5,24.5,0,0,0,24.5,0,0,0,44.5,"PG-13",1,0,0,1,0,0,0 -"Sentinel, The",1977,92,3700000,5.5,552,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sentinelle, La",1992,139,NA,6.2,180,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sentinelles",2000,8,NA,7.2,13,0,0,0,0,0,14.5,4.5,34.5,4.5,34.5,"",0,1,0,0,0,0,1 -"Sentinels In the Air",1956,15,NA,5.4,9,0,0,0,0,45.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"Senya ichiya monogatari",1969,128,NA,7.9,5,0,0,0,24.5,0,0,0,0,24.5,64.5,"",0,1,0,0,0,0,0 -"Senza buccia",1980,102,NA,6.5,12,0,0,0,0,4.5,34.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Senza famiglia, nullatenenti cercano affetto",1972,100,NA,4.8,7,14.5,0,0,0,14.5,24.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Senza filtro",2001,95,NA,3.6,13,34.5,0,0,4.5,34.5,0,4.5,0,0,14.5,"",1,0,1,1,0,0,0 -"Senza pelle",1994,90,NA,6.3,66,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Senza ragione",1973,89,NA,2.8,28,24.5,4.5,4.5,4.5,4.5,0,4.5,14.5,0,34.5,"",1,0,0,1,0,0,0 -"Seobe",1989,120,NA,9.2,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,0,0,1,0,0,0 -"Seom",2000,90,NA,7,1280,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Seopyeonje",1993,112,NA,8,133,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Seoul Train",2005,54,NA,6.9,9,0,0,0,0,0,14.5,34.5,24.5,0,34.5,"",0,0,0,0,1,0,0 -"Separate Peace, A",1972,104,NA,5.1,147,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Separate Tables",1958,100,NA,7.6,718,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Separate Vacations",1986,91,NA,3.9,66,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Separate Ways",1981,92,NA,3.6,10,0,0,34.5,14.5,34.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Separation Anxiety",1997,87,NA,6.6,5,0,0,0,24.5,0,0,64.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Separation, The",2003,9,NA,7,19,4.5,4.5,0,0,4.5,14.5,14.5,14.5,24.5,14.5,"",0,1,0,1,0,0,1 -"Sepet",2004,104,NA,8.6,69,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,1,0 -"Sepia Cinderella",1947,75,NA,4.7,9,14.5,0,0,0,24.5,14.5,34.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Sepolcro dei re, Il",1960,93,NA,4.9,13,0,0,4.5,14.5,34.5,14.5,0,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Seppuku",1962,135,NA,8,604,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Sept jours ailleurs",1968,100,NA,6.2,11,4.5,0,0,0,4.5,0,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Sept morts sur ordonnance",1975,100,NA,5.7,42,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Septej",1996,82,NA,6.9,49,4.5,0,0,4.5,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,0,0,0,1,0 -"September",1987,82,10000000,6.1,918,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"September",2003,109,NA,6.2,45,14.5,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"September Affair",1950,91,NA,6.7,80,0,4.5,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"September Storm",1960,99,NA,3.5,20,14.5,24.5,24.5,0,24.5,14.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"September Tapes",2004,95,NA,6.1,134,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"September in the Rain",1937,6,NA,5.3,14,0,0,0,34.5,24.5,4.5,4.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Sepuluh menit menjelang kematian",2001,5,NA,6.8,8,14.5,0,14.5,0,0,45.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Sequel, The",2003,5,NA,4.5,6,0,0,0,34.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Sequestrati di Altona, I",1962,114,NA,6.7,27,0,0,0,4.5,24.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Sequestro di persona",1968,95,NA,4.8,9,0,0,0,34.5,34.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Sequoia",1934,68,NA,7.6,14,0,0,0,0,0,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Serafino",1968,96,NA,5.2,38,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Seraglio",2000,14,NA,6.8,34,14.5,4.5,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,1,1 -"Serdtsa chetyryokh",1941,88,NA,8.8,18,0,0,0,0,0,14.5,14.5,4.5,14.5,45.5,"",0,0,1,0,0,1,0 -"Serena",1962,60,NA,6.2,8,0,0,0,14.5,0,24.5,34.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Serenade",1937,110,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Serenade",1956,121,NA,5.2,62,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Serenades",2001,99,NA,6,21,4.5,0,0,0,4.5,24.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Serenal",1959,4,NA,7.8,6,0,0,0,0,0,14.5,14.5,45.5,0,14.5,"",0,0,0,0,0,0,1 -"Serendipity",2001,90,28000000,6.6,10795,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Serene Velocity",1970,23,NA,6.7,27,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Serengeti Symphony",1998,82,NA,6.8,21,0,0,0,0,0,14.5,14.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Serengeti darf nicht sterben",1959,85,NA,8.4,58,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Seres humanos",2002,80,NA,5.7,14,4.5,14.5,0,14.5,0,0,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Seres queridos",2004,93,NA,6.8,57,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Sergeant Dead Head",1965,90,NA,3.9,21,24.5,4.5,14.5,4.5,24.5,0,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Sergeant Madden",1939,80,NA,6.1,25,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Sergeant Murphy",1938,57,NA,3.1,31,24.5,14.5,4.5,14.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,1,1,0,0,0 -"Sergeant Pepper",2004,98,NA,6.4,11,0,4.5,14.5,0,0,0,14.5,0,24.5,24.5,"",0,0,0,1,0,1,0 -"Sergeant Rutledge",1960,111,NA,7.2,403,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sergeant Ryker",1968,85,NA,6.5,46,0,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sergeant York",1941,134,1400000,7.9,2239,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sergeant, The",1968,108,NA,5.4,70,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sergeants 3",1962,112,NA,6.1,147,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Sergei Eisenstein. Avtobiografiya",1996,90,NA,6,13,0,24.5,0,0,0,14.5,44.5,4.5,4.5,0,"",0,0,0,0,1,0,0 -"Sergei Eisenstein. Meksikanskaya fantasiya",1998,100,NA,3.9,11,14.5,0,0,14.5,0,0,0,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Sergente Rompiglioni, Il",1973,93,NA,3.8,7,14.5,14.5,14.5,0,14.5,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Sergio Lapel's Drawing Blood",1999,90,NA,3.7,31,14.5,14.5,4.5,4.5,14.5,24.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Serial",1980,86,NA,6.5,235,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Serial Killer",1995,94,NA,5.2,84,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Serial Killer, O",2004,23,NA,6.5,11,34.5,0,0,0,0,0,0,4.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Serial Killing 4 Dummys",2004,83,NA,4.7,105,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Serial Lover",1998,85,NA,7.2,459,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Serial Metaphysics",1972,20,NA,5.2,8,45.5,0,0,0,0,0,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Serial Mom",1994,95,13000000,6.3,4750,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Series 7: The Contenders",2001,86,NA,6.7,2253,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Series of Small Things, A",2005,23,15000,8.4,7,0,14.5,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Serious Charge",1959,99,NA,7.2,8,0,0,0,0,0,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Serp i molot",1994,93,NA,6.9,11,0,0,4.5,0,0,4.5,44.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Serpent Island",1954,62,NA,1,12,64.5,0,0,0,0,4.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Serpent and the Rainbow, The",1988,98,7000000,5.9,2166,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Serpent of Death, The",1989,98,NA,4.7,25,0,14.5,24.5,4.5,24.5,24.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Serpent of the Nile",1953,81,NA,4,19,0,14.5,14.5,24.5,14.5,14.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Serpent's Egg, The",1977,119,NA,5.8,352,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Serpent's Kiss, The",1997,104,13000000,5.3,368,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Serpent's Lair",1995,90,4000000,4.1,118,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Serpent, Le",1973,113,NA,5.9,98,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Serpico",1973,129,NA,7.5,6327,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Serpientes y escaleras",1992,95,NA,4.1,8,0,24.5,14.5,24.5,0,14.5,14.5,0,14.5,0,"",0,0,0,1,0,1,0 -"Serva Padrona, La",1998,70,NA,8.5,30,0,0,0,0,14.5,4.5,4.5,24.5,44.5,14.5,"",0,0,1,0,0,0,0 -"Servant of Mankind",1940,9,NA,5.5,10,14.5,0,0,14.5,24.5,14.5,34.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Servant, The",1963,112,NA,7.7,687,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Servants of Twilight, The",1991,95,NA,4.7,139,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Service de Luxe",1938,85,NA,7.3,6,0,0,0,0,14.5,0,45.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Service with the Colors",1940,21,NA,5.6,5,0,24.5,0,24.5,0,24.5,44.5,0,0,0,"",0,0,0,1,0,0,1 -"Serving Sara",2002,99,29000000,4.6,2990,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Servus Bayern",1977,84,NA,6.8,6,0,34.5,0,0,0,0,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Serye volki",1993,115,NA,5.5,19,14.5,0,0,4.5,14.5,14.5,44.5,4.5,4.5,0,"",1,0,0,0,0,0,0 -"Seryi volk & Krasnaya Shapochka",1990,27,NA,8.8,18,0,4.5,0,0,0,4.5,4.5,14.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Seryozha",1960,80,NA,8.5,17,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Sesame Street Presents: Follow that Bird",1985,88,NA,6.1,603,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Session 9",2001,97,1500000,6.6,3718,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Sesso e volentieri",1982,105,NA,5,6,14.5,0,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Sesso nero",1980,79,NA,8.3,6,0,0,0,0,0,0,34.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Sessomatto",1973,97,NA,5,34,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Sest dana juna",1985,90,NA,6.1,7,14.5,0,0,0,24.5,24.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Sest medvedu s Cibulkou",1972,90,NA,6.9,22,0,0,0,4.5,0,34.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Sesta brzina",1981,104,NA,4.4,10,14.5,0,0,14.5,0,0,24.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Sestricky",1983,85,NA,7.2,27,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Set It Off",1996,123,9000000,6.1,1619,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Set Set Spike",2002,6,NA,5.3,14,0,14.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Set Up, The",1995,93,NA,4.3,162,34.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Set-Up, The",1949,72,NA,8,601,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Set-Up, The",1978,17,NA,5.7,6,14.5,0,14.5,0,14.5,0,14.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Sete Gatinhos, Os",1980,109,NA,5.5,34,4.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Sete Vampiras, As",1986,100,NA,3.8,21,4.5,4.5,4.5,4.5,14.5,0,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Setenta veces siete",1962,92,NA,7.4,11,0,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Setenta veces siete",1968,90,NA,7.1,6,0,0,0,0,0,14.5,14.5,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Seth",1999,52,NA,6,22,0,0,4.5,4.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sethu",1999,180,NA,8.5,10,0,0,14.5,0,0,0,0,24.5,44.5,34.5,"",0,0,0,0,0,0,0 -"Setouchi munraito serenade",1997,110,NA,4.4,7,24.5,0,0,0,14.5,0,0,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Setouchi shonen yakyu dan",1984,143,NA,7,39,0,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Setta, La",1991,112,2000000,5.7,184,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sette contro la morte",1964,94,NA,6.8,25,4.5,0,0,0,4.5,34.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Sette di Marsa Matruh, I",1969,100,NA,3.8,12,4.5,4.5,0,14.5,14.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Sette dollari sul rosso",1966,95,NA,5,5,0,0,24.5,0,0,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Sette donne per i MacGregor",1967,90,NA,3.1,7,14.5,0,0,0,14.5,44.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Sette folgori di Assur, Le",1962,88,NA,5,5,24.5,0,24.5,0,0,64.5,0,0,0,0,"",1,0,0,1,0,0,0 -"Sette magnifiche pistole",1966,100,NA,1.3,8,34.5,14.5,0,0,0,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Sette nani alla riscossa, I",1951,84,NA,3.6,9,14.5,14.5,0,14.5,34.5,0,24.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Sette note in nero",1977,90,NA,6.2,119,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sette orchidee macchiate di rosso",1972,88,NA,6.7,111,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sette ore di guai",1951,84,NA,5.9,10,0,0,0,14.5,24.5,24.5,34.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Sette pistole per i MacGregor",1966,107,NA,2.7,9,14.5,0,14.5,34.5,14.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Sette scialli di seta gialla",1972,90,NA,5.4,16,0,0,0,14.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sette uomini d'oro",1965,95,NA,7.1,37,0,0,0,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Sette uomini d'oro nello spazio",1979,103,NA,3.1,27,44.5,14.5,4.5,0,4.5,4.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Sette uomini e un cervello",1968,106,NA,6.7,7,0,0,0,14.5,24.5,0,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Sette volte sette",1968,92,NA,6,30,0,0,0,14.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sette winchester per un massacro",1968,98,NA,5.2,18,0,0,4.5,14.5,34.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Settima donna, La",1978,86,NA,5.1,18,0,0,14.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Settimana della sfinge, La",1990,105,NA,6,22,0,0,0,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Setting Son, The",1997,95,NA,7,10,14.5,0,0,0,0,14.5,44.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Settlement, The",1983,91,NA,4,7,44.5,0,0,45.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Settlement, The",1999,101,NA,5.4,90,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Seul contre tous",1998,89,NA,7,1046,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Seule",1997,34,NA,7.8,31,4.5,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Seunlau ngaklau",2000,113,NA,6.8,1283,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Seven",1979,100,NA,5.3,213,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Seven Ages",1906,5,NA,4.6,5,24.5,0,0,0,0,64.5,24.5,0,0,0,"",0,0,0,1,0,0,1 -"Seven Alone",1974,97,NA,4.8,42,14.5,14.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Seven Angry Men",1955,90,NA,6.6,44,0,0,4.5,0,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Seven Brides for Seven Brothers",1954,102,NA,7.2,3068,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Seven Chances",1925,56,NA,7.9,545,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Seven Cities of Gold",1955,103,NA,5.3,35,0,4.5,4.5,14.5,34.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Seven Crows a Secret",1994,29,NA,8.4,5,0,0,0,24.5,0,0,0,0,44.5,44.5,"",0,0,0,0,1,0,1 -"Seven Days Ashore",1944,74,NA,5.4,20,0,0,14.5,14.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Seven Days in May",1964,118,2200000,7.8,1960,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Seven Days to Live",2000,96,NA,5.2,448,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Seven Days to Noon",1950,94,NA,7.1,108,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Seven Days' Leave",1930,80,NA,7.1,5,0,0,0,0,24.5,0,64.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Seven Days' Leave",1942,87,NA,5.7,38,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Seven Doors to Death",1944,64,NA,4.4,9,0,14.5,0,24.5,24.5,14.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Seven Footprints to Satan",1929,77,NA,7.5,20,0,0,0,0,4.5,14.5,14.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Seven Gates",1997,20,NA,5.6,17,0,4.5,14.5,0,14.5,34.5,24.5,0,0,0,"",0,0,1,0,0,0,1 -"Seven Girlfriends",1999,99,NA,5.7,318,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Seven Hours to Burn",2000,9,NA,7.3,11,0,0,14.5,0,0,14.5,14.5,34.5,0,4.5,"",0,0,0,0,1,0,1 -"Seven Hours to Judgment",1988,90,NA,4.5,55,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Seven Into Snowy",1977,79,NA,6.5,12,0,0,0,0,4.5,14.5,45.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Seven Keys to Baldpate",1929,72,NA,7,9,14.5,0,0,14.5,24.5,0,24.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Seven Keys to Baldpate",1935,80,NA,7.1,23,4.5,0,4.5,4.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Seven Keys to Baldpate",1947,64,NA,5.3,29,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Seven Little Foys, The",1955,93,NA,6.5,265,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Seven Men from Now",1956,78,NA,6.2,97,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Seven Miles from Alcatraz",1942,62,NA,5.3,32,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Seven Minutes in Heaven",1985,88,NA,5.9,223,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Seven Minutes, The",1971,115,NA,3.8,67,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Seven Nights in Japan",1976,104,NA,5.5,19,0,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Seven Secrets of Sumuru, The",1969,94,NA,4.6,56,14.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Seven Servants",1996,88,NA,4,15,14.5,4.5,0,14.5,0,0,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Seven Sinners",1936,67,NA,6.4,22,0,0,4.5,4.5,4.5,34.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Seven Sinners",1940,87,760000,6.4,171,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Seven Songs for Malcolm X",1993,52,NA,1.8,14,45.5,14.5,4.5,0,0,4.5,4.5,0,0,4.5,"",0,0,0,0,1,0,0 -"Seven Spiritual Laws of Sex, The",1999,84,NA,7.4,5,0,0,24.5,0,0,24.5,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Seven Storeys",2000,25,NA,6.2,5,0,0,0,0,44.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,1 -"Seven Sweethearts",1942,98,NA,6.3,50,4.5,0,0,4.5,4.5,34.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Seven Thieves",1960,102,NA,6.5,113,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Seven Thunders",1957,100,NA,6.4,13,0,0,0,0,14.5,24.5,45.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Seven Times Lucky",2004,85,NA,4.6,66,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Seven Waves Away",1957,97,NA,7.6,201,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Seven Ways from Sundown",1960,96,NA,6.6,50,4.5,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Seven Women from Hell, The",1961,88,NA,4.8,18,4.5,4.5,14.5,24.5,24.5,4.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Seven Wonders of the World",1956,106,NA,6.9,17,0,0,0,4.5,4.5,14.5,14.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Seven Year Itch, The",1955,105,3200000,7.2,3211,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Seven Years Bad Luck",1921,65,NA,8.2,40,0,0,0,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Seven Years in Tibet",1997,139,70000000,6.6,9426,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Seven-Per-Cent Solution, The",1976,113,NA,6.8,631,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Seven-Ups, The",1973,103,NA,6.2,346,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Seventeen",1983,120,NA,2.8,18,4.5,4.5,0,0,4.5,0,0,14.5,14.5,64.5,"",0,0,0,0,1,0,0 -"Seventeen Again",2000,97,NA,4.4,135,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Seventeen Years to Earth",1998,23,NA,6.8,6,34.5,0,0,0,0,14.5,14.5,0,0,34.5,"",0,0,0,0,0,0,1 -"Seventh Coin, The",1993,92,900000,4,58,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Seventh Cross, The",1944,110,NA,7.2,311,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Seventh Heaven",1927,110,NA,7.9,115,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Seventh Heaven",1937,102,NA,6,73,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Seventh Nocturne, The",1997,8,NA,9,16,4.5,0,0,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Seventh Sign, The",1988,97,NA,5.8,2866,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Seventh Sin, The",1957,94,NA,6.3,18,0,0,0,0,24.5,24.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Seventh Veil, The",1946,90,NA,7.2,155,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Seventh Victim, The",1943,71,NA,6.8,304,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Seventy",2003,8,NA,8.6,25,0,0,0,0,4.5,0,24.5,24.5,24.5,24.5,"",0,0,1,1,0,0,1 -"Severe Injuries",2003,64,NA,5,22,34.5,4.5,4.5,0,4.5,0,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Severed Arm, The",1973,89,NA,3.2,71,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Severed Head, A",1970,98,NA,4.9,21,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Severed Ties",1992,92,NA,3.1,69,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Severnoye siyaniye",2001,93,NA,9,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Sevillanas",1992,53,NA,7.4,29,4.5,0,4.5,0,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Sewing Circle",1992,7,NA,6,27,4.5,0,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Sewing Woman",1983,14,NA,5.3,5,0,0,0,0,24.5,44.5,0,0,24.5,24.5,"",0,0,0,0,1,0,1 -"Sex",1920,87,NA,8.7,30,14.5,4.5,4.5,0,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Sex",1993,69,NA,6.4,21,4.5,4.5,0,0,4.5,24.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Sex & the Other Man",1995,89,NA,4.1,172,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Sex 2",1993,85,NA,6.1,9,14.5,0,0,14.5,0,0,14.5,14.5,0,45.5,"",0,0,1,0,0,0,0 -"Sex Appeal",1986,81,NA,3.8,30,14.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Sex Boat",1981,80,NA,5,47,4.5,0,0,4.5,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Sex Commandos",1999,114,NA,5,37,4.5,0,4.5,14.5,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Sex Derby",1987,90,NA,5.4,5,24.5,24.5,0,24.5,0,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Sex Drive",2003,88,NA,8.2,5,0,0,0,0,24.5,0,0,44.5,0,44.5,"",0,0,1,0,0,0,0 -"Sex Files: Alien Erotica",1999,99,NA,5,114,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Sex Files: Alien Erotica II",2000,80,NA,3.2,72,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sex Files: Ancient Desires",2000,86,NA,3.3,46,24.5,4.5,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Sex Files: Creating the Perfect Man",2000,83,NA,3.3,32,14.5,4.5,14.5,24.5,4.5,0,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sex Files: Digital Sex",1998,78,NA,3,22,34.5,24.5,4.5,14.5,4.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Sex Files: Erotic Possessions",2000,77,NA,2.3,31,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sex Files: Pleasure World",1998,89,NA,3.5,19,24.5,14.5,14.5,4.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Sex Files: Pleasureville",1999,79,NA,3.5,48,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sex Files: Portrait of the Soul",1999,90,NA,3.8,17,44.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Sex Files: Sexecutioner",1998,88,NA,3.6,29,14.5,14.5,14.5,14.5,14.5,0,4.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Sex Files: Sexual Matrix",1999,79,NA,3.2,52,24.5,4.5,14.5,14.5,24.5,4.5,0,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Sex Files: Sexually Bewitched",2000,80,NA,3.1,43,14.5,4.5,4.5,4.5,14.5,14.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sex Files: Sin in the City",2001,84,NA,3,33,24.5,4.5,14.5,14.5,0,0,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sex Hygiene",1942,30,NA,3,18,34.5,14.5,0,4.5,14.5,0,14.5,0,4.5,14.5,"",0,0,0,0,1,0,1 -"Sex Is Comedy",2002,94,NA,6,406,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Sex Is...",1993,82,NA,5.3,52,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Sex Killer, The",1967,55,NA,3.9,18,14.5,0,24.5,0,34.5,14.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Sex Kittens Go to College",1960,94,NA,3.8,47,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sex Life of the Polyp, The",1928,11,NA,7.7,10,14.5,0,0,14.5,0,24.5,14.5,0,24.5,34.5,"",0,0,1,0,0,0,1 -"Sex Lives of the Potato Men",2004,83,NA,3.5,302,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sex Madness",1938,57,NA,2.9,30,4.5,14.5,44.5,14.5,14.5,4.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sex Monster, The",1999,97,NA,5.2,632,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Sex Perils of Paulette, The",1965,72,NA,1.2,7,44.5,0,14.5,0,0,0,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Sex Rituals of the Occult",1970,30,NA,5.2,6,0,34.5,34.5,0,0,0,14.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Sex Sells: The Making of Touche",2005,96,NA,4.7,73,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Sex Thief, The",1973,89,NA,5.5,21,4.5,0,4.5,4.5,34.5,24.5,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Sex Trek: The Next Penetration",1990,75,NA,6.3,47,14.5,0,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Sex Under Glass",1992,85,NA,5.7,16,24.5,0,0,14.5,0,0,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Sex Wars",1985,81,NA,5.5,14,14.5,4.5,0,4.5,4.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Sex Wish",1976,80,NA,3.5,11,24.5,0,0,14.5,4.5,14.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Sex World",1977,90,NA,6,52,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sex and Buttered Popcorn",1989,70,NA,6.7,19,14.5,0,0,4.5,0,14.5,24.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Sex and Violence",1997,8,NA,7.7,39,0,0,0,0,0,14.5,14.5,44.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Sex and the Other Woman",1980,88,NA,1.9,6,14.5,0,34.5,0,14.5,14.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Sex and the Single Girl",1964,110,NA,6.1,384,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Sex and the Single Vampire",1970,27,NA,4,13,34.5,4.5,4.5,4.5,4.5,0,4.5,4.5,0,14.5,"",0,0,1,0,0,0,1 -"Sex with Strangers",2002,105,NA,4.3,60,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,1,0,0 -"Sex with the Stars",1980,92,NA,3.6,17,14.5,4.5,14.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sex, Blood and Mutilation",1995,40,NA,6.2,6,0,0,0,0,14.5,0,34.5,0,0,45.5,"",0,0,0,0,1,0,1 -"Sex, Drugs & Democracy",1994,87,NA,5.6,37,4.5,0,0,4.5,4.5,24.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Sex, Drugs, Rock & Roll",1991,96,NA,6.2,47,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,24.5,"",0,0,1,1,1,0,0 -"Sex, Lies, and Videotape",1989,100,1200000,7.1,7461,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sex, Politics & Cocktails",2002,90,NA,2.8,29,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Sex/Life in L.A.",1998,91,NA,5.6,29,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Sex: Female",2003,70,NA,6,16,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,0,"",0,0,0,0,1,0,0 -"Sex: The Annabel Chong Story",1999,86,NA,5.4,443,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Sexabenteuer der drei Musketiere, Die",1971,79,NA,1.9,14,44.5,24.5,0,4.5,24.5,0,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Sexbomb",1989,86,NA,2.9,14,4.5,24.5,14.5,4.5,4.5,0,0,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sexcapades",1983,85,NA,3.5,14,0,14.5,4.5,0,4.5,0,44.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Sexe des anges, Le",1977,40,NA,7.2,6,0,0,0,0,0,14.5,0,45.5,34.5,0,"",0,0,0,0,0,0,1 -"Sexe qui parle, Le",1975,70,NA,5.7,29,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sexo & Beethoven - O Reencontro",1997,16,NA,6,5,0,0,0,44.5,0,24.5,24.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Sexo con amor",2003,90,NA,7.2,245,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Sexo oral",1994,114,NA,5.1,27,14.5,0,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Sexokynigos, O",1981,106,NA,3.8,7,14.5,14.5,14.5,0,0,0,0,14.5,0,44.5,"",0,0,1,1,0,0,0 -"Sexperiment, The",1998,102,NA,3.8,34,14.5,0,14.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Sexplorer",1975,82,NA,2.5,11,24.5,0,0,4.5,4.5,4.5,0,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Sexpot",1988,95,NA,3.5,6,45.5,0,14.5,0,14.5,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Sextette",1978,91,NA,2.9,207,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sexton Blake and the Hooded Terror",1938,70,NA,3.5,9,0,34.5,14.5,14.5,14.5,0,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Sexual Boundaries",2005,90,NA,6.2,7,0,0,0,44.5,0,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Sexual Ecstasy of the Macumba",1975,85,NA,9.5,13,4.5,4.5,4.5,0,0,0,0,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Sexual Impulse",1997,95,NA,2.3,6,14.5,14.5,0,0,0,14.5,0,0,34.5,14.5,"R",0,0,0,0,0,0,0 -"Sexual Intent",1994,88,NA,3.7,18,24.5,4.5,24.5,14.5,14.5,4.5,4.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Sexual Malice",1994,96,NA,3.4,90,14.5,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sexual Outlaws",1994,87,NA,3.7,46,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sexual Response",1992,90,NA,3.9,121,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sexual Roulette",1996,80,NA,3.1,55,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sexy",2002,10,NA,2.5,7,24.5,14.5,14.5,0,0,0,0,24.5,14.5,0,"",0,0,1,0,0,0,1 -"Sexy Beast",2000,89,NA,7,7462,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Sexy Boys",2001,90,NA,3.9,198,14.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sexy Chef, The",2002,81,NA,6.9,9,0,14.5,0,14.5,0,0,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Sexy Sadie",1996,92,NA,6.2,69,4.5,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Sexy Secrets of the Kiss-o-gram Girls, The",1986,88,NA,6.2,6,34.5,0,0,0,0,0,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Seytan",1974,101,NA,5.2,49,14.5,4.5,4.5,0,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Seyyit Han",1968,78,NA,6,6,0,0,0,0,34.5,0,34.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Sezon na leszcza",2001,100,NA,4.6,35,14.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Sezona mira u Parizu",1981,102,NA,7.1,6,0,0,0,0,0,14.5,34.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Sezonat na kanarchetata",1993,128,NA,6.4,31,4.5,0,0,0,0,14.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Sfagi tou kokora, I",1996,146,NA,6.3,15,24.5,0,4.5,24.5,0,4.5,4.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Sfaires den gyrizoun piso, Oi",1967,116,NA,7.5,44,4.5,0,0,0,0,0,24.5,74.5,0,4.5,"",0,0,0,1,0,0,0 -"Sfida dei MacKenna, La",1970,81,NA,4.1,10,0,0,34.5,14.5,0,14.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Sfida dei giganti, La",1965,90,NA,6.4,9,14.5,0,0,14.5,14.5,34.5,14.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Sfinge d'oro, La",1967,91,NA,5,13,0,14.5,4.5,4.5,24.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Sfora - Bez litosci",2002,120,NA,5.4,25,34.5,0,0,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sgt. Bilko",1996,93,39000000,5.1,3712,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Sgt. Kabukiman N.Y.P.D.",1991,105,NA,4.8,349,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Sgt. Pepper's Lonely Hearts Club Band",1978,113,18000000,3.6,1419,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sguardo di Michelangelo, Lo",2004,15,NA,6.2,9,14.5,14.5,0,0,14.5,14.5,0,14.5,0,44.5,"",0,0,0,0,1,0,1 -"Sh! The Octopus",1937,54,NA,5.4,28,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sh'Chur",1994,100,700000,6.7,18,14.5,0,4.5,14.5,0,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sha sha ren, tiao tiao miu",1998,92,NA,5.6,85,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Shaam-e-akhar",2002,96,NA,5.6,7,14.5,0,0,0,14.5,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Shaan",1980,181,NA,7.6,79,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Shabab imra'a",1956,126,NA,7.7,6,0,0,0,0,0,14.5,14.5,0,64.5,0,"",0,0,0,0,0,0,0 -"Shabhaye roshan",2003,105,NA,8.3,7,0,0,0,0,0,24.5,0,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Shablul",1971,80,NA,6.9,6,14.5,0,0,0,0,0,14.5,34.5,14.5,14.5,"",0,0,1,1,1,0,0 -"Shabondama Elegy",1999,85,NA,4.3,64,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Shack Out on 101",1955,80,NA,6.5,55,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shackleton's Antarctic Adventure",2001,40,NA,8.1,138,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Shacky Carmine",1999,110,NA,4.2,14,24.5,0,4.5,14.5,24.5,0,4.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Shade",2003,101,6800000,6.5,1616,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Shade, The",1999,83,NA,5.5,34,4.5,4.5,0,4.5,4.5,24.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Shades",1999,93,NA,4.9,127,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Shades",2004,4,NA,9.9,11,0,0,0,0,0,0,0,0,4.5,94.5,"",0,0,0,1,0,0,1 -"Shades of Crimson",2005,12,NA,8.6,11,4.5,0,0,4.5,0,0,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Shades of Darkness",2000,88,NA,2.6,27,34.5,14.5,14.5,4.5,0,4.5,4.5,0,0,4.5,"PG-13",0,0,0,0,0,0,0 -"Shadey",1985,90,NA,3.9,27,0,14.5,24.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Shadow Boxers",1999,72,NA,6.3,36,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Shadow Boxing",1993,15,NA,7.9,29,0,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Shadow Builder",1998,120,NA,4.5,347,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Shadow Conspiracy",1997,103,45000000,4.5,1078,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Shadow Dancer",1997,89,NA,2.1,22,34.5,14.5,0,4.5,24.5,14.5,4.5,0,0,4.5,"R",0,0,0,0,0,0,0 -"Shadow Dancing",1988,100,NA,3.8,15,14.5,14.5,14.5,24.5,4.5,4.5,0,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Shadow Force",1993,80,NA,4.6,13,0,14.5,4.5,0,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shadow Fury",2001,89,NA,3.1,77,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,24.5,"R",1,0,0,0,0,0,0 -"Shadow Glories",2001,107,NA,6.4,58,14.5,0,4.5,4.5,4.5,4.5,0,4.5,14.5,45.5,"R",0,0,0,0,0,0,0 -"Shadow Hours",2000,95,NA,5.2,240,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Shadow Magic",2000,115,NA,7.3,277,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"PG",0,0,0,1,0,1,0 -"Shadow Men, The",1998,95,NA,3.7,249,24.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Shadow Play",1986,101,NA,3.4,15,4.5,4.5,24.5,4.5,14.5,24.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Shadow Play: Indonesia's Year of Living Dangerously",2002,79,NA,7,5,0,0,0,0,24.5,0,44.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Shadow Puppets",1994,12,NA,6.1,6,0,0,0,0,0,14.5,0,14.5,0,64.5,"",0,1,0,0,0,0,1 -"Shadow Ranch",1930,64,NA,7,7,0,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Shadow Returns, The",1946,61,NA,5.6,9,0,0,0,24.5,24.5,0,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Shadow Run",1998,94,NA,5.2,73,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shadow Skill",1995,50,NA,4.6,61,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,1,0,0,0,0,0 -"Shadow Strikes, The",1937,61,NA,4.7,24,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shadow Valley",1947,59,NA,5.2,9,14.5,0,14.5,24.5,14.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Shadow Warriors",1992,82,NA,2.7,5,44.5,0,0,0,0,0,0,0,0,64.5,"",1,0,0,0,0,0,0 -"Shadow Warriors",1996,89,NA,2.4,24,24.5,4.5,4.5,0,4.5,14.5,0,4.5,0,34.5,"R",0,0,0,0,0,0,0 -"Shadow in the Sky",1952,78,NA,6.5,29,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Shadow of Chikara, The",1977,114,NA,4.6,31,14.5,0,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shadow of China",1990,121,NA,6.3,28,0,0,4.5,4.5,14.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shadow of Doubt",1935,74,NA,5.9,25,0,4.5,0,4.5,24.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Shadow of Doubt",1998,103,NA,5.2,428,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Shadow of Fear",1963,60,NA,6,7,0,14.5,0,14.5,14.5,0,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Shadow of Fear",2004,88,NA,5,110,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Shadow of a Doubt",1943,108,NA,8.1,5680,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Shadow of a Drought",1999,15,NA,6.1,21,0,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Shadow of a Woman",1946,78,NA,5.9,44,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shadow of the Cat",1961,79,NA,5.9,18,0,4.5,0,4.5,14.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shadow of the Eagle, The",1932,218,NA,3.8,36,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shadow of the Hawk",1976,92,NA,4.8,48,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Shadow of the Thin Man",1941,97,NA,7.1,532,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Shadow of the Vampire",2000,87,8000000,6.8,8366,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Shadow of the Wolf",1992,112,NA,4.7,137,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shadow on the Wall",1950,84,NA,6.9,66,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shadow on the Window, The",1957,76,NA,5.8,17,0,0,14.5,14.5,14.5,14.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Shadow, The",1940,285,NA,6.1,30,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Shadow, The",1994,108,40000000,5.2,3386,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Shadowlands",1993,131,NA,7.4,4085,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Shadowlands",2003,91,500000,1.1,14,74.5,4.5,0,0,0,0,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Shadowman",1988,96,NA,4.4,14,0,0,4.5,0,14.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Shadowman",2001,19,NA,5.7,6,0,0,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Shadowplay",2002,15,NA,8.6,10,0,0,0,14.5,0,0,24.5,0,24.5,45.5,"",0,1,0,0,0,0,1 -"Shadows",1922,70,NA,6.7,41,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Shadows",1959,87,NA,7.3,612,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shadows",2000,24,NA,5.3,8,14.5,14.5,0,0,0,14.5,0,0,34.5,24.5,"",0,0,0,1,0,0,1 -"Shadows",2004,27,NA,7.8,9,14.5,0,0,0,0,0,14.5,34.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Shadows Over Chinatown",1946,64,75000,6,24,4.5,0,0,4.5,14.5,24.5,4.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Shadows and Fog",1992,85,14000000,6.3,2303,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Shadows in the Night",1944,67,NA,5.8,5,0,0,0,0,24.5,24.5,0,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Shadows on the Sage",1942,55,NA,3.5,6,0,34.5,0,0,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Shadows on the Stairs",1941,64,NA,5,43,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shadows on the Wall",1986,97,NA,5,5,0,0,0,24.5,0,0,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Shadowscan",2001,11,NA,6,11,24.5,0,0,4.5,0,4.5,4.5,0,34.5,4.5,"",0,0,0,0,0,0,1 -"Shadowzone",1990,88,NA,4.2,124,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shadrach",1998,98,NA,6.3,325,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Shaft",1971,100,1125000,6.5,2923,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Shaft",2000,99,46000000,6,13742,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Shaft in Africa",1973,112,NA,5.6,475,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Shaft of Light",1996,9,NA,7.1,10,0,0,0,0,0,14.5,14.5,34.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Shaft's Big Score!",1972,104,NA,6.1,454,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Shafted!",2000,90,NA,5.1,33,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,34.5,"R",0,0,0,0,0,0,0 -"Shag",1988,111,NA,5.1,10,0,0,0,14.5,24.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Shag",1989,98,NA,5.7,822,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Shag Carpet Sunset",2002,80,NA,7,5,0,24.5,0,0,24.5,0,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Shaggy D.A., The",1976,91,NA,5.2,314,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Shaggy Dog, The",1959,104,NA,6.3,455,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Shah-re ziba",2004,105,NA,8.1,45,0,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Shaka",1961,139,NA,6.8,5,0,0,0,0,0,84.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Shake Hands with the Devil",1959,111,NA,6.2,133,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shake!: Otis at Monterey",1987,19,NA,8.6,26,0,0,0,0,4.5,4.5,14.5,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Shake, Rattle & Rock!",1956,72,79000,5.1,27,0,14.5,14.5,4.5,24.5,4.5,24.5,0,4.5,4.5,"",0,0,1,1,0,0,0 -"Shakedown",1950,80,NA,7.8,20,0,0,0,0,0,14.5,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Shakedown",1988,93,NA,5.1,348,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Shakedown, The",1929,70,NA,5.4,13,14.5,0,0,4.5,0,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Shakedown, The",1959,92,NA,5.2,16,0,0,0,34.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shaker Run",1985,91,NA,5.2,28,4.5,0,0,24.5,14.5,4.5,14.5,4.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Shakers: Hands to Work, Hearts to God, The",1984,57,NA,7.5,34,4.5,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Shakes the Clown",1992,87,1400000,5.5,838,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Shakespeare in Love",1998,122,25000000,7.5,41999,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Shakespeare's Children",1996,50,100000,5.1,12,4.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Shakespeare's Dilemma",2003,38,0,8,8,0,0,0,14.5,0,0,0,45.5,0,34.5,"",0,0,0,0,0,0,1 -"Shakespeare-Wallah",1965,120,NA,6.6,81,4.5,0,0,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Shakespearian Spinach",1940,6,NA,5.4,13,0,0,24.5,0,14.5,34.5,0,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Shakha Proshakha",1990,130,NA,6.5,34,4.5,4.5,0,0,4.5,14.5,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Shakhmatnaya goryachka",1925,28,NA,7,90,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Shakiest Gun in the West, The",1968,101,NA,5.7,243,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Shakma",1990,101,NA,4.4,132,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Shakti",1982,166,NA,8.5,104,4.5,4.5,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",1,0,0,1,0,0,0 -"Shakti: The Power",2002,170,NA,6.9,114,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Shalako",1968,113,1455000,5.2,287,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shalimar",1978,85,NA,5.9,60,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Shall We Dance",1937,109,991000,7.6,603,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Shall We Dance",2004,106,40000000,6,3479,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Shall we dansu?",1996,118,NA,7.7,3368,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,1,0,0,0,0 -"Shallow Grave",1987,90,NA,4.2,34,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shallow Grave",1994,93,2500000,7.4,9401,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Shallow Ground",2004,97,NA,5.4,102,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Shallow Hal",2001,113,40000000,6.1,13217,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Shalom Y'all",2003,59,NA,7.4,19,0,0,0,0,0,14.5,14.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Shame",1987,94,NA,6.9,85,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shame No More",1999,12,NA,6.5,23,0,4.5,0,0,0,44.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Shame, Shame, Shame",1998,100,NA,3.4,35,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Shampoo",1975,109,NA,6.1,1593,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Shampoo Horns",1998,89,2500000,4.3,21,24.5,0,4.5,4.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Shamrock Handicap, The",1926,66,NA,3.7,22,24.5,0,0,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Shamus",1973,100,NA,5.6,130,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Shan gou 1999",1999,81,NA,4.9,16,4.5,0,4.5,14.5,14.5,14.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Shan-chung ch'uan-ch'i",1979,130,NA,6.8,29,0,0,0,0,14.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Shane",1953,118,NA,7.8,5603,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Shang Hai yi jiu er ling",1991,137,NA,5.1,25,4.5,4.5,24.5,4.5,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Shanghai Chest, The",1948,65,NA,5.7,16,4.5,0,0,14.5,34.5,0,14.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Shanghai Cobra, The",1945,64,75000,5.9,55,0,0,4.5,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shanghai Express",1932,80,NA,7.8,536,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Shanghai Gesture, The",1941,98,1000000,6.7,233,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shanghai Ghetto",2002,95,NA,7,60,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Shanghai Knights",2003,114,50000000,6.3,7279,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Shanghai Noon",2000,110,55000000,6.7,12258,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Shanghai Story, The",1954,90,NA,4.4,13,0,0,14.5,24.5,34.5,14.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Shanghai Surprise",1986,97,17000000,2.8,836,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Shanghai huang di zhi sui yue feng yun",1992,150,NA,7.6,7,0,0,0,0,0,14.5,45.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Shanghai huang di zhi xiong ba tian xia",1993,104,NA,8.1,7,0,0,0,0,0,24.5,0,14.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Shanghai jiaqi",1990,100,NA,6.5,10,0,0,14.5,0,24.5,14.5,34.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Shanghaied",1915,30,NA,6.3,118,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Shanghaied",1934,8,NA,7.1,15,0,0,0,4.5,14.5,24.5,24.5,4.5,0,24.5,"",0,1,1,0,0,0,1 -"Shanghaied Shipmates",1936,7,NA,5.7,10,0,0,0,24.5,14.5,24.5,44.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Shank's Mare",2004,95,NA,7.2,6,0,0,0,0,14.5,34.5,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Shankarabharanam",1979,143,NA,4.4,33,4.5,0,0,0,0,0,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Shanks",1974,93,NA,5.3,28,14.5,0,4.5,4.5,14.5,4.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Shans",1984,85,NA,9.2,5,0,0,0,0,0,24.5,0,0,0,84.5,"",0,0,1,0,0,1,0 -"Shanty Tramp",1967,72,NA,4.7,20,24.5,0,4.5,0,4.5,14.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Shanty Where Santy Claus Lives, The",1933,8,NA,6,22,0,0,24.5,4.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Shao Lin Hai Deng da shi",1988,84,NA,6.9,10,0,0,0,0,14.5,24.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Shao Lin men",1976,95,NA,5.2,163,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Shao Lin mu ren xiang",1976,106,NA,6.2,192,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Shao Lin san shi liu fang",1978,115,NA,8,612,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Shao Lin san shi liu zhu",1978,90,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",1,0,0,1,0,0,0 -"Shao Lin szu shih pa tung jen",1976,81,NA,6.3,28,0,4.5,0,14.5,14.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Shao Lin tzu",1979,111,NA,7,370,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Shao Lin xiao zi",1983,99,NA,5.8,126,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Shao Lin zi di",1974,101,NA,5,6,14.5,0,0,0,0,34.5,34.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Shao Nu xiao yu",1995,104,NA,8,50,0,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Shaolin Invincible Sticks",1979,90,NA,5.3,8,0,0,0,14.5,24.5,24.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Shaolin Red Master",1978,90,NA,3.3,6,14.5,0,34.5,34.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Shaolin Traitor",1982,94,NA,9,12,0,0,0,0,4.5,4.5,0,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Shaolin chuan ren",1983,100,NA,6.5,14,0,4.5,0,0,14.5,4.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Shap yee yeh",2000,92,NA,6.1,41,4.5,4.5,0,0,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shape Ahoy",1945,7,NA,5.4,7,0,0,0,14.5,24.5,14.5,14.5,14.5,14.5,0,"",0,1,1,0,0,0,1 -"Shape of Evil, The",2002,80,NA,6.9,16,14.5,0,0,0,4.5,0,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Shape of Things to Come, The",1979,94,NA,3.3,72,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shape of Things, The",2003,96,4000000,6.9,1816,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Shapka",1990,88,NA,5,9,0,0,0,14.5,14.5,0,14.5,34.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Shaqi Errenzu",1986,92,NA,6.3,24,4.5,4.5,4.5,4.5,0,24.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Sharaku",1995,115,NA,8.3,15,0,0,4.5,0,0,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Shararat",2002,155,NA,5.3,22,0,4.5,14.5,0,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Sharasojyu",2003,100,NA,6.9,138,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shards",2004,23,38000,7.7,6,0,14.5,0,0,0,14.5,0,14.5,0,45.5,"",0,0,0,1,0,0,1 -"Shark Attack",1999,92,NA,3.1,512,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Shark Attack 2",2000,93,NA,2.8,260,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Shark Attack 3: Megalodon",2002,90,NA,2.4,292,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Shark Hunter",2001,94,NA,3.1,139,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Shark River",1953,80,NA,5.7,6,0,0,14.5,14.5,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Shark Tale",2004,90,75000000,5.9,7819,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",1,1,1,0,0,0,0 -"Shark and the Piano, The",2001,7,NA,7.5,6,0,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Shark in a Bottle",1998,94,NA,3.3,32,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,1,0,1,0 -"Shark rosso nell'oceano",1984,90,NA,1.9,395,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Shark!",1969,92,NA,4.1,88,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"SharkTank Redemption, The",2000,25,NA,6.5,119,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Sharkfighters, The",1956,73,NA,4.1,22,4.5,0,4.5,44.5,24.5,0,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Sharks 3D",2004,42,4000000,7.8,6,0,0,0,0,14.5,14.5,14.5,0,14.5,34.5,"",0,0,0,0,1,0,1 -"Sharks' Treasure",1975,95,NA,3.9,35,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sharkskin 6",2005,100,NA,8.2,9,0,24.5,0,0,0,0,0,0,0,74.5,"",0,0,0,0,0,0,0 -"Sharky's Machine",1981,122,NA,5.8,784,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shatranj Ke Khilari",1977,129,NA,7.5,142,0,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,1,1,0,0,0 -"Shatranje bad",1976,90,NA,8.5,6,0,0,0,0,14.5,0,0,0,64.5,14.5,"",0,0,0,0,0,0,0 -"Shatter",1974,90,NA,4.2,61,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Shatter Dead",1994,84,NA,3.7,129,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shattered",1991,98,NA,6.4,1441,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shattered Glass",2003,95,6000000,7.5,4108,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Shattered Image",1998,104,NA,4.3,246,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Shattered Lies",2002,95,NA,3.2,19,24.5,14.5,14.5,4.5,4.5,14.5,4.5,0,14.5,14.5,"R",1,0,0,0,0,0,0 -"Shaun of the Dead",2004,99,4000000,7.9,18685,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"R",0,0,1,0,0,0,0 -"Shaving Muggs",1953,6,NA,5.6,8,0,0,0,0,34.5,0,14.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Shaving the Castro",1996,4,NA,6,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,0,0,1,0,1 -"Shawshank Redemption, The",1994,142,25000000,9.1,149494,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"R",0,0,0,1,0,0,0 -"Shayad Vaghti Deegar",1988,159,NA,8.2,9,0,0,0,14.5,0,14.5,0,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Shazdeh Ehtejab",1974,93,NA,8.8,5,0,0,0,0,0,0,0,24.5,84.5,0,"",0,0,0,0,0,0,0 -"Shchastlivyye dni",1991,86,NA,4.6,16,14.5,0,0,0,14.5,0,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Shchedroye leto",1950,87,NA,6.2,5,0,0,0,0,0,44.5,24.5,0,44.5,0,"",0,0,1,0,0,0,0 -"Shchors",1939,92,NA,4.2,13,14.5,0,0,4.5,14.5,24.5,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"She",1911,24,NA,5.8,9,0,0,0,14.5,24.5,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"She",1925,98,NA,7.6,8,0,0,0,0,14.5,24.5,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"She",1935,95,NA,6.6,129,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"She",1985,106,NA,3.1,151,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"She Came to the Valley",1979,92,NA,4.7,11,14.5,4.5,4.5,4.5,4.5,14.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"She Couldn't Say No",1954,89,NA,4.8,62,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"She Couldn't Take It",1935,77,NA,7.9,6,0,0,0,0,14.5,0,14.5,34.5,34.5,0,"",0,0,1,0,0,0,0 -"She Demons",1958,77,65000,2.6,47,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"She Devil",1957,77,NA,4.5,23,0,4.5,14.5,14.5,4.5,34.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"She Devils in Chains",1976,80,NA,2.7,32,24.5,14.5,4.5,14.5,4.5,4.5,4.5,0,0,14.5,"",1,0,0,1,0,0,0 -"She Don't Fade",1991,23,NA,6.2,6,0,14.5,0,0,0,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"She Done Him Wrong",1933,66,200000,6.8,512,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"She Freak",1967,83,65000,3.5,74,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"She Gods of Shark Reef",1958,63,50000,2.7,53,24.5,24.5,14.5,14.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"She Good Fighter",1995,85,NA,5,73,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"She Got Game",2003,78,NA,6,5,0,24.5,0,0,0,24.5,44.5,24.5,0,0,"",0,0,0,0,1,0,0 -"She Had to Say Yes",1933,65,111000,6,42,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"She Hate Me",2004,138,NA,4.6,789,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"She Loved a Fireman",1937,58,NA,6,15,0,4.5,0,14.5,24.5,0,45.5,4.5,0,0,"",1,0,0,1,0,0,0 -"She Loves Me Not",1934,85,NA,5.6,25,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,0,14.5,"",0,0,1,0,0,0,0 -"She Married Her Boss",1935,85,NA,6.7,20,0,0,0,0,14.5,24.5,34.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"She Me and Her",2002,99,NA,3,19,34.5,0,0,14.5,4.5,24.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"She Must Be Seeing Things",1987,95,NA,7.2,13,4.5,0,0,0,0,4.5,44.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"She Shoulda Said No",1949,70,NA,2.1,15,34.5,4.5,4.5,0,4.5,4.5,0,4.5,0,34.5,"",0,0,0,1,0,0,0 -"She Smokes",2000,22,NA,5.6,7,14.5,0,14.5,0,0,44.5,0,14.5,14.5,0,"",0,0,0,0,0,0,1 -"She Wanted a Millionaire",1932,80,NA,6.1,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"She Was an Acrobat's Daughter",1937,8,NA,7.5,12,0,0,0,0,4.5,14.5,34.5,4.5,24.5,4.5,"",0,1,1,0,0,0,1 -"She Went to the Races",1945,86,NA,5.7,20,4.5,0,0,14.5,24.5,34.5,4.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"She Wore a Yellow Ribbon",1949,103,1600000,7.5,2242,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"She Would Be an Actress",1909,5,NA,5.4,8,14.5,0,0,14.5,14.5,14.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"She Wronged Him Right",1934,7,NA,5.7,10,0,0,0,14.5,24.5,24.5,44.5,0,0,14.5,"",0,1,0,0,0,0,1 -"She hao ba bu",1978,96,NA,6.1,226,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"She hao dan xin zhen jiu zhou",1976,90,NA,5.3,27,4.5,14.5,0,4.5,14.5,34.5,4.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"She nu yu chao",1978,80,NA,5,10,14.5,0,24.5,24.5,0,0,24.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"She xing diao shou",1978,92,NA,7.2,676,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"She xing zui bu",1979,90,NA,4.2,14,4.5,4.5,4.5,0,24.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"She'll Follow You Anywhere",1971,96,NA,4.8,9,14.5,0,24.5,34.5,14.5,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"She's Alive! Creating the Bride of Frankenstein",1999,39,NA,6.6,40,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,1,0,1 -"She's All That",1999,95,10000000,5.5,13070,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"She's Back",1989,89,NA,2.9,19,24.5,14.5,24.5,0,4.5,14.5,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"She's Back on Broadway",1953,95,NA,5.5,20,0,0,14.5,4.5,34.5,24.5,14.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"She's Got Everything",1937,72,NA,6.1,28,0,0,4.5,0,24.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"She's Gotta Have It",1986,88,160000,6.3,1034,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"She's Having a Baby",1988,106,NA,5.6,2342,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"She's My Weakness",1930,71,NA,3.6,17,14.5,4.5,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,1,0,0,1,0 -"She's Oil Mine",1941,17,NA,6.7,5,0,0,0,0,44.5,24.5,0,44.5,0,0,"",0,0,0,0,0,0,1 -"She's Out of Control",1989,90,NA,4.8,661,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"She's So Lovely",1997,100,18000000,5.7,2280,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"She's Too Tall",1998,90,NA,5.4,28,14.5,14.5,4.5,4.5,4.5,0,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"She's Working Her Way Through College",1952,104,NA,4.7,70,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"She's the One",1996,96,3500000,6,3779,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"She-Creature, The",1956,77,100000,3.1,179,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"She-Devil",1989,99,NA,4.5,2133,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"She-Devils on Wheels",1968,83,NA,3.4,111,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"She-Man",1967,68,NA,6.5,5,64.5,0,0,0,0,24.5,0,0,0,24.5,"",0,0,1,1,0,0,0 -"She-Sick Sailors",1944,7,NA,5.9,6,0,0,0,0,14.5,34.5,34.5,0,0,14.5,"",0,1,1,0,0,0,1 -"She-Wolf of London",1946,61,NA,4.8,133,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sheena",1984,117,25000000,4,618,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Sheep Ahoy",1954,7,NA,7.8,41,4.5,0,0,0,0,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Sheep Dog",1949,7,NA,5.1,16,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Sheep Wrecked",1958,6,NA,6.3,12,0,0,0,0,44.5,4.5,0,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Sheep in the Deep, A",1962,6,NA,7.6,39,0,0,0,4.5,4.5,0,44.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Sheepman, The",1958,85,NA,6.8,235,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sheer Passion",1998,93,NA,3.4,21,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Sheffey",1977,137,NA,7.7,9,0,0,0,0,14.5,0,14.5,0,34.5,44.5,"",0,0,0,1,0,1,0 -"Sheik, The",1921,80,NA,6.3,182,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Sheila Levine Is Dead and Living in New York",1975,113,NA,4.6,38,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Shekvarebuli kulinaris ataserti retsepti",1997,100,NA,6.8,175,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Shelf Life",2000,4,NA,6.6,11,0,0,0,0,4.5,24.5,4.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Shelf Life",2003,3,NA,8.9,8,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Shelf Life",2004,90,NA,5.4,11,24.5,4.5,4.5,14.5,4.5,4.5,0,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Shell Shock",1964,84,NA,3.9,9,24.5,0,24.5,0,24.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Shell Shocked Egg, The",1948,7,NA,6.3,15,0,0,0,4.5,24.5,24.5,34.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Shellfishing",2005,6,NA,7.6,8,0,14.5,0,14.5,0,0,0,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Shelter",2003,80,125000,4.6,5,0,24.5,24.5,44.5,0,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Shelter Dogs",2003,74,NA,7.9,31,4.5,0,0,0,0,0,24.5,14.5,14.5,44.5,"",0,0,0,1,1,0,0 -"Shelter Island",2003,82,5000000,3.9,191,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Shelter in the Storm",1987,90,NA,8.5,52,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sheltering Desert, The",1992,105,NA,7,6,0,0,0,14.5,0,14.5,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Sheltering Sky, The",1990,139,NA,6.4,1483,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shen Jing Dao yu Fei Tian Mao",1993,86,NA,5.9,74,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Shen bu you ji",1980,100,NA,7.7,63,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Shen da",1975,98,NA,6.6,18,0,0,0,0,14.5,14.5,34.5,14.5,24.5,4.5,"",1,0,1,1,0,0,0 -"Shen nu",1934,77,NA,7.4,51,4.5,0,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shen tan guang tou mei",1982,98,NA,3.9,14,14.5,0,24.5,0,4.5,0,4.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Shenandoah",1965,105,NA,7.4,837,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sheng hua te jing zhi sang shi ren wu",2000,89,NA,5.4,33,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sheng huo xiu",2002,107,NA,7.3,39,0,0,0,0,14.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sheng shi chuan shuo",2000,122,NA,6.8,29,4.5,14.5,4.5,4.5,0,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Sheng zhe wei wang",2000,118,NA,6.5,69,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shepherd",1999,91,NA,2.3,104,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shepherd of the Hills, The",1941,98,NA,6.2,206,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shepherd on the Rock",1993,90,NA,5.9,13,0,0,4.5,4.5,4.5,34.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Sher Mountain Killings Mystery",1990,84,NA,2.7,9,44.5,24.5,0,0,0,0,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Sherekilebi",1973,75,NA,8.4,13,0,0,0,0,0,0,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Shergar",1999,95,NA,3.6,57,4.5,14.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sheriff",2004,76,NA,8.5,6,0,0,0,0,14.5,0,0,14.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Sheriff of Cimarron",1945,56,NA,5.5,13,0,0,4.5,34.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sheriff of Fractured Jaw, The",1958,103,NA,5.3,77,4.5,0,4.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sheriff of Las Vegas",1944,55,NA,6.4,7,0,0,0,0,0,74.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Sheriff of Tombstone",1941,54,NA,6.5,12,0,0,0,0,4.5,34.5,14.5,34.5,0,4.5,"",0,0,0,0,0,0,0 -"Sherlock Holmes",1922,109,NA,2.4,13,24.5,14.5,14.5,14.5,14.5,0,0,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Sherlock Holmes",1932,68,NA,3,14,24.5,14.5,4.5,4.5,4.5,24.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Sherlock Holmes Faces Death",1943,68,NA,6.6,322,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sherlock Holmes and a Study in Scarlet",1983,50,NA,3.5,9,0,24.5,0,24.5,0,14.5,0,34.5,0,14.5,"",0,1,0,0,0,0,0 -"Sherlock Holmes and the Baskerville Curse",1983,67,NA,2.9,16,14.5,14.5,4.5,14.5,4.5,34.5,4.5,4.5,0,0,"",0,1,0,0,0,0,0 -"Sherlock Holmes and the House of Fear",1945,69,NA,7.1,302,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sherlock Holmes and the Secret Weapon",1943,68,NA,6.5,446,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sherlock Holmes and the Sign of Four",1983,50,NA,4.3,14,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Sherlock Holmes and the Spider Woman",1944,63,NA,6.7,321,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sherlock Holmes and the Valley of Fear",1983,50,NA,3.5,9,0,24.5,0,24.5,0,14.5,0,34.5,14.5,0,"",0,1,0,0,0,0,0 -"Sherlock Holmes and the Voice of Terror",1942,65,NA,6.3,326,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sherlock Holmes in Washington",1943,71,NA,6.2,309,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sherlock Holmes und das Halsband des Todes",1962,84,NA,4.7,51,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sherlock Holmes und die sieben Zwerge",1994,85,NA,1.2,7,74.5,14.5,14.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Sherlock Pink",1976,7,NA,3.9,12,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Sherlock Sleuth",1925,20,NA,1,6,64.5,0,0,0,0,0,34.5,0,0,0,"",0,0,1,0,0,0,1 -"Sherlock de Araque",1957,94,NA,1.1,8,74.5,0,0,0,0,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Sherlock, Jr.",1924,44,NA,8.2,1863,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,1,1 -"Sherlock: Undercover Dog",1994,78,NA,2.2,35,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sherman's March",1986,157,NA,7.4,364,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Sherwood's Travels",1994,98,NA,4.9,15,0,0,0,24.5,14.5,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Shetlandsgjengen",1954,70,NA,6.4,26,44.5,4.5,4.5,0,0,4.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shi di chu ma",1980,90,NA,7.1,646,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"PG-13",1,0,1,0,0,0,0 -"Shi er jin pai",1970,90,NA,6.8,16,0,0,0,0,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Shi jie da shai",1989,90,NA,4.9,29,14.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Shi mian mai fu",2004,118,NA,7.6,8700,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",1,0,0,1,0,1,0 -"Shi no toge",1990,115,NA,7.4,23,0,0,0,14.5,0,4.5,24.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Shi qi sui de tian kong",2004,93,NA,6.7,81,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Shi wan huo ji",1997,108,NA,7.3,73,0,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Shi xiong di",1995,100,NA,5.9,8,0,0,0,14.5,14.5,24.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Shiatsu Oja",1989,15,NA,8.2,6,0,0,0,0,0,0,14.5,14.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Shiawase no kiiroi hankachi",1977,109,NA,8.1,38,4.5,0,0,0,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Shichinin no samurai",1954,206,500000,8.9,32141,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",1,0,0,1,0,0,0 -"Shield for Murder",1954,82,NA,6.3,57,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shier lou",1997,100,NA,7.1,51,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Shifshuf Naim",1981,90,NA,3.6,113,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Shigatsu monogatari",1998,67,NA,7.4,261,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,1,0 -"Shiiku",1961,105,NA,7.4,5,0,0,0,0,0,24.5,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Shijie",2004,143,NA,7,108,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shijushichinin no shikaku",1994,132,NA,6.7,23,0,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Shik",2003,92,NA,6.7,80,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shiki-Jitsu",2000,128,NA,7.9,89,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Shiko funjatta",1992,105,NA,7.2,106,4.5,0,4.5,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Shilje sanghwang",2000,69,NA,5.5,83,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shillingbury Blowers, The",1980,95,NA,6.4,18,0,0,0,0,14.5,24.5,0,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Shiloh",1996,93,NA,6.3,222,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"PG",0,0,0,0,0,0,0 -"Shiloh 2: Shiloh Season",1999,96,NA,5.4,108,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Shilrakwon",1998,100,NA,5.5,10,34.5,14.5,0,0,0,14.5,34.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Shimaizaka",1985,100,NA,8.1,9,0,0,0,0,0,24.5,14.5,14.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Shimmer",1993,95,NA,5.5,35,4.5,0,0,4.5,0,4.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Shimotsuma monogatari",2004,102,NA,7.8,84,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Shin Zatoichi monogatari",1963,91,NA,7.1,81,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Shin heike monogatari",1955,108,NA,7.2,73,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shin jingi no hakaba",2002,131,NA,6.9,243,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Shin kanashiki hittoman",1995,105,NA,4.9,9,0,14.5,0,0,24.5,14.5,0,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Shin yukiguni",2001,109,NA,4.7,8,0,14.5,0,0,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Shin-sung-ga-jok",2001,11,NA,8.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,0,0,0,1 -"Shinbone Alley",1971,85,NA,5.4,26,0,0,0,24.5,0,14.5,14.5,4.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Shindig, The",1930,8,NA,5.9,11,4.5,4.5,0,4.5,0,14.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Shine",1996,105,5500000,7.6,12425,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Shine On, Harvest Moon",1944,111,NA,6.6,60,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shine, The",2002,2,NA,8.1,18,0,0,0,0,0,0,14.5,14.5,45.5,14.5,"",0,0,1,0,0,0,1 -"Shinel",1926,84,NA,7.7,19,0,0,4.5,4.5,0,0,24.5,44.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shinel",1959,75,NA,7.1,25,0,0,0,0,4.5,4.5,34.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Shiner",2000,99,NA,6.1,405,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Shiner",2004,89,NA,3.5,63,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Shining Hour, The",1938,76,NA,6.6,81,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shining Through",1992,132,NA,5.9,1808,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Shining Victory",1941,80,NA,7,104,0,0,4.5,0,4.5,4.5,34.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Shining, The",1980,146,19000000,8.3,50908,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Shinjang gaeub",1998,100,NA,5.7,13,0,0,0,4.5,24.5,34.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Shinjuku Boys",1995,53,NA,6.9,14,0,0,0,0,24.5,24.5,34.5,14.5,4.5,0,"",0,0,0,0,1,0,0 -"Shinjuku dorobo nikki",1968,96,NA,6.3,25,0,4.5,0,0,24.5,0,14.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Shinkansen daibakuha",1975,115,NA,6.4,52,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Shinken shobu",1971,75,NA,6.6,7,0,14.5,0,0,0,14.5,14.5,24.5,0,24.5,"",1,0,0,1,0,0,0 -"Shinlaui dalbam",2001,118,NA,7.1,124,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Shinobi no mono",1962,104,NA,6.9,18,0,0,0,0,4.5,24.5,34.5,24.5,0,14.5,"",1,0,0,1,0,0,0 -"Shinobugawa",1972,121,NA,9.3,12,0,0,0,0,0,0,0,14.5,45.5,24.5,"",0,0,0,1,0,0,0 -"Shinsengumi",1969,122,NA,6.2,10,0,0,0,0,14.5,0,24.5,14.5,24.5,44.5,"",1,0,0,1,0,0,0 -"Shiosai",1954,96,NA,5.4,7,14.5,0,0,0,14.5,0,44.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Ship Ahoy",1942,95,NA,5.8,64,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Ship Comes In, A",1928,70,NA,6.3,7,14.5,0,0,0,14.5,44.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Ship That Died of Shame, The",1955,95,NA,6.4,36,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ship That Died, The",1938,10,NA,6.1,7,0,0,0,0,14.5,44.5,24.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Ship from Shanghai, The",1930,69,NA,4.3,14,4.5,4.5,4.5,4.5,4.5,34.5,4.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Ship of Fools",1965,149,NA,7.2,574,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shipmates",1931,72,NA,5.6,20,4.5,0,4.5,4.5,14.5,44.5,34.5,4.5,0,0,"",0,0,1,1,0,1,0 -"Shipmates Forever",1935,109,NA,6.2,20,0,0,0,14.5,24.5,24.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Shipment, The",2001,92,NA,3.4,126,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Shipping News, The",2001,111,35000000,6.9,7695,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,1,0 -"Ships with Wings",1942,103,NA,5.8,11,4.5,0,14.5,14.5,4.5,4.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Shipyard Sally",1939,77,NA,7.9,8,0,0,0,0,14.5,0,14.5,64.5,0,14.5,"",0,0,1,0,0,0,0 -"Shiqi sui de dan che",2001,113,NA,7.4,908,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Shiralee, The",1957,99,NA,6.5,53,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Shirat Ha'Sirena",1994,90,NA,5.7,43,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Shiraz",1928,97,NA,7.1,10,0,0,0,0,24.5,14.5,0,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Shiriusu no densetsu",1981,108,NA,9.2,30,0,0,4.5,0,0,0,0,14.5,24.5,64.5,"",0,1,0,0,0,0,0 -"Shirley Valentine",1989,108,NA,6.9,1104,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Shirli-Myrli",1995,143,NA,6.5,96,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Shirts & Skins",2002,20,NA,6.4,20,0,0,4.5,14.5,0,14.5,44.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Shiryo no wana",1988,105,NA,6,334,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shisenjiyou no Aria",1992,97,NA,5.3,41,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shisha no gakuensai",2000,101,NA,5.2,23,0,14.5,4.5,4.5,34.5,24.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Shishkabugs",1962,7,NA,6.4,41,0,0,4.5,4.5,4.5,34.5,34.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Shit Happens",2002,5,NA,4,9,44.5,14.5,0,0,14.5,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Shit Happens Again",1994,2,NA,1.8,6,34.5,0,0,0,0,0,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Shitoyakana kedamono",1962,96,NA,8.4,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,1,1,0,0,0 -"Shitsurakuen",1997,119,NA,6.3,91,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shiva",1990,145,NA,8.6,42,4.5,0,0,0,0,4.5,4.5,4.5,14.5,45.5,"",1,0,0,0,0,0,0 -"Shiva MeHodu, Ha-",2002,96,NA,5.5,18,14.5,14.5,0,4.5,14.5,4.5,0,14.5,0,24.5,"",0,0,0,1,0,1,0 -"Shiver Me Timbers!",1934,7,NA,5.4,16,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Shivering Shakespeare",1930,20,NA,6.6,21,0,0,4.5,4.5,4.5,14.5,34.5,4.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Shivering Sherlocks",1948,17,NA,6.7,66,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Shivers",1975,87,NA,6.1,1272,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shivrei T'munot Yerushalayim",1997,358,NA,4,15,14.5,0,0,0,0,0,14.5,4.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Shiza",2004,86,NA,6.5,68,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shizi jietou",1937,110,NA,7.5,13,0,0,0,0,0,14.5,24.5,45.5,4.5,0,"",0,0,0,0,0,0,0 -"Shizukana seikatsu",1995,121,NA,8.7,12,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Shizukanaru ketto",1949,95,NA,7.7,69,4.5,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Shlager",1979,90,NA,6.4,17,14.5,0,0,0,14.5,0,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Shlosha Yamim Veyeled",1967,90,NA,8.2,7,0,0,0,0,0,0,24.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Sho o suteyo machi e deyou",1971,138,NA,7.6,16,0,0,0,0,0,14.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Shoah",1985,566,NA,7,1113,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Shock",1946,70,375000,6.4,80,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shock",1993,8,NA,7.6,5,0,0,0,0,24.5,0,44.5,24.5,24.5,0,"",0,1,1,0,0,0,1 -"Shock 'Em Dead",1991,93,NA,3.5,69,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Shock Act",2004,19,50000,9.1,12,4.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,0,0,1 -"Shock Corridor",1963,101,NA,7.5,719,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shock Treatment",1964,94,NA,6.4,52,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Shock Treatment",1981,94,3500000,4.5,572,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Shock Waves",1977,90,200000,5.4,429,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shock to the System, A",1990,85,NA,6.5,647,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Shock! Shock! Shock!",1987,60,NA,3.8,5,44.5,0,24.5,0,0,24.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Shock, The",1923,96,90220,7,27,0,0,0,0,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Shocker",1989,109,NA,4.8,1316,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shocking Accident, A",1982,25,NA,5.6,8,0,14.5,0,0,14.5,34.5,0,14.5,0,24.5,"",0,0,1,0,0,1,1 -"Shocking Asia",1974,94,NA,4.3,75,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Shocking Asia II: The Last Taboos",1985,90,NA,4,28,14.5,4.5,14.5,4.5,34.5,0,14.5,4.5,4.5,0,"",0,0,0,0,1,0,0 -"Shocking Asia III: After Dark",1995,102,NA,5.5,10,24.5,14.5,24.5,0,0,0,14.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Shocking Miss Pilgrim, The",1947,85,NA,5.9,59,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Shocking Pink",1965,6,NA,5.1,7,14.5,0,0,0,74.5,14.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Shockproof",1949,80,NA,6.3,33,0,4.5,0,4.5,4.5,34.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Shocktroop",1989,117,NA,1,6,45.5,14.5,14.5,0,0,0,14.5,0,0,0,"",1,0,0,0,0,0,0 -"Shoe Shine Boy",1943,15,NA,6.2,14,4.5,4.5,4.5,4.5,0,34.5,4.5,24.5,4.5,0,"",0,0,0,1,0,0,1 -"Shoe Shine Boys",2000,90,NA,6.8,11,14.5,0,4.5,0,0,0,0,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Shoe Store, The",1999,75,NA,9.7,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,0,0,1,0,0 -"Shoe, The",1998,83,NA,6.5,25,4.5,4.5,0,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Shoein' Hosses",1934,6,NA,5.8,10,0,0,0,24.5,14.5,44.5,0,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Shoemaker",1996,80,NA,5.8,23,0,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Shoes Off!",1998,13,NA,6.9,48,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,1,1 -"Shoes of the Fisherman, The",1968,162,NA,6.3,441,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shogun Assassin",1980,86,NA,7.1,961,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Shojo Hanazono",1936,65,NA,9.2,8,0,34.5,0,0,0,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Shojo no harawata",1986,72,NA,4.6,91,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shokei no heya",1956,96,NA,6.4,13,0,0,0,0,4.5,24.5,34.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Sholay",1975,162,NA,7.4,1724,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",1,0,1,1,0,1,0 -"Sholi gia soferines",1964,74,NA,8.1,8,0,0,0,0,14.5,14.5,0,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Shonen",1969,97,NA,8.1,27,0,0,0,0,4.5,4.5,14.5,14.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Shonen jidai",1990,119,NA,8.3,15,0,0,0,4.5,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Shool",1999,138,NA,6.7,51,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Shoot",1976,99,NA,3.9,49,4.5,14.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shoot It Black, Shoot It Blue",1974,93,NA,6.5,5,0,0,0,0,0,24.5,24.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Shoot Out",1971,95,NA,5.2,84,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Shoot Yourself Some Golf",1942,9,NA,1.1,9,64.5,14.5,0,0,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Shoot the Moon",1982,124,NA,6.8,503,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shoot the Works",1934,64,NA,6.6,8,0,0,0,0,0,14.5,34.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Shoot to Kill",1947,64,NA,6.8,10,0,14.5,14.5,0,14.5,34.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Shoot to Kill",1988,109,NA,6.4,1604,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Shoot!",2001,12,NA,6.5,11,0,0,0,0,0,24.5,24.5,4.5,0,34.5,"",0,0,0,0,0,0,1 -"Shoot-Out at Medicine Bend",1957,87,NA,6.2,27,0,4.5,0,0,24.5,44.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Shooter",2004,24,25000,7,11,24.5,0,0,0,0,0,4.5,0,24.5,34.5,"",0,0,0,1,0,0,1 -"Shooter, The",2001,88,NA,4.2,78,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Shooters",2002,91,NA,5.3,162,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shootfighter II",1995,95,NA,4.6,54,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Shootfighter: Fight to the Death",1992,100,NA,4,95,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Shooting Blanks",1996,8,NA,7.7,6,0,0,0,0,0,14.5,34.5,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Shooting Creek",1995,30,NA,7.6,7,14.5,0,0,0,0,24.5,0,0,0,45.5,"",0,0,0,1,0,0,1 -"Shooting Elizabeth",1992,92,NA,5.1,109,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Shooting Fish",1997,103,3000000,6.6,2701,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG",0,0,1,0,0,1,0 -"Shooting High",1940,65,NA,6.1,13,0,0,4.5,0,14.5,34.5,0,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Shooting Lily",1996,82,NA,6.2,28,4.5,4.5,4.5,4.5,0,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Shooting Livien",2005,90,NA,6.7,29,14.5,0,0,0,4.5,4.5,14.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Shooting Party, The",1985,93,NA,6.8,195,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shooting Porn",1997,75,NA,3.1,42,24.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,0,"",0,0,0,0,1,0,0 -"Shooting of Dan McGoo, The",1945,8,NA,8.2,46,0,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Shooting the Chutes, Luna Park, Coney Island",1903,2,NA,3.4,7,0,0,45.5,14.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Shooting, The",1967,82,NA,6.1,290,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shootist, The",1976,100,NA,7.5,3134,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Shop Around the Corner, The",1940,99,NA,8,2889,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Shop Look & Listen",1940,8,NA,7.9,14,0,0,0,0,0,4.5,44.5,24.5,24.5,0,"",0,1,1,0,0,0,1 -"Shop at Sly Corner, The",1947,91,NA,6.2,12,0,0,0,0,14.5,44.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Shopping",1994,106,NA,5.1,495,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Shopping Part, The",2004,12,NA,9.9,7,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,1 -"Shopping for Fangs",1997,90,100000,7.6,44,4.5,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Shopworn",1932,72,NA,5.2,8,0,0,0,24.5,14.5,34.5,24.5,0,0,0,"",0,0,0,1,0,1,0 -"Shopworn Angel, The",1938,85,NA,6.8,152,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Shor",1972,170,NA,8.3,35,0,0,0,0,0,0,4.5,24.5,45.5,14.5,"",0,0,1,1,0,1,0 -"Shoreditch",2003,101,NA,4.1,70,74.5,4.5,0,4.5,0,4.5,0,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Short",1999,10,NA,5.7,24,4.5,0,0,14.5,24.5,4.5,14.5,14.5,24.5,4.5,"",0,0,1,1,0,0,1 -"Short Changed",1986,104,NA,5,8,14.5,0,0,14.5,14.5,14.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Short Circuit",1986,98,NA,5.9,6165,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Short Circuit 2",1988,110,NA,4.5,3190,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Short Cut to Hell",1957,89,NA,5.4,22,0,0,4.5,4.5,24.5,4.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Short Cut to Nirvana: Kumbh Mela",2004,85,200000,8.6,31,0,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Short Cuts",1993,190,NA,7.6,8165,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Short Eyes",1977,100,NA,6.9,102,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Short Film About Decalogue: An Interview with Krzysztof Kieslowski, A",1996,47,NA,7.6,11,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Short Film About Falling Down, A",1996,37,NA,6.4,13,0,4.5,0,0,4.5,24.5,0,0,4.5,45.5,"",0,0,1,0,0,0,1 -"Short Film About John Bolton, A",2003,27,NA,8.2,23,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Short Fuse",1990,37,NA,6,6,0,0,0,0,34.5,34.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Short Grass",1950,82,NA,6.8,7,14.5,0,0,0,0,44.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Short Hymn, Silent War",2003,20,NA,6.9,27,4.5,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Short Time",1990,97,NA,5.7,335,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Short Wait Between Trains, A",1998,25,NA,6.6,17,14.5,0,0,4.5,0,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Short and Suite",1959,5,NA,8.1,5,0,0,0,0,0,0,0,84.5,0,24.5,"",0,1,0,0,0,0,1 -"Short, White, Pleated",2001,10,NA,6.7,6,0,0,0,14.5,0,14.5,45.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Shot and Bothered",1966,6,NA,4.2,13,4.5,4.5,24.5,14.5,4.5,34.5,4.5,0,0,0,"",0,1,1,0,0,0,1 -"Shot at Glory, A",2000,114,9000000,6.3,286,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Shot in the Dark, A",1933,53,NA,5,9,14.5,14.5,0,0,14.5,34.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Shot in the Dark, A",1935,69,NA,7.1,7,0,0,0,0,0,44.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Shot in the Dark, A",1941,57,NA,6,22,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Shot in the Dark, A",1964,102,NA,7.5,3391,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Shot in the Frontier",1954,16,NA,6.9,30,0,0,0,0,4.5,14.5,44.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Shot, The",1996,83,NA,5.3,18,14.5,0,0,14.5,0,0,14.5,14.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Shoter Azulai, Ha-",1970,87,NA,7.7,65,0,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Shotgun Wedding",1963,64,NA,1.4,10,74.5,0,0,0,0,0,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Shotgun Wedding",2003,24,2000,9.1,8,0,0,14.5,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Shottas",2002,95,200000,6.4,48,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",1,0,0,1,0,0,0 -"Shou huang de nu ren",1989,96,NA,5.6,5,0,0,0,0,24.5,24.5,0,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Shou ji",2003,107,NA,6.8,61,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Shou xing xin ren lei",2000,88,NA,5.1,13,0,0,14.5,4.5,34.5,4.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Shouf shouf habibi!",2004,89,NA,6.1,553,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Should Ladies Behave",1933,87,NA,4.8,25,4.5,4.5,4.5,14.5,4.5,24.5,34.5,4.5,4.5,0,"",0,0,1,1,0,0,0 -"Should Married Men Go Home?",1928,20,NA,7,41,0,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Should Sailors Marry?",1925,22,NA,5.6,9,0,0,0,0,34.5,0,44.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Should Tall Men Marry?",1928,20,NA,7.2,10,0,0,14.5,0,14.5,14.5,44.5,34.5,0,0,"",0,0,1,0,0,0,1 -"Shoulder Arms",1918,46,NA,7.8,314,4.5,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Shout",1991,89,NA,4.4,318,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shout at the Devil",1976,119,NA,6.1,268,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Shout, The",1978,86,NA,6.3,326,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Show",2003,120,NA,6.5,101,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Show Biz Bugs",1957,7,NA,7.9,77,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Show Boat",1929,147,NA,6.7,32,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Show Boat",1936,113,NA,7.8,370,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Show Boat",1951,107,2295429,7,665,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Show Business at War",1943,17,NA,7.8,90,4.5,0,0,4.5,4.5,0,24.5,24.5,34.5,14.5,"",0,0,0,0,1,0,1 -"Show Girl in Hollywood",1930,80,NA,7.7,15,0,0,0,4.5,14.5,4.5,24.5,14.5,0,44.5,"",0,0,1,1,0,0,0 -"Show Girls",1999,52,NA,4.9,86,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Show Me",2004,97,NA,7,12,0,4.5,0,0,0,4.5,14.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Show Off, The",1926,82,NA,7.1,52,0,0,0,0,14.5,4.5,34.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Show People",1928,82,NA,8,224,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Show Them No Mercy!",1935,76,NA,8.4,18,0,0,0,4.5,14.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Show of Force, A",1990,95,NA,5.1,157,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Show of Shows, The",1929,128,NA,7.7,29,4.5,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Show, The",1995,93,NA,5.3,59,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,1,0,0 -"Show-Off, The",1934,77,NA,7.3,11,0,0,0,0,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Show-Off, The",1946,83,NA,6.3,16,0,0,4.5,14.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"ShowChickens",2001,12,NA,7.6,8,24.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,1,0,0,1,1 -"Showboy",2002,93,300000,4.5,67,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Showdown",1942,8,NA,6.7,34,0,0,0,0,4.5,24.5,44.5,4.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Showdown",1963,79,NA,6.3,16,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Showdown",1973,99,NA,5.3,136,0,4.5,4.5,4.5,14.5,45.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Showdown at Abilene",1956,80,NA,6.4,11,0,0,4.5,4.5,4.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Showdown at Boot Hill",1958,71,NA,5.3,42,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Showdown in Little Tokyo",1991,79,NA,5.1,1462,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Showdown, The",1950,86,NA,7.7,18,0,0,0,4.5,4.5,0,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Shower, The",1992,82,NA,4.9,7,0,0,14.5,14.5,24.5,0,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Showgirl Murders",1996,82,NA,2.8,38,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Showgirls",1995,131,45000000,3.8,11483,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"NC-17",0,0,0,1,0,0,0 -"Showman",1963,53,NA,5.9,7,14.5,0,0,0,14.5,0,44.5,14.5,14.5,0,"",0,0,0,0,1,0,0 -"Showtime",2002,96,85000000,5.5,7689,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Shree 420",1955,168,NA,7.8,71,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Shrek",2001,90,60000000,8,65146,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG",0,1,1,0,0,1,0 -"Shrek 2",2004,92,75000000,7.8,27236,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG",0,1,1,0,0,0,0 -"Shrek 4-D",2003,12,NA,6.8,316,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Shriek in the Night, A",1933,66,NA,5.8,58,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Shriek of the Mutilated",1974,85,NA,3.7,102,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Shrieker",1997,84,NA,2.9,150,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Shrike, The",1955,88,NA,6.4,32,4.5,0,0,4.5,14.5,4.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Shrimp on the Barbie, The",1990,90,NA,4.7,259,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Shrink",1998,30,NA,4.9,15,4.5,24.5,0,0,24.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Shrink Is In, The",2001,87,6000000,4.9,319,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Shrink Rap",2003,80,NA,7.6,13,14.5,0,4.5,0,0,4.5,0,4.5,0,64.5,"",0,0,1,0,0,0,0 -"Shrunken City, The",1998,90,NA,4.3,45,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,0,14.5,"PG",0,0,0,0,0,0,0 -"Shtei Etzbaot Mi'Tzidon",1986,91,80000,8.5,22,4.5,0,0,0,0,4.5,4.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Shturetz v uhoto",1976,95,NA,7.9,8,0,0,0,0,0,0,14.5,14.5,0,74.5,"",0,0,1,0,0,0,0 -"Shu dan long wei",1995,101,NA,5.8,604,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Shu jian en chou lu",1987,180,NA,5.5,17,0,0,4.5,4.5,4.5,14.5,0,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Shu shan zheng zhuan",2001,104,NA,5.9,627,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Shu'al B'Lool Hatarnagalot, Ha-",1978,90,NA,8.3,11,0,0,0,0,0,4.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Shu-u",1956,91,NA,6.9,8,14.5,0,0,0,0,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Shuang long hui",1992,100,NA,5.9,1379,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Shuang tong",2002,113,NA,6.4,524,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Shuang xiong",2003,100,NA,5.8,111,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Shuang-Qi-Zhen daoke",1991,90,NA,6.9,46,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Shubho Mahurat",2003,150,NA,5.5,9,0,0,14.5,0,24.5,24.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Shubun",1950,105,NA,7.3,122,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shudojo: nure nawa zange",1979,74,NA,5.8,10,0,0,14.5,0,14.5,44.5,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Shuffle Off to Buffalo",1933,7,NA,4.9,6,0,0,0,14.5,34.5,14.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Shui quan guai zhao",1978,88,NA,7.2,9,0,0,0,0,0,24.5,45.5,0,24.5,0,"",1,0,0,0,0,0,0 -"Shui shuo wo bu zai hu",2001,110,NA,5.5,24,0,0,0,4.5,4.5,44.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Shukujo to hige",1931,75,NA,6.8,15,0,0,0,0,4.5,24.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Shura",1971,135,NA,9.3,12,0,0,0,0,0,0,0,14.5,45.5,24.5,"",0,0,0,1,0,0,0 -"Shura Yukihime",2001,93,NA,5.8,687,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Shura-yuki-hime: Urami Renga",1974,89,NA,6.7,93,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shurayukihime",1973,97,NA,8.1,591,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Shuroo",1991,85,NA,6.9,29,0,0,4.5,4.5,0,14.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Shut",1988,99,NA,8.8,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Shut My Big Mouth",1942,71,NA,6.7,18,0,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Shuteye Popeye",1952,6,NA,5.5,18,0,0,0,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Shutter",2001,24,15000,3.5,12,45.5,0,4.5,4.5,0,0,4.5,0,0,24.5,"R",0,0,0,0,0,0,1 -"Shutter Bugged Cat",1967,7,NA,5,17,4.5,14.5,4.5,0,24.5,14.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Shuttered Room, The",1967,99,NA,5.4,124,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Shuttlecock",1991,85,NA,5.4,6,14.5,0,0,0,34.5,0,14.5,0,34.5,0,"",0,0,0,0,0,0,0 -"Shvil Hahalav",1997,106,NA,7.5,18,0,0,0,0,0,4.5,24.5,45.5,14.5,0,"",0,0,0,1,0,0,0 -"Shvitz, The",1993,46,NA,8.9,9,0,0,0,0,0,0,14.5,34.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Shwaas",2004,107,NA,8.2,103,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Shy Guy",1947,14,NA,4.6,10,14.5,14.5,34.5,0,14.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,1 -"Shy People",1987,118,NA,6.6,236,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Shyamchi Aai",1953,152,NA,9.5,6,0,0,0,0,0,0,14.5,0,0,84.5,"",0,0,0,0,0,0,0 -"Shyness",1996,10,NA,6.3,13,0,0,0,14.5,24.5,24.5,14.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"Si fa presto a dire amore...",2000,95,NA,3.8,5,24.5,0,44.5,0,24.5,0,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Si mian xia wa",1996,91,NA,7.1,10,0,14.5,0,0,14.5,14.5,14.5,44.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Si mis campos hablaran",1947,77,NA,6,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Si ringrazia la regione Puglia per averci fornito i milanesi",1982,98,NA,3.1,9,24.5,0,0,34.5,14.5,0,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Si tous les gars du monde",1956,95,NA,7.3,19,0,0,0,0,4.5,4.5,24.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Si vous le voyez, tuez-le de ma part",2002,13,NA,8.7,7,0,0,0,0,0,0,0,45.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Si yo fuera diputado",1952,95,NA,7.5,21,0,0,0,4.5,0,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Si yu si ri",1997,88,NA,3.1,9,14.5,14.5,34.5,14.5,0,24.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Sia dai",1996,109,NA,5.5,14,0,0,0,4.5,24.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Siam Sunset",1999,91,NA,6.2,376,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Siamo donne",1953,95,NA,7.1,17,0,0,0,0,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Siamo uomini o caporali",1955,94,NA,7.6,33,0,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Sib",1998,86,NA,7.5,326,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Sibaji",1987,100,NA,8.3,43,4.5,0,0,0,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Sibak",1994,128,NA,5.5,64,4.5,4.5,4.5,0,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Sibelius",2003,120,NA,5.4,93,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Siberia",1998,91,NA,6.8,344,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sibha kham doan sib ed",2002,119,NA,7.2,55,0,0,4.5,0,0,4.5,24.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Sibiriada",1979,206,NA,8.1,134,4.5,0,0,0,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Sibirska Ledi Magbet",1961,93,NA,7,27,0,0,0,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sibirskiy tsiryulnik",1998,275,35000000,7.1,1254,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Sibling",2003,12,NA,8.7,7,0,0,0,0,0,0,0,44.5,44.5,14.5,"",0,0,0,1,0,0,1 -"Sibling Rivalry",1990,88,NA,5.3,582,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Siblings",2004,85,NA,7.3,30,4.5,0,14.5,4.5,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Sicilia!",1999,76,NA,7.3,71,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sicilia, La",1997,93,NA,4.7,27,14.5,14.5,4.5,0,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sicilian, The",1987,116,NA,4.9,634,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sick Kitten",1903,1,NA,6.4,34,4.5,0,0,14.5,4.5,24.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"Sick: The Life & Death of Bob Flanagan, Supermasochist",1997,90,NA,6.9,203,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Sid and Nancy",1986,110,4000000,7,3057,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Siddhartha",1972,94,NA,5.9,159,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Side Effects",2002,18,NA,5,16,4.5,14.5,0,4.5,4.5,0,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Side Out",1990,100,NA,4.5,315,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Side Show",1931,66,NA,4.5,7,0,0,14.5,24.5,14.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Side Show",2003,18,NA,7.3,6,0,14.5,0,0,0,0,0,45.5,34.5,0,"",0,0,0,1,0,0,1 -"Side Street",1950,83,NA,7,125,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Side Streets",1934,63,NA,4.4,5,0,24.5,0,0,0,44.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Side Streets",1998,116,NA,6.5,49,4.5,4.5,0,4.5,4.5,4.5,34.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Side by Side",1975,84,NA,7.6,9,0,0,0,0,0,14.5,34.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Side/Walk/Shuttle",1991,47,NA,6,11,0,0,0,0,14.5,14.5,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Sidecar Racers",1975,100,NA,5,11,4.5,4.5,0,24.5,14.5,4.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Sidekicks",1992,101,NA,4.2,987,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Sideshow, The",1928,70,NA,8.2,5,0,0,0,0,0,0,44.5,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Sidesplitters: The Burt & Dick Story",2000,23,NA,5.6,11,4.5,0,0,0,0,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Sidewalk Soldiers",2002,71,NA,8.8,32,4.5,0,0,0,0,0,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Sidewalk Stories",1989,97,NA,6.2,59,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Sidewalks of London",1938,85,NA,6.8,95,0,0,0,0,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Sidewalks of New York",1931,74,NA,5.2,56,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sidewalks of New York",2001,108,1000000,6.5,1998,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Sideways",2004,123,16000000,8,17051,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Sidewinder 1",1977,96,NA,5.6,6,0,14.5,0,0,0,0,64.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Sidste detalje, Den",1981,31,NA,1,43,84.5,4.5,0,0,4.5,0,0,0,0,4.5,"",0,0,0,0,0,0,1 -"Sidste time",1995,83,NA,5.9,255,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sidste viking, Den",1997,88,NA,5.7,51,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Sie fanden eine Heimat",1953,98,NA,7.1,12,0,4.5,0,0,4.5,4.5,4.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Sie haben Knut",2003,107,NA,6.4,53,14.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sie nannten ihn Gringo",1965,86,NA,4.5,15,4.5,0,24.5,34.5,24.5,0,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Sieben Jahre Pech",1940,90,NA,6,7,0,0,14.5,14.5,14.5,0,24.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Sieben Monde",1998,96,NA,5.4,115,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sieben Sommersprossen",1978,76,NA,7.8,24,0,0,0,4.5,4.5,4.5,24.5,14.5,44.5,4.5,"",0,0,0,1,0,1,0 -"Siebente Kontinent, Der",1989,90,NA,8.1,191,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Siebtelbauern, Die",1998,95,NA,7.2,424,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Siedem dni w tygodniu",1988,18,NA,3.5,6,14.5,0,0,0,0,0,14.5,0,0,64.5,"",0,0,0,0,1,0,1 -"Sieg des Glaubens, Der",1933,61,NA,3.1,29,34.5,0,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sieg im Westen",1941,114,NA,8,12,4.5,0,0,0,0,14.5,0,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Sieg, Der",1998,8,NA,9.3,11,14.5,0,0,0,0,0,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Siege at Red River, The",1954,86,NA,4.5,24,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Siege of Firebase Gloria, The",1989,97,NA,7.3,303,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Siege of Pinchgut, The",1959,100,NA,6,5,0,0,0,24.5,0,24.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Siege of Sidney Street, The",1960,93,NA,5.8,15,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Siege of the Saxons",1963,85,NA,4.3,25,24.5,14.5,14.5,14.5,24.5,0,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Siege, The",1998,116,70000000,5.9,9725,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Sieger, Die",1994,130,NA,6.4,127,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Siegfried & Roy: The Magic Box",1999,50,NA,3.9,59,24.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Siegfried und das sagenhafte Liebesleben der Nibelungen",1971,92,NA,2.8,23,34.5,4.5,0,4.5,14.5,14.5,14.5,0,4.5,0,"",1,0,0,0,0,0,0 -"Siekierezada",1986,82,NA,8.1,19,0,0,0,4.5,0,14.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Siemensstadt",2000,15,NA,5.8,5,0,24.5,0,0,44.5,0,0,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Siempre hay un camino a la derecha",1997,97,NA,4.1,16,4.5,4.5,14.5,14.5,0,14.5,34.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Siempre tuya",1952,90,NA,6.4,22,4.5,0,0,4.5,4.5,4.5,44.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sientje",1997,5,NA,6.4,8,0,0,0,14.5,14.5,14.5,14.5,34.5,14.5,0,"",0,1,0,0,0,0,1 -"Sierra",1950,83,NA,6.4,31,0,0,0,0,14.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Sierra Baron",1958,80,NA,5.1,13,0,4.5,0,4.5,24.5,34.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sierra Leone",1987,92,NA,3.5,6,0,34.5,0,0,0,0,0,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sierra Passage",1951,81,NA,7,6,0,0,0,0,0,14.5,84.5,0,0,0,"",0,0,0,0,0,0,0 -"Sierra Stranger",1957,74,NA,4,5,0,0,44.5,0,44.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Sierra Sue",1941,64,NA,6.3,8,0,14.5,0,0,14.5,34.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Siesta",1987,99,NA,5.1,519,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Siesta",1998,21,NA,3.5,6,0,0,34.5,0,0,0,0,14.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Siestas & Olas: A Surfing Journey Through Mexico",1997,87,NA,8,8,0,0,0,0,14.5,0,14.5,45.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Siestes",2001,18,NA,6.3,12,4.5,0,0,0,0,45.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Siestes Grenadine, Les",1999,90,NA,5.8,11,0,14.5,0,0,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Siete espartanos, Los",1962,105,NA,5.3,20,0,4.5,0,14.5,24.5,14.5,34.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Siete locos, Los",1973,118,NA,7.8,41,4.5,4.5,0,4.5,4.5,4.5,4.5,45.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Sigade revolutsioon",2004,98,NA,6.5,89,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Sigge Nilsson och jag",1938,75,NA,5.1,8,0,0,0,64.5,14.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Sight for Sore Eyes, A",2004,30,NA,5.9,646,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Siglo de las luces, El",1992,247,NA,7.8,5,0,0,0,0,0,24.5,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Sigmund",1984,2,NA,7.8,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,1,0,0,0,0,1 -"Sigmund the See Monster",2002,15,NA,9.1,11,4.5,0,0,0,0,0,0,0,4.5,84.5,"",0,0,1,1,0,0,1 -"Sign 'o' the Times",1987,85,NA,7.4,284,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Sign from God, A",2000,80,NA,6,13,0,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sign of Four, The",1932,75,NA,6.1,29,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sign of Zorro, The",1958,91,NA,6.6,94,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Sign of the Cross, The",1932,125,NA,7.2,233,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sign of the Pagan",1954,92,1300000,5.7,79,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sign of the Ram, The",1948,84,NA,8.1,11,0,0,0,0,4.5,0,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sign of the Times",1999,104,NA,5.8,56,74.5,4.5,4.5,0,4.5,0,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Signal 30",1959,28,NA,6,8,14.5,0,0,14.5,0,14.5,24.5,24.5,14.5,0,"",0,0,0,0,1,0,1 -"Signal One",1994,95,NA,2.9,14,14.5,24.5,4.5,14.5,14.5,0,14.5,0,4.5,4.5,"R",0,0,0,0,0,0,0 -"Signal Seven",1986,92,NA,5.3,16,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Signaleur, Le",1997,20,NA,4.6,25,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Signatures of the Soul",1987,60,NA,8.5,6,0,0,0,0,0,0,0,34.5,45.5,14.5,"",0,0,0,0,1,0,0 -"Signe d'hiver",2003,22,NA,6.1,8,0,0,0,0,64.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Signe du lion, Le",1959,103,NA,7,88,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Signers Koffer",1995,81,NA,7.6,6,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Signers Koffer - Unterwegs mit Roman Signer",1995,84,NA,8.5,6,0,0,0,0,0,14.5,0,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Signes de vie",2004,10,NA,6.2,7,0,0,0,0,14.5,74.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Signing Off",1996,15,NA,7.4,40,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Signor Max, Il",1937,84,NA,7.9,16,0,0,0,0,0,4.5,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Signor Quindicipalle, Il",1998,101,NA,5.1,60,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,1,0,0,1,0 -"Signor Robinson, mostruosa storia d'amore e d'avventure, Il",1976,107,NA,5.2,35,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Signor Rossi al mare, Il",1964,15,NA,6.3,10,0,14.5,0,14.5,0,24.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Signora della notte, La",1985,90,NA,4.5,23,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Signora di tutti, La",1934,95,NA,7,60,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Signora senza camelie, La",1953,105,NA,6.4,38,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Signore & signori",1965,115,NA,7.2,45,0,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Signore e signori, buonanotte",1976,117,NA,5.2,27,4.5,4.5,0,14.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Signori si nasce",1960,95,NA,5.6,52,4.5,0,0,4.5,4.5,14.5,4.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Signpost to Murder",1964,74,NA,5.4,39,4.5,0,14.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Signs",2002,108,72000000,7.1,40285,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Signs & Wonders",2000,105,NA,5.4,187,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Signs and Voices",2004,17,NA,8.7,7,0,0,14.5,0,0,0,0,14.5,0,74.5,"",0,0,0,0,1,0,1 -"Signs of Life",1989,90,NA,6.2,146,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Signum Laudis",1980,88,NA,7.6,13,0,0,0,4.5,0,14.5,14.5,44.5,14.5,0,"",0,0,0,0,0,0,0 -"Sigurd Drakedreper",1989,90,NA,4.4,37,14.5,0,14.5,4.5,14.5,0,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sijie",1968,19,NA,1.5,5,44.5,44.5,0,0,0,0,0,0,0,24.5,"",0,0,0,1,0,0,1 -"Sik san",1996,95,NA,7.4,679,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Silence",1974,88,NA,3,5,44.5,0,64.5,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Silence",1997,102,NA,6.5,6,34.5,0,0,0,0,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Silence de la Mer, Le",1949,88,NA,8.1,110,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Silence des fusils, Le",1996,97,NA,6,6,0,0,34.5,14.5,14.5,0,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Silence est d'or, Le",1947,100,NA,7.2,50,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Silence of Dean Maitland, The",1934,95,NA,5.2,11,0,4.5,0,4.5,24.5,24.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Silence of the Lambs, The",1991,118,19000000,8.5,92060,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Silence of the North",1981,94,NA,6.1,46,4.5,4.5,4.5,4.5,14.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Silence, Le",2004,104,NA,5.8,13,4.5,14.5,0,14.5,0,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Silence, d'abord, Le",2003,22,NA,6.1,6,0,0,0,0,45.5,0,34.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Silencer, The",1999,92,NA,4.3,110,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Silencers, The",1966,102,NA,5.5,395,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Silencers, The",1996,103,NA,4.1,110,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Silencieux, Le",1973,114,NA,6.7,56,0,0,0,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Silencio",2002,30,10000,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,0,0,0,1 -"Silencio de Neto, El",1994,106,NA,5.3,35,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Silencio profundo",2003,15,NA,7.3,6,14.5,0,0,0,0,0,0,45.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Silencio roto",2001,110,NA,7.2,159,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Silent Alarm, The",1993,31,NA,6.8,14,4.5,0,0,0,4.5,14.5,24.5,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Silent Amy",2004,41,7000,8.4,16,0,0,4.5,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Silent Assassins",1988,92,NA,3.7,22,14.5,4.5,24.5,4.5,14.5,4.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Silent But Deadly 3",2004,12,NA,6.9,9,34.5,0,0,0,0,0,0,0,14.5,45.5,"",0,0,1,0,0,0,1 -"Silent Call, The",1961,63,NA,9.5,6,0,0,0,0,0,0,14.5,0,0,84.5,"",0,0,0,1,0,0,0 -"Silent Conflict",1948,61,NA,6.7,24,0,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Silent Cries",1993,120,NA,6.8,32,4.5,4.5,0,0,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Silent Cry",2002,85,4500000,3.7,39,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Silent Enemy, The",1930,84,NA,6.6,20,0,14.5,0,0,14.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Silent Enemy, The",1958,112,NA,6.2,31,0,0,4.5,0,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Silent Fall",1994,101,NA,5.6,793,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Silent Force, The",2000,90,NA,3.6,32,24.5,4.5,14.5,14.5,4.5,0,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Silent Grace",2001,87,NA,5.5,14,14.5,4.5,0,0,4.5,4.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Silent Hill: The Unauthorized Trailer",2004,3,NA,1.8,75,64.5,4.5,4.5,4.5,0,0,4.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Silent Hunter",1995,97,NA,3.1,58,14.5,24.5,14.5,4.5,14.5,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Silent Lies",1996,88,NA,7.2,14,4.5,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Silent Love, A",2004,100,NA,6.4,35,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Silent Madness",1984,93,NA,4,25,4.5,14.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Silent Movie",1976,87,4400000,6.3,2321,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Silent Night, Bloody Night",1974,81,NA,4.9,191,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Silent Night, Deadly Night",1984,85,750000,4.4,563,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Silent Night, Deadly Night 3: Better Watch Out!",1989,90,NA,2.4,226,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Silent Night, Deadly Night 4: Initiation",1990,90,NA,2.7,157,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Silent Night, Deadly Night 5: The Toy Maker",1992,90,NA,2.7,123,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Silent Night, Deadly Night Part 2",1987,88,250000,2.3,383,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Silent Number",1993,11,NA,5.6,12,14.5,0,0,0,4.5,14.5,4.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Silent One, The",1984,95,NA,4.4,26,4.5,0,4.5,14.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Silent Partner",2001,84,NA,5.1,34,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Silent Partner, The",1978,106,NA,7.4,394,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Silent Passenger, The",1935,75,NA,5.7,6,0,0,0,34.5,14.5,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Silent Prey",1997,93,NA,4.5,23,44.5,4.5,4.5,4.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Silent Rage",1982,103,NA,4.8,321,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Silent Raiders",1954,65,NA,7.6,12,0,0,0,0,0,0,14.5,45.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Silent Rain in the Ninth",1998,19,NA,6.3,25,0,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Silent Running",1972,89,NA,6.8,2860,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Silent Scream",1980,87,NA,5,83,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Silent Scream",1990,85,NA,5.1,20,24.5,0,0,4.5,24.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Silent Tongue",1994,101,NA,4.2,230,14.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Silent Treatment, The",2003,9,NA,8.4,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,1,1,0,0,1 -"Silent Trigger",1996,90,15000000,4.7,432,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Silent Whispers",1998,30,NA,9.8,5,24.5,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,0,0,0,0,1 -"Silentium",2004,116,NA,7.9,284,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Silenzio dei prosciutti, Il",1994,81,3000000,3.4,847,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Silenzio si nasce",1996,85,NA,2.2,7,24.5,0,0,14.5,0,0,44.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Silicon Towers",1999,87,NA,3.4,74,34.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"PG-13",1,0,0,1,0,0,0 -"Silja - nuorena nukkunut",1956,87,NA,6.3,19,0,0,0,14.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Silk",1986,84,NA,4.5,23,0,14.5,14.5,14.5,14.5,24.5,4.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Silk Degrees",1994,81,NA,2.8,49,24.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Silk Express, The",1933,61,NA,5.9,18,0,4.5,0,4.5,24.5,34.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Silk Stockings",1957,117,1853463,6.9,475,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Silk n' Sabotage",1994,73,NA,3.1,14,24.5,14.5,14.5,0,14.5,0,0,0,4.5,24.5,"",0,0,1,0,0,1,0 -"Silkwood",1983,131,NA,7.1,2562,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Silly Billies",1936,63,NA,6.5,8,0,0,0,0,14.5,14.5,34.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Silly Hillbilly",1949,6,NA,5.2,5,0,0,0,24.5,24.5,24.5,0,0,0,44.5,"",0,1,1,0,0,0,1 -"Silly Scandals",1931,6,NA,5.9,12,0,0,0,4.5,14.5,34.5,34.5,4.5,0,0,"",0,1,0,0,0,0,1 -"Silmido",2003,135,8000000,7.1,409,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Silnee vsekh inykh veleniy (Syuita na russkie temy)",1987,100,NA,8.4,5,0,0,0,0,0,0,0,64.5,44.5,0,"",0,0,0,0,0,0,0 -"Silsila",1981,182,NA,8.3,135,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Silver Bears",1978,113,NA,5.3,130,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Silver Bells",2003,3,NA,9.7,7,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,1,0,0,0,1 -"Silver Blaze",1937,65,NA,5.8,46,0,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Silver Brumby, The",1993,93,NA,5.3,135,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Silver Bullet",1985,95,7000000,5.6,2000,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Silver Canyon",1951,70,NA,5.5,8,0,0,14.5,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Silver Chalice, The",1954,142,4500000,4.1,184,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Silver City",1951,90,NA,5.5,18,14.5,0,14.5,14.5,24.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Silver City",1969,25,NA,5.8,11,0,0,0,14.5,4.5,14.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,1 -"Silver City",1984,101,NA,5.5,20,0,0,0,14.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Silver City",2004,129,NA,6.4,796,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Silver City Bonanza",1951,67,NA,6.2,8,0,0,14.5,0,24.5,34.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Silver Cord, The",1933,74,NA,5.7,43,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Silver Dollar",1932,83,NA,6,29,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Silver Dream Racer",1980,101,NA,3.7,75,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Silver Fleet, The",1943,88,NA,8.2,33,0,0,0,4.5,0,4.5,14.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Silver Hermit from Shaolin Temple",1979,94,NA,4.9,18,4.5,0,14.5,14.5,4.5,14.5,24.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Silver Horde, The",1930,75,NA,5.3,26,0,0,4.5,4.5,34.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Silver Lode",1954,81,NA,6.8,60,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Silver Queen",1942,80,NA,5.8,6,0,0,0,14.5,0,45.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Silver River",1948,110,NA,6,100,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Silver Screen: Color Me Lavender, The",1997,100,NA,7,16,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Silver Slime",1981,15,NA,6.3,6,0,0,0,0,0,34.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Silver Star, The",1955,73,NA,5.1,16,4.5,4.5,0,0,0,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Silver Streak",1976,114,NA,6.7,2472,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Silver Streak, The",1934,85,NA,6.5,22,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Silver Surfer, The",1994,5,NA,4.9,14,0,0,14.5,0,24.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Silver Whip, The",1953,73,NA,6.8,19,0,14.5,4.5,0,0,24.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Silver Wolf",1998,99,NA,6,102,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Silver moumoute",2003,12,NA,4.1,8,14.5,0,14.5,45.5,0,14.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Silver on the Sage",1939,68,NA,8,18,0,0,0,0,0,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Silverado",1985,127,26000000,7,6118,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Silverstar",1999,13,NA,5.9,16,0,0,0,0,24.5,34.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Silvestre",1982,120,NA,5.2,17,14.5,4.5,14.5,0,0,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Silvia Prieto",1999,92,NA,6,69,24.5,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Simba",1955,99,NA,6.9,28,0,0,4.5,14.5,14.5,14.5,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Simba: The King of the Beasts",1928,87,NA,7.6,7,0,0,0,14.5,0,0,44.5,24.5,0,14.5,"",0,0,0,0,1,0,0 -"Simbad el Mareado",1950,96,NA,7.8,15,0,0,0,0,0,4.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Simhasan",1980,170,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Simian Line, The",2000,106,NA,5.9,112,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Simitrio",1960,90,NA,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Simon",1980,97,NA,5.6,133,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Simon Birch",1998,113,20000000,6.8,4612,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,1,0,0,0 -"Simon Says",1998,91,NA,7.8,5,24.5,0,0,0,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Simon Sez",1999,90,NA,2.6,737,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Simon and I",2002,52,NA,8.8,10,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,0,0,0,1,0,0 -"Simon and Laura",1955,87,NA,6.2,23,0,0,0,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Simon les nuages",1990,83,NA,6.2,32,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Simon syndaren",1954,85,NA,6.9,7,0,0,0,0,14.5,14.5,44.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Simon, King of the Witches",1971,91,NA,3.5,50,24.5,4.5,14.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Simon: An English Legionnaire",2002,90,3500000,5.7,44,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Simone e Matteo un gioco da ragazzi",1975,105,NA,6,10,0,0,0,14.5,0,14.5,14.5,24.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Simones Labyrinth",2003,15,NA,7.1,28,4.5,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Simons film",1999,115,NA,6.8,5,0,24.5,0,0,0,0,44.5,0,44.5,0,"",0,0,0,0,1,0,0 -"Simpatici & antipatici",1998,92,NA,2.6,14,24.5,24.5,4.5,4.5,0,14.5,0,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Simpatico",1999,101,NA,4.5,994,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Simple Men",1992,105,NA,7.1,1017,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Simple Plan, A",1998,121,17000000,7.6,15398,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Simple Revenge",2003,88,NA,6.6,13,14.5,4.5,4.5,0,4.5,0,14.5,4.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Simple Simon",1935,6,NA,4.5,15,14.5,0,0,24.5,34.5,14.5,0,14.5,4.5,0,"",0,1,0,0,0,0,1 -"Simple Things, The",1953,7,NA,5.8,36,4.5,0,4.5,14.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Simple Twist of Fate, A",1994,106,NA,6.2,995,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Simple Wish, A",1997,89,28000000,5,423,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Simple mortel",1991,85,NA,7.3,61,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Simply Irresistible",1999,94,6000000,4.7,3083,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Simpsons: Family Portrait, The",1988,3,NA,9.4,7,0,0,0,0,0,0,14.5,0,14.5,74.5,"",0,1,1,0,0,0,1 -"Simpsons: Family Therapy, The",1989,3,NA,8.2,12,0,0,0,0,4.5,4.5,0,4.5,14.5,45.5,"",0,1,1,0,0,0,1 -"Simulacra",2001,13,NA,8.7,10,14.5,0,0,0,0,0,0,24.5,0,74.5,"",0,0,0,1,0,0,1 -"Simulacrum",2001,26,NA,9.5,6,0,0,0,0,0,0,14.5,0,0,84.5,"",0,0,0,0,0,0,1 -"Sin",2000,12,NA,5.8,9,0,0,14.5,14.5,34.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Sin City",2005,124,45500000,8.3,23473,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"R",1,0,0,0,0,0,0 -"Sin Takes a Holiday",1930,81,NA,5.9,33,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Sin dejar huella",2000,109,NA,6.9,95,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Sin in the Suburbs",1964,88,NA,7.1,16,0,0,0,0,14.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Sin nombre, Los",1999,102,NA,6.2,1127,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Sin noticias de Dios",2001,112,NA,6.6,960,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Sin of Harold Diddlebock, The",1947,89,1712959,6.2,172,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sin of Madelon Claudet, The",1931,75,NA,6.7,70,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sin of Nora Moran, The",1933,65,NA,5.9,30,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sin querer",1997,96,NA,5.4,17,14.5,0,0,0,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Sin remitente",1995,97,NA,7.4,44,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Sin ton ni Sonia",2003,113,NA,5.2,58,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sinai Field Mission",1978,127,NA,5,5,44.5,0,0,0,24.5,0,0,0,44.5,0,"",0,0,0,0,1,0,0 -"Sinans bryllup",1997,59,NA,3.6,18,14.5,0,0,4.5,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sinatra",1988,112,NA,8.7,8,14.5,0,0,0,0,0,14.5,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Sinbad and the Eye of the Tiger",1977,113,NA,5.6,645,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Sinbad contro i sette saraceni",1964,92,NA,3.6,9,0,24.5,24.5,24.5,0,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Sinbad of the Seven Seas",1989,93,NA,2.4,134,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sinbad the Sailor",1935,7,NA,6.8,16,0,0,4.5,0,14.5,14.5,14.5,24.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Sinbad the Sailor",1947,116,NA,6.6,212,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Sinbad: Legend of the Seven Seas",2003,86,60000000,6.5,2340,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG",0,1,0,0,0,0,0 -"Since You Went Away",1944,172,2400000,7.6,560,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sincerely Yours",1955,115,NA,2.7,34,24.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Sincerely, Joe P. Bear",2000,4,NA,7.9,8,0,0,0,0,14.5,0,14.5,14.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Sind Sie Luigi?",1999,7,NA,4.2,10,0,0,24.5,0,0,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,1 -"Sinderella",1992,78,NA,7.3,15,0,0,0,14.5,0,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Sinderella and the Golden Bra",1964,81,NA,3.3,14,4.5,14.5,24.5,24.5,24.5,0,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Sindhu Bhairavi",1985,159,NA,9,8,0,0,0,0,14.5,0,0,0,34.5,45.5,"",0,0,0,0,0,0,0 -"Sindrome di Stendhal, La",1996,113,3800000,5.8,972,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sinful Davey",1969,95,3000000,5.6,76,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sinful Intrigue",1995,88,NA,3.7,37,14.5,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Sinful Life, A",1989,90,NA,4.1,25,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Sinful Obsession",1999,90,NA,3,43,24.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Sing",1989,98,NA,5,150,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sing As We Go",1934,80,NA,6.9,15,0,0,0,4.5,4.5,24.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Sing Faster: The Stagehands' Ring Cycle",1999,60,NA,6.6,27,0,0,4.5,0,0,4.5,34.5,14.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Sing Me a Love Song",1937,75,NA,6.7,12,0,0,0,4.5,0,34.5,34.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Sing Sing",1983,117,NA,3.7,19,4.5,14.5,14.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Sing Sing Nights",1934,60,NA,3.4,5,44.5,0,0,44.5,24.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Sing You Sinners",1938,88,NA,6.2,19,4.5,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Sing Your Way Home",1945,72,NA,4,10,14.5,14.5,24.5,14.5,34.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Sing Your Worries Away",1942,70,NA,6.5,15,0,0,4.5,4.5,24.5,24.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Sing a Song of Six Pants",1947,17,NA,7.1,133,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Sing and Like It",1934,72,NA,6.5,43,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sing si jin jaang",1988,92,NA,6,68,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sing!",2001,36,NA,7,5,0,0,0,24.5,0,24.5,24.5,24.5,0,24.5,"",0,0,0,0,1,0,1 -"Sing, Baby, Sing",1936,90,NA,5.8,10,0,14.5,0,0,14.5,24.5,24.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Sing, Bing, Sing",1933,19,NA,6.7,14,0,0,0,4.5,4.5,14.5,34.5,34.5,0,0,"",0,0,1,0,0,0,1 -"Sing, Boy, Sing",1958,90,NA,4.7,25,0,4.5,0,24.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sing, Cowboy, Sing",1937,59,NA,4.1,5,0,24.5,0,24.5,44.5,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Singapore",1947,79,NA,6.5,42,0,0,0,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Singapore Sling",1990,120,NA,5.8,93,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Singapore Sue",1932,10,NA,4.9,35,14.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Singapore Woman",1941,64,NA,5.1,20,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Singer Not the Song, The",1961,132,NA,6.2,60,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Singin' in the Rain",1952,103,2540800,8.5,20585,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Singing Blacksmith, The",1938,90,NA,5.4,12,0,0,0,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Singing Cowboy, The",1936,56,NA,5.2,6,0,0,34.5,14.5,0,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Singing Detective, The",2003,109,10000000,5.3,1184,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Singing Fool, The",1928,105,NA,6.8,24,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Singing Forest, The",2003,95,NA,1.6,28,45.5,14.5,4.5,4.5,4.5,0,0,0,0,14.5,"",0,0,0,1,0,1,0 -"Singing Guns",1950,91,NA,5.8,35,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Singing Hill, The",1941,75,NA,4.3,6,14.5,0,0,0,34.5,0,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Singing Kid, The",1936,85,NA,6.9,18,0,0,0,0,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Singing Marine, The",1937,105,NA,6.1,24,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Singing Nun, The",1966,98,NA,5.3,157,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Singing Sheriff, The",1944,63,NA,6,6,0,0,14.5,0,14.5,34.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Singing Vagabond, The",1935,55,NA,5.6,5,24.5,0,0,24.5,0,0,24.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Single Girls, The",1974,83,NA,6.6,7,0,0,0,24.5,0,14.5,14.5,0,24.5,14.5,"",0,0,1,1,0,0,0 -"Single Room Furnished",1968,93,NA,3.9,39,14.5,4.5,4.5,24.5,4.5,4.5,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Single Spaced",1998,14,NA,6,20,0,4.5,4.5,0,14.5,14.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Single Standard, The",1929,73,336000,6.6,48,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Single White Female",1992,107,NA,6.2,4403,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Single and Dealing with It",2003,86,175000,5,27,24.5,14.5,0,0,4.5,4.5,0,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Single-Handed",1953,83,NA,6,83,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Singles",1992,99,NA,6.6,5897,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Singles Ward, The",2002,102,500000,5.7,291,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG",0,0,1,1,0,1,0 -"Singoalla",1949,104,NA,2.8,10,0,34.5,0,14.5,14.5,24.5,0,0,14.5,24.5,"",0,0,0,1,0,1,0 -"Siniestro doctor Orloff, El",1984,87,NA,5.2,7,24.5,0,0,0,0,0,0,0,0,74.5,"",0,0,0,0,0,0,0 -"Sininen viikko",1954,70,NA,6.6,28,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Sinister Flesh",1976,27,NA,5.3,5,0,0,0,24.5,0,0,24.5,0,0,64.5,"",0,0,1,0,0,0,1 -"Sinister Hands",1932,65,NA,4.2,8,0,14.5,24.5,0,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Sinister Harvest",1930,9,NA,2.7,5,0,24.5,24.5,0,24.5,0,24.5,0,0,24.5,"",0,0,0,0,1,0,1 -"Sinister Journey",1948,59,NA,6.2,23,0,0,4.5,24.5,4.5,4.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Sinister Urge, The",1961,71,NA,2,153,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sink Pink",1965,6,NA,5.3,9,0,0,0,0,45.5,24.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Sink or Swim",1990,48,NA,5.9,24,14.5,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Sink the Bismarck!",1960,97,NA,7.4,639,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Sinkhole",2003,90,NA,8,6,14.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Sinkin' in the Bathtub",1930,8,NA,4.8,14,14.5,4.5,14.5,4.5,14.5,34.5,4.5,0,0,0,"",0,1,1,0,0,0,1 -"Sinner's Blood",1969,81,NA,7,8,14.5,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sinners",1990,87,NA,3,6,45.5,14.5,0,34.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Sinners in Paradise",1938,65,NA,5.5,19,0,24.5,4.5,0,4.5,24.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Sinners in the Sun",1932,70,NA,6.4,15,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sinners' Holiday",1930,60,NA,6.2,40,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Sinnui yauman",1987,92,5600000,7.4,1606,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,1,0 -"Sinnui yauman II",1990,104,NA,7,445,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,1,0 -"Sinnui yauman III: Do Do Do",1991,104,NA,7,326,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Sinon, oui",1997,115,NA,5.6,6,0,0,0,0,64.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Sins of Desire",1993,87,NA,3.9,95,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sins of Jezebel",1953,74,100000,5,9,14.5,0,0,14.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sins of Rachel Cade, The",1961,124,NA,5.4,74,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Sins of the Children, The",1930,86,NA,4.8,22,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sins of the Fleshapoids",1965,40,1000,7.9,14,0,14.5,0,0,0,14.5,24.5,14.5,0,24.5,"",0,0,1,0,0,0,1 -"Sins of the Night",1993,85,NA,4.3,59,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sins of the Wealthy 2",1987,85,NA,8,5,0,0,0,0,24.5,0,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Sinterklaas en het geheim van de Robijn",2004,120,NA,8.2,6,0,0,0,14.5,0,0,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Sinthia, the Devil's Doll",1968,78,NA,2.4,32,34.5,14.5,14.5,4.5,4.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Sioux City",1994,102,NA,4.8,79,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sioux City Sue",1946,69,NA,5.9,13,4.5,0,0,4.5,34.5,4.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Sioux Ghost Dance",1894,1,NA,4.4,18,0,4.5,14.5,34.5,34.5,14.5,0,4.5,0,0,"",0,0,0,0,0,0,1 -"Sioux Me",1939,7,NA,6.6,6,0,0,0,0,14.5,34.5,34.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Sip si 32 doe",1996,90,NA,7.5,245,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",1,0,0,1,0,0,0 -"Sipur Shematchil Belevaya Shel Nachash",1994,85,NA,6.4,5,24.5,0,0,0,44.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Sipurei Tel-Aviv",1992,108,NA,5.7,29,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sir",1993,151,NA,6.7,7,14.5,0,0,0,14.5,14.5,0,14.5,44.5,0,"",0,0,0,1,0,0,0 -"Sir Cocuklari",2002,110,NA,8.4,21,4.5,0,0,0,0,0,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Sir Drone",1989,57,NA,9,8,0,0,0,14.5,0,0,0,0,24.5,64.5,"",0,0,1,0,0,0,0 -"Sir Henry at Rawlinson End",1980,71,NA,5.5,81,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Siraa Fil-Wadi",1954,105,NA,7.4,17,0,4.5,0,0,4.5,0,0,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Siren",2000,102,NA,4.7,11,24.5,4.5,0,4.5,0,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Siren of Atlantis",1949,75,NA,5.7,20,0,4.5,0,14.5,14.5,4.5,14.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Siren of Bagdad",1953,77,NA,4.9,7,14.5,0,14.5,14.5,24.5,0,0,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Siren's Kiss",1995,99,NA,3.5,46,24.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Sirene",1968,9,NA,7.2,14,0,0,0,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Sirens",1994,94,NA,5.9,2962,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Sirius Remembered",1959,12,NA,6.8,11,14.5,0,14.5,4.5,0,0,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Sirocco",1951,98,NA,5.9,224,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Sirota kazanskaya",1997,82,800000,7,47,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Sirup",1990,114,NA,5.7,18,4.5,0,0,4.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Sissi",1955,105,NA,6.6,588,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Sissi - Die junge Kaiserin",1956,118,NA,6.2,402,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Sissi - Schicksalsjahre einer Kaiserin",1957,118,NA,5.9,363,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Sissit",1963,106,NA,8.2,31,0,0,0,0,4.5,4.5,24.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Sissy Boy Slap Party",1995,6,NA,6.9,75,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Sissy's Hot Summer",1979,69,NA,7.1,5,0,0,0,0,0,24.5,64.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Sista dansen",1993,113,NA,5.2,190,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sista kontraktet",1998,107,NA,6.3,362,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sista paret ut",1956,103,NA,6.3,14,0,0,14.5,0,14.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sista vals, En",2001,14,35000,5.1,22,4.5,0,4.5,0,4.5,14.5,0,24.5,4.5,44.5,"",0,0,0,1,0,0,1 -"Siste Fleksnes, Den",1974,86,NA,6.9,122,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Sister Act",1992,100,NA,5.9,10051,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sister Act 2: Back in the Habit",1993,107,NA,4.6,4590,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sister Blue",2003,88,NA,4.5,21,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Sister Helen",2002,90,NA,9.1,46,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Sister Kenny",1946,116,NA,6.3,88,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sister My Sister",1994,86,NA,7,372,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Sister Rose's Passion",2004,39,NA,7.5,20,0,0,14.5,0,0,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Sister Stella L.",1984,96,NA,7.6,13,0,0,0,0,0,4.5,4.5,24.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Sister, Sister",1987,91,NA,5.2,190,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sisters",1973,92,500000,6.8,1088,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sisters in Cinema",2003,57,NA,5.9,7,0,0,14.5,0,14.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Sisters in Leather",1969,64,NA,4.7,5,0,0,24.5,24.5,0,0,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Sisters of Death",1977,87,NA,4.1,79,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Sisters, The",1938,99,NA,6.9,237,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sistole Diastole",1997,22,NA,4.8,16,4.5,34.5,0,0,4.5,4.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Sisyphus",1975,3,NA,6.5,11,4.5,0,0,0,14.5,4.5,0,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Sit Tight",1931,78,NA,7.2,7,0,0,14.5,14.5,0,24.5,0,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Sit and Spin",2002,20,50000,8.7,6,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,1,0,0,1 -"Sita Kalyanam",1976,134,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"Sitcom",1998,76,NA,6.7,982,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Sith Apprentice",2005,12,NA,7.9,12,4.5,0,0,4.5,0,14.5,0,0,14.5,45.5,"",0,0,1,0,0,0,1 -"Sitter-Downers, The",1937,16,NA,7.4,51,0,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Sitting Bull",1954,105,NA,4.3,44,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Sitting Pretty",1933,85,NA,5.5,11,0,0,4.5,4.5,4.5,4.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Sitting Pretty",1948,83,NA,7.6,232,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Sitting Target",1972,93,NA,5.8,89,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sitting in Limbo",1986,96,NA,6.7,9,14.5,0,0,0,14.5,14.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Situation",1973,83,NA,3.3,9,0,24.5,14.5,14.5,14.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Situation Hopeless... But Not Serious",1965,97,NA,5.6,84,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Siu lam ji",1976,126,NA,7.2,74,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",1,0,0,0,0,0,0 -"Siu lam juk kau",2001,89,NA,7.3,6680,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",1,0,1,0,0,0,0 -"Siunin Wong Fei-hung tsi titmalau",1993,90,2000000,7.4,3173,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",1,0,1,0,0,0,0 -"Sivi kamion crvene boje",2004,95,NA,7.1,39,4.5,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Siworae",2000,95,NA,8,586,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Six Black Horses",1962,80,NA,5.9,25,0,0,14.5,4.5,4.5,34.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Six Bridges to Cross",1955,96,NA,6.5,51,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Six Characters in Search of America",2004,99,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Six Days Seven Nights",1998,101,70000000,5.6,11112,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Six Days in Roswell",1998,82,NA,7.1,54,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Six Degrees of Separation",1993,112,NA,7,4155,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Six Figures Getting Sick",1966,4,0,6.3,357,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Six Hits and a Miss",1942,9,NA,5.8,6,0,0,0,0,14.5,45.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Six Hours to Live",1932,72,NA,6,7,0,0,0,14.5,14.5,14.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Six O'Clock News",1996,90,NA,7,44,0,4.5,0,0,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Six Pack",1982,108,NA,4.7,339,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Six Shooter",2005,27,NA,8.6,8,0,0,0,0,0,0,0,64.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Six Thousand Dollar Nigger, The",1980,80,NA,3.3,26,14.5,14.5,4.5,4.5,0,0,4.5,4.5,4.5,44.5,"",1,0,1,0,0,0,0 -"Six Ways to Sunday",1997,97,NA,6,284,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Six Weeks",1982,107,NA,4.6,172,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Six of a Kind",1934,65,NA,7.1,99,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Six-Gun Gold",1941,57,NA,6.4,8,0,0,0,0,24.5,14.5,0,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Six-Gun Rhythm",1939,57,NA,4.5,5,0,24.5,0,24.5,24.5,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Six-Pack",2000,108,NA,5.5,179,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Six-String Samurai",1998,91,2000000,6.2,1163,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG-13",1,0,0,0,0,0,0 -"Six: The Mark Unleashed",2004,104,NA,4.1,67,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Sixpack Annie",1975,88,NA,3.7,45,14.5,4.5,14.5,24.5,14.5,14.5,0,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Sixteen",1973,84,NA,3.6,12,0,4.5,4.5,14.5,14.5,4.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Sixteen Candles",1984,93,6500000,6.9,8690,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Sixteen Years of Alcohol",2003,102,NA,5.4,209,34.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Sixten",1994,78,NA,5,42,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Sixth Happiness",1997,97,NA,7.4,59,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sixth Man, The",1997,107,NA,5,642,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Sixth Scent",2002,5,NA,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,1,0,0,0,1 -"Sixth Scent, The",1999,27,NA,3.9,28,14.5,4.5,4.5,4.5,4.5,0,0,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Sixth Sense, The",1999,107,55000000,8.2,96987,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Sixth Sun: Mayan Uprising in Chiapas, The",1995,60,NA,9,5,0,0,0,0,0,24.5,0,0,24.5,64.5,"",0,0,0,0,1,0,0 -"Sixty Cups of Coffee",2000,8,NA,7.4,34,4.5,4.5,4.5,4.5,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Size 'Em Up",2001,15,NA,6,25,0,0,14.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Size of Watermelons, The",1996,84,NA,5.1,71,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Sjaj u ocima",2003,97,NA,5.1,34,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sjecanje na Georgiju",2002,90,NA,2.8,5,84.5,0,0,0,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Sjecas li se, Dolly Bell",1981,107,NA,8.1,368,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,1,1,0,1,0 -"Sjors en Sjimmie en het zwaard van Krijn",1977,86,NA,6,6,0,0,0,0,14.5,14.5,0,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sjov i gaden",1969,88,NA,4.2,15,0,14.5,4.5,24.5,24.5,4.5,0,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sjunde inseglet, Det",1957,92,150000,8.4,9622,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Skademeldingen",1993,5,NA,6.3,13,34.5,4.5,4.5,0,0,0,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Skagerrak",2003,104,NA,6,203,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Skallagrigg",1994,87,NA,8.2,26,4.5,0,0,0,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Skammen",1968,103,NA,8.3,554,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Skarb",1949,102,NA,7.8,18,0,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Skarby ukryte z cyklu 'Opowiesci weekendowe'",2000,54,NA,6.2,6,0,0,0,14.5,0,14.5,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Skat det er din tur",1997,95,NA,2.3,17,24.5,24.5,4.5,14.5,0,0,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Skateboard",1978,97,NA,4.5,53,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Skateboard Kid II, The",1995,90,NA,4.3,64,24.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Skateboard Kid, The",1993,83,NA,3.4,71,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Skatetown, U.S.A.",1979,98,NA,3.3,100,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Skaz pro Fedota-streltsa",2002,102,NA,4.8,27,24.5,0,14.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Skaz pro to, kak tsar Pyotr arapa zhenil",1976,100,NA,7.5,46,4.5,0,0,0,0,4.5,4.5,24.5,34.5,24.5,"",0,0,0,0,0,1,0 -"Skazanie o zemle sibirskoy",1947,114,NA,5.9,8,0,0,0,0,14.5,14.5,14.5,34.5,0,24.5,"",0,0,0,1,0,1,0 -"Skazka o poteryannom vremeni",1964,85,NA,6.7,22,0,0,0,0,14.5,14.5,14.5,24.5,34.5,4.5,"",0,0,0,0,0,0,0 -"Skazka o tsare Saltane",1966,82,NA,6.7,15,4.5,0,4.5,0,4.5,4.5,24.5,44.5,0,4.5,"",0,0,0,0,0,0,0 -"Skazka o tsare Saltane",1984,53,NA,7.2,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,1,0,0,0,0,0 -"Skazka skazok",1979,29,NA,8.3,99,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,1,0,0,0,0,1 -"Skazka stranstviy",1982,101,NA,8.6,64,4.5,0,0,0,4.5,4.5,4.5,4.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Skazki... skazki... skazki starogo Arbata",1982,101,NA,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,1,1,0,0,0 -"Skeeter",1993,95,NA,2.6,217,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Skeleton Coast",1987,98,NA,4,30,24.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Skeleton Dance, The",1929,6,5386,8.6,137,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Skeleton Woman",2000,80,NA,3.6,10,0,14.5,0,0,0,0,14.5,0,14.5,74.5,"",0,0,0,1,0,0,0 -"Skeletons",1996,87,2200000,5.3,122,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Skeletons in the Closet",2000,86,1500000,5.4,239,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Skepp till India land",1947,98,NA,6.7,41,0,4.5,0,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ski Bum, The",1971,95,NA,4.1,12,14.5,0,4.5,14.5,14.5,4.5,4.5,0,14.5,4.5,"",0,0,0,1,0,0,0 -"Ski Bums",2001,76,NA,5.7,8,0,0,0,0,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Ski Fever",1966,98,NA,1.9,6,45.5,14.5,14.5,14.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Ski Hard",1995,90,NA,3.9,70,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"PG-13",0,0,0,0,0,0,0 -"Ski Party",1965,90,NA,4.6,71,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ski Patrol",1990,91,NA,3.7,276,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Ski School",1991,95,NA,4.5,468,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Ski School 2",1995,89,NA,4.1,218,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Ski Troop Attack",1960,63,NA,2.5,27,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Ski for Two",1944,7,NA,7,6,0,0,14.5,0,0,14.5,34.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Skidoo",1968,97,NA,4,168,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Skier's Guide to the Galaxy, The",1992,57,NA,5.3,6,34.5,0,14.5,0,0,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Skin",1987,90,NA,5,16,14.5,4.5,0,4.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Skin",1995,11,NA,5.7,5,24.5,24.5,0,0,0,0,0,44.5,0,24.5,"",0,0,0,0,0,0,1 -"Skin Deep",1929,64,NA,7.9,7,0,0,0,0,0,44.5,14.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Skin Deep",1978,110,NA,4.6,22,4.5,4.5,0,34.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Skin Deep",1989,97,NA,5.3,734,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Skin Deep",1994,88,NA,2.6,22,14.5,24.5,4.5,14.5,4.5,0,4.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Skin Deep",2001,13,NA,6.9,30,14.5,4.5,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Skin Deep",2003,89,400000,3.8,31,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,24.5,"R",1,0,1,1,0,0,0 -"Skin Game",1971,102,NA,7,232,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Skin Game, The",1931,85,NA,5.6,230,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Skin Gang",1999,67,NA,5,65,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Skin Too Few: The Days of Nick Drake, A",2000,48,NA,7.6,48,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Skin Walker",2004,83,NA,6.3,9,34.5,0,0,0,0,0,0,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Skin and Bone",1996,110,NA,5.4,40,14.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Skinhead Attitude",2003,90,NA,7.2,34,4.5,0,0,0,4.5,4.5,34.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Skinheads",1989,90,NA,2.6,57,45.5,4.5,4.5,4.5,14.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Skinned Deep",2004,97,NA,4,40,24.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Skinner",1995,90,NA,4.6,118,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Skinner's Dress Suit",1926,70,NA,6.7,6,0,0,0,0,0,45.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Skins",1994,86,NA,2.5,20,44.5,14.5,4.5,14.5,4.5,0,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Skins",1997,14,NA,5.3,5,0,0,24.5,0,0,24.5,44.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Skins",2002,84,NA,6.6,351,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"R",0,0,0,1,0,0,0 -"Skip Tracer",1977,95,NA,3.9,27,4.5,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Skipalong Rosenbloom",1951,72,NA,7.3,7,0,0,0,0,0,0,44.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Skipped Parts",2000,100,NA,6.3,750,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Skipper Surprised His Wife, The",1950,85,NA,5.7,7,0,0,14.5,14.5,0,14.5,0,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Skipper, Der",1990,98,NA,4.8,158,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Skippy",1931,85,NA,6.8,23,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Skippy",2001,90,NA,3.5,40,34.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,24.5,"PG",0,0,1,0,0,1,0 -"Skirts Ahoy!",1952,109,NA,4.9,78,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Skizbe",1967,10,NA,8.5,7,0,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,0,0,1,0,1 -"Sklavenkarawane, Die",1958,99,NA,5.7,5,0,0,0,0,44.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Skoda",2002,39,NA,4.5,8,0,0,0,24.5,24.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Skoot hansawwar",2001,102,NA,6.3,84,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,"",0,0,1,1,1,1,0 -"Skorbnoye beschuvstviye",1987,110,NA,6.8,19,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Skoro sasvim obicna prica",2003,80,NA,6.1,15,4.5,0,4.5,0,4.5,34.5,24.5,0,4.5,24.5,"",0,0,1,0,0,1,0 -"Skraphandlerne",1975,84,NA,4.6,8,0,64.5,0,0,14.5,0,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Skrupellosen.com, Die",2003,89,NA,5,19,4.5,0,14.5,14.5,24.5,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Skuespilleren",2004,48,NA,7.4,8,0,14.5,14.5,0,0,0,24.5,0,0,45.5,"",0,0,0,1,0,1,1 -"Skull, The",1965,90,NA,5.6,161,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Skull: A Night of Terror",1987,80,NA,4,14,14.5,34.5,0,4.5,14.5,24.5,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Skullduggery",1970,105,4500000,4,69,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Skullduggery",1983,95,NA,2.3,57,44.5,14.5,4.5,4.5,4.5,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Skulls III, The",2003,102,NA,4.4,193,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Skulls, The",2000,106,15000000,5.3,6530,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Skunk Ape!?",2003,30,NA,8,5,0,0,0,0,24.5,0,0,44.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Skupljaci perja",1967,94,NA,8.5,62,0,0,0,0,0,4.5,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Skvernyy anekdot",1966,87,NA,8.9,7,0,0,14.5,0,0,0,0,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Sky Bandits",1986,95,18000000,3.8,29,24.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,0,24.5,"",1,0,0,0,0,0,0 -"Sky Blue Pink",1968,6,NA,5.1,11,0,0,24.5,0,34.5,24.5,0,0,0,4.5,"",0,1,0,0,0,0,1 -"Sky Captain and the World of Tomorrow",2004,106,40000000,6.5,12579,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG",1,0,0,0,0,0,0 -"Sky Commando",1953,69,NA,5,8,0,24.5,14.5,14.5,14.5,0,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Sky Devils",1932,90,NA,6.3,10,14.5,0,14.5,14.5,24.5,14.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Sky Dragon, The",1949,64,NA,6.5,73,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Sky Full of Moon",1952,73,NA,6.6,6,14.5,0,0,0,14.5,14.5,14.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Sky Giant",1938,80,NA,7.4,10,0,0,0,14.5,0,24.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sky High",1922,58,NA,4.9,8,0,0,14.5,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Sky Is Falling, The",2000,105,NA,6,142,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Sky Is Falling, The",2004,20,NA,4,12,0,4.5,4.5,0,0,0,0,24.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Sky Murder",1940,72,NA,5,19,0,4.5,24.5,4.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Sky Over Holland",1967,22,NA,6.7,11,0,0,0,0,4.5,0,24.5,24.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Sky Pilot, The",1921,77,NA,5.8,6,0,0,0,14.5,0,0,14.5,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Sky Pirates",1986,89,NA,3.3,45,44.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Sky Raiders",1941,227,NA,6.8,6,0,0,0,0,14.5,14.5,0,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Sky Riders",1976,91,NA,5.9,111,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Sky Scrapers of New York City from North River",1903,3,NA,6.2,57,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Sky Trooper",1942,7,NA,7.2,46,0,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Sky West and Crooked",1966,105,NA,7.4,90,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sky of an Archangel",2004,24,NA,9.9,7,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,1 -"Sky's the Limit, The",1943,89,NA,6.7,75,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Skydivers, The",1963,75,NA,1.3,513,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Skyggen",1998,102,NA,4.9,170,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Skyggen af Emma",1988,99,NA,7.6,88,0,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Skyjacked",1972,101,NA,5.4,210,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Skylark",1941,92,NA,7.5,21,0,0,0,0,4.5,14.5,4.5,44.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Skyscraper Caper",1968,6,NA,7,8,0,0,0,0,0,24.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Skyscraper Souls",1932,99,NA,7.3,85,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Skyscraper Symphony",1929,9,NA,6.8,17,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,0,"",0,0,0,0,1,0,1 -"Skyscrapers",1906,8,NA,4.8,5,24.5,0,0,0,0,44.5,24.5,24.5,0,0,"",0,0,0,1,0,0,1 -"Skyscrapers and Brassieres",1963,10,NA,1,8,74.5,0,0,0,0,0,0,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Skytten",1977,85,NA,5.4,39,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Skytturnar",1987,80,NA,5.7,27,4.5,0,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Skyway",1933,70,NA,3.9,5,0,24.5,24.5,24.5,0,24.5,0,24.5,0,0,"",0,0,1,1,0,0,0 -"Skywhales",1983,11,NA,5.2,14,0,0,14.5,0,0,0,4.5,4.5,0,74.5,"",0,1,0,0,0,0,1 -"Slab Boys, The",1997,97,NA,3.3,13,4.5,34.5,0,14.5,0,14.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Slack Trek: The X Generation",1995,90,NA,4.7,7,24.5,24.5,0,0,0,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Slacker",1991,97,23000,6.7,2108,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Slackers",2002,86,11000000,4.7,2755,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Sladke sanje",2001,110,NA,6.7,36,4.5,0,4.5,0,4.5,0,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Slalom",1965,108,NA,5.3,8,0,0,14.5,14.5,14.5,0,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Slam",1998,100,1000000,7.1,569,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Slam",2003,94,NA,3.5,47,14.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Slam Dance",1987,100,NA,5,318,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"SlamNation",1998,100,NA,7.9,40,4.5,0,0,0,4.5,0,4.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Slammed",2001,100,NA,4,26,14.5,4.5,14.5,0,4.5,14.5,4.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Slams, The",1973,91,NA,4.7,17,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Slander",1956,81,NA,6.9,26,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Slap Happy Lion",1947,7,NA,7.5,51,0,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Slap Happy Pappy",1940,7,NA,7.8,9,0,0,0,0,0,14.5,24.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Slap Happy Sleuths",1950,16,NA,7.5,33,0,0,0,0,0,4.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Slap Her... She's French",2002,92,10000000,4.7,811,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Slap Shot",1977,123,NA,7.2,5509,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",1,0,1,1,0,0,0 -"Slap af, Frede!",1966,105,NA,5.6,56,0,0,4.5,14.5,14.5,34.5,24.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Slap, The",1996,6,NA,6.2,14,0,14.5,0,0,4.5,0,4.5,24.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Slap-Hoppy Mouse, The",1956,7,NA,6.1,21,4.5,0,4.5,0,24.5,4.5,24.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Slappy and the Stinkers",1998,78,NA,4,111,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Slapstick (Of Another Kind)",1982,82,NA,2.4,113,44.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Slash",2002,93,NA,4.1,287,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Slash Dance",1989,83,NA,2.6,12,34.5,4.5,14.5,0,14.5,0,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Slashed Dreams",1975,74,NA,3.6,15,24.5,24.5,4.5,14.5,4.5,4.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Slashers",2001,97,165000,5.2,213,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Slate, Wyn & Me",1987,87,NA,3.5,19,14.5,14.5,24.5,4.5,24.5,14.5,4.5,4.5,0,0,"",0,0,0,1,0,1,0 -"Slatko od snova",1994,96,NA,3.7,27,74.5,4.5,14.5,0,0,4.5,4.5,0,0,4.5,"",0,0,0,0,0,1,0 -"Slattery's Hurricane",1949,87,NA,6.8,46,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Slaughter",1972,91,NA,5.6,83,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Slaughter High",1986,95,NA,4.2,217,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Slaughter Rule, The",2002,112,500000,6,356,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Slaughter Trail",1951,78,NA,5.7,27,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Slaughter in San Francisco",1974,89,NA,3.4,68,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Slaughter of the Innocents",1994,99,NA,5,311,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Slaughter on Tenth Avenue",1957,103,NA,6.3,45,4.5,0,0,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Slaughter's Big Rip-Off",1973,92,NA,5,51,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Slaughterhouse",1987,85,NA,4.7,150,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Slaughterhouse Rock",1988,90,NA,3.5,62,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Slaughterhouse-Five",1972,104,NA,6.9,1521,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Slave",2002,102,NA,5.1,7,14.5,14.5,0,0,24.5,0,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Slave Girl",1947,80,NA,4.1,14,4.5,4.5,4.5,14.5,0,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Slave Girls from Beyond Infinity",1987,80,NA,3.8,183,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Slave Ship",1937,100,NA,7.1,34,0,4.5,4.5,4.5,0,24.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Slavers",1978,102,NA,4.4,20,14.5,0,4.5,34.5,4.5,24.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Slaves",1969,110,NA,3.8,13,14.5,0,24.5,24.5,14.5,4.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Slaves in Bondage",1937,70,NA,5.7,9,0,0,0,14.5,34.5,34.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Slaves of Babylon",1953,82,NA,3.7,9,14.5,14.5,14.5,24.5,34.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Slaves of Hollywood",1999,73,NA,5.2,14,0,0,14.5,0,24.5,24.5,14.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Slaves of New York",1989,124,NA,4.6,235,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Slaves to the Underground",1997,93,NA,4.7,103,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Slavica",1947,100,NA,8.1,6,0,0,14.5,0,0,0,14.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Slavnosti snezenek",1983,83,NA,8.3,95,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Slavoj Zizek: The Reality of the Virtual",2004,71,NA,9.2,6,0,0,0,0,0,0,0,14.5,45.5,34.5,"",0,0,0,0,1,0,0 -"Slayer, The",1982,80,NA,4,94,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Slayers: The Motion Picture",1995,63,NA,6.1,151,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Slayground",1983,89,NA,3.5,33,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Sleazy Rider",1988,23,NA,3.1,11,34.5,0,0,0,0,0,4.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Sled kraja na sveta",1998,112,NA,6.3,48,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sledgehammer",1983,87,40000,3.7,24,44.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sledopyt",1987,91,NA,7,9,0,0,14.5,0,14.5,0,34.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Sledvay me",2003,75,NA,9.7,7,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,0,1,0,0,0 -"Sleep",1963,321,NA,5.5,44,34.5,4.5,4.5,4.5,0,4.5,14.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Sleep",2002,10,NA,6,5,44.5,0,0,0,0,0,0,0,44.5,24.5,"",0,0,0,1,0,0,1 -"Sleep Always",2002,81,NA,8.7,14,0,0,0,0,0,0,0,45.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sleep Room, The",1998,193,NA,5.5,23,4.5,0,0,4.5,24.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sleep of Death, The",1981,90,NA,4.2,8,0,0,64.5,0,0,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Sleep with Me",1994,86,NA,5.6,695,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Sleep, My Love",1948,97,NA,6.8,89,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sleepaway Camp",1983,84,350000,5.3,1104,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sleepaway Camp II: Unhappy Campers",1988,80,NA,5.1,636,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sleepaway Camp III: Teenage Wasteland",1989,80,NA,4.6,455,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sleeper",1973,89,2000000,7.4,5571,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Sleepers",1996,147,44000000,7,17896,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Sleepers West",1941,74,NA,6,7,0,0,0,0,14.5,24.5,0,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Sleeping Beauties",1999,13,NA,4.9,53,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Sleeping Beauty",1959,75,6000000,7.4,5843,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,1,0 -"Sleeping Beauty",1987,90,NA,4.9,41,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Sleeping Beauty Aroused",1989,77,NA,4.8,7,0,0,14.5,14.5,0,0,24.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Sleeping Car to Trieste",1948,95,NA,5.8,38,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sleeping Car, The",1990,96,NA,3.9,63,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sleeping Cardinal, The",1931,84,NA,5.9,15,0,0,0,4.5,24.5,34.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Sleeping City, The",1950,85,NA,7,24,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sleeping Dictionary, The",2003,109,12000000,6.1,696,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Sleeping Dogs",1977,107,NA,5.9,96,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Sleeping Dogs",1998,90,NA,3.8,69,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sleeping Dogs Lie",1998,92,NA,6,15,0,0,0,4.5,14.5,44.5,0,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sleeping Dogs Lie",2005,25,NA,7.9,14,4.5,0,4.5,0,0,14.5,0,4.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Sleeping Man",2001,6,NA,6.6,5,0,0,0,0,0,24.5,84.5,0,0,0,"",0,0,0,1,0,0,1 -"Sleeping Tiger, The",1954,89,NA,6.7,46,0,0,4.5,14.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sleeping Together",1997,87,NA,5.9,21,4.5,4.5,4.5,0,14.5,4.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Sleeping with the Enemy",1991,99,NA,5.7,5687,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sleepless in Seattle",1993,105,21000000,6.7,19224,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Sleepless, The",1997,91,NA,2.8,9,24.5,0,0,14.5,0,14.5,0,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Sleepover",1995,88,NA,5.6,14,24.5,0,0,0,14.5,24.5,0,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Sleepover",2004,89,10000000,4.1,733,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Sleepstalker",1995,105,NA,3.8,196,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sleepwalk",1986,78,NA,4.2,31,4.5,24.5,4.5,0,4.5,4.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Sleepwalk",2000,98,100000,5.7,48,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sleepwalker",1993,2,15000,1.5,6,14.5,14.5,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Sleepwalker",2000,95,NA,6.2,386,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sleepwalker, The",1942,7,NA,6.4,14,0,0,0,14.5,0,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Sleepwalkers",1992,91,NA,4.3,2569,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Sleepy Heads",1997,87,NA,5.2,34,4.5,0,14.5,4.5,4.5,0,14.5,14.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Sleepy Hollow",1999,105,65000000,7.4,38857,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Sleepy Hollow High",2000,81,NA,2.8,55,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Sleepy Time Donald",1947,7,NA,7.4,20,4.5,0,0,4.5,0,4.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Sleepy Time Gal, The",2001,94,NA,6,159,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Sleepy Time Possum",1951,7,NA,5.9,12,0,0,0,4.5,24.5,24.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Sleepy-Time Squirrel",1954,7,NA,6,6,0,0,0,0,34.5,34.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"Sleepy-Time Tom",1951,7,NA,6.7,32,0,0,0,14.5,4.5,4.5,24.5,14.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Slepa pega",2002,88,NA,5.2,28,4.5,0,0,14.5,34.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sleuth",1972,138,NA,8.1,4807,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Slick Chick, The",1962,7,NA,6.2,18,0,0,4.5,14.5,14.5,24.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Slick Hare",1947,7,NA,7.9,81,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Slick Honey",1989,85,NA,4.7,5,0,0,0,44.5,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Slicked-up Pup",1951,6,NA,6.4,28,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Slide Donald Slide",1949,7,NA,7.3,22,0,0,4.5,4.5,4.5,14.5,4.5,14.5,0,34.5,"",0,1,1,0,0,0,1 -"Slide, Babe, Slide",1932,10,NA,6.2,10,0,0,0,0,14.5,24.5,34.5,44.5,0,0,"",0,0,0,0,0,0,1 -"Slidin' - Alles bunt und wunderbar",1998,94,NA,6.4,23,0,0,4.5,0,24.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sliding Doors",1998,99,NA,6.9,11954,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"Slight Case of Larceny, A",1953,71,NA,6.6,32,4.5,0,0,4.5,14.5,14.5,14.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Slight Case of Murder, A",1938,85,NA,7.2,157,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Slightly Daffy",1944,7,NA,6.9,30,0,0,4.5,0,14.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Slightly Dangerous",1943,94,NA,5.7,60,0,4.5,0,14.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Slightly French",1949,81,NA,5.3,16,0,0,4.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Slightly Honorable",1940,85,NA,6,31,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Slightly Scarlet",1956,99,NA,6.5,84,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Slim",1937,85,NA,6.6,66,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Slim Carter",1957,82,NA,6.2,15,0,0,0,14.5,0,24.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Slim Pickings",1999,5,NA,5.9,20,0,0,0,4.5,24.5,14.5,24.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Slim Slam Slum",2002,97,NA,1.7,107,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Slime People, The",1963,76,NA,2.3,167,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sling Blade",1996,135,NA,8,20361,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Slingrevalsen",1981,99,NA,6.6,14,0,0,0,14.5,0,34.5,24.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Slink Pink",1969,6,NA,5.7,11,0,0,0,0,44.5,14.5,14.5,0,14.5,0,"",0,1,0,0,0,0,1 -"Slipper",2001,14,NA,8.6,16,0,0,0,0,0,0,24.5,14.5,34.5,24.5,"",0,0,1,0,0,0,1 -"Slipper and the Rose, The",1976,127,NA,6.5,423,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,1,0 -"Slippery Ice!",1999,1,NA,7.9,5,0,0,0,0,0,0,24.5,64.5,24.5,0,"",0,1,0,0,0,0,1 -"Slippery Pearls, The",1931,20,NA,6.4,64,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Slippery Silks",1936,18,NA,7.7,63,0,0,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Slippery When Wet",1958,72,NA,5.2,14,4.5,0,0,4.5,24.5,14.5,4.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Slipping Into Darkness",1988,87,NA,4,23,4.5,4.5,14.5,24.5,14.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Slipping Wives",1927,23,NA,6.3,31,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,0,0,"",0,0,1,0,0,0,1 -"Slipping-Down Life, A",1999,111,NA,5.9,148,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Slipstream",1973,93,NA,5.3,10,0,14.5,0,14.5,14.5,14.5,34.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Slipstream",1989,102,NA,4.5,391,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Slipstream",2005,89,NA,3.8,199,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Slither",1972,92,NA,5.8,205,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Sliver",1993,107,NA,4.6,5610,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Slo-Mo",2001,24,NA,5.3,95,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Sloane",1984,94,NA,1.3,13,64.5,14.5,0,0,0,0,0,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Slobodno mesto",2000,8,NA,8.7,7,0,14.5,0,0,0,0,0,0,14.5,74.5,"",0,0,0,1,0,0,1 -"Slodko gorzki",1996,90,NA,5.2,28,14.5,4.5,14.5,4.5,24.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Slog Movie, The",1982,59,5000,8,5,0,0,0,0,24.5,0,24.5,0,44.5,24.5,"",0,0,0,0,1,0,0 -"Slogan",1969,90,NA,5.4,13,0,0,4.5,14.5,14.5,4.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Slogans",2001,90,NA,8.3,101,4.5,0,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Slonce wschodzi raz na dzien",1972,94,NA,7.7,7,14.5,0,0,14.5,0,0,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sloneczny zegar",1997,108,NA,5.7,6,0,0,0,0,14.5,34.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Slonyonok",1967,11,NA,9.1,8,34.5,0,0,0,0,0,0,0,0,64.5,"",0,1,0,0,0,0,1 -"Slottet",1964,82,NA,6.7,7,0,0,0,0,44.5,0,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Slow Business of Going, The",2000,101,NA,6.7,14,4.5,0,4.5,14.5,4.5,14.5,0,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Slow Dancin' Down the Aisles of the Quickcheck",1999,31,NA,4.3,18,14.5,0,4.5,14.5,14.5,14.5,0,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Slow Dancing in the Big City",1978,110,NA,4.8,55,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Slucaj Harms",1987,90,NA,3.3,13,14.5,0,4.5,0,0,14.5,0,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Sluchay v kvadrate 36-80",1982,93,NA,5.8,10,0,14.5,0,14.5,24.5,24.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Sluga",1988,141,NA,8.6,17,4.5,0,0,0,0,0,4.5,14.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Slugger's Wife, The",1985,105,NA,4.3,250,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Slugs, muerte viscosa",1988,89,NA,4.2,280,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sluikrups, De",2002,10,NA,5.9,16,0,4.5,0,4.5,4.5,14.5,44.5,14.5,4.5,0,"",0,0,0,0,0,0,1 -"Slumber Party '57",1976,89,NA,2.9,35,24.5,4.5,24.5,4.5,24.5,4.5,0,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Slumber Party Massacre II",1987,90,NA,2.9,301,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Slumber Party Massacre III",1990,87,NA,3,172,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Slumber Party Massacre, The",1982,77,250000,4.4,482,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Slums of Beverly Hills",1998,92,5000000,6.4,2914,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Slunce, seno, erotika",1991,103,NA,3.5,42,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Slunce, seno, jahody",1984,83,NA,6.1,59,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Slut",1999,5,NA,6.8,5,0,44.5,0,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Slutspel",1997,81,NA,4.1,50,14.5,4.5,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Slutty Summer",2004,85,NA,4.5,28,4.5,0,0,4.5,4.5,14.5,4.5,14.5,4.5,45.5,"",0,0,1,1,0,0,0 -"Sluzhebnyy roman",1977,159,NA,9.1,320,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,1,0 -"Sluzhili dva tovarishcha",1968,99,NA,8.2,59,0,0,0,0,0,4.5,14.5,14.5,34.5,44.5,"",0,0,1,1,0,0,0 -"Slyozy kapali",1982,89,NA,9.3,32,0,0,0,0,4.5,0,4.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Smaak van water, De",1982,90,NA,6.6,53,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Smala Sussie",2003,97,NA,6.6,868,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Smala, La",1984,90,NA,5.4,28,14.5,0,4.5,4.5,4.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Small Back Room, The",1949,106,NA,7.8,100,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Small Circle of Friends, A",1980,113,NA,5.4,115,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Small Deaths",1996,11,NA,6.9,42,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Small Emergencies",2002,7,NA,8.6,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,1,0,0,0,1 -"Small Faces",1996,100,NA,7,381,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Small Hotel",1957,59,NA,6.7,5,0,44.5,0,0,0,24.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Small Kill",1992,86,NA,4.6,10,14.5,0,0,24.5,44.5,0,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Small Miracle, The",1951,82,NA,5.1,7,0,0,0,14.5,0,0,14.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Small One, The",1978,26,NA,6.9,49,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Small Soldiers",1998,110,40000000,5.8,6938,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Small Talk",1929,20,NA,6.5,12,4.5,0,0,14.5,0,34.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Small Time Crooks",2000,94,18000000,6.5,6218,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"PG",0,0,1,0,0,1,0 -"Small Time Obsession",2000,119,NA,6.1,28,14.5,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Small Town Girl",1936,106,NA,6.4,74,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Small Town Girl",1953,92,NA,6.1,76,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Small Town Girls",1979,82,NA,7.5,6,0,0,0,0,0,45.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Small Town Idol, A",1921,70,NA,5.9,6,0,0,0,14.5,34.5,14.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Small Town in Texas, A",1976,96,NA,4.8,52,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Small Treasures",1995,15,NA,7.8,5,0,0,24.5,0,0,0,0,24.5,44.5,24.5,"",0,1,0,0,0,0,1 -"Small Triptych",1998,8,NA,6.4,12,0,0,0,4.5,45.5,4.5,24.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Small Voice, The",1948,67,NA,6.2,7,0,0,0,14.5,14.5,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Small Wonders",1995,77,NA,7.2,48,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Small World of Sammy Lee, The",1963,107,NA,6.6,13,4.5,0,0,0,4.5,4.5,14.5,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Smallest Show on Earth, The",1957,80,NA,6.6,235,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Smart Alec",1986,88,NA,3.8,5,24.5,0,24.5,24.5,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Smart Alecks",1942,67,NA,5.5,63,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Smart Blonde",1937,59,NA,6,43,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Smart Girls Don't Talk",1948,81,NA,7.7,22,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Smart Money",1931,81,NA,6.8,124,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Smart Politics",1948,65,NA,7.4,5,0,0,0,0,24.5,0,24.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Smart Set-Up, The",1931,19,NA,5.2,10,0,0,14.5,14.5,44.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Smart Woman",1931,68,NA,6.9,33,0,0,0,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Smart Woman",1948,93,NA,6,7,0,0,0,0,24.5,14.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Smart as a Fox",1946,10,NA,3.6,7,24.5,14.5,14.5,0,24.5,0,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Smartest Girl in Town",1936,58,NA,6.5,26,4.5,0,0,0,4.5,24.5,34.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Smarty",1934,65,NA,4.9,28,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Smarty Cat",1955,7,NA,6,27,0,0,0,14.5,24.5,14.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Smash Palace",1981,100,NA,7,135,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Smash Your Baggage",1933,10,NA,6.1,8,0,0,0,14.5,14.5,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Smash and Grab",1937,73,NA,5.8,10,0,0,14.5,0,24.5,24.5,0,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Smash-Up: The Story of a Woman",1947,103,NA,6.8,113,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Smashing Machine, The",2002,93,NA,7.9,163,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"R",0,0,0,0,0,0,0 -"Smashing Time",1967,96,NA,5.8,72,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Smashing the Money Ring",1939,57,NA,3.7,33,24.5,4.5,0,4.5,24.5,4.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Smashing the Rackets",1938,69,NA,6.5,9,0,0,0,0,34.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Smear",1997,9,NA,3,24,24.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Smeker",1986,99,NA,7.8,8,14.5,0,0,14.5,0,0,14.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Smell of Burning Ants, The",1994,21,NA,7.9,22,4.5,0,0,0,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Smell of Honey, a Swallow of Brine, A",1966,69,NA,4.2,13,4.5,4.5,14.5,14.5,0,0,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Smemorato di Collegno, Lo",1962,87,NA,7.3,12,0,0,0,0,14.5,14.5,4.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Smic Smac Smoc",1971,90,NA,4.5,21,14.5,4.5,0,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Smicha Hashmalit Ushma Moshe",1995,90,NA,4.7,17,4.5,0,0,4.5,14.5,0,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Smierc jak kromka chleba",1994,135,NA,5.4,12,0,14.5,0,0,0,4.5,4.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Smierc prezydenta",1978,144,NA,8.1,9,0,0,0,0,0,24.5,34.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Smile",1975,113,NA,7.5,383,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Smile",2005,107,NA,4.9,43,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"PG-13",0,0,0,1,0,0,0 -"Smile Like Yours, A",1997,98,18000000,4.5,348,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Smile Orange",1976,86,NA,5.9,17,0,0,0,0,14.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Smile Pretty, Say Pink",1966,6,NA,4.9,72,34.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Smile, Darn Ya, Smile!",1931,7,NA,4.7,30,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Smiley",1956,97,NA,4.6,21,4.5,0,4.5,14.5,0,4.5,4.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Smiley Gets a Gun",1958,90,NA,6.6,9,0,0,0,14.5,0,14.5,0,44.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Smilin' Through",1932,98,NA,7,104,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Smilin' Through",1941,100,NA,6.3,38,4.5,0,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Smiling Ghost, The",1941,71,NA,6.7,68,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Smiling Irish Eyes",1929,90,NA,1,7,100,0,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Smiling Lieutenant, The",1931,93,NA,7.5,159,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Smilla's Sense of Snow",1997,120,35000000,6.3,3722,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Smith",1939,10,NA,8.3,8,0,0,0,0,0,0,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,1 -"Smith Family, The",2002,80,NA,7.7,23,4.5,0,4.5,0,0,0,4.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Smith!",1969,112,NA,5.8,24,4.5,0,4.5,4.5,24.5,4.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Smithereens",1982,89,NA,6.3,129,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Smithy",1924,20,NA,4.5,17,0,0,14.5,14.5,24.5,14.5,14.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Smitten Kitten",1952,8,NA,6.2,22,0,0,0,4.5,14.5,44.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Smoke",1993,90,NA,6.4,56,4.5,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Smoke",1995,112,7000000,7.4,8111,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Smoke Over London",1966,122,NA,5.9,18,0,0,0,24.5,0,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Smoke Signal",1955,88,NA,6.4,20,4.5,0,0,14.5,24.5,14.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Smoke Signals",1998,88,2000000,7.2,2665,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Smoke and Flesh",1968,70,NA,5.1,7,0,0,24.5,24.5,0,0,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Smoked Hams",1934,19,NA,4.1,11,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,0,0,"",0,0,1,0,0,0,1 -"Smoked Lizard Lips",1991,96,NA,3.6,6,64.5,14.5,0,14.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Smoker",1984,85,NA,4.2,9,14.5,0,14.5,0,0,34.5,0,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Smoker, The",2000,19,NA,7.6,7,0,0,14.5,0,14.5,0,14.5,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Smokers, The",2000,90,NA,3.1,691,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Smokescreen",1964,70,NA,6.2,10,14.5,0,0,0,14.5,0,44.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Smokey Bites the Dust",1981,87,NA,2.9,44,14.5,14.5,14.5,4.5,14.5,4.5,0,4.5,0,14.5,"",1,0,1,0,0,0,0 -"Smokey and the Bandit",1977,96,NA,6.3,5237,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Smokey and the Bandit II",1980,100,NA,4.4,1669,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Smokey and the Bandit Part 3",1983,85,NA,2.7,1440,34.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Smokey and the Good Time Outlaws",1978,90,NA,5.7,7,0,0,24.5,0,14.5,24.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Smokey and the Hotwire Gang",1979,85,NA,2.2,5,44.5,24.5,24.5,24.5,0,0,0,0,0,0,"",1,0,1,0,0,0,0 -"Smokin' Stogies",2001,98,280000,4.6,34,14.5,4.5,4.5,4.5,14.5,4.5,0,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Smoking",1994,13,NA,6.9,20,0,14.5,0,4.5,4.5,14.5,4.5,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Smoking Room",2002,91,NA,6.4,172,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Smoking/No Smoking",1993,298,NA,7.5,333,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Smoky",1946,87,NA,6.6,39,0,0,0,0,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Smoky",1966,103,NA,5.7,20,0,0,0,4.5,14.5,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Smooth Talk",1985,92,NA,6,238,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Smradi",2002,93,NA,6.9,49,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Smrt gospodina Goluze",1982,89,NA,4.6,13,0,14.5,0,4.5,0,0,34.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Smrt si rika Engelchen",1963,111,NA,8,10,0,0,0,0,0,14.5,0,34.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Smuga cienia",1976,100,NA,4.1,17,14.5,0,0,0,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Smugglarkungen",1985,107,NA,4.5,56,0,14.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Smugglers' Cove",1948,66,NA,7.2,21,0,0,0,0,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Smukke dreng",1993,86,NA,5.1,44,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Smukke-Arne og Rosa",1967,89,NA,5.4,12,0,4.5,0,4.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Smurfs and the Magic Flute, The",1983,90,NA,5.3,116,14.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Smush",1993,8,NA,8.9,7,0,0,0,0,0,0,24.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Smutsiga fingrar",1973,107,NA,2.9,28,24.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Smykketyven",1990,92,NA,2,8,34.5,64.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Snack Bar Budapest",1988,98,NA,5.3,21,0,14.5,4.5,4.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Snack and Drink",1999,4,NA,6.4,36,0,0,0,14.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Snackers",2004,10,13000,7,9,34.5,0,0,0,0,0,0,0,0,64.5,"",0,0,1,0,0,0,1 -"Snafuperman",1944,3,NA,6.5,17,0,0,0,0,24.5,34.5,4.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Snails",2000,6,NA,6.4,21,34.5,4.5,0,0,0,4.5,4.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Snake Eyes",1998,98,73000000,5.7,12091,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Snake Feed",1997,23,NA,5.1,11,0,4.5,0,4.5,4.5,4.5,14.5,0,4.5,34.5,"",0,0,0,0,0,0,1 -"Snake Island",2002,90,NA,2.9,66,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Snake Pit, The",1948,108,NA,7.8,530,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Snake Skin Jacket",1997,91,NA,5.7,7,14.5,14.5,0,14.5,0,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Snake Tales",2000,91,NA,7.5,13,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Snake Woman",1961,68,NA,4.7,10,0,24.5,0,0,44.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Snakes",1974,83,NA,4,20,0,14.5,14.5,0,14.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Snakes & Ladders",1996,93,NA,6.5,35,4.5,0,4.5,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Snakeskin",2001,94,NA,5.6,155,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Snapdragon",1993,98,NA,3.4,298,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Snapped",1998,83,NA,5.3,27,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Snapped",2001,6,NA,4.7,9,34.5,0,0,0,24.5,14.5,14.5,0,14.5,14.5,"",0,0,1,0,0,0,1 -"Snapphanar",1941,113,NA,4.3,10,24.5,0,14.5,44.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Snapshot",1979,92,NA,3.3,43,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Snapshot",2002,15,NA,6.3,18,4.5,14.5,4.5,14.5,4.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Snatch.",2000,102,10000000,7.9,44785,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,0,0,0,0 -"Sneakers",1992,126,NA,7,11994,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Sneezing Weasel, The",1938,7,NA,7,15,0,0,0,0,4.5,24.5,34.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Snegurochka",1952,67,NA,9.8,7,0,0,0,0,0,14.5,0,0,24.5,45.5,"",0,1,0,0,0,0,0 -"Snell Show, The",2003,8,6000,9.2,15,4.5,0,0,0,0,0,0,4.5,4.5,84.5,"",0,0,1,0,0,0,1 -"Snezenky a machri",1982,82,NA,7.8,40,0,0,0,0,4.5,14.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Snezhnaya koroleva",1957,74,NA,7.6,53,0,0,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,1,0,1,0,0,0 -"Snezhnaya koroleva",1966,85,NA,7.5,24,0,0,0,4.5,0,14.5,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Sniffles Bells the Cat",1941,8,NA,5.9,17,4.5,0,0,24.5,4.5,14.5,24.5,4.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Sniffles Takes a Trip",1940,8,NA,5.2,16,4.5,0,14.5,14.5,4.5,14.5,4.5,0,14.5,14.5,"",0,1,1,0,0,0,1 -"Sniffles and the Bookworm",1939,7,NA,6.3,29,0,0,0,0,14.5,44.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Sniper",1993,98,NA,5.7,2298,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Sniper's Ridge",1961,61,NA,4.8,19,0,4.5,4.5,14.5,24.5,24.5,4.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Sniper, The",1952,87,NA,7.2,105,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Snipers Alley",2002,12,NA,5.5,7,0,0,0,0,44.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,1 -"Snipes",2001,113,NA,5.7,123,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Snitch",1996,97,NA,4.4,28,14.5,0,24.5,14.5,14.5,14.5,14.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Snitch",1998,90,11000000,6.2,412,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"R",1,0,0,1,0,0,0 -"Snitch in Time, A",1950,17,NA,7.8,40,0,0,0,0,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Sno-Line",1984,89,NA,4.3,6,0,14.5,45.5,0,0,0,0,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Snobs!",1962,90,NA,7.1,7,0,0,14.5,0,14.5,0,14.5,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Snookles",1986,3,NA,9.6,12,0,0,0,0,4.5,0,0,4.5,14.5,64.5,"",0,1,1,0,0,0,1 -"Snoopy Come Home",1972,83,NA,7.3,421,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Snorkel, The",1958,74,NA,6.4,13,0,0,0,4.5,0,4.5,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Snow",1996,81,NA,7.2,10,0,0,14.5,0,0,44.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Snow Business",1953,7,NA,6.6,40,0,0,4.5,4.5,14.5,14.5,44.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Snow Cat",1998,23,NA,6.1,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,1,0,0,0,0,1 -"Snow Creature, The",1954,69,NA,2.3,52,24.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Snow Day",2000,89,13000000,4.6,1645,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,1,0 -"Snow Days",1999,90,NA,4.5,244,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"R",0,0,1,0,0,1,0 -"Snow Dogs",2002,99,35000000,5.1,2379,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Snow Excuse",1966,6,NA,5.8,21,0,4.5,4.5,4.5,14.5,14.5,0,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Snow Falling on Cedars",1999,127,36000000,6.7,4536,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Snow Foolin'",1949,6,NA,4.1,13,0,34.5,0,24.5,4.5,0,0,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Snow Job",1972,90,NA,4.1,25,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Snow Queen, The",1995,75,NA,4.5,6,14.5,0,0,14.5,34.5,34.5,0,0,0,0,"",0,1,0,0,0,0,0 -"Snow Time for Comedy",1941,7,NA,5.6,12,0,0,0,0,34.5,45.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Snow Treasure",1968,95,NA,5.7,17,0,0,0,14.5,14.5,24.5,24.5,14.5,4.5,0,"",1,0,0,0,0,0,0 -"Snow Walker, The",2003,103,NA,7.5,632,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Snow White",1988,85,NA,5.9,60,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Snow White and the Seven Dwarfs",1937,83,1488000,7.8,14341,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,0,1,0,0,0 -"Snow White and the Three Stooges",1961,107,3500000,4.1,174,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Snow White: A Tale of Terror",1997,100,NA,6,1582,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Snow-White",1933,7,NA,8.1,90,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Snowball Express",1972,99,NA,5.2,188,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Snowballing",1984,96,NA,4.6,18,14.5,14.5,14.5,4.5,14.5,14.5,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Snowboard Academy",1996,88,NA,2.1,384,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Snowboarder",2003,110,NA,3.6,112,14.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Snowbody Loves Me",1964,8,NA,5.3,31,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Snowbound",1948,90,NA,5.6,12,0,4.5,4.5,0,34.5,24.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Snowbound",2001,93,NA,3.8,69,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Snowed Under",1936,64,NA,6.6,31,4.5,0,0,14.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Snowfire",1958,73,NA,5.5,42,0,4.5,0,4.5,0,0,4.5,4.5,24.5,64.5,"",0,0,0,0,0,0,0 -"Snowflake Crusade, The",2002,95,NA,8.8,11,4.5,0,0,0,0,0,0,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Snowman's Land",1939,7,NA,7.1,8,0,0,0,0,0,24.5,34.5,34.5,0,0,"",0,1,1,0,0,0,1 -"Snowman, The",1982,26,NA,7.9,835,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Snowriders",1996,96,NA,6.8,17,14.5,0,0,0,14.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Snowriders II",1997,95,NA,3.5,13,24.5,0,0,0,4.5,14.5,14.5,0,0,34.5,"",0,0,0,0,1,0,0 -"Snows of Kilimanjaro, The",1952,117,NA,6.3,513,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Snubbed by a Snob",1940,6,NA,5.1,11,0,0,4.5,0,45.5,24.5,4.5,0,0,0,"",0,1,1,0,0,0,1 -"Snuden 1 - Snuden rejser hjemmefra",1980,17,NA,6.9,7,0,0,0,0,44.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Snuden 2 - Snuden i byen",1980,20,NA,6.9,7,0,0,0,0,44.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Snuden 3 - Snuden vender hjem",1980,18,NA,7.1,5,0,0,0,0,24.5,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Snuff",1976,76,NA,2.6,204,44.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Snuff killer - La morte in diretta",2004,88,NA,5.4,16,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Snurriga familjen",1940,106,NA,4.5,6,0,0,14.5,0,0,34.5,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Sny",1993,78,NA,6.7,16,4.5,4.5,0,14.5,4.5,14.5,4.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"So Big",1953,101,NA,6.8,50,0,0,0,0,14.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"So Big!",1932,81,NA,7.3,153,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"So Close to Home",2003,50,NA,4.3,10,44.5,0,14.5,0,24.5,0,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"So Dark the Night",1946,71,NA,6.9,20,0,4.5,0,4.5,14.5,24.5,14.5,44.5,0,4.5,"",0,0,0,0,0,0,0 -"So Dear to My Heart",1949,82,NA,7.5,137,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"So Does an Automobile",1939,6,NA,5.5,7,0,0,0,0,44.5,0,24.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"So Ends Our Night",1941,122,401000,7.2,44,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"So Evil My Love",1948,112,NA,6.7,29,0,0,0,4.5,14.5,24.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"So Evil, My Sister",1974,80,NA,5.1,16,4.5,14.5,0,14.5,14.5,14.5,0,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"So Evil, So Young",1961,77,NA,3.6,15,0,14.5,4.5,4.5,44.5,0,0,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"So Faraway and Blue",2001,78,NA,4.8,8,0,0,14.5,0,24.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"So Fine",1981,90,NA,4.6,233,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"So Goes My Love",1946,88,NA,5.3,16,0,14.5,0,4.5,24.5,14.5,24.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"So I Married an Axe Murderer",1993,93,NA,6.2,6991,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"So Is This",1982,43,NA,8,11,4.5,0,0,0,4.5,0,14.5,0,24.5,34.5,"",0,0,0,0,0,0,1 -"So Little Time",1952,88,NA,7.8,13,0,0,0,0,0,14.5,0,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"So Long Letty",1929,64,NA,5.8,10,0,0,0,14.5,34.5,45.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"So Long Mr. Chumps",1941,17,NA,7.7,48,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"So Long at the Fair",1950,86,NA,7.2,102,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"So Many Miracles",1987,48,NA,9.2,5,0,0,0,0,0,0,0,0,84.5,24.5,"",0,0,0,0,1,0,0 -"So Much for So Little",1949,10,NA,5.9,29,14.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,1,0,0,1,0,1 -"So Proudly We Hail!",1943,126,NA,7.6,187,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"So Quiet On the Canine Front",1931,16,NA,5.7,15,4.5,0,4.5,4.5,24.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,1 -"So Red the Rose",1935,82,NA,6.7,16,0,0,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"So Sad About Gloria",1975,90,NA,5.1,14,4.5,0,4.5,14.5,24.5,4.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"So This Is Africa",1933,61,NA,4.2,14,14.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"So This Is College",1929,98,NA,3.7,7,14.5,14.5,24.5,0,14.5,0,24.5,0,0,0,"",0,0,1,1,0,0,0 -"So This Is Harris!",1934,28,NA,7,7,0,0,0,0,0,14.5,74.5,14.5,0,0,"",0,0,1,0,0,0,1 -"So This Is Love",1953,101,NA,4.8,19,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"So This Is New York",1948,79,NA,6.1,29,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"So This Is Paris",1955,96,NA,6.2,31,0,0,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"So This Is Romance?",1998,95,NA,6.2,56,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"So This Is Washington",1943,64,NA,5.7,25,4.5,0,14.5,0,14.5,34.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"So Well Remembered",1947,114,NA,7.1,50,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"So Wrong They're Right",1999,92,NA,4.3,18,24.5,0,4.5,0,0,4.5,14.5,24.5,0,34.5,"",0,0,0,0,1,0,0 -"So You Think You Need Glasses",1942,11,NA,6.1,11,0,0,0,0,4.5,45.5,4.5,4.5,14.5,0,"",0,0,1,0,0,0,1 -"So You Think You're Not Guilty",1949,10,NA,5.5,9,14.5,0,14.5,0,24.5,24.5,24.5,0,14.5,0,"",0,0,1,0,0,0,1 -"So You Think You're a Nervous Wreck",1946,10,NA,7.5,13,0,0,0,0,0,4.5,44.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"So You Want an Apartment",1948,11,NA,5.6,7,0,0,0,14.5,14.5,0,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"So You Want to Be a Detective",1948,11,NA,6.5,40,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"So You Want to Be a Gambler",1948,11,NA,4.1,5,24.5,0,0,24.5,24.5,0,24.5,0,24.5,0,"",0,0,1,0,0,0,1 -"So You Want to Be in Pictures",1947,11,NA,4.3,21,24.5,14.5,0,0,0,24.5,24.5,0,4.5,4.5,"",0,0,1,0,0,0,1 -"So You Want to Build a House",1948,11,NA,5.2,8,0,14.5,0,14.5,24.5,34.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"So You Want to Give Up Smoking",1942,11,NA,6.2,14,0,4.5,0,0,14.5,24.5,24.5,4.5,24.5,0,"",0,0,1,0,0,0,1 -"So You Want to Hold Your Wife",1947,11,NA,7.2,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,1,0,0,0,1 -"So You Want to Keep Your Hair",1946,11,NA,6.2,16,0,0,0,4.5,24.5,14.5,34.5,4.5,14.5,4.5,"",0,0,1,0,0,0,1 -"So You Want to Play the Horses",1946,11,NA,7.6,5,0,0,0,0,0,0,24.5,84.5,0,0,"",0,0,1,0,0,0,1 -"So You're Going to Be a Father",1947,11,NA,5.7,15,0,0,0,14.5,0,34.5,0,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"So Young So Bad",1950,91,NA,5.4,31,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"So and Sew",1936,15,NA,5.6,5,0,0,0,0,44.5,0,44.5,0,0,24.5,"",0,0,1,0,0,0,1 -"So ein Flegel",1934,81,NA,6.8,38,0,4.5,0,4.5,0,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"So-poong",1999,14,NA,6.8,13,0,0,0,4.5,0,4.5,0,24.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Soak the Poor",1937,16,NA,6.5,10,0,0,0,0,14.5,44.5,45.5,0,0,0,"",0,0,0,0,0,0,1 -"Soap Girl",2002,90,NA,7.6,34,34.5,4.5,4.5,0,4.5,0,4.5,0,4.5,24.5,"",0,0,0,1,0,1,0 -"Soapdish",1991,97,NA,6.1,3422,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Soapte de amor",1994,93,NA,8.8,12,4.5,0,0,0,0,4.5,0,0,4.5,74.5,"",0,0,1,0,0,0,0 -"Soar",2004,19,NA,8,8,0,14.5,0,0,0,0,14.5,14.5,34.5,24.5,"",0,0,1,0,0,0,1 -"Sobibor, 14 octobre 1943, 16 heures",2001,97,NA,6.9,68,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Sobre las olas",1950,128,NA,7.9,12,0,0,0,0,4.5,0,4.5,4.5,44.5,34.5,"",0,0,0,1,0,0,0 -"Sobredosis",1986,98,NA,4.4,5,24.5,24.5,24.5,0,0,24.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Sobrenatural",1996,100,NA,6.5,71,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Sobrevivientes, Los",1979,130,NA,5.7,11,0,0,0,4.5,4.5,24.5,0,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Sobri",2002,301,NA,6.3,16,14.5,0,4.5,14.5,4.5,4.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Sobyan wa banat",1995,72,NA,8.3,7,14.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,0,0,0,0,0 -"Soccer",1999,1,NA,6.2,9,24.5,0,0,0,14.5,24.5,44.5,0,0,0,"",0,1,0,0,0,0,1 -"Soccer Dog: European Cup",2004,88,NA,4.8,30,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"PG",0,0,1,0,0,0,0 -"Soccer Dog: The Movie",1999,98,NA,3.9,282,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Soccer Practice",2003,4,NA,8,8,0,0,0,0,0,24.5,0,14.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Social Intercourse",1998,90,15000,4.8,81,24.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Social Lion",1954,6,NA,7.2,8,0,0,0,0,0,14.5,34.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Social Secretary, The",1916,52,NA,8.3,9,0,0,0,0,0,0,34.5,24.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Social Suicide",1991,98,NA,4.1,15,24.5,0,4.5,24.5,4.5,34.5,0,4.5,0,0,"PG-13",0,0,1,0,0,0,0 -"Social-Sex Attitudes in Adolescence",1953,24,NA,5.2,11,0,4.5,4.5,0,14.5,34.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Sociala arvet, Det",1993,87,NA,6.1,76,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Society",1989,99,NA,5.9,561,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Society Affairs",1982,91,NA,6.7,6,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Society Doctor",1935,67,NA,5.3,18,4.5,0,4.5,4.5,4.5,44.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Society Dog Show",1939,9,NA,7.1,43,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Society Lawyer",1939,77,NA,6.1,19,0,0,4.5,4.5,14.5,34.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Society Raffles, The",1905,1,NA,4,8,0,0,14.5,45.5,14.5,24.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Society Sensation, A",1918,24,NA,6,6,0,0,14.5,0,0,64.5,0,14.5,0,0,"",0,0,1,1,0,0,1 -"Sociologie est un sport de combat, La",2001,146,NA,7.2,34,0,0,0,4.5,4.5,14.5,24.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Sock a Doodle Do",1952,7,NA,6.4,17,0,0,0,4.5,14.5,24.5,44.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Sock-a-Bye Baby",1942,18,NA,6.6,55,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Sock-a-Bye, Baby",1934,6,NA,6.3,12,0,0,0,4.5,14.5,34.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Socorro Nobre",1995,23,NA,4.2,10,24.5,14.5,0,14.5,14.5,14.5,14.5,14.5,24.5,0,"",0,0,0,0,1,0,1 -"Sod Sisters",1969,74,NA,2.1,5,44.5,24.5,24.5,24.5,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Sodom and Gomorrah",1962,155,NA,5.4,174,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sodom und Gomorrha",1922,150,NA,7.3,9,0,0,14.5,0,0,14.5,45.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Sodomites",1998,7,NA,5.1,47,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Sodot Mishpacha",1998,92,NA,7.7,6,0,14.5,0,0,0,0,0,45.5,0,34.5,"",0,0,0,1,0,0,0 -"Soeurs Hamlet, Les",1996,90,NA,6.4,7,0,0,0,0,0,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Sof Ha'Olam Smola",2004,110,NA,7.6,148,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Sofa",2001,3,NA,5.2,6,0,0,0,0,34.5,45.5,0,14.5,0,0,"",0,1,0,0,0,0,1 -"Soferaki, To",1953,90,NA,7.5,7,0,0,0,0,0,0,44.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Soferina, I",1964,100,NA,7.6,21,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Sofi",1968,96,NA,9.3,7,0,0,0,0,0,0,14.5,0,24.5,45.5,"",0,0,0,1,0,0,0 -"Sofie",1992,152,NA,6.2,64,4.5,4.5,0,4.5,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sofies verden",1999,107,NA,5.5,323,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sofreh Irani",2002,102,NA,7.7,16,0,0,0,0,0,24.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Soft Beds, Hard Battles",1974,107,NA,3.7,91,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Soft Deceit",1994,95,NA,4.6,50,4.5,14.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Soft Drinks and Sweet Music",1934,22,NA,6.2,19,14.5,0,0,4.5,14.5,44.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Soft Fruit",1999,101,NA,6.4,239,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Soft Kill, The",1994,94,NA,4.2,43,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Soft Like Me",1996,26,NA,7.4,11,0,4.5,0,0,14.5,0,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Soft Toilet Seats",1999,107,NA,4,16,34.5,14.5,4.5,14.5,4.5,4.5,14.5,0,0,4.5,"R",0,0,1,0,0,0,0 -"Soft and Hard",1986,55,NA,6.2,17,14.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Soft for Digging",2001,74,6000,6.1,73,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Soggy Bottom, USA",1980,90,NA,3.7,55,14.5,4.5,14.5,14.5,4.5,4.5,0,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Soggy Penis Syndrome",2004,6,NA,8,6,0,0,0,34.5,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Sogni d'oro",1981,105,NA,7.1,97,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sogni del signor Rossi, I",1976,80,NA,8,16,0,0,0,0,0,0,24.5,34.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Sogni erotici di Cleopatra",1985,86,NA,4.9,16,14.5,14.5,14.5,4.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Sogni nel cassetto, I",1956,105,NA,7.1,8,0,0,0,0,0,24.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sogno della farfalla, Il",1994,111,NA,5.9,10,14.5,0,0,0,14.5,14.5,34.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sogobi",2001,90,NA,7.7,5,24.5,0,0,0,0,0,24.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Sohni Mahiwal",1984,142,NA,7.1,15,0,0,0,14.5,0,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,1,0 -"Soho Square",2000,79,7000,4.9,45,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,0,24.5,"R",0,0,0,1,0,0,0 -"Soif de l'or, La",1993,81,NA,3.5,115,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Soigne ta droite",1987,82,NA,6.1,55,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Soigne ton gauche",1936,20,NA,6.5,104,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Soilers, The",1923,20,NA,5.1,37,14.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,1 -"Sois belle et tais-toi",1958,110,NA,5.4,67,0,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sois belle et tais-toi",1981,115,NA,8.2,8,0,0,0,0,0,0,14.5,0,45.5,34.5,"",0,0,0,0,1,0,0 -"Sok od sljiva",1981,91,NA,7.4,10,0,0,0,0,14.5,24.5,0,44.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Sokaktan gelen kadin",1984,90,NA,4.4,5,0,0,0,44.5,24.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Sokkotanssi",1999,90,NA,6.6,77,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Sokoote beine do fekr",2003,95,NA,6.3,36,0,0,4.5,4.5,4.5,34.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sokout",1998,76,NA,6.9,156,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sol Bianca: The Legacy",1999,200,NA,5.5,28,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,24.5,"",1,1,0,0,0,0,0 -"Sol Goode",2001,99,3000000,5.4,291,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Sol Madrid",1968,86,NA,5.7,51,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sol del membrillo, El",1992,133,NA,8,233,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Sol nad zlato",1982,85,NA,8.2,19,0,0,0,0,0,14.5,14.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Sola ante el terror",1986,90,NA,2.6,8,45.5,14.5,0,0,0,0,0,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Solamente nero",1978,109,NA,6.7,97,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Solan, Ludvig og Gurin med reverompa",1998,76,NA,4.5,58,14.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Solar Crisis",1990,112,55000000,3.9,377,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Solarbabies",1986,94,NA,4,556,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Solaris",2002,99,47000000,6.3,11808,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Solarmax",2000,38,NA,6.4,38,4.5,0,0,0,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Solas",1999,101,NA,7.4,1024,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Soldaat van Oranje",1977,215,NA,7.6,1661,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Soldadera, La",1967,88,NA,7.1,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",1,0,0,1,0,0,0 -"Soldados de Salamina",2003,112,NA,6.8,239,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Soldat Bom",1948,89,NA,5.2,29,0,14.5,4.5,0,24.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Soldaten og Jenny",1947,92,NA,8.4,23,4.5,4.5,0,0,0,0,4.5,14.5,44.5,14.5,"",0,0,0,1,0,1,0 -"Soldaterkammerater",1958,90,NA,5.6,26,14.5,0,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Soldaterkammerater rykker ud",1959,100,NA,4.8,26,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Soldatessa alle grandi manovre, La",1978,96,NA,5.6,18,14.5,0,4.5,14.5,14.5,4.5,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Soldati - 365 all'alba",1987,116,NA,6.5,45,4.5,0,4.5,4.5,4.5,14.5,44.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Soldato di ventura, Il",1975,95,NA,5.5,183,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,1,1,0,0,0 -"Soldier",1998,98,75000000,5.2,5590,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Soldier Blue",1970,112,NA,6.7,529,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Soldier Boyz",1995,90,NA,4,211,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Soldier Girls",1981,87,NA,5.8,28,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Soldier and the Lady, The",1937,82,NA,7.1,13,0,0,0,0,4.5,14.5,4.5,34.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Soldier in the Rain",1963,88,NA,6.9,239,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Soldier of Fortune",1955,96,NA,5.9,153,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Soldier's Daughter Never Cries, A",1998,127,NA,6.9,875,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Soldier's Leap, The",1998,26,75000,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,1,1,0,0,1 -"Soldier's Plaything, A",1930,56,NA,3.2,19,14.5,14.5,34.5,14.5,14.5,14.5,4.5,0,0,0,"",0,0,1,1,0,0,0 -"Soldier's Story, A",1984,101,NA,7.2,1270,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Soldier's Sweetheart, A",1998,112,NA,5.8,186,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Soldier's Tale, A",1988,97,NA,6,62,4.5,4.5,0,4.5,4.5,24.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Soldier, The",1982,96,NA,4.5,153,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Soldier, The",2003,10,3000,9.2,6,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Soldiers Pay",2004,35,180000,7,34,0,0,4.5,0,4.5,4.5,14.5,4.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Soldiers Three",1951,92,NA,6.1,49,0,4.5,4.5,14.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Soldiers in White",1942,20,NA,4.5,7,0,0,14.5,44.5,44.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Soldiers in the Army of God",2000,70,NA,7.4,21,4.5,0,0,0,4.5,14.5,14.5,44.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Soldiers of Innocence",1987,111,NA,8,6,0,0,0,0,0,0,14.5,64.5,14.5,0,"",0,0,0,0,0,0,0 -"Soldiers of the King",1934,80,NA,4.1,12,4.5,4.5,24.5,14.5,4.5,24.5,0,0,4.5,0,"",0,0,1,0,0,0,0 -"Sole Survivor",1983,85,NA,5,52,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sole anche di notte, Il",1990,112,NA,6.6,105,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sole nella pelle, Il",1971,91,NA,4.5,11,0,14.5,0,4.5,24.5,0,4.5,4.5,0,24.5,"",0,0,0,1,0,1,0 -"Soledad era esto, La",2002,89,NA,4.4,15,14.5,0,4.5,14.5,4.5,24.5,0,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Soleil",1997,105,NA,6,38,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Soleil O",1967,98,NA,8.9,9,0,0,0,0,0,14.5,14.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Soleil au-dessus des nuages, Le",2001,96,NA,6.7,41,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Soleil des voyous, Le",1967,95,NA,5.4,23,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Soleil rouge",1971,112,NA,6.7,615,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Solid Air",2003,115,NA,6,54,45.5,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Solid Cover",2000,97,NA,3.5,6,0,0,14.5,14.5,0,0,34.5,0,0,34.5,"",1,0,0,0,0,0,0 -"Solid Gold Cadillac, The",1956,99,NA,7.3,215,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Solid Serenade",1946,7,NA,7.7,42,0,4.5,0,4.5,0,4.5,4.5,44.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Solid Tin Coyote, The",1966,6,NA,5.3,22,0,4.5,14.5,14.5,4.5,24.5,14.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Soliloquy",2001,29,3000,7.2,12,14.5,0,4.5,0,0,0,14.5,4.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Soliloquy",2003,93,89000,9.2,27,0,0,0,0,0,0,4.5,14.5,34.5,44.5,"",0,0,1,0,0,0,0 -"Solimsa yongpali",1983,98,NA,5.8,5,0,24.5,0,24.5,24.5,0,0,24.5,0,24.5,"",1,0,0,0,0,0,0 -"Solina",1994,16,NA,5,6,34.5,0,14.5,0,0,0,0,34.5,14.5,0,"",0,0,0,0,0,0,1 -"Solino",2002,124,NA,7.3,431,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Solitaire",1991,105,NA,7.1,14,0,0,0,4.5,4.5,0,4.5,14.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Solitaire",1996,94,NA,2.9,14,24.5,0,24.5,14.5,4.5,14.5,0,0,0,14.5,"R",0,0,0,0,0,0,0 -"Solitaire Man, The",1933,67,NA,6,19,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Solitaire for 2",1995,106,1500000,4.8,122,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Solitaire, Le",1987,100,NA,5.6,141,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Soliter",2000,80,NA,8.5,8,14.5,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Soliti ignoti vent'anni dopo, I",1987,99,NA,6.1,16,0,0,0,14.5,14.5,44.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Soliti ignoti, I",1958,111,NA,7.8,790,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Solitude",2005,74,5000,8.6,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Solitude de Monsieur Turgeon, La",2000,14,NA,5,11,0,0,0,24.5,44.5,4.5,4.5,4.5,0,0,"",0,1,0,0,0,0,1 -"Solly's Diner",1979,10,NA,8.6,7,0,0,0,0,0,14.5,0,24.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Solo",1978,96,NA,4.9,17,0,0,4.5,4.5,44.5,4.5,0,4.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Solo",1984,96,NA,4.7,18,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Solo",1996,94,NA,3.5,699,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Solo Sunny",1980,100,NA,6.3,44,4.5,4.5,0,0,14.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Solo contro Roma",1962,100,NA,5.3,11,0,0,4.5,24.5,0,0,44.5,0,4.5,4.5,"",1,0,0,1,0,0,0 -"Solo de guitarra",2004,55,NA,7.6,5,0,0,0,0,0,0,84.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Solomon Bernstein's Bathroom",2000,20,35000,6.4,9,14.5,14.5,14.5,0,14.5,24.5,0,34.5,0,0,"",0,0,0,0,0,0,1 -"Solomon and Gaenor",1999,102,NA,6.6,347,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Solomon and Sheba",1959,141,5000000,5.8,254,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Solomon's Song",1998,22,NA,8.9,16,4.5,0,0,0,0,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Solos en la madrugada",1978,102,NA,6.9,21,14.5,0,0,4.5,4.5,4.5,34.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Solstice",1994,48,130000,5.1,9,44.5,14.5,0,0,0,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Solstik",1953,89,NA,4.3,7,0,0,24.5,0,14.5,44.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Soltan ghalbha",1968,114,NA,4.7,12,14.5,0,0,0,0,34.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Soltera y madre en la vida",1969,90,NA,2.2,9,44.5,14.5,0,24.5,14.5,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Soltero y padre en la vida",1972,98,NA,2.7,5,24.5,0,24.5,64.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Solve for X",2001,12,NA,7.5,17,0,0,0,0,4.5,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Solvorn",1997,9,NA,3,7,0,74.5,0,0,24.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Solyaris",1972,165,NA,7.7,5225,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Som and Bank: Bangkok for Sale",2001,88,NA,5.3,68,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Som du vil ha' mig",1943,85,NA,6.7,6,0,0,0,0,14.5,0,34.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Som du vill ha mej",1943,81,NA,5,5,0,0,0,0,100,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Som sendt fra himlen",1951,95,NA,5.8,5,0,0,24.5,0,24.5,44.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Somberman's aktie",1999,94,NA,7.3,34,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Sombra del caminante, La",2004,90,NA,8.4,12,0,0,0,0,4.5,4.5,0,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sombra del caudillo, La",1960,129,NA,8.1,9,0,0,0,0,0,0,24.5,45.5,0,24.5,"",0,0,0,1,0,0,0 -"Sombra del judoka contra el doctor Wong, La",1985,86,NA,5.3,5,24.5,0,0,0,0,24.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Sombra dolorosa",2004,7,NA,6.8,25,0,4.5,0,0,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Sombra dos Abutres, A",1998,90,NA,6.7,24,0,0,0,0,4.5,14.5,45.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sombras en una batalla",1993,106,NA,6.7,18,0,0,14.5,4.5,0,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sombre",1998,112,NA,6.6,127,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sombrero",1953,103,NA,5.3,39,0,14.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Some Body",2001,77,NA,6.3,35,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Some Call It Loving",1973,103,NA,4.5,16,4.5,4.5,4.5,14.5,4.5,24.5,4.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Some Came Running",1958,137,NA,7.3,669,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Some Days",2003,4,NA,4.2,6,0,14.5,34.5,14.5,0,14.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Some Folks Call It a Sling Blade",1994,25,NA,7.4,308,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Some Girl",1998,94,NA,5.8,284,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Some Girls",1988,94,NA,6.1,440,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Some Girls Do",1969,88,NA,5,33,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,0,34.5,"",1,0,1,0,0,0,0 -"Some Kind of Hero",1982,97,NA,5.5,189,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Some Kind of Life",1995,102,NA,5.1,6,0,0,0,0,14.5,14.5,0,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Some Kind of Wonderful",1987,95,NA,6.6,4040,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Some Kind of a Nut",1969,90,NA,4,26,4.5,14.5,14.5,34.5,14.5,4.5,14.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Some Like It Hot",1939,65,NA,6.9,65,4.5,0,4.5,0,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Some Like It Hot",1959,120,2883848,8.4,25369,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Some Like It Sexy",1969,84,NA,4.6,5,24.5,24.5,0,0,24.5,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Some More of Samoa",1941,17,NA,6.7,51,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Some Mother's Son",1996,112,NA,7.1,584,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Some Nudity Required",1998,82,NA,4.3,65,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Some People",1962,93,NA,5.9,15,0,0,0,4.5,0,24.5,4.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Some Prefer Cake",1998,94,NA,3.6,16,14.5,4.5,4.5,14.5,4.5,24.5,0,0,14.5,4.5,"",0,0,1,0,0,1,0 -"Some Trouble of a SeRRious Nature",2002,25,NA,8.9,34,4.5,4.5,4.5,0,0,0,4.5,4.5,34.5,44.5,"",0,0,1,0,0,0,1 -"Some Voices",2000,101,NA,6.3,110,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Some Will, Some Won't",1969,90,NA,5.4,14,0,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Some of My Best Friends Are",1971,110,NA,6.6,19,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Somebody Is Waiting",1996,96,NA,4.9,115,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Somebody Killed Her Husband",1978,97,NA,4.2,67,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Somebody Loves Me",1952,97,NA,5.1,29,0,4.5,4.5,14.5,4.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Somebody Up There Likes Me",1956,114,NA,7.2,659,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Somebody or The Rise and Fall of Philosophy",1989,25,NA,5.5,5,24.5,24.5,0,0,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Somebody to Love",1994,102,NA,5,174,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Someone Else's America",1995,96,NA,6.5,113,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Someone Like You...",2001,97,23000000,5.7,4249,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Someone and Someone, Inc.",2004,7,NA,7.4,13,0,0,0,0,0,0,24.5,24.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Someone to Die For",1995,105,NA,4.7,39,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Someone to Love",1987,111,NA,5.6,52,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Someone to Love",1997,15,NA,7.8,5,0,0,24.5,0,0,0,0,44.5,0,44.5,"",0,0,1,0,0,0,1 -"Someone to Remember",1943,60,NA,7.6,6,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Someone to Watch Over Me",1987,106,NA,6.1,1668,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Somersault",1999,13,NA,4.3,12,0,0,24.5,4.5,14.5,14.5,4.5,0,14.5,4.5,"",0,0,0,0,0,0,1 -"Somersault",2004,106,NA,6.9,370,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Something About AJ",2002,120,NA,2.3,19,74.5,0,0,4.5,0,4.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Something About Love",1988,93,NA,6.9,14,0,0,0,4.5,0,14.5,45.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Something Always Happens",1934,69,NA,6,5,0,0,0,24.5,24.5,0,0,64.5,0,0,"",0,0,1,0,0,0,0 -"Something Between Us",2000,79,NA,8.8,5,0,0,0,0,0,0,0,64.5,0,44.5,"",0,0,1,0,0,1,0 -"Something Big",1971,108,NA,5.1,182,4.5,4.5,4.5,4.5,4.5,4.5,45.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Something Close to Heaven",2000,28,NA,5.2,29,24.5,0,4.5,4.5,14.5,0,0,0,14.5,44.5,"",0,0,0,1,0,0,1 -"Something Fishy",2002,3,NA,6.3,41,0,0,0,4.5,24.5,24.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Something Money Can't Buy",1952,83,NA,4.8,9,0,0,0,24.5,45.5,14.5,0,0,14.5,0,"",0,0,1,1,0,0,0 -"Something New",1920,57,NA,5.8,35,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Something Short of Paradise",1979,87,NA,4.1,30,14.5,4.5,14.5,24.5,34.5,4.5,0,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Something Weird",1967,80,35000,3.1,63,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Something Wicked This Way Comes",1983,95,19000000,6.5,1302,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Something Wild",1961,112,NA,6.8,61,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Something Wild",1986,113,NA,6.6,2632,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Something for Everyone",1970,112,NA,7.2,147,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Something for the Birds",1952,81,NA,5.8,21,0,0,4.5,4.5,4.5,24.5,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Something for the Boys",1944,87,NA,5.8,25,0,4.5,0,14.5,34.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Something in the Basement",1986,27,NA,8.1,12,24.5,0,4.5,0,0,0,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Something in the Wind",1947,94,NA,6.5,40,4.5,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Something of Value",1957,113,NA,6.4,118,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Something to Believe In",1998,113,NA,6.4,77,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Something to Hide",1972,99,NA,5,24,4.5,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Something to Live For",1952,89,NA,6.9,16,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Something to Sing About",1937,93,900000,6,80,0,0,0,4.5,14.5,24.5,34.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Something to Talk About",1995,106,NA,5.6,2758,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Something's Gotta Give",2003,128,NA,6.8,11275,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Something's Happening",1967,75,NA,5,12,4.5,14.5,0,4.5,14.5,0,4.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Sometime Sweet Susan",1974,85,NA,5.8,7,0,0,0,14.5,0,24.5,14.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Sometimes They Come Back... Again",1996,98,3000000,2.9,630,44.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Sometimes They Come Back... for More",1999,89,2000000,2.8,321,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Sometimes a Great Notion",1971,113,NA,6.7,383,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Somewhat Secret",1939,21,NA,5,6,0,0,0,14.5,34.5,34.5,14.5,0,0,0,"",0,0,1,0,0,1,1 -"Somewhere I'll Find You",1942,108,NA,5.9,88,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Somewhere Tomorrow",1983,91,NA,6.4,108,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Somewhere in Dreamland",1936,9,NA,7,35,0,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Somewhere in Sonora",1933,59,NA,3.7,34,14.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Somewhere in Time",1980,103,5100000,6.8,3837,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Somewhere in the City",1998,94,NA,4.6,65,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Somewhere in the Darkness",1998,94,NA,4.8,11,4.5,0,0,4.5,0,4.5,24.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Somewhere in the Night",1946,110,NA,7.3,73,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sommaren",1995,112,NA,5.6,26,0,0,0,4.5,14.5,34.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Sommaren med Monika",1953,96,NA,7.3,527,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Sommarlek",1951,96,NA,7.5,231,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Sommarmord",1994,105,NA,4.8,41,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Sommarnattens leende",1955,110,NA,7.7,1150,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Sommer der Liebe",1992,89,NA,9.4,10,0,0,0,0,0,0,14.5,14.5,14.5,74.5,"",0,0,0,0,0,0,0 -"Sommer des Falken, Der",1988,106,NA,8.8,6,0,0,0,0,0,0,0,64.5,34.5,0,"",0,0,0,0,0,0,0 -"Sommer des Samurai, Der",1986,100,NA,5.5,11,4.5,0,4.5,14.5,0,0,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sommer i Tyrol",1964,99,NA,5.7,76,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sommeralbum, Das",1992,90,NA,8.7,6,0,0,0,0,0,14.5,0,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Sommersby",1993,114,NA,5.9,3981,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Sommersturm",2004,98,NA,8.3,399,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Somnambuul",2003,129,NA,5.7,45,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Son",2002,125,2000000,4.2,33,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Son de mar",2001,96,NA,5.8,316,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Son in Law",1993,95,NA,5,2478,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Son of Ali Baba",1952,75,NA,5.4,74,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Son of Bambi Meets Godzilla",1999,2,NA,4.8,6,0,14.5,14.5,0,14.5,14.5,0,0,14.5,14.5,"",0,1,0,0,0,0,1 -"Son of Belle Starr",1953,70,NA,4.4,10,0,0,24.5,24.5,34.5,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Son of Darkness: To Die for II",1991,95,NA,3.4,62,14.5,14.5,14.5,14.5,14.5,0,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Son of Dr. Jekyll, The",1951,78,NA,3.7,27,4.5,4.5,14.5,44.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Son of Dracula",1943,80,NA,6.1,378,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Son of Dracula",1974,90,NA,4.9,58,14.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Son of Flubber",1963,100,NA,5.7,341,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Son of Frankenstein",1939,99,NA,7,718,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Son of Fury",1942,98,NA,7.1,129,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Son of India",1931,75,NA,7.1,7,0,24.5,0,0,0,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Son of Ingagi",1940,70,NA,2.7,6,0,34.5,34.5,0,0,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Son of Kong, The",1933,70,250000,5.6,316,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Son of Lassie",1945,100,NA,6.6,58,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Son of Monte Cristo, The",1940,102,NA,5.9,75,4.5,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Son of Paleface",1952,95,NA,6.9,344,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,1,0,0,1,0 -"Son of Robin Hood, The",1958,81,NA,4.4,11,4.5,0,4.5,14.5,34.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Son of Sinbad",1955,91,NA,5.1,65,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Son of Zorro",1947,180,NA,7,21,0,0,0,4.5,14.5,24.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Son of a Gunfighter",1965,91,NA,5.1,22,0,0,4.5,14.5,4.5,44.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Son of a Sailor",1933,73,NA,6.1,29,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Son of the Border",1933,55,NA,5.5,20,0,0,14.5,24.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Son of the Mask",2005,94,74000000,1.9,1785,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Son of the Navy",1940,72,NA,7.9,9,24.5,0,0,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Son of the Pink Panther",1993,93,NA,3.2,704,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Son of the Sheik, The",1926,68,NA,6.5,188,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Son-Daughter, The",1932,79,NA,5.7,19,4.5,0,14.5,4.5,34.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sonar Kella",1974,120,NA,7.2,62,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Sonatas",1959,103,NA,4,9,14.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,1,0 -"Sonatine",1984,91,NA,6.9,38,0,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sonatine",1993,94,NA,7.5,2407,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,0,1,0,0,0 -"Sonderling, Der",1929,88,NA,5,73,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sonezaki shinju",1978,112,NA,7,6,0,0,0,0,0,0,45.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Song Is Born, A",1948,113,2400000,7.2,278,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Song Remains the Same, The",1976,137,NA,6.5,1189,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Song Without End",1960,141,NA,4.9,71,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Song Writers' Revue, The",1930,20,NA,7.2,9,14.5,0,0,0,0,24.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Song a Day, A",1936,7,NA,6.7,11,0,0,4.5,0,4.5,24.5,24.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Song for Chao Phraya",1990,100,NA,8,9,0,0,0,0,0,24.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Song for Jade, A",2001,23,NA,8.4,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Song for a Raggy Boy",2003,100,NA,7,309,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Song jia huang chao",1997,145,50000000,6.9,151,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Song o' My Heart",1930,85,NA,4.3,7,0,0,0,24.5,14.5,14.5,0,0,0,44.5,"",0,0,0,1,0,0,0 -"Song of Bernadette, The",1943,156,2000000,7.7,671,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Song of Ceylon",1934,38,NA,6.3,27,0,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Song of Freedom",1936,80,NA,6.3,37,0,0,14.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Song of India",1949,77,NA,7.3,13,0,24.5,0,4.5,14.5,0,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Song of Leonard Cohen, The",1980,90,NA,8.6,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Song of Love",1947,119,NA,6.5,98,4.5,4.5,0,4.5,4.5,34.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Song of Nevada",1944,75,NA,6.8,10,0,0,0,0,0,24.5,24.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Song of Norway",1970,138,NA,3.1,118,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Song of Revolt",1937,11,NA,5.5,9,0,0,0,0,34.5,45.5,14.5,0,0,0,"",0,0,0,1,0,0,1 -"Song of Russia",1944,107,NA,5.1,31,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Song of Scheherazade",1947,105,NA,5.6,36,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Song of Songs, The",1933,90,NA,4.9,27,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Song of Surrender",1949,93,NA,7.8,6,0,0,14.5,0,0,14.5,14.5,14.5,34.5,0,"",0,0,0,1,0,1,0 -"Song of Texas",1943,69,NA,6.5,10,0,0,0,0,14.5,64.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Song of Wreckage",2003,12,NA,6,11,0,0,0,0,0,24.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Song of a Nation, The",1936,18,NA,5.4,10,0,0,24.5,0,34.5,14.5,24.5,0,14.5,14.5,"",0,0,0,1,0,0,1 -"Song of the Birds, The",1935,7,NA,5.1,13,0,0,0,24.5,44.5,14.5,4.5,0,4.5,0,"",0,1,0,0,0,0,1 -"Song of the City",1937,68,NA,5.9,17,0,0,0,14.5,24.5,34.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Song of the Gringo",1936,62,NA,5.5,9,0,0,0,14.5,24.5,14.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Song of the Islands",1942,76,NA,6.1,49,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Song of the Loon",1970,79,NA,6.8,10,24.5,0,0,0,0,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Song of the Open Road",1944,93,NA,6.4,29,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Song of the Saddle",1936,58,NA,5.5,13,0,0,4.5,14.5,14.5,34.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Song of the South",1946,94,NA,7.3,1830,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Song of the Thin Man",1947,86,NA,6.7,408,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Song to Remember, A",1945,113,NA,6.4,115,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Song-o",1999,100,NA,5.3,19,0,4.5,0,14.5,14.5,34.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Songcatcher",2000,109,1800000,7.2,927,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Songhwan",2003,149,NA,9,21,0,4.5,0,4.5,0,0,0,14.5,44.5,34.5,"",0,0,0,0,1,0,0 -"Songs and Dances of the Inanimate World: The Subway",1984,14,NA,8.2,5,0,0,0,0,0,0,0,64.5,44.5,0,"",0,1,0,0,0,0,1 -"Songwriter",1984,94,NA,5.8,86,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sonho Sem Fim",1985,93,NA,4.8,27,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Sonho de Rose - 10 Anos Depois, O",1997,92,NA,9.4,27,0,0,0,4.5,4.5,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Sonho de Valsa",1987,96,NA,7.2,16,0,0,0,4.5,4.5,4.5,34.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Sonhos Tropicais",2001,120,NA,8.9,27,0,0,0,14.5,0,4.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sonic Impact",1999,94,NA,4.4,124,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Sonic Outlaws",1995,87,NA,7.9,41,4.5,0,4.5,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Sonja",1943,79,NA,6.9,6,0,0,0,0,0,14.5,84.5,0,0,0,"",0,0,0,1,0,0,0 -"Sonne, Sylt und kesse Krabben",1971,82,NA,4.3,11,14.5,24.5,4.5,14.5,4.5,4.5,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Sonnenallee",1999,101,NA,7.1,1004,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Sonntag im August",2004,15,NA,4.4,6,0,14.5,0,34.5,0,0,0,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Sonntagskind, Das",1956,96,NA,5.1,14,0,0,0,14.5,24.5,24.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Sonny",2002,110,NA,5.5,438,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Sonny Boy",1990,96,NA,3.5,58,24.5,4.5,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sonny and Cornblatt",1991,33,NA,5.2,6,34.5,0,0,0,0,14.5,14.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Sono fotogenico",1980,120,NA,5.4,32,4.5,4.5,4.5,4.5,14.5,24.5,24.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Sono otoko, kyobo ni tsuki",1989,103,NA,7.2,1333,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Sono pazzo di Iris Blond",1996,110,NA,6.3,144,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Sono positivo",1999,96,NA,7.4,14,0,0,4.5,4.5,24.5,4.5,14.5,14.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Sono stato un agente C.I.A.",1978,95,NA,5.3,29,4.5,14.5,14.5,4.5,14.5,14.5,14.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Sono yo no tsuma",1930,65,NA,7.1,24,0,0,4.5,0,0,14.5,24.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sonora",1969,92,NA,4.2,10,0,0,0,44.5,14.5,14.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Sonora Stagecoach",1944,61,NA,2,6,14.5,45.5,0,0,0,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Sonrisas de Chile",1969,108,NA,6.6,5,24.5,0,0,0,0,0,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Sons and Lovers",1960,103,NA,7.3,138,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sons o' Guns",1936,82,NA,5.8,22,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sons of Katie Elder, The",1965,122,NA,6.8,1494,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sons of Liberty",1939,20,NA,6.1,26,0,4.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,1 -"Sons of Matthew",1949,107,NA,5.1,7,0,0,0,14.5,14.5,0,0,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Sons of New Mexico",1949,71,NA,3.5,16,0,14.5,14.5,0,14.5,4.5,0,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sons of Provo",2004,93,200000,4.3,35,4.5,14.5,4.5,4.5,4.5,0,4.5,14.5,4.5,44.5,"PG",0,0,1,0,0,0,0 -"Sons of Steel",1989,104,NA,3.5,19,24.5,4.5,14.5,0,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Sons of the Desert",1933,68,NA,7.7,1033,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Sontob",1994,101,NA,4.3,11,14.5,0,4.5,24.5,4.5,14.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Sooteh-Delan",1978,120,NA,8.4,52,4.5,0,4.5,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Soowitch",2001,25,NA,8.6,5,0,0,0,0,0,0,0,44.5,64.5,0,"",0,0,0,0,0,0,1 -"Sophiatown",2003,82,NA,8.6,22,0,0,0,4.5,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Sophie Scholl - Die letzten Tage",2005,117,NA,8.3,306,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Sophie's Choice",1982,150,NA,7.5,4002,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Sophiiiie!",2002,107,NA,7,147,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Soplagaitas, El",1980,85,NA,1.7,11,34.5,24.5,0,0,4.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Soplo de vida",1999,112,NA,6.1,31,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sopraluoghi in Palestina per il vangelo secondo Matteo",1964,55,NA,8.3,7,0,0,0,0,0,14.5,0,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Sor Citroen",1967,87,NA,3.7,30,14.5,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sor Ye-Ye",1968,103,NA,2.7,8,34.5,0,14.5,24.5,14.5,0,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Sora no ana",2001,118,NA,6.3,40,4.5,0,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sorb",1988,130,NA,7.5,6,0,0,0,0,0,14.5,64.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Sorcellerie culinaire",1904,4,NA,6.5,57,4.5,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Sorcerer",1977,93,22000000,7.1,719,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sorcerer's Apprentice, The",1955,13,NA,6.3,6,34.5,0,0,0,0,0,34.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Sorcerer's Apprentice, The",2002,86,NA,4.8,81,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sorcerers, The",1967,87,NA,5.7,114,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sorceress",1982,83,NA,3.3,76,34.5,14.5,14.5,4.5,4.5,14.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Sorceress",1995,93,NA,3.8,141,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Sorceress II: The Temptress",1996,90,NA,2.7,36,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Sordid Lives",2000,111,NA,6.3,575,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Sore Losers, The",1997,89,NA,4.7,72,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Sorekara",1985,130,NA,7.6,29,0,0,0,0,4.5,4.5,14.5,34.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Sorella di Satana, La",1966,74,NA,4.7,44,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sorelle, Le",1969,108,NA,5.6,8,0,0,0,0,24.5,24.5,14.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Soriton no akuma",1997,90,NA,1.7,8,24.5,0,0,14.5,24.5,0,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Sorobanzuku",1986,109,NA,5,8,24.5,0,14.5,0,34.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Sorok pervyy",1956,88,NA,8.7,46,0,0,0,0,0,4.5,4.5,24.5,34.5,34.5,"",0,0,0,1,0,1,0 -"Sorority Babes in the Slimeball Bowl-O-Rama",1988,80,90000,4,338,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sorority Boys",2002,93,12000000,5.1,2398,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Sorority Girl",1957,61,NA,4.1,42,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sorority Girls and the Creature From Hell",1990,85,NA,3.2,34,24.5,24.5,4.5,4.5,0,0,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Sorority House",1939,64,NA,5.9,8,0,0,0,14.5,0,14.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Sorority House Massacre",1987,86,NA,3.6,205,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sorority House Massacre II",1990,80,NA,3.6,220,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sorority House Vampires",1998,86,50000,1.8,83,74.5,4.5,4.5,4.5,4.5,0,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sorority Pink 2: The Initiation",1989,89,NA,6.8,8,0,14.5,0,0,24.5,14.5,0,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sorpasso, Il",1962,105,NA,7.6,482,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Sorriso del grande tentatore, Il",1975,105,NA,5.3,19,0,0,0,24.5,14.5,24.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Sorriso della iena, Il",1972,85,NA,5.2,9,0,0,14.5,0,24.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Sorriso di Diana, Il",2002,13,NA,7.9,13,0,0,4.5,0,0,0,34.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Sorrowful Jones",1949,88,NA,6.7,89,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sorry Safari",1962,7,NA,3.7,20,14.5,24.5,4.5,14.5,14.5,24.5,4.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Sorry, Wrong Number",1948,89,NA,7.4,1015,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sort Oktober",2005,35,NA,8.7,7,0,0,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Sorte Nula",2004,85,150000,7.3,134,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Sorted",2000,102,NA,5.3,238,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Sortez des rangs",1996,86,NA,7.5,7,0,0,0,0,0,0,24.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Sorthvit",2000,16,NA,6.2,6,14.5,0,0,0,34.5,0,0,34.5,0,14.5,"",0,0,0,1,0,1,1 -"Sorum",2001,100,NA,6.4,156,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Sose me",2001,100,NA,6.6,46,4.5,14.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Sosedi",2000,7,NA,4.3,5,24.5,0,0,0,24.5,44.5,0,0,0,24.5,"",0,1,0,0,0,0,1 -"Soshun",1956,144,NA,7.9,106,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sospetto, Il",1975,105,NA,6.2,6,34.5,0,0,0,0,14.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sostiene Pereira",1996,104,NA,7.5,267,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sotalapset",2003,93,NA,7.5,6,0,0,14.5,0,0,14.5,0,34.5,34.5,0,"",0,0,0,0,1,0,0 -"Sotto dieci bandiere",1960,110,NA,5.9,32,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sotto falso nome",2004,105,NA,6.2,46,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Sotto il ristorante cinese",1987,94,NA,5.9,9,0,0,0,14.5,24.5,0,45.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Sotto il segno dello scorpione",1969,100,NA,6,21,0,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Sotto il sole di Roma",1946,95,NA,6.3,11,4.5,0,0,0,0,44.5,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Sotto il vestito niente",1985,90,NA,4.5,46,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Sotto il vestito niente 2",1988,95,NA,5.6,15,4.5,0,24.5,14.5,0,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sotto voce",1996,88,NA,7.4,21,0,0,0,0,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sotvoreniye Adama",1994,93,NA,6.3,22,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Souffle au coeur, Le",1971,118,NA,7.6,492,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Souffle, Le",2001,77,NA,6.7,95,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Soul Assassin",2001,96,7000000,4,376,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Soul Cages, The",1999,22,NA,4.9,10,0,0,14.5,24.5,24.5,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,1 -"Soul Food",1997,114,7500000,6.5,1166,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"R",0,0,1,1,0,0,0 -"Soul Man",1986,104,NA,4.7,1503,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Soul Patrol",2000,20,NA,4.5,7,0,0,0,44.5,14.5,14.5,14.5,0,0,14.5,"",0,0,1,0,0,0,1 -"Soul Plane",2004,92,16000000,3.2,2361,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Soul Ripper",2002,20,NA,7.8,13,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Soul Survivor",1995,89,NA,3,30,24.5,14.5,14.5,14.5,24.5,14.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Soul Survivors",2001,84,14000000,3.6,2305,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Soul in Cinema: Filming Shaft on Location",1971,11,NA,5.2,8,14.5,0,0,14.5,24.5,14.5,14.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Soul in the Hole",1997,98,NA,6.5,69,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Soul of Nigger Charley, The",1973,109,NA,3,27,24.5,4.5,4.5,4.5,4.5,0,4.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Soul of a Man, The",2003,103,NA,7.4,153,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Soul of a Monster",1944,61,NA,5.5,6,0,0,0,14.5,34.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Soul of the Beast",1923,65,NA,6.8,7,0,0,0,0,24.5,0,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Soul to Soul",1971,96,NA,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,1,0,0 -"Souler Opposite, The",1998,104,NA,5.1,72,4.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Soulier de satin, Le",1985,410,NA,6.5,8,24.5,0,0,0,14.5,0,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Soulkeeper",2001,105,NA,4.8,283,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Soulmates",1992,90,NA,3.6,28,14.5,14.5,14.5,24.5,4.5,0,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Soulmates",1997,95,NA,5.4,23,0,4.5,14.5,0,4.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Souls at Sea",1937,92,NA,6.6,57,4.5,0,0,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Souls for Sale",1923,80,NA,6.6,14,4.5,0,0,4.5,24.5,14.5,24.5,4.5,0,14.5,"",0,0,1,1,0,1,0 -"Souls of Sin",1949,64,NA,7.6,7,0,14.5,14.5,0,0,0,0,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Soultaker",1990,94,NA,2,668,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Soumission",1978,85,NA,3.5,21,14.5,14.5,4.5,0,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sound Barrier, The",1952,109,NA,7.1,139,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sound Off",1952,83,NA,5,5,0,0,24.5,0,44.5,0,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Sound and Fury",2000,80,NA,8.5,159,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Sound and the Fury, The",1959,110,NA,6.3,95,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sound of Claudia Schiffer, The",2000,18,NA,2.9,11,14.5,4.5,14.5,0,24.5,4.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Sound of Fury, The",1950,85,NA,7.1,53,0,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sound of Laughter, The",1963,80,NA,6.7,8,0,0,0,0,24.5,14.5,34.5,14.5,0,14.5,"",0,0,1,0,1,0,0 -"Sound of Love",1981,80,NA,6.7,7,0,0,0,0,0,14.5,24.5,44.5,0,14.5,"",0,0,0,0,0,0,0 -"Sound of Murder, The",1982,113,NA,3.8,7,24.5,0,14.5,0,14.5,0,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Sound of Music, The",1965,174,8200000,7.8,20641,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sound of One Hand Clapping, The",1998,93,NA,5.4,46,14.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sounder",1972,105,NA,7.9,411,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sounder, Part 2",1976,98,NA,6.2,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Soundman",1998,105,NA,6.8,128,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,34.5,"R",0,0,1,0,0,0,0 -"Soundman, The",1950,10,NA,5.2,6,0,0,0,0,45.5,34.5,14.5,0,0,0,"",0,0,0,0,1,0,1 -"Sounds of Silence",1989,108,NA,5.8,8,14.5,14.5,0,0,0,34.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Soundtrack",2001,96,NA,4.5,10,14.5,0,14.5,0,0,0,0,14.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Soup for One",1982,87,NA,5.7,36,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Soup to Nuts",1930,70,NA,5.4,67,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Soup's On",1948,7,NA,7.5,26,0,0,0,0,4.5,4.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Soupe aux choux, La",1981,98,NA,6,564,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Souper, Le",1992,90,NA,6.9,56,4.5,0,4.5,0,0,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Soupirant, Le",1962,83,NA,7.3,9,0,0,0,0,0,24.5,14.5,44.5,24.5,0,"",0,0,1,0,0,0,0 -"Sour Death Balls",1993,5,NA,8,12,0,0,0,0,0,4.5,14.5,0,4.5,64.5,"",0,0,0,0,0,0,1 -"Sour Grapes",1998,92,NA,5.3,517,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Sour Puss, The",1940,7,NA,6.3,8,0,0,0,0,14.5,34.5,14.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Source, The",1999,88,NA,7.4,240,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Source, The",2002,97,NA,4.3,151,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Souriante Madame Beudet, La",1922,54,NA,7.2,73,0,4.5,4.5,0,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sourire du clown, Le",1999,89,NA,5.3,17,0,0,4.5,24.5,14.5,14.5,24.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Sourire, Le",1994,85,NA,5.4,78,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Soursweet",1988,110,NA,7.1,13,0,0,4.5,0,14.5,24.5,4.5,34.5,0,4.5,"",0,0,0,1,0,0,0 -"Sous le ciel de Paris",1951,114,NA,8.2,26,4.5,0,0,0,0,4.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Sous le ciel de Provence",1956,97,NA,8.2,8,0,0,0,0,14.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Sous le sable",2000,92,NA,7.1,1819,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sous le signe du taureau",1968,85,NA,5.1,6,0,0,0,0,64.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Sous le soleil de Satan",1987,93,NA,6.9,193,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sous les pieds des femmes",1997,85,NA,2.6,10,24.5,14.5,0,0,34.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Sous les toits de Paris",1930,96,NA,7.8,174,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Sous-sol",1996,90,NA,6.5,29,0,0,0,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Souten",1983,160,NA,7.4,5,0,0,0,0,0,0,84.5,0,24.5,0,"",0,0,0,1,0,1,0 -"South",1919,88,NA,7.5,141,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"South American George",1941,92,NA,4.8,6,34.5,0,0,14.5,0,0,14.5,0,0,34.5,"",0,0,1,0,0,0,0 -"South Beach",1992,93,800000,3.4,60,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"South Beach Academy",1996,91,NA,3.2,104,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"South Bronx Heroes",1985,85,NA,2.7,29,45.5,4.5,14.5,14.5,0,0,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"South Central",1992,99,NA,5.8,393,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"South Kensington",2001,112,NA,4.2,83,14.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"South Pacific",1958,171,6000000,6.6,1387,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"South Park: Bigger Longer & Uncut",1999,81,21000000,7.6,33188,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,1,1,0,0,0,0 -"South Riding",1938,85,NA,5.9,12,0,0,4.5,0,14.5,4.5,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"South Sea Sinner",1950,88,NA,6.1,16,4.5,0,0,4.5,14.5,14.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"South Sea Woman",1953,99,NA,6.2,39,4.5,0,0,4.5,4.5,34.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"South Seas",1974,90,NA,7.8,8,14.5,0,0,0,0,14.5,34.5,24.5,0,14.5,"",1,0,0,1,0,0,0 -"South West 9",2001,90,NA,5.1,114,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"South of Algiers",1953,88,NA,5.3,18,0,0,4.5,14.5,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"South of Caliente",1951,67,NA,6.5,7,0,0,0,0,24.5,24.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"South of Death Valley",1949,54,NA,5.7,5,0,24.5,0,0,24.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"South of Heaven, West of Hell",2000,139,NA,3.7,306,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"South of Hell Mountain",1971,87,NA,3.8,7,14.5,24.5,14.5,0,0,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"South of Pago Pago",1940,98,NA,6.5,20,4.5,0,0,0,14.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"South of Reno",1988,97,NA,3.6,32,14.5,14.5,4.5,14.5,14.5,0,14.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"South of St. Louis",1949,88,NA,5.8,40,0,0,4.5,14.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"South of Suez",1940,86,NA,6,23,0,0,0,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"South of Wawa",1991,91,NA,6.4,30,14.5,0,4.5,0,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"South of the Border",1939,71,NA,5.8,18,0,0,4.5,14.5,14.5,4.5,14.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"South of the Rio Grande",1932,61,NA,4.6,13,0,4.5,14.5,34.5,4.5,4.5,24.5,4.5,0,0,"",1,0,0,1,0,0,0 -"South of the Rio Grande",1945,62,NA,4.6,8,0,14.5,0,34.5,0,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Southbound Duckling",1955,6,NA,6.1,26,0,0,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Southern Comfort",1981,105,NA,6.8,1620,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Southern Comfort",2001,90,NA,7.4,195,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Southern Cross",1999,102,NA,4.1,48,14.5,14.5,14.5,14.5,14.5,14.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Southern Discomfort: Wrestling on the Indie Circuit",2002,60,NA,6.3,7,0,0,0,0,14.5,24.5,14.5,24.5,0,14.5,"",1,0,0,0,1,0,0 -"Southern Exposure",1935,21,NA,8.9,12,0,0,0,0,4.5,4.5,4.5,34.5,0,44.5,"",0,0,1,0,0,0,1 -"Southern Fried Rabbit",1953,7,NA,7.6,82,0,4.5,4.5,4.5,0,4.5,24.5,44.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Southern Heart",1999,94,NA,5.7,26,4.5,0,4.5,14.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Southern Maid, A",1933,83,NA,8,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Southern Star, The",1969,104,NA,4.9,43,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Southern Yankee, A",1948,90,NA,6.6,73,0,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Southerner, The",1945,92,NA,7.7,251,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Southie",1998,95,NA,4.4,298,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Southlander",2001,80,NA,6.7,51,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Southpaw: The Francis Barrett Story",1999,77,NA,6.2,35,0,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Southside",2003,106,NA,5.1,63,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Southside 1-1000",1950,73,NA,6.1,9,0,0,0,0,14.5,44.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Southwest Passage",1954,75,NA,5.6,8,0,0,0,14.5,14.5,45.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Souvenir",1989,93,NA,6.3,23,0,0,0,4.5,4.5,14.5,34.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Souvenir",1994,90,NA,5.9,21,0,0,4.5,0,4.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Souvenir",1998,78,NA,2,23,14.5,24.5,0,0,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Souvenir d'Italie",1957,100,NA,4.5,13,4.5,0,0,0,34.5,34.5,34.5,0,0,0,"",0,0,1,0,0,1,0 -"Souvenirs d'en France",1975,90,NA,7.3,14,0,0,4.5,4.5,24.5,4.5,14.5,0,34.5,4.5,"",0,0,1,1,0,0,0 -"Souvenirs des Herrn X, Die",2004,102,NA,7.3,8,14.5,0,0,0,0,0,14.5,24.5,0,45.5,"",0,0,0,0,1,0,0 -"Souvenirs intimes",1999,118,NA,6.3,85,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Souvenirs souvenirs",1984,115,NA,6.8,13,0,0,4.5,4.5,4.5,4.5,34.5,24.5,0,4.5,"",0,0,1,1,0,1,0 -"Sovetskaya elegiya",1989,20,NA,6,11,0,0,0,14.5,0,4.5,4.5,34.5,0,24.5,"",0,0,0,0,0,0,1 -"Soweto Green",1995,100,NA,6.2,6,14.5,0,0,0,14.5,34.5,0,0,14.5,14.5,"",0,0,1,0,0,1,0 -"Soy Cuba, O Mamute Siberiano",2004,90,NA,9.3,6,0,0,0,0,0,0,0,34.5,0,64.5,"",0,0,0,0,1,0,0 -"Soy Cuba/Ya Kuba",1964,141,NA,8.3,583,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Soy tu aventura",2003,110,NA,6,36,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Soylent Green",1973,97,NA,6.7,4515,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Space Available",2004,15,18000,9.2,11,0,0,0,0,4.5,0,0,4.5,14.5,64.5,"",0,0,0,1,0,0,1 -"Space Between, The",2002,19,12000,4.8,12,0,4.5,0,0,45.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Space Between, The",2004,60,1500,5.4,12,34.5,4.5,0,0,4.5,4.5,0,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Space Children, The",1958,69,NA,3.5,171,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Space Cowboys",2000,130,65000000,6.4,11887,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Space Fury",2000,80,NA,1.6,76,64.5,14.5,4.5,4.5,0,4.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Space Is the Place",1974,85,NA,6.1,76,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Space Jam",1996,87,80000000,5.2,7995,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,1,1,0,0,0,0 -"Space Marines",1996,95,NA,3.3,113,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Space Master X-7",1958,71,NA,4.6,36,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Space Men",1960,73,NA,3.2,40,14.5,24.5,14.5,14.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Space Movie, The",1979,78,NA,8,20,4.5,0,0,0,0,0,24.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Space Mutiny",1988,108,NA,1.7,1828,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Space Pigs",1996,28,NA,4.4,9,0,0,14.5,14.5,24.5,14.5,14.5,24.5,14.5,0,"",0,1,0,0,0,0,1 -"Space Probe Taurus",1965,73,NA,3.4,46,24.5,14.5,34.5,14.5,14.5,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Space Rage",1985,77,NA,2.5,54,44.5,14.5,4.5,4.5,4.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Space Raiders",1983,84,NA,3.9,99,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Space Ship Sappy",1957,16,NA,6.2,34,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Space Specks",2003,85,NA,6,6,0,0,0,0,0,45.5,0,0,0,45.5,"",0,0,1,0,0,0,0 -"Space Station 3D",2002,47,NA,7.5,272,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Space Truckers",1996,95,25000000,4.5,1460,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Space Zoo",2001,15,NA,5.5,5,0,0,0,24.5,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Space-Thing",1968,69,17500,3.5,26,4.5,24.5,14.5,4.5,14.5,4.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"SpaceCamp",1986,104,NA,5.2,1996,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spaceballs",1987,96,22700000,6.7,20054,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Spaced Invaders",1990,100,3000000,4.5,612,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Spaced Out",1979,84,NA,3,44,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Spaceflight IC-1",1965,65,NA,4.1,7,0,14.5,0,44.5,0,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Spacehunter: Adventures in the Forbidden Zone",1983,90,14400000,4.2,706,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spacejacked",1997,89,NA,2.7,43,24.5,24.5,24.5,14.5,4.5,4.5,4.5,0,0,4.5,"R",1,0,0,0,0,0,0 -"Spaceman",1997,88,50000,4.7,67,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Spaceman",1998,8,NA,9.1,8,0,0,0,0,0,0,24.5,0,14.5,64.5,"",0,0,1,0,0,0,1 -"Spaceman and King Arthur, The",1979,93,NA,4.5,161,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Spacer",2004,3,NA,7,9,34.5,0,0,0,0,0,0,0,0,64.5,"",0,1,0,0,0,0,1 -"Spaceways",1953,74,NA,4.3,30,4.5,4.5,14.5,24.5,34.5,24.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Spada normanna, La",1972,99,NA,4.2,7,14.5,0,24.5,14.5,24.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Spaghetti House",1982,103,NA,5.8,19,0,14.5,4.5,14.5,0,14.5,24.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Spaghetti a mezzanotte",1981,88,NA,5,22,4.5,4.5,0,4.5,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Spagnola, La",2001,92,NA,6,177,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Spalovac mrtvol",1968,102,NA,8.1,176,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,1,0,0,0 -"Spandex: A Father's Tale",2005,21,30000,9.4,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,1,0,0,0,1 -"Spanglish",1994,15,NA,7.7,6,14.5,0,0,0,0,14.5,0,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Spanglish",2004,130,80000000,6.7,4698,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Spaniard's Curse, The",1958,80,NA,5.9,10,0,0,0,0,45.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Spanish Affair",1958,93,NA,5.8,5,0,24.5,0,24.5,0,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Spanish Bullfight",1900,1,NA,4.5,22,4.5,4.5,4.5,24.5,4.5,24.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Spanish Cape Mystery, The",1935,73,NA,6.4,14,4.5,0,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spanish Dancer, The",1923,56,NA,7.5,8,0,0,0,0,0,24.5,0,45.5,24.5,0,"",0,0,0,0,0,1,0 -"Spanish Earth, The",1937,52,NA,6.8,54,0,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Spanish Fly",1976,86,NA,4,23,4.5,14.5,14.5,14.5,14.5,14.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Spanish Fly",2003,92,NA,3.7,59,14.5,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Spanish Gardener, The",1956,91,NA,6.4,93,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Spanish Judges",1999,98,3500000,4.8,178,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Spanish Main, The",1945,100,NA,6.2,122,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Spanish Prisoner, The",1997,110,NA,7.4,7433,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG",0,0,0,1,0,0,0 -"Spanish Twist, A",1932,6,NA,5,9,0,14.5,14.5,14.5,14.5,34.5,0,14.5,14.5,0,"",0,1,1,0,0,0,1 -"Spank",1999,89,NA,3.8,22,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Spank",2003,19,NA,5.6,20,14.5,4.5,0,0,4.5,4.5,24.5,4.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Spanking Love",1994,100,NA,4.9,11,4.5,4.5,0,4.5,34.5,24.5,0,0,4.5,0,"",0,0,0,1,0,0,0 -"Spanking the Monkey",1994,100,200000,6.5,1352,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Spara, Gringo, spara",1968,88,NA,4.8,20,14.5,14.5,0,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Spare Time",1939,15,NA,7.5,7,0,0,0,0,14.5,44.5,24.5,0,14.5,0,"",0,0,0,0,1,0,1 -"Spare a Copper",1941,77,NA,5.2,7,24.5,0,0,0,14.5,45.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Spare the Rod",1954,4,NA,7.4,21,4.5,0,0,0,14.5,14.5,24.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Spare the Rod",1961,93,NA,5.1,9,0,0,0,34.5,0,44.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Spark",1998,103,NA,8.3,7,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Spark",2005,10,NA,9,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,1,0,0,1 -"Sparkle",1976,98,NA,5.7,95,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sparkle",1999,82,NA,4.6,16,4.5,0,4.5,14.5,14.5,4.5,4.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Sparkle and Charm",1997,90,NA,8.1,16,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,1,1,0,0,0 -"Sparkler",1997,96,NA,5.5,196,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Sparks",1998,9,NA,6.6,19,0,14.5,0,0,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Sparky",2003,5,NA,6.3,17,14.5,4.5,0,4.5,4.5,14.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Sparrows",1926,84,463455,7.4,119,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sparrows Can't Sing",1963,94,NA,5.6,14,24.5,0,0,0,4.5,4.5,4.5,34.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Sparsh",1980,145,NA,7.8,29,0,0,0,0,4.5,4.5,14.5,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Spartaco",1953,75,NA,7.3,21,0,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Spartacus",1960,198,12000000,8,17084,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",1,0,0,1,0,1,0 -"Spartacus",2003,7,NA,5.2,5,24.5,0,0,0,24.5,44.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Spartakus",1977,95,NA,5.3,7,24.5,0,0,14.5,0,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Spartan",2004,106,NA,6.9,5589,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Spasi i sokhrani",1989,150,NA,7.8,26,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Spasmo",1974,94,NA,5.1,65,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Spasms",1983,90,NA,3.3,78,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Spawn",1997,98,40000000,4.6,7523,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Spawn of the North",1938,110,NA,6.9,49,4.5,0,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,1,0 -"Spawn of the Slithis",1978,86,100000,2.5,87,34.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Speak Easily",1932,80,NA,6.1,108,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Speak Like a Child",1998,77,NA,7.9,39,4.5,0,0,4.5,4.5,0,24.5,44.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Speak White",1980,6,NA,7.8,11,4.5,0,0,0,0,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Speak of the Devil",1991,99,NA,4.4,17,24.5,14.5,4.5,14.5,4.5,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Speakeasy",1929,62,NA,2.6,10,44.5,14.5,14.5,0,14.5,14.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Speaking Parts",1989,93,NA,7.4,272,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Speaking in Strings",1999,73,NA,6.4,54,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Speaking of Sex",2001,97,NA,6,424,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Speaking of the Weather",1937,7,NA,6.1,12,4.5,0,0,0,14.5,24.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Special",2002,14,NA,4.5,14,0,0,0,4.5,4.5,0,0,0,4.5,74.5,"",0,0,1,0,0,0,1 -"Special Agent",1935,76,NA,6.2,116,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Special Agent",1949,71,NA,6.8,8,0,0,0,0,14.5,14.5,24.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Special Delivery",1976,99,NA,5.9,26,4.5,0,0,14.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Special Delivery",1978,7,NA,7.9,78,4.5,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Special Effects",1984,93,NA,5.1,55,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Special Effects: Anything Can Happen",1996,40,NA,6.8,95,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Special Investigator",1936,61,NA,6.5,5,0,0,0,0,44.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Special London Bridge Special, The",1972,48,NA,5.8,11,0,0,0,4.5,14.5,14.5,0,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Special Thanks to Roy London",2005,91,NA,7.6,7,14.5,14.5,0,0,0,0,0,0,0,74.5,"",0,0,0,0,1,0,0 -"Specialist, The",1994,110,45000000,4.7,6602,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Specialisti, Gli",1970,104,NA,5.6,18,4.5,0,0,0,24.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Specials, The",2000,82,NA,6,448,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Species",1995,108,35000000,5.4,8963,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Species II",1998,93,NA,3.6,4311,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Specijalno vaspitanje",1977,110,NA,9,38,0,0,0,0,4.5,0,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Specimen",1996,85,NA,3.5,118,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Speckled Band, The",1931,66,NA,4.7,10,0,14.5,14.5,14.5,44.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Spectacle Maker, The",1934,21,NA,6.2,7,0,0,0,14.5,24.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Specter of the Rose",1946,90,NA,5,25,14.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Spectre of Edgar Allan Poe, The",1974,89,NA,6.2,11,0,4.5,4.5,4.5,0,14.5,4.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Spectre of Hope, The",2000,52,NA,5,6,0,0,14.5,14.5,14.5,0,0,0,0,45.5,"",0,0,0,0,1,0,0 -"Spectre rouge, Le",1907,9,NA,6.9,21,4.5,4.5,4.5,0,0,14.5,4.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Spectres",2004,98,NA,5,26,14.5,4.5,0,4.5,4.5,14.5,14.5,0,14.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Spectres of the Spectrum",1999,94,NA,5.4,48,14.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Speech: Platform Posture and Appearance",1949,9,NA,1.4,24,45.5,24.5,4.5,4.5,4.5,4.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Speech: Using Your Voice",1950,10,NA,2.6,19,34.5,14.5,34.5,14.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Speechless",1994,99,NA,5.6,1158,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Speechless...",2001,20,NA,7.9,16,14.5,4.5,4.5,0,0,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Speed",1936,70,NA,5.9,66,4.5,0,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Speed",1984,30,NA,6.9,44,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Speed",1994,116,28000000,7.1,32979,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,0,0,0,0 -"Speed",2000,1,NA,4.4,11,4.5,0,0,4.5,24.5,4.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Speed 2: Cruise Control",1997,121,110000000,3.3,13268,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,1,0 -"Speed Demon",2003,85,NA,2.6,98,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Speed Kings, The",1913,8,NA,4.7,12,0,0,14.5,24.5,14.5,24.5,4.5,4.5,0,0,"",1,0,1,0,0,0,1 -"Speed Zone!",1989,94,NA,3.8,512,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Speed for Thespians",2000,30,NA,8.1,48,0,0,4.5,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,1 -"Speedo",2003,80,NA,7.5,29,0,0,0,0,4.5,4.5,34.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Speedtrap",1977,113,NA,5,21,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Speedway",1968,94,1500000,4.6,239,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Speedway Junky",1999,105,1000000,5.3,469,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Speedy",1928,86,NA,7.7,231,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Speedy Boys",1999,75,NA,4.8,13,14.5,0,24.5,4.5,24.5,0,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Speedy Ghost to Town",1967,6,NA,5.8,15,0,0,4.5,4.5,34.5,14.5,4.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Speedy Gonzales",1955,7,NA,7.1,116,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Speedy Gonzales - noin 7 veljeksen poika",1970,85,NA,6.8,85,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Speel met me",2001,12,NA,5.8,9,0,14.5,14.5,0,34.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Speilburgh",2004,93,NA,6.9,7,24.5,0,0,0,0,0,0,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Spelen of sterven",1990,48,NA,6.2,73,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Spellbinder",1988,98,NA,4.7,270,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Spellbinder, The",1939,69,NA,5.3,12,0,0,0,14.5,14.5,14.5,44.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Spellbound",1941,82,NA,7.7,12,0,0,0,0,0,0,34.5,44.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Spellbound",1945,111,1696377,7.6,5108,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Spellbreaker: Secret of the Leprechauns",1996,85,NA,2.7,38,24.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Spellcaster",1992,83,NA,3.3,45,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spelling Bee",2004,13,20000,8.3,15,0,0,0,0,4.5,4.5,0,0,24.5,64.5,"",0,0,1,0,0,0,1 -"Spencer's Mountain",1963,118,NA,6.3,320,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Speriamo che sia femmina",1986,120,NA,6.7,75,0,0,0,4.5,4.5,14.5,44.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Spermula",1976,103,NA,4.4,41,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Spettatrice, La",2004,98,NA,6.9,24,0,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Spetters",1980,120,NA,6.4,690,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Spettri",1987,90,NA,3.3,42,14.5,14.5,14.5,4.5,14.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Spettro, Lo",1963,97,NA,4.9,59,4.5,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Spetzialist po vsichko",1962,90,NA,6.4,33,4.5,0,0,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,1,0,0,0,0 -"Sphere",1998,134,80000000,5.3,12990,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Spheres",1969,7,NA,6.8,22,4.5,0,14.5,0,4.5,4.5,0,14.5,4.5,44.5,"",0,1,0,0,0,0,1 -"Sphinx",1981,118,14000000,4.5,204,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sphinx, Le",1995,109,NA,6.2,55,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sphinx, The",1933,64,NA,5.7,29,0,0,14.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Spiaggia del desiderio, La",1976,88,NA,3.8,32,14.5,24.5,4.5,24.5,0,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Spice Girls in America: A Tour Story, The",1999,90,NA,2.1,40,45.5,4.5,0,4.5,4.5,0,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Spice Girls in Concert: Wild!",1998,87,NA,3.6,29,24.5,4.5,4.5,0,4.5,14.5,0,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Spice World",1997,93,25000000,3,7710,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Spider",2002,94,8000000,6.8,5193,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Spider & Rose",1994,94,NA,6.3,122,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Spider Baby, or The Maddest Story Ever Told",1968,81,65000,6.7,385,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Spider Woman Strikes Back, The",1946,59,NA,5.8,13,0,0,4.5,4.5,0,24.5,4.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Spider and the Fly, The",1931,7,NA,6.3,19,0,0,0,4.5,14.5,24.5,34.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Spider and the Fly, The",1949,87,NA,6.1,20,0,0,4.5,0,14.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Spider's Web",2001,88,NA,3.7,124,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"R",0,0,0,0,0,1,0 -"Spider, The",1931,59,NA,6.3,14,0,4.5,0,14.5,24.5,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Spider, The",1945,63,NA,5.9,5,0,0,0,44.5,0,44.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Spider-Man",2002,121,139000000,7.4,63228,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,0,0,0,0,0 -"Spider-Man 2",2004,127,200000000,7.9,40256,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",1,0,0,0,0,0,0 -"Spiderman",1990,5,NA,4.2,35,14.5,4.5,4.5,4.5,14.5,4.5,0,0,4.5,44.5,"",0,0,0,0,0,0,1 -"Spiders",2000,95,2000000,3.2,511,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Spiders II: Breeding Ground",2001,96,NA,3.2,195,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Spie uccidono a Beirut, Le",1965,89,NA,5.9,6,14.5,0,0,14.5,34.5,14.5,0,14.5,0,0,"",1,0,0,1,0,0,0 -"Spie uccidono in silenzio, Le",1967,85,NA,5.6,5,24.5,0,24.5,0,24.5,0,24.5,24.5,0,0,"",1,0,0,1,0,0,0 -"Spie vengono dal semifreddo",1966,100,NA,3.5,103,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Spiegel van Holland",1950,10,NA,8.2,12,0,0,0,0,0,0,34.5,34.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Spielen wir Liebe",1977,93,NA,6.7,72,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Spieler",1990,105,NA,7.1,13,0,0,0,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Spies",1943,4,NA,7.5,70,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Spies Like Us",1985,102,22000000,5.7,6434,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Spijun na stiklama",1988,80,NA,3.9,5,0,24.5,0,44.5,0,0,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Spike & Mike's Festival of Animation Volume 1",1991,80,NA,7.1,19,4.5,0,0,4.5,0,24.5,34.5,14.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Spike of Bensonhurst",1988,100,NA,4.9,107,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Spikes Gang, The",1974,96,NA,5.6,75,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spiklenci slasti",1996,85,NA,7.8,309,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,1,1,0,0,0,0 -"Spill",1996,87,NA,2.6,145,34.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Spin",1995,56,NA,8.1,53,4.5,0,0,0,4.5,0,4.5,24.5,4.5,45.5,"",0,0,0,0,1,0,1 -"Spin",2002,10,NA,5.2,25,4.5,4.5,14.5,0,4.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Spin Cycle",2000,19,NA,5.3,15,14.5,0,0,4.5,0,4.5,0,4.5,4.5,64.5,"",0,0,1,0,0,0,1 -"Spin Cycle, The",2004,9,5300,8.8,5,0,0,0,0,0,0,44.5,0,0,64.5,"",0,0,0,0,0,0,1 -"Spin the Bottle",1999,97,NA,4.4,23,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Spin the Bottle",2000,83,NA,5.1,103,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Spin the Bottle",2003,90,NA,5.6,37,4.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Spina dorsale del diavolo, La",1971,100,NA,5.1,45,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Spinach Fer Britain",1943,6,NA,5.9,14,4.5,0,0,4.5,24.5,34.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Spinach Overture, The",1935,8,NA,5.9,9,0,0,14.5,14.5,14.5,24.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Spinach Packin' Popeye",1944,7,NA,5.2,5,0,44.5,0,24.5,0,0,0,44.5,0,0,"",0,1,1,0,0,0,1 -"Spinach Roadster, The",1936,6,NA,6.1,6,0,0,14.5,0,0,0,45.5,0,0,34.5,"",0,1,1,0,0,0,1 -"Spinach vs Hamburgers",1948,6,NA,4,8,0,0,34.5,0,24.5,0,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Spinal Tap: The Final Tour",1998,20,50000,6.6,5,0,24.5,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,1 -"Spineless",1987,12,NA,3.1,14,14.5,14.5,14.5,0,4.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Spinnen, 1. Teil - Der Goldene See, Die",1919,130,NA,6.7,85,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spinnen, 2. Teil - Das Brillantenschiff, Die",1920,69,NA,5.9,66,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spinnennetz, Das",1989,196,NA,7,37,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Spinning Boris",2003,112,NA,6.8,204,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Spinning Gasing",2000,90,NA,6.8,27,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Spinnolio",1977,10,NA,6.8,13,0,0,4.5,0,0,4.5,34.5,4.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Spinout",1966,90,NA,4.4,209,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Spionage",1955,95,NA,5.4,8,0,0,0,0,24.5,0,34.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Spione",1928,90,NA,7.3,153,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Spiral",1999,18,NA,4.9,26,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Spiral Road, The",1962,145,NA,5.2,72,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Spiral Staircase, The",1946,83,NA,7.5,912,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Spiral Staircase, The",1975,89,NA,4.5,75,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spirala",1978,83,NA,7.7,13,0,0,0,0,0,14.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Spirale di nebbia, Una",1978,110,NA,7.4,100,0,4.5,0,4.5,4.5,14.5,44.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Spirit Is Willing, The",1967,100,NA,4.7,49,4.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Spirit Lost",1996,90,NA,3.6,27,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Spirit of '43, The",1943,6,NA,5.5,78,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,1,1,1,1,0,1 -"Spirit of '76, The",1990,82,NA,5.1,177,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Spirit of America, The",2001,3,60000,6,14,0,4.5,0,4.5,0,14.5,0,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Spirit of Charles Lindbergh, The",1984,3,NA,5.5,20,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Spirit of Christmas, The",1950,27,NA,2,5,0,24.5,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Spirit of Christmas, The",1992,4,NA,6.9,152,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Spirit of Christmas, The",1995,5,NA,7.5,917,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,1,1,0,0,0,1 -"Spirit of Culver, The",1939,89,NA,4,5,0,0,0,24.5,0,0,24.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Spirit of Notre Dame, The",1931,80,NA,2.6,13,44.5,4.5,0,0,4.5,14.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Spirit of Seventy Sex, The",1976,72,NA,6.8,7,24.5,0,0,0,0,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Spirit of St. Louis, The",1957,135,6000000,7.1,1007,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Spirit of West Point, The",1947,77,NA,6.9,7,0,0,0,0,0,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Spirit of Youth",1938,66,NA,4.1,7,0,0,0,45.5,14.5,0,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Spirit of the Wind",1979,93,NA,3.7,29,14.5,0,0,4.5,4.5,0,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Spirit: Stallion of the Cimarron",2002,86,80000000,6.4,2738,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Spirithunter, The",2004,115,100000,8.3,7,0,0,0,0,0,14.5,24.5,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Spirits",1992,88,NA,2.9,34,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Spirits",2004,120,NA,7.6,18,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Spirits of the Air, Gremlins of the Clouds",1989,93,NA,4.1,41,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Spirtokouto",2003,80,NA,7.1,38,4.5,4.5,0,0,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Spis cudzoloznic",1995,70,NA,6.4,23,4.5,0,0,4.5,4.5,34.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spite Marriage",1929,80,NA,7.6,190,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Spitfire",1934,87,NA,5.5,97,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Spitfire",1984,90,NA,5.3,6,0,0,0,14.5,34.5,14.5,0,0,34.5,0,"",0,0,0,0,0,0,0 -"Spitfire",1994,95,NA,3.3,106,14.5,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Spitfire Grill, The",1996,117,6000000,6.7,2245,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Spiti tou Kain, To",2000,79,NA,6.7,6,0,0,0,0,34.5,0,45.5,0,14.5,0,"",0,0,0,0,1,0,0 -"Spittin' Image, The",1997,22,NA,4,7,0,0,0,24.5,0,0,14.5,0,0,45.5,"",0,0,0,0,0,0,1 -"Spivs",2004,95,NA,5.2,68,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Splash",1984,111,8000000,6.3,9428,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Splatter University",1984,78,NA,3,133,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Splav 'Meduza'",1980,101,NA,6.1,12,0,0,4.5,0,4.5,0,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Splendor",1935,75,NA,5.6,15,4.5,4.5,0,0,24.5,24.5,4.5,34.5,0,4.5,"",0,0,1,0,0,1,0 -"Splendor",1988,105,NA,7,103,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Splendor",1999,93,NA,5.8,804,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Splendor in the Grass",1961,124,NA,7.5,2144,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Splendori e miserie di Madame Royale",1970,103,NA,5.8,8,0,0,0,0,24.5,14.5,45.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Split",1989,85,NA,5.7,30,14.5,0,4.5,0,14.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Split Decisions",1988,95,NA,5.3,150,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Split Image",1982,110,NA,6.3,112,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Split Infinity",1992,90,NA,5.3,42,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Split Second",1953,85,NA,6.9,125,4.5,4.5,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Split Second",1992,90,7000000,5.3,1120,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Split Wide Open",1999,100,NA,5.1,59,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Split, The",1968,91,NA,5.7,108,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Splitting Heirs",1993,87,NA,5.2,796,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Splitz",1984,89,NA,4.8,18,14.5,24.5,4.5,14.5,4.5,0,0,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Spoiler",1997,99,NA,4.4,53,14.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Spoilers of the Plains",1951,68,NA,6.5,5,0,0,0,0,24.5,44.5,24.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Spoilers, The",1930,86,NA,6.6,12,0,0,0,0,4.5,14.5,44.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Spoilers, The",1942,87,NA,6.5,212,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Spoilers, The",1955,84,NA,5.9,28,0,0,0,4.5,24.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Spokane",2004,29,NA,5.5,18,14.5,14.5,0,0,14.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Spokoynyy den v kontse voyny",1970,32,NA,7.2,8,0,0,0,0,0,14.5,24.5,34.5,0,24.5,"",0,0,0,1,0,0,1 -"Spomen za bliznachkata",1976,139,NA,8.4,5,0,0,0,0,0,0,24.5,0,44.5,44.5,"",0,0,0,1,0,0,0 -"Spona",1998,91,NA,5.6,6,14.5,0,0,14.5,14.5,14.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"SpongeBob SquarePants Movie, The",2004,90,30000000,6.5,2672,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"PG",0,1,1,0,0,0,0 -"Spontaneous Combustion",1990,96,NA,3.3,200,14.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Spoof! An Insider's Guide to Short Film Success",2000,11,NA,7.1,9,0,14.5,34.5,0,0,14.5,0,24.5,0,24.5,"",0,0,1,0,0,0,1 -"Spook",2003,93,1000000,8.3,7,0,0,0,0,0,24.5,0,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Spook Busters",1946,68,NA,6.2,37,0,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Spook Chasers",1957,62,NA,6,8,0,0,0,14.5,0,24.5,45.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Spook Louder",1943,17,NA,7.2,66,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Spook Who Sat by the Door, The",1973,102,NA,6.8,77,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"",1,0,0,1,0,0,0 -"Spookies",1987,85,NA,2.9,135,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Spooking About Africa",1957,6,NA,5.1,10,0,0,0,44.5,14.5,14.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Spooks",1931,8,NA,6.9,15,0,0,0,0,0,44.5,14.5,24.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Spooks",1953,16,NA,7,54,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Spooks Run Wild",1941,69,NA,5.4,150,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Spooky Hooky",1936,10,NA,6.3,36,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Spooky House",2000,106,NA,5.6,79,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,44.5,"PG",0,0,0,0,0,0,0 -"Spooky House, The",2003,7,NA,8.8,5,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,0,1,0,0,0,1 -"Spooky Swabs",1957,6,NA,5.1,10,0,0,14.5,0,34.5,44.5,14.5,0,14.5,0,"",0,1,1,0,0,0,1 -"Spoonman",2003,24,NA,7.7,11,4.5,0,4.5,0,0,0,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Spoorloos",1988,107,NA,7.8,2827,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sporlaust",1998,90,NA,5.7,44,14.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sport Chumpions",1941,7,NA,5.8,21,4.5,0,0,4.5,14.5,44.5,4.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Sport Parade, The",1932,63,NA,5.1,7,0,0,14.5,14.5,14.5,24.5,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Sport of Kings, The",1931,90,NA,4,6,0,0,14.5,64.5,14.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Sporting Blood",1931,82,NA,5.5,42,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sporting Blood",1940,82,NA,5.1,18,0,0,0,24.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Sporting Club, The",1971,107,NA,2.4,12,24.5,14.5,4.5,4.5,14.5,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Sportloto-82",1982,95,NA,5.7,56,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Spotless",2002,20,NA,6,19,0,4.5,0,0,4.5,14.5,4.5,14.5,34.5,24.5,"",0,0,1,1,0,0,1 -"Spotless",2005,90,250000,3.9,44,4.5,14.5,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Spotlight on the World We Live In",1951,14,NA,5.9,5,0,0,24.5,0,24.5,44.5,0,0,0,24.5,"",0,0,0,0,1,0,1 -"Spotswood",1992,95,NA,6.2,363,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Spreadin' the Jam",1945,10,NA,5.3,9,0,0,24.5,14.5,0,44.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Spreading Ground, The",2000,100,NA,5.4,97,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Sprechende Grab, Das",1994,90,NA,3.9,8,34.5,0,0,0,14.5,24.5,0,0,0,24.5,"PG",0,0,0,0,0,0,0 -"Spree Lunch",1957,6,NA,5.5,16,0,0,4.5,4.5,24.5,24.5,14.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Sprickorna i muren",2003,98,NA,5.8,55,4.5,0,0,4.5,24.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Spriggan: The Movie",1998,90,NA,6.5,584,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",1,1,0,0,0,0,0 -"Spring",2002,7,NA,6.2,6,0,0,0,0,0,64.5,0,14.5,0,14.5,"",0,1,0,1,0,0,1 -"Spring Break",1983,102,NA,3.8,254,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Spring Fever",1982,100,4300000,4.3,24,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Spring Forward",1999,110,2000000,7.1,307,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Spring Madness",1938,67,NA,4.7,23,4.5,14.5,4.5,24.5,24.5,4.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Spring Parade",1940,89,NA,6.6,13,4.5,0,4.5,0,0,14.5,4.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Spring Reunion",1957,79,NA,5.9,11,0,4.5,0,4.5,24.5,4.5,34.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Spring and Port Wine",1970,101,NA,5.8,79,4.5,0,0,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Spring in Park Lane",1948,100,NA,7,19,0,0,0,0,0,24.5,0,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Spring, The",1989,102,NA,5.3,15,14.5,14.5,0,4.5,34.5,4.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Springen",1985,105,NA,2.8,21,14.5,14.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Springfield Rifle",1952,93,NA,6.2,152,4.5,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Springflod",1990,105,NA,4.7,45,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Springtime",1929,6,NA,7,12,0,0,0,0,4.5,14.5,24.5,0,14.5,34.5,"",0,1,1,0,0,0,1 -"Springtime for Pluto",1944,7,NA,5.9,26,0,0,4.5,34.5,14.5,14.5,14.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Springtime for Thomas",1946,8,NA,6.9,25,0,0,0,4.5,24.5,4.5,24.5,44.5,0,4.5,"",0,1,1,0,0,0,1 -"Springtime in Greenland",1981,24,NA,8.7,11,0,0,0,4.5,0,4.5,4.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Springtime in Hell",1999,13,NA,5.9,15,4.5,0,0,4.5,0,14.5,4.5,24.5,4.5,44.5,"",0,0,1,0,0,1,1 -"Springtime in the Rockies",1937,56,NA,6.8,20,0,0,0,0,24.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Springtime in the Rockies",1942,91,NA,6.7,102,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Springtime in the Sierras",1947,75,NA,6.5,10,0,0,0,0,14.5,44.5,0,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Sprinter, Der",1984,87,NA,4.7,10,0,0,14.5,0,24.5,0,14.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Sprung",1997,105,NA,4,194,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Spudmonkey",2001,88,1100000,7.8,8,0,0,0,0,0,45.5,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Spun",2002,106,2800000,6.2,3924,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Spur der Steine",1966,129,NA,7.6,136,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Spur des Bernsteinzimmers, Die",1992,105,NA,5.8,7,0,0,14.5,0,14.5,45.5,0,14.5,0,0,"",0,0,1,1,0,0,0 -"Spy Chasers",1955,61,NA,6.1,27,0,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Spy Game",2001,126,92000000,7,16736,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",1,0,0,1,0,0,0 -"Spy Hard",1996,81,18000000,4.5,4686,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Spy Kids",2001,88,35000000,6.2,7400,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Spy Kids 2: Island of Lost Dreams",2002,99,39000000,5.8,3175,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Spy Kids 3-D: Game Over",2003,84,39000000,4.7,2597,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"Spy Ship",1942,62,NA,5.8,10,14.5,0,0,14.5,14.5,14.5,45.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Spy Smasher",1942,215,NA,7.6,54,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Spy Sorge",2003,182,NA,6.5,41,14.5,4.5,4.5,0,14.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Spy Swatter, The",1967,6,NA,6.3,8,0,0,0,14.5,0,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Spy Who Came In from the Cold, The",1965,112,NA,7.7,1048,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Spy Who Loved Me, The",1977,123,14000000,6.9,8130,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Spy in Black, The",1939,80,NA,7.4,110,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,1,0 -"Spy in the Sky!",1958,75,NA,5.1,5,44.5,0,24.5,0,24.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Spy with My Face, The",1965,88,NA,5.7,67,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Spy with a Cold Nose, The",1966,93,NA,5.2,18,0,0,4.5,14.5,34.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Squad Car",1960,62,NA,2.9,6,34.5,14.5,14.5,14.5,0,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Squadra antiscippo",1976,95,NA,5.3,57,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Squadrone bianco",1936,100,NA,7.8,5,0,0,0,0,0,0,44.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Squale, La",2000,100,NA,4.7,66,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Squall, The",1929,101,NA,4.6,40,14.5,24.5,14.5,4.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Squanderers",1996,95,NA,2.1,26,34.5,14.5,14.5,0,4.5,0,4.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Squanto: A Warrior's Tale",1994,102,NA,5.9,173,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Square Dance",1987,112,NA,5.3,178,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Square Dance Jubilee",1949,79,NA,3.1,7,14.5,14.5,24.5,14.5,14.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Square Jungle, The",1955,86,NA,6.1,27,0,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Square Mile, The",1953,19,NA,8.1,11,0,0,0,0,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Square Peg, The",1958,89,NA,5.9,88,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Square Ring, The",1953,83,NA,5.7,19,0,0,4.5,14.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Square Shooter",1935,57,NA,6.4,5,0,0,0,0,44.5,24.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Square couine",2001,12,NA,6.7,8,0,0,0,0,0,45.5,24.5,24.5,0,0,"",0,1,0,0,0,0,1 -"Squareheads of the Round Table",1948,18,NA,8,47,0,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Squares",1972,92,NA,4.8,7,0,0,0,14.5,0,14.5,0,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Squartatore di New York, Lo",1982,93,NA,5.7,768,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Squash",2002,29,NA,8,58,4.5,0,0,0,4.5,14.5,4.5,34.5,24.5,24.5,"",0,0,1,1,0,0,1 -"Squatter's Daughter, The",1933,104,NA,5.8,8,0,0,0,14.5,14.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Squatter's Rights",1946,8,NA,6.8,27,4.5,0,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Squaw Man, The",1914,72,15450,6.3,41,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Squaw Man, The",1931,107,NA,6.3,36,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Squawkin' Hawk, The",1942,7,NA,6.7,16,0,0,0,0,4.5,34.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Squeak in the Deep, A",1966,6,NA,6.7,17,0,0,0,4.5,14.5,24.5,14.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Squeaker, The",1937,77,NA,4.9,10,0,14.5,0,0,24.5,24.5,44.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Squeeze",1997,102,155000,4.9,57,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Squeeze Play",1980,96,NA,3.1,64,14.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Squeeze a Flower",1970,102,NA,3.4,6,34.5,14.5,0,0,14.5,14.5,0,0,14.5,0,"",0,0,1,0,0,0,0 -"Squeeze, The",1977,104,NA,4.8,60,4.5,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Squeeze, The",1978,99,NA,4.5,56,4.5,4.5,14.5,24.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Squeeze, The",1987,101,NA,3.8,186,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Squid and the Whale, The",2005,80,NA,3.6,61,4.5,14.5,4.5,0,0,4.5,4.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Squirm",1976,93,NA,3.6,691,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Squizzy Taylor",1982,97,NA,5.3,14,0,4.5,0,14.5,24.5,4.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Sr. Trapo",2002,12,NA,7.5,9,14.5,14.5,0,0,0,14.5,34.5,0,24.5,14.5,"",0,1,0,0,0,0,1 -"Srce nije u modi",2000,87,NA,4.9,8,14.5,14.5,0,24.5,34.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Srcna dama",1991,98,NA,5.5,6,0,14.5,0,0,14.5,34.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Sreca na vrvici",1977,94,NA,7.6,45,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Srecno Kekec",1963,58,NA,8.1,72,0,0,4.5,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Sreda",1997,93,NA,5.6,7,0,0,0,14.5,14.5,14.5,14.5,24.5,14.5,0,"",0,0,0,0,1,0,0 -"Sredi serykh kamney",1983,88,NA,8,10,0,0,0,0,0,0,14.5,14.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Sredni Vashtar",2003,10,NA,7.3,11,4.5,0,0,4.5,4.5,4.5,0,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Sretno dijete",2003,97,NA,6.6,28,24.5,4.5,4.5,4.5,0,0,4.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Srok davnosti",1983,91,NA,8,6,0,0,0,0,0,0,14.5,64.5,14.5,0,"",0,0,0,1,0,1,0 -"Ssaki",1962,10,NA,6.3,102,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"St. Andrew's Girls",2002,76,NA,6.6,27,14.5,14.5,4.5,0,4.5,4.5,4.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"St. Benny the Dip",1951,80,NA,5.5,29,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"St. Elmo's Fire",1985,110,NA,5.9,5271,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"St. Helens",1981,90,NA,5.9,102,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"St. Ives",1976,94,NA,5.3,215,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"St. Ives",1999,90,NA,6.2,179,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"St. John in Exile",1986,92,NA,6.9,30,0,0,0,4.5,4.5,0,14.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"St. Louis Blues",1929,16,NA,7.5,28,0,0,4.5,0,4.5,24.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"St. Louis Blues",1939,92,NA,4.9,6,0,14.5,0,0,14.5,0,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"St. Louis Blues",1958,105,NA,6.3,83,0,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"St. Louis Kid, The",1934,67,80000,6.4,50,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"St. Patrick's Day Parade, Lowell, Mass.",1905,3,NA,3.2,8,24.5,14.5,14.5,14.5,34.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"St. Pauli Nacht",1999,95,NA,5.6,141,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"St. Pauli Report",1971,92,NA,2.1,6,45.5,0,14.5,0,0,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"St. Tammany Miracle, The",1994,90,NA,1.5,27,24.5,4.5,0,4.5,4.5,14.5,0,4.5,0,44.5,"",0,0,0,1,0,0,0 -"St. Valentine's Day Massacre, The",1967,100,1000000,6.1,380,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sta se zgodi kad se ljubav rodi",1984,103,NA,5,6,0,45.5,0,0,0,14.5,0,0,34.5,0,"",0,0,1,0,0,0,0 -"Stablemates",1938,89,NA,6.2,16,0,0,4.5,0,0,34.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Staccato Purr of the Exhaust",1996,92,NA,9.3,6,0,0,0,0,0,0,0,34.5,0,64.5,"",0,0,0,1,0,0,0 -"Stacey",1973,81,100000,5.6,12,0,0,4.5,24.5,14.5,24.5,4.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Stachka",1925,81,NA,8,438,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Stacja",2001,96,NA,5.9,59,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stacking",1987,96,NA,4.6,39,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Stacy",2001,80,NA,4.6,234,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Stade de Wimbledon, Le",2001,78,NA,5.2,45,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Stadt der verlorenen Seelen",1983,91,NA,7.6,7,0,0,0,0,0,24.5,0,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Stadt ohne Juden, Die",1924,80,NA,4.9,8,14.5,0,14.5,0,34.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Stadtstreicher, Der",1966,10,NA,6.1,54,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Stag",1997,91,3000000,5.5,305,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Stag",2001,9,NA,7.1,24,0,0,0,0,14.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Stage Beauty",2004,110,NA,7.3,1211,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Stage Door",1937,92,952000,7.6,1085,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Stage Door Canteen",1943,132,NA,6.3,173,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stage Door Cartoon",1944,8,NA,6.8,59,0,0,0,0,14.5,14.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Stage Fright",1940,7,NA,6.5,6,0,0,0,0,0,34.5,45.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Stage Fright",1950,110,NA,6.9,1177,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Stage Fright",1997,11,NA,6.6,35,0,4.5,0,0,24.5,24.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Stage Mother",1933,85,NA,6.3,28,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stage Struck",1925,70,NA,7.4,8,0,0,0,0,0,14.5,34.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Stage Struck",1936,91,NA,5,29,4.5,14.5,0,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Stage Struck",1948,71,NA,7.1,5,0,0,0,0,0,0,44.5,24.5,44.5,0,"",0,0,0,1,0,0,0 -"Stage Struck",1958,95,NA,6.2,67,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Stage to Chino",1940,59,NA,2.9,7,24.5,0,0,0,14.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Stage to Mesa City",1947,56,NA,4.6,12,0,4.5,0,4.5,45.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Stage to Thunder Rock",1964,82,NA,3.9,17,14.5,14.5,0,14.5,24.5,4.5,0,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Stage to Tucson",1950,81,NA,6.2,11,4.5,0,0,0,0,44.5,34.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Stagecoach",1939,96,531300,8,5646,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,1,0 -"Stagecoach",1966,110,NA,5.4,216,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stagecoach Kid",1949,60,NA,5.8,18,0,0,4.5,4.5,0,34.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Stagecoach Outlaws",1945,58,NA,4.8,12,0,0,0,34.5,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Stagecoach War",1940,63,NA,7.4,18,0,0,0,4.5,0,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Stagecoach to Dancers' Rock",1962,72,NA,5,5,24.5,24.5,0,0,0,24.5,24.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Stagecoach to Denver",1946,56,NA,5,10,14.5,0,14.5,24.5,44.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Stagefright",1981,75,NA,7.2,8,0,0,0,0,14.5,14.5,45.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Stageghost",2000,104,NA,3.9,26,34.5,14.5,0,4.5,14.5,4.5,0,0,4.5,24.5,"R",0,0,0,0,0,0,0 -"Stagestruck: Gay Theatre in the 20th Century",2000,140,NA,9.1,11,0,0,0,0,0,0,0,24.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Staggered",1994,95,NA,5.9,218,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Stagnate",2002,5,NA,5.9,10,14.5,0,14.5,0,24.5,14.5,45.5,0,0,0,"",0,0,0,0,0,0,1 -"Stagona ston okeano",1995,106,NA,5.6,6,0,0,0,14.5,14.5,0,34.5,0,34.5,0,"",0,0,0,0,0,0,0 -"Stain, The",1991,12,NA,6.1,5,0,0,0,0,24.5,0,0,0,0,84.5,"",0,1,0,0,0,0,1 -"Staircase",1969,100,NA,4,91,14.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Stairs 1 Geneva",1995,107,NA,4.3,17,14.5,0,0,0,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Stairway to Light",1945,10,NA,6.8,15,0,0,4.5,0,14.5,14.5,44.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Stakaman",2001,100,NA,5.8,63,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Stakeout",1987,116,NA,6.5,4215,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Stakeout on Dope Street",1958,89,35000,7,9,0,0,14.5,14.5,0,24.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Stakeout!",1962,81,NA,7.5,8,14.5,14.5,0,0,24.5,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Stalag 17",1953,116,1315000,8.2,7153,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Stalingrad",1993,135,NA,7.4,2765,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Stalked",1968,29,NA,9.1,8,0,0,0,14.5,0,0,0,0,14.5,74.5,"",0,0,0,0,0,0,1 -"Stalked",1994,95,NA,4.5,46,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Stalker",1979,163,NA,7.7,3994,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Stalker Guilt Syndrome",1999,11,NA,7.1,48,0,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Stalking Moon, The",1969,109,NA,6.3,169,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Stalled",2000,96,NA,4.5,33,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Stallion Road",1947,91,NA,3.9,38,14.5,14.5,4.5,4.5,24.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stamatis kai o Gregoris, O",1962,86,NA,6.8,5,0,24.5,0,0,0,24.5,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Stamboul Quest",1934,86,NA,6.7,29,0,4.5,0,0,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Stammheim",1986,107,NA,6.4,29,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Stamp Day for Superman",1954,18,NA,6,14,0,4.5,0,4.5,14.5,24.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Stampede",1949,76,NA,6.1,11,4.5,4.5,0,0,14.5,24.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Stan and George's New Life",1991,104,NA,4.1,12,4.5,0,0,24.5,0,14.5,0,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Stan posiadania",1989,103,NA,6.7,8,0,0,0,0,14.5,0,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Stan the Flasher",1990,67,NA,3.8,19,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Stan's Window",2003,6,NA,8.5,6,0,0,0,0,0,14.5,34.5,14.5,34.5,0,"",0,0,0,0,0,0,1 -"Stand Alone",1985,94,NA,4.9,34,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Stand By",2003,9,NA,6.7,12,0,0,0,0,4.5,14.5,0,24.5,0,45.5,"",0,0,0,1,0,0,1 -"Stand Up and Be Counted",1972,99,NA,3.6,11,14.5,4.5,34.5,0,0,0,4.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Stand Up and Cheer!",1934,80,NA,5.3,57,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Stand Up and Fight",1939,97,NA,6.6,43,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Stand and Deliver",1988,102,NA,7.1,2229,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Stand at Apache River, The",1953,77,NA,4,15,14.5,4.5,4.5,34.5,4.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Stand by Me",1986,89,8000000,8,30805,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Stand by for Action",1942,109,NA,6.3,81,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Stand der Dinge, Der",1982,121,NA,6.8,227,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Stand van de maan",2005,92,NA,2.7,14,4.5,0,0,4.5,4.5,0,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Stand-In",1937,91,NA,6.6,196,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Stand-In, The",1999,100,400000,5.6,42,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Stand-Up Reagan",1989,40,NA,1,21,45.5,4.5,0,4.5,0,0,4.5,0,4.5,14.5,"",0,0,0,0,0,0,1 -"Stand-by",2000,121,NA,6.8,111,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Stand-ins",1997,89,NA,3.6,36,24.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Standalone",2005,108,245000,7.3,10,0,14.5,0,0,14.5,24.5,14.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Standard Parade, The",1939,8,NA,7,10,0,0,0,14.5,0,34.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Standard Time",1967,8,NA,3.8,6,14.5,14.5,14.5,14.5,0,0,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Standard Time",2002,102,NA,5.8,89,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,0,0,1,0 -"Stander",2003,111,NA,7.2,659,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Standhaftige tinnsoldat, Den",1955,13,NA,7.9,120,0,0,0,4.5,4.5,4.5,4.5,4.5,24.5,45.5,"",0,1,0,0,0,1,1 -"Standing by Yourself",2002,65,1000,9.1,8,0,0,14.5,0,0,0,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Standing in the Shadows of Motown",2002,108,NA,7.7,869,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG",0,0,0,0,1,0,0 -"Standing on Fishes",1999,89,NA,6,35,0,0,4.5,4.5,14.5,14.5,4.5,14.5,24.5,24.5,"R",0,0,1,0,0,1,0 -"Standoff",1998,87,NA,4.6,116,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Stangata napoletana",1982,129,NA,5.6,5,0,0,0,0,24.5,44.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Stanley",1972,108,125000,3.9,36,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Stanley",2000,7,NA,6.3,16,0,0,0,0,24.5,4.5,14.5,0,0,45.5,"",0,1,0,1,0,0,1 -"Stanley & Iris",1990,104,NA,5.9,1156,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Stanley Beloved",1998,20,NA,5.8,18,0,0,4.5,14.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Stanley Kubrick: A Life in Pictures",2001,142,NA,7.7,1560,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Stanley and Livingstone",1939,101,2000000,7.2,175,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Stanley and Us",1999,58,NA,7.2,33,4.5,0,0,0,4.5,14.5,4.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Stanley's Gig",2000,93,NA,7.1,48,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Stanno tutti bene",1990,126,NA,7.4,407,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Stanza accanto, La",1994,94,NA,5.4,6,0,0,0,14.5,34.5,0,0,45.5,0,0,"",0,0,0,0,0,0,0 -"Stanza del figlio, La",2001,99,NA,7.4,2992,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Stanza del vescovo, La",1977,110,NA,5.9,36,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Stanza dello scirocco, La",1998,89,NA,6.8,17,14.5,0,0,0,0,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Staplerfahrer Klaus - Der erste Arbeitstag",2000,9,NA,8.3,721,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Star 80",1983,100,NA,6.2,1152,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Star Chamber, The",1983,109,NA,6.1,1061,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Star Dreamer, The",2002,54,NA,8.9,20,0,0,0,0,4.5,4.5,0,34.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Star Dust",1940,86,NA,6.6,40,4.5,0,0,4.5,4.5,14.5,24.5,34.5,0,14.5,"",0,0,1,1,0,0,0 -"Star Is Bored, A",1956,7,NA,7.4,53,4.5,0,0,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Star Is Born, A",1937,111,1173639,7.5,687,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Star Is Born, A",1954,176,5019770,7.7,1856,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Star Is Born, A",1976,139,6000000,5,755,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Star Is Hatched, A",1938,8,NA,6.8,19,0,0,4.5,4.5,4.5,24.5,34.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Star Kid",1997,101,12000000,5,269,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Star Maps",1997,86,NA,6.1,350,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Star Night at the Cocoanut Grove",1934,20,NA,5.4,18,0,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Star Packer, The",1934,53,NA,4.8,110,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Star Portal",1998,78,NA,3.1,27,24.5,24.5,24.5,0,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Star Spangled Girl",1971,93,NA,4.5,40,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Star Spangled Rhythm",1942,99,NA,6.3,94,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Star Spangled to Death",2004,402,NA,4.3,12,0,14.5,0,0,0,0,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Star Tours",1987,3,NA,7.3,522,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Star Trak",1998,9,NA,4.3,10,24.5,24.5,0,0,14.5,14.5,0,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Star Trek III: The Search for Spock",1984,105,17000000,6.2,9808,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Star Trek IV: The Voyage Home",1986,136,25000000,7.1,11647,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Star Trek V: The Final Frontier",1989,107,27800000,4.8,9215,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Star Trek VI: The Undiscovered Country",1991,113,30000000,6.9,10367,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Star Trek the Experience: The Klingon Encounter",1998,4,70000000,7,170,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",1,0,0,0,0,0,1 -"Star Trek: First Contact",1996,106,45000000,7.3,25046,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",1,0,0,0,0,0,0 -"Star Trek: Generations",1994,118,35000000,6.2,12651,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Star Trek: Insurrection",1998,103,58000000,6.3,13395,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG",1,0,0,1,0,1,0 -"Star Trek: Nemesis",2002,116,70000000,6.5,11785,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,0,0,1,0,0,0 -"Star Trek: New Voyages",2003,45,NA,8.8,9,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,0,0,0 -"Star Trek: The Motion Picture",1979,143,35000000,5.8,10752,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Star Trek: The Wrath of Khan",1982,116,11000000,7.6,16333,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG",1,0,0,0,0,0,0 -"Star Virgin",1979,78,NA,3.7,31,14.5,4.5,4.5,0,0,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Star Wars",1977,125,11000000,8.8,134640,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG",1,0,0,0,0,0,0 -"Star Wars: Episode I - The Phantom Menace",1999,133,115000000,6.4,84488,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"PG",1,0,0,0,0,0,0 -"Star Wars: Episode II - Attack of the Clones",2002,120,120000000,7,63889,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG",1,0,0,0,0,0,0 -"Star Wars: Episode V - The Empire Strikes Back",1980,129,18000000,8.8,103706,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"PG",1,0,0,0,0,0,0 -"Star Wars: Episode VI - Return of the Jedi",1983,135,32500000,8.1,82471,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG",1,0,0,0,0,0,0 -"Star Witness, The",1931,68,NA,5.9,63,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Star for Two, A",1991,95,NA,5.8,11,0,0,4.5,34.5,0,14.5,34.5,0,0,0,"",0,0,0,1,0,1,0 -"Star in the Dust",1956,80,NA,5.9,31,4.5,0,0,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Star in the Night",1945,22,NA,8.3,43,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Star of India",1953,92,NA,5.1,14,0,14.5,14.5,0,14.5,14.5,24.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Star of Jaipur",1998,100,NA,7.7,22,14.5,4.5,0,0,0,4.5,0,0,4.5,74.5,"",1,0,0,1,0,0,0 -"Star of Midnight",1935,90,280000,7,89,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Star of My Night",1954,70,NA,3.3,6,14.5,0,0,34.5,14.5,0,14.5,0,0,14.5,"",0,0,0,1,0,1,0 -"Star!",1968,120,14000000,6,290,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Star! Star!",1999,78,NA,4,14,4.5,0,4.5,45.5,4.5,0,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Star, The",1952,89,NA,7.3,283,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Star-Crossed",2003,105,2500,8.4,69,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,74.5,"",0,0,0,0,0,1,0 -"StarGeeks",1999,25,NA,5.6,30,14.5,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Stara basn. Kiedy slonce bylo bogiem",2003,103,NA,5.3,84,14.5,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Starblack",1966,89,NA,5.7,5,0,0,0,0,24.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Starbuck Holger Meins",2002,90,NA,2.3,65,14.5,34.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Starchaser: The Legend of Orin",1985,107,NA,6.5,150,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Starched",2001,6,NA,3.9,13,0,0,14.5,4.5,14.5,14.5,14.5,0,4.5,24.5,"",0,0,1,0,0,0,1 -"Stardom",2000,105,NA,5.2,499,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Stardust",1974,111,NA,6.7,122,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stardust Memories",1980,91,10000000,6.8,2148,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Stardust Stricken - Mohsen Makhmalbaf: A Portrait",1996,70,NA,7.9,9,14.5,0,0,0,24.5,14.5,34.5,0,0,24.5,"",0,0,0,0,1,0,0 -"Stare de fapt",1996,89,NA,6.8,5,0,0,24.5,0,0,0,64.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Starfighters, The",1964,84,NA,1.9,224,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Starforce",2000,93,NA,3.5,77,14.5,4.5,0,4.5,0,4.5,0,0,0,74.5,"PG",0,0,0,0,0,0,0 -"Stargames",1998,90,NA,2.2,16,45.5,14.5,14.5,0,4.5,4.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Stargate",1994,130,55000000,6.4,17520,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Starhops",1978,82,NA,3.3,13,14.5,14.5,4.5,34.5,4.5,0,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Starik Khottabych",1956,86,NA,7.1,23,0,0,0,0,4.5,4.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Stariki-razboyniki",1971,92,NA,7.5,76,0,0,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Stark Fear",1962,86,NA,5.4,7,14.5,0,14.5,0,14.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Stark Raving Mad",2002,102,5000000,6.2,601,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Starke Ferdinand, Der",1976,97,NA,6.4,17,0,0,0,0,14.5,24.5,14.5,44.5,0,4.5,"",0,0,0,0,0,0,0 -"Starkiss - Circusmeisjes in India",2003,77,NA,7.9,11,0,0,0,0,0,0,44.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Starkweather",2004,92,1000000,4.6,89,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Starlet!",1969,91,NA,3.9,13,14.5,4.5,0,4.5,4.5,34.5,4.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Starlift",1951,103,NA,5.6,22,0,0,4.5,4.5,24.5,4.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Starlight Hotel",1987,93,NA,7.1,60,0,0,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Starman",1984,115,24000000,6.8,5541,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Staromodnaya komediya",1979,92,NA,9.1,7,0,0,0,0,0,14.5,0,14.5,0,74.5,"",0,0,0,0,0,0,0 -"Staroye i novoye",1929,121,NA,7.6,105,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Starquest II",1997,92,NA,2,104,45.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Starry Night",1999,101,NA,4.1,94,34.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Stars Are Beautiful, The",1974,19,NA,5.5,46,4.5,0,4.5,4.5,24.5,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Stars Are Singing, The",1953,99,NA,3.9,8,0,14.5,0,14.5,14.5,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Stars Caravan",2002,60,NA,6,17,4.5,0,4.5,4.5,24.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Stars Fell on Henrietta, The",1995,110,NA,6.1,253,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stars Look Down, The",1940,110,NA,7.5,110,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Stars Over Broadway",1935,90,NA,6,22,4.5,0,0,0,34.5,4.5,4.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Stars Over Texas",1946,59,NA,7,6,0,0,0,0,0,0,84.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Stars and Bars",1988,94,NA,4.1,182,14.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Stars and Stripes",1939,3,NA,8.5,6,0,0,0,0,0,34.5,0,14.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Stars and Stripes Forever",1952,90,NA,7.3,175,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Stars in My Crown",1950,89,NA,7.5,158,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Starshaya sestra",1966,102,NA,9,6,0,0,0,0,0,0,0,34.5,34.5,34.5,"",0,0,0,0,0,1,0 -"Starship",1985,84,NA,2.7,52,24.5,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Starship Invasions",1977,89,NA,3.3,100,24.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Starship Troopers",1997,129,95000000,6.7,32618,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Starshiy syn",1975,140,NA,8.2,35,0,0,0,4.5,0,0,4.5,4.5,24.5,64.5,"",0,0,0,1,0,0,0 -"Starsky & Hutch",2004,101,60000000,6.3,13529,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Starstruck",1982,94,NA,6.8,165,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Starstruck",1998,90,NA,4.4,136,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Start Cheering",1938,85,NA,6.4,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Start of Something, The",2004,3,NA,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,1 -"Start the Revolution Without Me",1970,98,NA,6.2,568,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Starting Over",1979,105,NA,6.3,359,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Starting Up",2003,1,NA,9.1,10,14.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,0,0,0,1 -"Startup.com",2001,105,NA,7.2,1359,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",0,0,0,0,1,0,0 -"Starukhi",2003,100,NA,7.5,21,4.5,4.5,0,0,0,4.5,14.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Starved",2000,90,NA,3.2,14,24.5,0,14.5,4.5,14.5,24.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Starving Artists",1997,97,NA,5.9,20,0,0,4.5,0,4.5,4.5,4.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Starwoids",2001,80,NA,4.1,88,14.5,0,0,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Staryy novyy god",1980,138,NA,7.7,28,0,0,0,0,0,4.5,14.5,34.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Stasera a casa di Alice",1990,123,NA,5.1,67,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Stastny konec",1966,71,NA,8.8,15,0,0,4.5,0,0,4.5,4.5,0,24.5,45.5,"",0,0,1,0,0,0,0 -"State Department: File 649",1949,87,NA,5.4,12,4.5,0,14.5,0,14.5,34.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"State Fair",1933,96,NA,6.7,67,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"State Fair",1945,100,NA,7.1,400,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"State Fair",1962,118,4500000,5.5,175,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"State Park",1990,87,NA,3.7,35,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"State Property",2002,88,NA,2.7,265,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"State Property 2",2005,94,NA,3.7,58,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"R",1,0,0,1,0,0,0 -"State Secret",1950,104,NA,6.7,32,4.5,0,0,0,4.5,14.5,14.5,44.5,4.5,14.5,"",0,0,0,1,0,0,0 -"State and Main",2000,105,NA,7,6995,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"State buoni... se potete",1983,115,NA,8.6,171,4.5,0,4.5,0,0,0,4.5,4.5,4.5,84.5,"",0,0,0,1,0,0,0 -"State of Grace",1990,134,NA,7.1,2111,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"State of Mind",1992,93,NA,1.8,6,45.5,45.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"State of Nature",1998,20,NA,8.6,7,0,0,0,0,0,0,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,1 -"State of Wonder",1984,113,NA,9.5,32,0,0,0,0,0,0,0,4.5,44.5,45.5,"",0,0,0,1,0,0,0 -"State of the Union",1948,124,2600000,7.2,454,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"State's Attorney",1932,79,NA,6.7,19,4.5,0,0,0,14.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"State's Evidence",2004,89,400000,7,12,14.5,0,0,0,0,0,4.5,0,4.5,64.5,"",0,0,0,1,0,0,0 -"Statement, The",2003,120,23000000,6.1,710,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"States of Control",1997,84,NA,5.5,12,24.5,0,4.5,0,4.5,4.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Stateside",2004,97,16000000,5.4,247,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Static",1985,93,NA,6.7,99,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Station Agent, The",2003,88,500000,8.1,7112,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Station Nord",2002,111,NA,5,24,4.5,0,24.5,14.5,4.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Station Six-Sahara",1962,99,NA,5.4,20,0,4.5,4.5,0,44.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Station West",1948,80,NA,6.8,69,0,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stationery Games",2002,28,2500,6.1,7,0,44.5,0,0,0,0,14.5,0,0,44.5,"",0,0,0,0,0,1,1 -"Statski sovetnik",2005,208,4000000,7,64,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Statue of Liberty, The",1985,60,NA,8.2,52,4.5,4.5,0,0,4.5,0,14.5,14.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Statue, The",1971,84,NA,5.3,23,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Statues meurent aussi, Les",1953,30,NA,7.3,32,0,4.5,4.5,4.5,0,14.5,14.5,4.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Status Yo!",2004,118,NA,7.7,27,24.5,0,4.5,0,0,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Stavisky...",1974,120,NA,6.9,162,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stay Awake, The",1987,91,NA,1.9,36,45.5,24.5,4.5,14.5,4.5,4.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Stay Away, Joe",1968,102,NA,3.8,143,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,1,0,0,0 -"Stay Clean",2002,11,NA,9.1,7,0,0,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Stay Hungry",1976,102,NA,5.5,438,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Stay Tuned",1992,88,NA,5.2,1607,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Staying Alive",1983,96,NA,3.8,1931,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Staying Together",1989,80,NA,5.5,144,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Stazione Termini",1953,63,NA,6.4,217,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Stazione, La",1990,92,NA,6.7,95,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Steagle, The",1971,87,1850000,4.2,15,4.5,14.5,0,24.5,14.5,14.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Steak, Le",1992,75,NA,7.2,19,4.5,0,0,4.5,4.5,24.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Steaks, The",2000,107,1000,8.7,10,0,0,0,0,0,14.5,0,34.5,34.5,34.5,"",0,0,1,1,0,1,0 -"Steal Big Steal Little",1995,135,35000000,4.6,263,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Steal This Movie",2000,106,NA,6.3,590,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Steal Wool",1957,7,NA,7.3,30,4.5,4.5,0,0,0,4.5,34.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Steal, The",1994,91,NA,3.9,41,4.5,14.5,14.5,4.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Stealin' Ain't Honest",1940,6,NA,4.2,6,14.5,0,14.5,0,14.5,14.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Stealing Beauty",1996,113,NA,6.2,3932,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Stealing Harvard",2002,82,25000000,4.7,2547,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Stealing Heaven",1988,115,NA,6,208,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Stealing Home",1988,98,NA,6.8,1296,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Stealing Sinatra",2003,96,NA,5.5,137,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Stealing the Fire",2002,97,NA,6.5,7,14.5,0,0,0,14.5,14.5,44.5,14.5,0,0,"",0,0,0,0,1,0,0 -"Stealth Fighter",1999,88,NA,3.6,220,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Steam Cloud Rising",2004,100,25000,6.4,8,24.5,0,0,0,0,14.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Steam Hammer",1904,4,NA,3.1,5,24.5,24.5,24.5,0,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Steamboat Bill, Jr.",1928,73,NA,7.9,1205,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Steamboat Round the Bend",1935,81,NA,6.2,77,4.5,0,0,0,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Steamboat Willie",1928,8,4986,7.6,386,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Steamboy",2004,126,20000000,6.6,529,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,1,0,1,0,0,0 -"Steaming",1985,102,3000000,5,58,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Steaming Milk",1997,87,NA,8.8,9,0,0,0,0,0,0,14.5,34.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Steamy Windows",1990,85,NA,5.6,17,0,0,4.5,0,14.5,0,14.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Steckler Interviews",1994,60,NA,1,6,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,1,0,0 -"Steel",1980,102,NA,5.3,103,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Steel",1997,97,16000000,2.6,1607,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Steel Against the Sky",1941,67,NA,5.8,18,4.5,0,0,14.5,14.5,14.5,34.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Steel Arena",1973,98,NA,5.5,7,14.5,0,0,14.5,0,14.5,24.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Steel Claw, The",1961,96,NA,5.7,8,0,0,0,24.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Steel Dawn",1987,100,NA,4.1,454,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Steel Frontier",1995,105,NA,4.9,44,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Steel Helmet, The",1951,85,103000,7.6,259,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Steel Lady, The",1953,84,NA,6.1,39,4.5,0,0,4.5,4.5,24.5,4.5,24.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Steel Legends: Railroads of the Northeast",2000,60,17500,8.5,48,4.5,4.5,0,0,0,0,14.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Steel Magnolias",1989,119,NA,6.8,6430,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Steel Sharks",1996,94,NA,3.8,100,14.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Steel Spirit",2002,90,20000,6,8,0,0,0,0,0,24.5,0,24.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Steel Town",1952,85,NA,6.6,11,0,0,0,0,4.5,24.5,45.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Steel Trap, The",1952,85,NA,6.6,27,0,0,0,0,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Steel and Lace",1991,92,NA,5.4,131,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Steele Justice",1987,95,NA,3.4,52,14.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Steelyard Blues",1973,93,NA,5.2,170,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Steep & Deep",1985,92,NA,7.1,8,0,0,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Steeplechase, The",1933,7,NA,6,10,0,0,0,14.5,14.5,34.5,34.5,0,0,24.5,"",0,1,0,0,0,0,1 -"Stefania",1966,92,NA,5.3,21,4.5,0,0,0,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stefanie",1958,99,NA,3.4,6,0,0,14.5,0,14.5,0,14.5,0,14.5,34.5,"",0,0,1,0,0,1,0 -"Stefano Quantestorie",1993,99,NA,6.2,40,4.5,0,0,4.5,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Stein des Todes, Der",1987,93,NA,3.9,13,4.5,14.5,4.5,0,14.5,14.5,4.5,0,4.5,24.5,"",1,0,0,0,0,0,0 -"Steiner - Das eiserne Kreuz, 2. Teil",1979,115,NA,4.4,120,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Steinflug",1999,15,NA,7.3,19,0,4.5,0,0,14.5,24.5,14.5,24.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Steklarski blues",2001,13,NA,6.7,7,0,0,0,0,14.5,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Stelinha",1990,112,NA,3.5,7,24.5,0,0,0,14.5,0,44.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Stella",1950,83,NA,6.4,14,0,0,0,0,14.5,34.5,14.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Stella",1955,100,NA,7.7,206,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Stella",1990,109,NA,5.4,435,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stella Dallas",1925,110,700000,7.6,12,0,0,0,0,4.5,4.5,4.5,45.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stella Dallas",1937,106,NA,7.2,444,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Stella Does Tricks",1996,99,NA,6.1,196,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Stella Maris",1918,84,NA,7.3,95,0,0,0,4.5,14.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Stella polaris",1993,89,NA,3.5,23,14.5,14.5,0,4.5,0,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Stellar",1993,3,NA,7.6,39,4.5,0,4.5,0,14.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Stem van het water, De",1966,90,NA,6.8,16,0,0,0,0,0,34.5,34.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Sten Stensson kommer till stan",1945,101,NA,2.7,10,24.5,44.5,0,14.5,24.5,0,14.5,0,0,0,"",0,0,1,0,0,1,0 -"Sten Stensson kommer tillbaka",1963,79,NA,3.5,14,0,14.5,44.5,4.5,14.5,4.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Stenographer's Friend, The",1910,9,NA,4.7,19,4.5,0,24.5,14.5,44.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Step",1977,134,NA,6.7,8,0,0,0,0,14.5,24.5,24.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Step Across the Border",1990,90,NA,9.2,50,0,0,0,0,0,0,4.5,4.5,24.5,64.5,"",0,0,0,0,1,0,0 -"Step Down to Terror",1958,76,NA,6.3,11,0,0,14.5,4.5,4.5,4.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Step Into Liquid",2003,88,NA,7.3,497,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"PG",0,0,0,0,1,0,0 -"Step Lively",1944,88,NA,5,45,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Step Lively, Jeeves!",1937,69,NA,5.3,13,0,0,0,14.5,24.5,34.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Step by Step",1946,62,NA,6.2,25,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stepdaughter, The",2000,92,NA,3.7,114,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Stepenice za nebo",1983,89,NA,8.1,5,24.5,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Stepfather II",1989,93,NA,4.5,276,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stepfather, The",1987,89,NA,6.3,964,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stepford Wives, The",1975,115,NA,6.8,2025,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stepford Wives, The",2004,93,90000000,5.3,7773,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Stephanie, Nathalie, Caroline & Vincent",2001,74,NA,8.4,11,0,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Stephen Tobolowsky's Birthday Party",2005,87,NA,8.3,15,4.5,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Stepmom",1998,124,50000000,6.1,7470,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Stepmonster",1993,85,NA,4.3,108,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Stepmother, The",1972,94,NA,2.7,8,14.5,14.5,45.5,0,0,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Steppenwolf",1974,107,NA,5.9,109,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Stepping Out",1991,108,NA,5.9,210,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Stepping Razor: Red X",1992,103,NA,5.7,31,0,4.5,4.5,4.5,4.5,0,14.5,24.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Steps",1987,25,NA,7.4,19,0,4.5,4.5,0,0,14.5,14.5,4.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Steptoe and Son",1972,98,NA,5.7,86,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Steptoe and Son Ride Again",1973,99,NA,6.1,75,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Stereo",1969,65,3500,4.7,86,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Stereo Future",2001,111,NA,6.4,87,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,1,0 -"Stereotypes",2003,10,NA,6.9,7,0,0,0,0,14.5,24.5,44.5,0,0,14.5,"",0,0,1,1,0,0,1 -"Sterile Cuckoo, The",1969,107,NA,6.6,332,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Sterling Chase, The",1999,95,NA,5.8,75,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Sterminatori dell'anno 3000, Gli",1983,103,NA,3.6,65,4.5,24.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Stern von Afrika, Der",1957,88,NA,6.1,30,4.5,0,4.5,0,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sterne",1959,92,NA,8.8,19,0,0,0,4.5,0,0,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Sternenberg",2004,90,NA,6.5,26,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Steve + Sky",2004,100,NA,6.6,188,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Steven Spielberg's Movie",2001,25,11000,1.7,37,24.5,4.5,4.5,0,0,4.5,0,0,0,64.5,"",0,0,1,0,0,0,1 -"Stevie",1978,102,NA,6.6,90,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Stevie",2002,140,NA,8.2,453,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,0,1,0,0 -"Stewardess School",1986,89,NA,2.8,305,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Stewardessen, Die",1971,80,NA,4.2,11,4.5,14.5,4.5,14.5,24.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Stewardesses, The",1969,93,NA,3.8,25,4.5,24.5,4.5,14.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Stick",1985,109,NA,4.8,242,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Stick Around",1925,12,NA,6.1,15,0,0,0,0,34.5,24.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Stick to Your Guns",1941,63,NA,7.6,17,0,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Stick, The",1987,88,NA,7.6,37,4.5,0,0,4.5,0,4.5,14.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Stickmen",2001,98,NA,6.6,372,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Sticks",2001,92,NA,5.5,18,14.5,0,14.5,4.5,24.5,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Sticks and Bones",1973,105,NA,1,12,45.5,0,0,0,0,0,0,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Sticks and Stones",1970,85,NA,4.4,15,0,4.5,4.5,4.5,0,4.5,44.5,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Sticks and Stones",1996,95,NA,5.8,111,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Stickup, The",2001,94,NA,6.2,230,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Sticky Fingers",1988,97,NA,4.7,66,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sticky Fingers of Time, The",1997,90,250000,5.5,129,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Stico",1984,105,NA,5.6,15,0,4.5,0,14.5,14.5,24.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Stiff Competition",1984,90,NA,7.7,23,4.5,0,4.5,0,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Stiff Upper Lips",1998,94,NA,6.4,328,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Stigma",1972,93,NA,1.7,10,34.5,14.5,0,14.5,0,0,0,0,0,45.5,"",0,0,0,1,0,0,0 -"Stigmata",1999,103,32000000,6,14062,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Stigmata, The",1995,75,NA,5.4,5,24.5,0,0,0,44.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Stiilipidu",2005,110,NA,7.4,7,0,14.5,0,0,14.5,14.5,0,0,14.5,44.5,"",0,0,1,1,0,0,0 -"Stiletto",1969,96,NA,3.7,34,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Stiliga Augusta",1946,78,NA,4.7,5,0,0,44.5,24.5,44.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Still",2003,21,NA,5.1,7,0,0,0,0,24.5,0,44.5,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Still Breathing",1997,109,NA,6.5,659,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Still Crazy",1998,100,NA,6.6,1561,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Still Kicking: The Fabulous Palm Springs Follies",1997,38,NA,2.8,13,14.5,0,0,0,4.5,0,4.5,4.5,0,64.5,"",0,0,0,0,1,0,1 -"Still Life",1988,83,NA,3.8,32,4.5,4.5,14.5,4.5,4.5,0,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Still Looking for Morphine",2001,119,NA,6.9,28,0,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Still Lover",2003,5,1000,7.7,7,0,14.5,0,0,0,0,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Still Movin'",1997,85,NA,5.1,23,4.5,0,14.5,4.5,14.5,14.5,14.5,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Still Revolutionaries",1998,16,NA,7.7,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,0,0,1,0,1 -"Still Smokin",1983,91,NA,4.8,1132,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Still of the Night",1982,93,NA,5.9,485,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Still the Brat",1988,83,NA,7.9,8,0,0,34.5,0,0,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Stille Liebe",2001,90,NA,6.7,42,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Stille Nacht",1995,83,NA,6.6,107,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Stille Nacht",2004,90,NA,6.4,115,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stille Nacht I",1988,1,NA,7.3,32,0,0,0,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Stille Nacht IV",1993,3,NA,7,23,0,0,0,0,4.5,34.5,4.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Stille Wasser",2005,18,NA,8.9,8,0,0,14.5,0,0,0,0,14.5,0,74.5,"",0,0,1,0,0,0,1 -"Stille dage i Clichy",1970,91,NA,5.7,66,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Stille liefde, Een",1977,102,NA,6.3,7,14.5,0,0,0,0,24.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Stiller Sturm",2001,93,NA,4.6,22,4.5,4.5,0,4.5,0,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Stilles Land",1992,95,NA,7.5,11,0,0,0,0,4.5,0,24.5,4.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Stilte rond Christine M., De",1982,92,NA,7.9,145,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Stiltwalkers",2002,13,NA,5.7,13,14.5,0,4.5,4.5,34.5,4.5,4.5,4.5,0,4.5,"",0,1,0,0,0,0,1 -"Stilwell Road",1945,51,NA,4,9,24.5,24.5,0,0,0,14.5,14.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Stimulantia",1967,105,NA,8.4,13,0,0,0,0,0,4.5,24.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Stine og drengene",1969,95,NA,5.3,11,0,0,0,24.5,14.5,14.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Sting II, The",1983,102,NA,4.5,280,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sting of Death",1965,76,NA,3.7,35,24.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sting, The",1973,129,5500000,8.4,23678,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Stingaree",1934,73,NA,7.2,10,0,0,14.5,0,0,0,14.5,64.5,24.5,0,"",0,0,1,1,0,0,0 -"Stingray",1978,100,NA,4.2,37,0,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Stinky",1999,1,NA,6.6,10,0,14.5,0,14.5,14.5,24.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Stir",1980,101,NA,7.4,27,0,4.5,0,14.5,0,14.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Stir Crazy",1980,108,NA,6.3,2125,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Stir of Echoes",1999,99,13000000,7,11433,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Stitch in Time, A",1963,89,NA,4.9,77,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Stitches",1985,89,NA,3.5,62,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Stjernekigger",2002,72,NA,6.1,29,4.5,4.5,0,0,24.5,4.5,34.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Stjerner uden hjerner",1997,79,NA,2,955,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Sto dney do prikaza",1990,71,NA,5.8,42,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sto dney posle detstva",1974,94,NA,8.9,20,4.5,0,0,0,0,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,0,1,0 -"Stockholm Marathon",1994,87,NA,4.9,219,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stockholm: Pride of Sweden",1937,9,NA,6.2,8,14.5,0,0,0,14.5,64.5,0,14.5,0,0,"",0,0,0,0,1,0,1 -"Stockholmsnatt",1986,50,NA,4.3,84,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Stockpile",2001,102,NA,5.1,5,0,0,24.5,0,0,24.5,44.5,0,24.5,0,"",0,0,0,0,1,0,0 -"Stod i avisen, Det",1962,96,NA,4.8,5,0,0,24.5,0,44.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Stoked: The Rise and Fall of Gator",2002,82,NA,7.2,238,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Stolen Face, A",1952,72,NA,4.8,22,4.5,0,0,4.5,34.5,14.5,0,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Stolen Heart",1998,85,NA,5.7,29,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Stolen Heaven",1931,76,NA,4.6,6,0,14.5,0,0,0,0,14.5,64.5,0,0,"",0,0,0,1,0,1,0 -"Stolen Holiday",1937,80,NA,6.7,37,4.5,0,0,0,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Stolen Honor: Wounds That Never Heal",2004,43,NA,4,205,44.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Stolen Hours",1963,97,NA,6.3,35,0,4.5,0,4.5,14.5,24.5,4.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Stolen Life, A",1946,109,NA,7.3,299,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Stolen Summer",2002,91,1500000,6.2,801,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Stolz der 3. Kompanie, Der",1932,85,NA,8,12,4.5,4.5,0,0,0,14.5,45.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Stompa & Co",1962,92,NA,6,23,0,0,0,4.5,14.5,34.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Stompa forelsker seg",1965,99,NA,5,16,0,0,4.5,14.5,34.5,14.5,4.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Ston asterismo tis Parthenou",1973,95,NA,5,6,14.5,0,0,34.5,0,34.5,0,0,14.5,0,"",0,0,1,1,0,0,0 -"Stone",1974,103,NA,5.7,112,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Stone Age Romeos",1955,16,NA,6.1,26,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Stone Boy, The",1984,91,NA,6.4,165,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Stone Cold Dead",1979,100,NA,4.3,38,4.5,4.5,14.5,24.5,4.5,24.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Stone Killer, The",1973,95,NA,5.7,199,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Stone Reader",2002,127,NA,7.4,197,0,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,1,0,0 -"Stone of Folly, The",2002,8,NA,7.2,30,0,0,0,4.5,14.5,14.5,24.5,24.5,24.5,4.5,"",0,1,0,0,0,0,1 -"Stonebrook",1999,90,NA,4.9,125,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Stoner's Life, A",2002,2,NA,5.5,21,0,0,4.5,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Stones in the Park, The",1969,53,NA,5.7,14,0,0,0,0,34.5,24.5,24.5,14.5,4.5,0,"",0,0,0,0,1,0,0 -"Stonewall",1995,99,NA,6.7,353,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Stony Island",1978,97,NA,4.2,13,0,0,14.5,4.5,0,0,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Stooge for a Mouse",1950,7,NA,6.8,21,0,0,0,4.5,4.5,24.5,34.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Stooge, The",1953,100,NA,6.3,142,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Stoolie, The",1972,90,NA,6.8,6,14.5,0,0,0,14.5,0,14.5,0,34.5,14.5,"",0,0,1,0,0,0,0 -"Stop Making Sense",1984,88,NA,7.8,2176,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Stop Press Girl",1949,78,NA,4.7,8,0,0,0,34.5,0,24.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Stop That Noise",1935,8,NA,4.8,17,0,0,24.5,14.5,24.5,14.5,14.5,0,0,4.5,"",0,1,0,0,0,0,1 -"Stop Thief!",1901,2,NA,5.6,33,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,1 -"Stop the Church",1991,24,NA,7.8,7,24.5,0,0,0,14.5,0,14.5,0,24.5,14.5,"",0,0,0,0,0,0,1 -"Stop the World: I Want to Get Off",1966,100,NA,5.3,32,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Stop!",2003,6,NA,6.1,8,0,0,0,0,34.5,14.5,34.5,14.5,0,0,"",0,0,1,1,0,0,1 -"Stop! Look! and Hasten!",1954,7,NA,6.8,47,4.5,0,0,4.5,4.5,4.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Stop! Look! and Laugh!",1960,78,NA,5.6,53,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Stop! Or My Mom Will Shoot",1992,87,NA,3.2,5652,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Stop, You're Killing Me",1952,86,NA,6.3,21,0,0,0,4.5,4.5,24.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Stopover Tokyo",1957,100,NA,6.2,22,4.5,0,0,14.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Store Wars: When Wal-Mart Comes to Town",2001,59,NA,8.4,11,0,0,0,0,0,0,14.5,4.5,44.5,24.5,"",0,0,0,0,1,0,0 -"Store badedag, Den",1991,100,NA,6.9,115,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Store flip, Det",1997,85,NA,5.4,103,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Store gavtyv, Den",1956,94,NA,5.8,12,4.5,4.5,0,0,14.5,14.5,4.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Store, The",1983,118,NA,6.9,25,0,0,0,4.5,4.5,14.5,34.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Storefront Hitchcock",1998,77,NA,7.2,90,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"PG-13",0,0,0,0,1,0,0 -"Storekeeper, The",1998,22,NA,8.2,10,0,0,0,0,0,0,24.5,44.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Storia d'amore",1986,109,NA,6.6,15,4.5,0,0,0,0,24.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Storia di Lady Chatterley, La",1989,87,NA,3.1,28,24.5,14.5,4.5,4.5,14.5,4.5,0,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Storia di Piera",1983,107,NA,5.8,54,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Storia di ragazzi e di ragazze",1989,87,NA,6.6,66,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Storia di una capinera",1993,106,NA,5.8,76,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Storia di una donna",1970,90,NA,4.4,17,4.5,0,4.5,14.5,14.5,0,14.5,4.5,0,44.5,"",0,0,0,1,0,0,0 -"Storia di una donna, La",1920,70,NA,7,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Storia di una monaca di clausura",1973,86,NA,6,29,0,0,14.5,14.5,24.5,4.5,34.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Storia semplice, Una",1991,91,NA,7.4,38,4.5,0,0,4.5,0,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Storie di ordinaria follia",1981,101,NA,6.3,236,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Stork",1971,85,NA,5.7,16,4.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Stork Club, The",1945,98,NA,6.1,61,0,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Stork Naked",1955,7,NA,6.7,34,0,4.5,4.5,4.5,0,24.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Stork's Holiday, The",1943,8,NA,6.6,7,0,0,0,0,24.5,14.5,14.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Storm",1943,8,NA,5.7,5,0,0,0,24.5,24.5,64.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Storm",1999,104,NA,4.1,241,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Storm",2002,93,NA,7.8,16,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Storm Boy",1976,88,NA,6.8,118,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Storm Catcher",1999,91,NA,3.8,311,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Storm Center",1956,85,NA,6.5,128,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Storm Fear",1955,88,NA,7.1,28,0,0,0,4.5,4.5,14.5,34.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Storm Over Lisbon",1944,67,NA,5.2,5,0,0,0,0,44.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Storm Over Tibet",1952,87,NA,6,9,14.5,0,0,14.5,0,34.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Storm Over Wyoming",1950,61,NA,5.8,13,0,0,0,0,14.5,34.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Storm Over the Nile",1955,107,NA,5.7,39,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Storm Rider, The",1957,72,NA,6,16,0,0,4.5,14.5,0,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Storm Trooper",1998,86,NA,2.4,103,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Storm Warning",1951,93,NA,6.1,107,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Storm Watch",2002,100,NA,5.2,228,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Storm at Daybreak",1933,78,NA,5.7,25,0,4.5,4.5,4.5,24.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Storm in a Teacup",1937,87,NA,6.3,62,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Storm, The",1930,80,NA,5.3,10,0,14.5,14.5,24.5,14.5,24.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Stormchasers",1995,38,NA,7.3,33,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,0,"",0,0,0,0,1,0,1 -"Stormquest",1987,89,NA,2.6,20,44.5,4.5,24.5,14.5,14.5,4.5,0,0,0,4.5,"",1,0,0,0,0,0,0 -"Stormswept",1995,93,NA,2.8,37,24.5,14.5,4.5,4.5,14.5,4.5,4.5,0,4.5,14.5,"R",0,0,0,0,0,0,0 -"Stormy",1935,69,NA,6.7,5,0,0,0,0,0,44.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Stormy Crossing",1957,79,NA,5.6,11,0,4.5,0,0,34.5,34.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Stormy Monday",1988,93,NA,6.2,726,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Stormy Nights",1996,87,NA,3.3,51,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Stormy Sun",1973,90,NA,6.2,6,0,14.5,14.5,34.5,0,0,14.5,0,14.5,0,"",1,0,0,1,0,0,0 -"Stormy Weather",1935,74,NA,4.6,14,14.5,4.5,0,0,24.5,24.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Stormy Weather",2003,91,NA,6.4,58,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Storno",2002,85,NA,6.9,19,0,0,0,0,14.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Stortjuven",1979,91,NA,5.8,9,0,0,14.5,0,24.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Story",2003,87,NA,9.3,13,0,0,0,0,0,0,0,24.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Story from Bhutan: The Making of 'Travellers & Magicians', A",2004,42,NA,9.2,13,0,0,0,0,0,0,0,14.5,44.5,34.5,"",0,0,0,0,1,0,1 -"Story of Alexander Graham Bell, The",1939,98,1500000,7.2,141,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Story of Alfred Nobel, The",1939,11,NA,5.8,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,0,1,0,0,1 -"Story of Computer Graphics, The",1999,93,NA,4.4,24,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Story of David, A",1960,95,NA,5.2,19,0,0,14.5,4.5,44.5,24.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Story of Dr. Jenner, The",1939,11,NA,6.2,5,0,0,0,0,0,64.5,24.5,0,24.5,0,"",0,0,0,1,0,0,1 -"Story of Dr. Wassell, The",1944,140,2720000,6.7,136,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,1,0 -"Story of Esther Costello, The",1957,103,NA,6,36,0,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Story of G.I. Joe",1945,108,NA,7.8,275,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Story of Gilbert and Sullivan, The",1953,109,NA,6.5,38,0,0,4.5,4.5,14.5,14.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Story of Healing, A",1997,28,NA,8.2,5,0,0,0,0,24.5,0,0,44.5,0,44.5,"",0,0,0,0,1,0,1 -"Story of Little Red Riding Hood, The",1949,9,NA,6.6,6,0,0,0,0,0,34.5,45.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Story of Louis Pasteur, The",1935,87,NA,7.5,167,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Story of Making the Film They're a Weird Mob, The",1966,54,NA,8.3,7,0,0,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Story of Mankind, The",1957,100,NA,4.8,118,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Story of Menstruation, The",1946,10,NA,7.9,7,0,0,0,0,0,14.5,14.5,24.5,0,44.5,"",0,1,0,0,1,0,1 -"Story of Molly X, The",1949,82,NA,4.8,12,4.5,0,0,4.5,24.5,34.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Story of Robin Hood and His Merrie Men, The",1952,84,NA,6.3,98,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Story of Ruth, The",1960,132,NA,5.7,78,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Story of Seabiscuit, The",1949,93,NA,5.6,102,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Story of Temple Drake, The",1933,70,NA,7.5,31,0,0,0,0,4.5,4.5,34.5,4.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Story of Three Loves, The",1953,122,NA,6,120,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Story of Us, The",1999,95,50000000,5.6,4953,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Story of Vernon and Irene Castle, The",1939,93,1196000,6.7,248,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Story of Will Rogers, The",1952,109,NA,6.5,41,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Story of a Bad Boy",1999,85,NA,5.1,32,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Story of a Three-Day Pass, The",1968,87,100000,4.7,104,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Story of the Kelly Gang, The",1906,70,2250,6,13,4.5,0,0,0,14.5,0,4.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Story of the Tortoise & the Hare, The",2002,12,NA,7.1,27,0,0,0,0,0,14.5,34.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Story on Page One, The",1960,118,NA,6.9,48,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Story the Biograph Told, The",1904,3,NA,4.5,7,14.5,0,0,14.5,0,44.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Story von Monty Spinnerratz, Die",1997,90,NA,4.5,43,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Story, A",1987,5,NA,8.1,14,0,0,4.5,0,0,0,24.5,4.5,34.5,24.5,"",0,1,0,0,0,0,1 -"Storybook",1995,88,NA,4.1,22,24.5,0,4.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Storytelling",2001,87,NA,6.7,4025,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Storytime",1968,9,NA,7.8,10,0,0,0,0,0,14.5,14.5,0,0,84.5,"",0,1,0,0,0,0,1 -"Storyville",1992,113,NA,5.5,292,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Stournara 288",1959,90,NA,7.6,12,0,0,0,0,4.5,24.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Stowaway",1936,87,NA,7.3,101,4.5,4.5,4.5,0,4.5,4.5,34.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Strada per Fort Alamo, La",1964,82,NA,5.3,5,0,24.5,0,24.5,24.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Strada, La",1954,115,NA,8.2,5012,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Stradivari",1989,110,NA,6.5,20,0,0,0,4.5,0,14.5,24.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Straffe koffie",1997,13,NA,4.7,25,14.5,4.5,14.5,4.5,0,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Strage dei vampiri, La",1962,72,NA,3.3,21,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Straight From the Suburbs",1998,25,NA,7.7,6,14.5,0,0,0,0,0,0,14.5,45.5,14.5,"",0,0,1,0,0,0,1 -"Straight Into Darkness",2005,95,NA,7.4,43,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Straight Is the Way",1934,59,NA,4.4,16,14.5,0,4.5,24.5,24.5,14.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Straight Out of Brooklyn",1991,79,450000,5.4,107,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Straight Outta Hunters Point",2003,75,NA,8,11,4.5,0,0,0,0,0,4.5,44.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Straight Place and Show",1938,66,NA,5.5,9,0,0,14.5,24.5,0,34.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Straight Right",2000,81,NA,3.8,32,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Straight Shooters",1947,6,NA,7.4,14,0,0,0,14.5,0,14.5,24.5,14.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Straight Shooting",1917,57,NA,5.2,59,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Straight Story, The",1999,112,10000000,8.1,14679,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Straight Talk",1992,91,NA,5.2,631,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Straight Time",1978,114,NA,7,463,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Straight Up: Helicopters in Action",2002,40,NA,6.9,29,4.5,4.5,4.5,14.5,0,24.5,4.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Straight in the Face",2002,13,NA,7.4,14,4.5,0,4.5,0,0,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Straight on Till Morning",1972,96,NA,5.6,39,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Straight to Hell",1987,86,1000000,4.9,464,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Straight-Jacket",2004,96,NA,5.9,72,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Straightman",2000,101,NA,5.1,39,4.5,24.5,4.5,4.5,0,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Strait-Jacket",1964,89,NA,6.5,340,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Straitjacket Lottery, The",2004,22,NA,8.7,13,0,0,4.5,0,4.5,0,4.5,0,14.5,64.5,"",0,0,1,0,0,0,1 -"Strana glukhikh",1998,105,NA,8.4,130,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Strana la vita",1987,90,NA,7,13,0,0,0,0,4.5,24.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Strand von Trouville, Der",1998,84,NA,6.6,41,4.5,4.5,4.5,0,0,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Stranded",1935,72,NA,6.6,30,4.5,0,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Stranded",1987,80,NA,5,63,4.5,4.5,4.5,34.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Strandgut",2000,18,NA,5.1,8,14.5,0,0,14.5,24.5,0,0,14.5,0,34.5,"",0,0,0,1,0,0,1 -"Strandvaskaren",2004,100,NA,4.9,195,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Strane storie",1994,82,NA,6.2,33,0,4.5,0,0,4.5,4.5,4.5,34.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Strange Adventure of New York Drummer",1899,1,NA,4.4,5,24.5,0,0,24.5,0,0,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Strange Adventure, A",1932,60,NA,5.8,14,0,4.5,0,0,34.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Strange Aeons",2004,16,NA,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,1 -"Strange Affair of Uncle Harry, The",1945,80,NA,6.6,56,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Strange Affair, The",1968,106,NA,5.9,33,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Strange Alibi",1941,63,NA,5.7,18,0,0,0,0,24.5,45.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Strange Awakening",1958,69,NA,7.4,5,0,0,0,0,24.5,24.5,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Strange Bargain",1949,68,NA,6.8,27,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Strange Bedfellows",1965,98,NA,5.6,84,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Strange Bedfellows",2004,100,NA,6,125,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Strange Behavior",1981,87,NA,5.1,78,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Strange Boarders",1938,74,NA,5.8,11,0,0,0,0,14.5,44.5,24.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Strange Cargo",1940,113,NA,6.8,224,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Strange Case of Doctor Rx, The",1942,66,NA,4.6,6,0,14.5,0,14.5,45.5,0,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Strange Case of the End of Civilization as We Know It, The",1977,56,NA,7.7,124,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Strange Confession",1945,62,NA,6.6,17,4.5,0,0,14.5,0,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Strange Date with Herself",2000,14,NA,7.5,8,0,0,14.5,0,0,0,24.5,24.5,34.5,0,"",0,0,0,0,0,0,1 -"Strange Days",1995,145,42000000,6.9,11869,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Strange Death of Adolf Hitler, The",1943,74,NA,7,5,0,0,0,0,24.5,0,24.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Strange Door, The",1951,81,NA,5.9,25,0,0,0,14.5,34.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Strange Fascination",1952,80,NA,5.2,11,4.5,0,0,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Strange Fits of Passion",1999,84,NA,6.3,70,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Strange Fruit",2002,57,NA,7.5,32,0,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Strange Fruit",2004,115,NA,8,10,0,14.5,0,0,0,0,24.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Strange Gamble",1948,61,NA,7,15,0,0,0,0,4.5,14.5,24.5,4.5,24.5,34.5,"",1,0,0,0,0,0,0 -"Strange Hearts",2001,90,NA,5.5,82,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Strange Holiday",1945,61,NA,4.2,12,0,0,4.5,24.5,24.5,0,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Strange Illusion",1945,87,NA,6.1,69,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Strange Impersonation",1946,68,NA,6.2,65,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Strange Interlude",1932,109,408000,5.8,97,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Strange Intruder",1956,82,NA,5.9,9,0,0,0,14.5,34.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Strange Invaders",1983,92,NA,5.4,306,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Strange Invaders",2002,8,NA,7,87,4.5,4.5,4.5,0,14.5,14.5,34.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Strange Lady in Town",1955,112,NA,5.5,28,4.5,4.5,0,4.5,34.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Strange Little Girls",2004,18,NA,2.5,8,14.5,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,1,0,0,1 -"Strange Love Affair, A",1984,90,NA,4.5,8,0,0,0,14.5,14.5,0,14.5,24.5,34.5,0,"",0,0,0,0,0,1,0 -"Strange Love of Martha Ivers, The",1946,116,NA,7.3,589,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Strange Love of Molly Louvain, The",1932,73,NA,5.9,41,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Strange One, The",1957,100,NA,6.5,49,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Strange Planet",1999,96,NA,5.5,217,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Strange Residues",1981,13,NA,3.9,14,14.5,14.5,4.5,0,4.5,4.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Strange Triangle",1946,65,NA,8.6,10,0,14.5,0,0,24.5,0,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Strange Vengeance of Rosalie, The",1972,107,NA,3.4,13,4.5,14.5,4.5,4.5,24.5,14.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Strange Woman, The",1946,100,NA,6.1,71,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Strange World of Planet X, The",1957,75,NA,4.9,46,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Strangeheart",2003,110,NA,7.2,18,24.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Strangeland",1998,92,2000000,4.4,1179,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Strangeness, The",1985,90,NA,4.4,11,4.5,14.5,44.5,0,0,4.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Stranger Among Us, A",1992,110,NA,5.4,701,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Stranger Came Home, A",1954,80,NA,3.2,8,0,24.5,0,0,24.5,0,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Stranger From Arizona, The",1938,54,NA,5.6,10,0,0,14.5,0,14.5,44.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Stranger Is Watching, A",1982,92,NA,3.8,80,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stranger Left No Card, The",1952,23,NA,8.2,17,4.5,0,0,0,0,0,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Stranger Than Fiction",1999,96,NA,6.1,372,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Stranger Than Paradise",1983,89,90000,7.4,2873,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Stranger Wore a Gun, The",1953,83,NA,5.8,64,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stranger at My Door",1956,85,NA,5.8,13,0,0,0,4.5,34.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Stranger by Night",1994,91,NA,4,37,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Stranger in My Arms, A",1959,88,NA,5.5,25,0,0,0,14.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Stranger in My House",1999,94,NA,5.5,83,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stranger in Town, A",1943,67,NA,7.7,40,0,0,0,0,4.5,14.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Stranger in the House",1997,94,NA,5,47,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Stranger in the Kingdom",1998,112,NA,6.3,52,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Stranger on the Third Floor",1940,64,171200,6.9,233,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Stranger's Hand, The",1952,85,NA,5.7,12,0,0,4.5,4.5,0,14.5,45.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Stranger's Meeting",1957,64,NA,4,6,14.5,0,0,64.5,0,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Stranger's Return, The",1933,89,NA,6,17,14.5,0,0,0,14.5,4.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Stranger, The",1946,95,NA,7.5,1619,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Stranger, The",1995,98,NA,3.8,95,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Stranger: Bernie Worrell on Earth",2005,39,NA,8.3,6,0,0,0,0,14.5,0,14.5,14.5,0,45.5,"",0,0,0,0,1,0,1 -"Strangers",1991,85,NA,5.5,15,4.5,0,4.5,0,44.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Strangers",2004,9,1000,9.7,6,0,0,0,0,0,0,0,0,34.5,64.5,"",0,0,0,1,0,0,1 -"Strangers Kiss",1983,94,NA,5.1,30,0,0,4.5,14.5,4.5,14.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Strangers May Kiss",1931,81,NA,5.6,45,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Strangers When We Meet",1960,117,NA,6.3,188,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Strangers in Good Company",1990,101,NA,7.5,276,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Strangers in Love",1932,76,NA,8.5,7,0,0,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Strangers in Paradise",1984,84,NA,6,20,34.5,0,0,14.5,0,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Strangers in the Night",1944,56,NA,6.6,22,14.5,0,0,0,4.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Strangers of the Evening",1932,70,NA,6.9,5,0,0,0,0,0,64.5,0,0,44.5,0,"",0,0,1,0,0,0,0 -"Strangers on a Train",1951,103,1200000,8.3,10624,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG",0,0,0,1,0,0,0 -"Strangers with Candy",2005,97,NA,6.6,53,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Strangled Eggs",1961,6,NA,6.3,25,0,0,4.5,4.5,24.5,4.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Stranglehold",1994,73,NA,4.5,13,24.5,14.5,14.5,0,4.5,14.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Strangler of the Swamp",1946,59,NA,6.7,47,4.5,0,0,4.5,14.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Strangler, The",1964,89,NA,6,54,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Stranglers of Bombay, The",1960,80,NA,5.9,33,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Strangolatore di Vienna, Lo",1971,81,NA,3.6,57,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Straniero, Lo",1967,104,NA,7.5,113,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Strano ricatto di una ragazza per bene, Lo",1974,77,NA,4.2,16,4.5,0,14.5,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Strano tipo, Uno",1963,90,NA,7.4,8,0,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Strano vizio della Signora Wardh, Lo",1971,81,NA,5.2,64,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Strapless",1989,99,NA,5.9,138,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Strass",2001,86,NA,6.7,47,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Strasti po Anzhelike",1993,70,NA,2.8,12,4.5,44.5,14.5,0,4.5,14.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Strata",1983,110,NA,7.5,8,24.5,34.5,0,14.5,0,0,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Strategia del ragno, La",1970,100,NA,6.8,243,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Strategia per una missione di morte",1979,90,NA,3.7,14,4.5,0,24.5,14.5,14.5,0,0,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Strategic Air Command",1955,112,NA,6.3,509,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Strategic Command",1997,90,NA,3.5,166,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Stratford Adventure, The",1954,45,NA,7.7,10,0,0,0,0,0,14.5,34.5,44.5,24.5,0,"",0,0,0,0,1,0,1 -"Stratosphere Girl",2004,90,NA,6.4,101,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Stratton Story, The",1949,106,NA,7,315,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Strauss Fantasy",1954,10,NA,5.5,5,0,0,24.5,0,0,24.5,44.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Straw Dogs",1971,113,3251794,7.4,4755,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Strawberry Blonde, The",1941,97,NA,7.2,335,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Strawberry Estates",2001,100,NA,3.2,29,24.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Strawberry Fields",1997,90,NA,4.9,27,4.5,4.5,4.5,0,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Strawberry Roan",1933,59,NA,2.7,5,0,44.5,0,0,24.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Strawberry Roan, The",1948,79,NA,6.3,25,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Strawberry Shortcake Meets the Berrykins",1984,60,NA,7.7,16,0,0,0,0,4.5,0,34.5,0,34.5,24.5,"",0,1,0,0,0,0,0 -"Strawberry Shortcake: Housewarming Surprise",1983,60,NA,6.2,17,0,0,4.5,0,0,4.5,24.5,34.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Strawberry Statement, The",1970,109,NA,6.3,234,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Stray Bullet",1998,89,NA,4.8,20,0,14.5,14.5,14.5,24.5,24.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Stray Dogs",2002,97,NA,3.1,24,4.5,24.5,4.5,14.5,4.5,4.5,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Stray Dogs",2004,93,NA,7.3,27,4.5,0,0,0,14.5,4.5,34.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Stray, The",2000,94,NA,4.5,111,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Strays",1997,105,NA,3.7,72,24.5,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Straziami, ma di baci saziami",1968,103,NA,6.6,52,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Streamers",1983,118,NA,6.6,257,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Streamline Express",1935,71,NA,4.3,5,0,0,0,24.5,24.5,44.5,24.5,0,0,0,"",0,0,1,1,0,1,0 -"Streamlined Greta Green",1937,8,NA,5.5,12,0,0,0,0,34.5,34.5,4.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Streamlined Swing",1938,9,NA,5.4,12,14.5,0,0,14.5,34.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Street Angel",1928,102,NA,8,58,0,0,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Street Angels",1992,90,NA,6.1,5,0,0,0,0,44.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Street Cat Named Sylvester, A",1953,7,NA,6.8,26,0,0,0,4.5,14.5,14.5,34.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Street Corner",1948,73,NA,8.1,5,0,0,0,0,24.5,0,24.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Street Corner",1953,94,NA,6.2,15,0,0,0,0,34.5,14.5,14.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Street Corner Justice",1996,102,NA,3.7,47,14.5,4.5,14.5,4.5,24.5,14.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Street Crimes",1992,94,NA,5.1,14,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Street Fighter",1994,102,NA,3.1,7321,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Street Fighter II Movie",1994,94,NA,6.6,812,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",1,1,0,0,0,0,0 -"Street Gun",1996,92,NA,4.1,32,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,0,24.5,"R",1,0,0,0,0,0,0 -"Street Hero",1984,102,NA,2.5,13,24.5,14.5,0,24.5,0,4.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Street Hunter",1990,95,NA,2.8,36,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Street Justice",1989,93,NA,4.8,23,0,4.5,14.5,4.5,34.5,4.5,0,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Street Knight",1993,91,NA,3.5,102,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Street Law",1995,98,NA,4.1,42,14.5,0,4.5,0,14.5,4.5,24.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Street Music",1981,90,NA,6.2,9,0,0,0,24.5,0,0,0,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Street Musique",1972,9,NA,7.9,6,0,0,0,0,0,0,14.5,45.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Street Pirates",1994,94,650000,8.2,111,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Street Scene",1931,80,584000,7.9,146,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Street Scenes",1970,75,NA,5.2,44,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Street Sisters",1974,87,NA,2,5,0,84.5,0,0,0,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Street Trash",1987,90,NA,5.4,495,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Street Wars",1992,92,NA,3.9,17,34.5,14.5,0,4.5,0,0,14.5,14.5,4.5,0,"",1,0,0,1,0,0,0 -"Street of Chance",1930,75,NA,7.1,12,0,0,0,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Street of Chance",1942,74,NA,7.2,12,0,0,0,0,0,44.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Street of Crocodiles",1986,20,NA,8.2,186,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Street of No Return",1989,90,NA,6.1,60,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Street of Pain",2003,10,NA,6,15,0,4.5,4.5,0,4.5,24.5,24.5,24.5,0,14.5,"",0,0,1,0,0,0,1 -"Street of Women",1932,59,NA,6.2,30,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Street of a Thousand Pleasures",1970,76,NA,3.5,26,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Street with No Name, The",1948,91,NA,7.7,132,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Street, The",1976,10,NA,6.9,40,0,0,0,14.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,1,0,0,1 -"Street-Fighter",1959,70,NA,1,6,100,0,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Street: A Film with the Homeless, The",1997,58,NA,7.4,6,0,0,0,0,0,0,34.5,34.5,0,34.5,"",0,0,0,0,1,0,0 -"Streetcar Named Desire, A",1951,125,1800000,8.1,9623,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Streetlife",1995,98,NA,5.5,17,0,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Streets of Fire",1984,93,14500000,6.2,1860,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,1,0 -"Streets of Ghost Town",1950,54,NA,5.8,10,0,0,0,24.5,24.5,44.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Streets of Gold",1986,95,NA,5.9,113,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Streets of Laredo",1949,93,NA,6.6,62,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Streetwalkin'",1984,86,NA,6.6,32,4.5,4.5,0,4.5,14.5,4.5,34.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Streetwise",1984,91,NA,7.8,147,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Strefa ciszy",2001,89,NA,5.3,7,0,0,0,14.5,24.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Stregati",1987,100,NA,2.3,15,14.5,24.5,4.5,4.5,4.5,4.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Stregati dalla luna",2001,91,NA,3.5,10,34.5,0,14.5,34.5,24.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Streghe",1989,93,NA,3.6,16,14.5,4.5,34.5,4.5,14.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Streghe, Le",1967,105,NA,5.8,111,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Streik!",1975,97,NA,2,13,64.5,4.5,4.5,4.5,0,0,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Strekoza i muravey",1913,5,NA,8.2,10,0,0,0,14.5,0,14.5,14.5,24.5,44.5,14.5,"",0,1,0,0,0,0,1 -"Strelets neprikayannyy",1993,96,NA,6,5,0,0,0,0,24.5,44.5,0,44.5,0,0,"",0,0,0,0,0,1,0 -"Stress-es tres-tres",1968,94,NA,3.3,11,34.5,0,0,0,4.5,34.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Stressati",1997,96,NA,5.5,9,0,0,0,14.5,34.5,24.5,14.5,0,14.5,14.5,"",0,0,1,1,0,0,0 -"Stricken",1998,88,NA,2.7,34,24.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Strictement personnel",1985,90,NA,5.6,10,14.5,14.5,0,24.5,0,34.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Strictly Ballroom",1992,94,NA,7.3,6026,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Strictly Business",1991,83,NA,4.9,266,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Strictly Dishonorable",1931,91,NA,5.7,31,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Strictly Dishonorable",1951,86,NA,4.8,11,24.5,0,0,4.5,0,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Strictly Dynamite",1934,71,NA,5.3,9,0,0,0,14.5,24.5,14.5,44.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Strictly G.I.",1943,13,NA,8.5,13,0,0,0,4.5,0,4.5,0,24.5,44.5,14.5,"",0,0,1,0,0,0,1 -"Strictly Sinatra",2001,97,NA,6.2,120,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Strife with Father",1950,7,NA,5.6,11,0,0,14.5,14.5,0,14.5,24.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Striglos pou egine arnaki, O",1967,80,NA,7.8,22,0,0,0,0,4.5,4.5,24.5,24.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Strike Commando",1987,90,NA,2.2,49,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Strike It Rich",1990,87,NA,4.4,35,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Strike Me Lucky",1934,87,NA,4.8,5,0,0,0,44.5,0,24.5,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Strike Me Pink",1936,100,NA,6.1,32,0,4.5,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Strike Up the Band",1940,120,838661,6.7,142,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Strike Zone",1999,111,NA,4.4,28,14.5,14.5,4.5,24.5,14.5,4.5,4.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Strike a Pose",1993,75,NA,3,35,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Strike of the Panther",1988,84,NA,3.1,14,14.5,4.5,14.5,4.5,24.5,0,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Strike!",1998,97,NA,6.2,1222,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Striker Bob",1997,16,NA,7.2,16,0,44.5,4.5,0,14.5,4.5,0,14.5,4.5,0,"",0,0,0,0,0,0,1 -"Strikes and Spares",1934,9,NA,6.2,11,0,0,4.5,4.5,4.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Striking Distance",1993,112,NA,5.3,4035,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Striking Poses",1999,93,NA,4.4,137,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Striking Resemblance",1997,103,NA,4.3,33,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Stringer",1992,85,NA,4.3,16,14.5,4.5,14.5,24.5,14.5,4.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Stringer",1999,80,NA,4.2,28,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Stringer, The",1998,88,NA,4.8,34,4.5,0,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Strings",1991,10,NA,7.9,27,4.5,0,0,0,4.5,4.5,24.5,34.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Strings",2004,88,NA,6.6,94,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Strip Jack Naked",1991,91,NA,6.3,7,14.5,0,0,0,0,44.5,24.5,0,14.5,0,"",0,0,0,0,1,0,0 -"Strip Search",1997,90,NA,2.5,62,34.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,1,0,0,0 -"Strip, The",1951,85,NA,5.9,54,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Stripes",1981,106,10000000,6.8,7406,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Striporama",1953,70,40000,7.7,14,14.5,0,0,0,0,4.5,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Stripped",2001,74,NA,6.2,37,4.5,0,4.5,4.5,0,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Stripped to Kill",1987,88,NA,4.4,106,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stripped to Kill II: Live Girls",1989,85,NA,3.3,40,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Stripper",1986,90,NA,5.1,48,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Stripper Wives",1999,86,NA,4.4,26,0,14.5,0,14.5,14.5,4.5,0,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Stripper, The",1963,95,NA,6.6,52,4.5,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Strippers",2000,71,NA,2.8,29,24.5,34.5,4.5,14.5,24.5,0,0,0,4.5,0,"",0,0,1,1,0,0,0 -"Strippers Pole",2002,5,NA,5.7,12,0,4.5,4.5,0,34.5,14.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Stripshow",1996,96,NA,4.2,51,24.5,14.5,14.5,4.5,4.5,14.5,4.5,0,4.5,4.5,"R",0,0,0,1,0,0,0 -"Striptease",1996,117,50000000,3.8,7998,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Stripteaser",1995,74,NA,2.8,69,24.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Stripteaser II",1997,77,NA,2.1,25,24.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Strit og Stumme",1987,78,NA,5.2,18,0,0,4.5,0,24.5,14.5,14.5,4.5,24.5,14.5,"",0,1,0,1,0,0,0 -"Strofi, I",1982,102,NA,6.6,9,0,0,14.5,0,0,24.5,0,0,0,64.5,"",1,0,0,1,0,0,0 -"Stroke",2000,97,NA,6.9,8,0,0,0,0,34.5,14.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Stroker Ace",1983,96,NA,4,548,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Stromboli",1950,81,NA,7,327,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Strong Boy",1929,62,NA,1,7,84.5,0,0,0,0,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Strong Island Boys",1997,90,NA,7.6,28,14.5,4.5,0,0,0,0,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Strong Language",2000,76,NA,6.9,56,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Strong Man, The",1926,75,NA,7,84,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Strong to the Finich",1934,7,NA,5.6,10,0,0,14.5,14.5,34.5,14.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Stronger Than Desire",1939,78,NA,5.8,22,0,0,4.5,0,14.5,44.5,34.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Strongest Man in the World, The",1975,92,NA,5.4,302,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Stronghold",1951,72,NA,6,8,0,0,0,14.5,14.5,14.5,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Strop",1962,42,NA,7.1,8,0,0,0,0,0,24.5,34.5,14.5,24.5,0,"",0,0,0,1,0,0,1 -"Stroszek",1977,115,NA,8.1,510,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Strsljen",1998,107,NA,6.5,45,14.5,4.5,0,4.5,4.5,24.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Struck by Lightning",1990,105,NA,7.2,35,0,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Struggle",2003,76,NA,6.2,56,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Struggle, The",1931,87,NA,6.4,19,0,0,4.5,14.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Struktura krysztalu",1969,74,NA,7.2,23,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Strul",1988,101,NA,5.1,313,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Strumpet",2001,72,NA,6.3,107,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Stryker",1983,86,NA,3.5,43,24.5,14.5,14.5,14.5,14.5,14.5,4.5,0,0,4.5,"",1,0,0,0,0,0,0 -"Stryker's War",1985,84,100000,5.1,146,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Stuart Bliss",1998,88,NA,4.9,33,4.5,0,14.5,14.5,0,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Stuart Little",1999,81,103000000,6,8009,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Stuart Little 2",2002,82,120000000,5.9,2324,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Stuart Saves His Family",1995,95,NA,5.2,747,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Stubble Trouble",2000,5,NA,6.1,33,4.5,0,0,0,34.5,4.5,14.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Stubbs and Roger's Big 3D Adventure",2002,3,NA,9,6,0,0,0,14.5,0,0,0,0,0,84.5,"",0,1,0,0,0,0,1 -"Stuck",2001,7,NA,5.1,32,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Stuck On You!",1984,97,NA,2.9,80,24.5,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Stuckey's Last Stand",1980,92,NA,3,7,0,14.5,0,0,0,14.5,0,0,14.5,45.5,"",0,0,1,0,0,0,0 -"Stud, The",1978,95,NA,3.1,121,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Student Affairs",1987,92,NA,2,7,14.5,14.5,0,0,0,14.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Student Bodies",1981,86,NA,5,559,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Student Confidential",1987,99,NA,1.9,23,34.5,4.5,4.5,0,0,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Student Nurses, The",1970,89,150000,3.4,29,14.5,4.5,14.5,14.5,24.5,4.5,14.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Student Prince in Old Heidelberg, The",1927,106,1205000,7.9,155,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Student Prince, The",1954,107,NA,5.6,154,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Student Teachers, The",1973,90,NA,4.5,13,34.5,0,4.5,4.5,14.5,0,4.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Student Tour",1934,87,NA,5.2,16,0,4.5,4.5,34.5,14.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Student of Prague, The",2004,9,8000,8.7,7,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Student von Prag, Der",1913,85,NA,7.2,77,0,4.5,0,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Student von Prag, Der",1935,87,NA,6.1,5,0,0,0,0,24.5,0,44.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Studie Nr. 10",1932,5,NA,9.1,6,14.5,0,0,0,0,0,14.5,34.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Studie Nr. 11",1932,4,NA,8.9,5,0,0,0,0,0,0,0,44.5,64.5,0,"",0,0,0,0,0,0,1 -"Studie Nr. 5",1930,3,NA,8.4,11,0,0,0,0,4.5,0,14.5,34.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Studie Nr. 6",1930,2,NA,7.7,10,0,0,0,0,0,24.5,0,44.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Studie Nr. 7",1931,3,NA,8.5,20,4.5,0,0,0,0,4.5,24.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Studie Nr. 8",1931,4,NA,8.3,9,0,0,0,0,0,14.5,0,44.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Studio Murder Mystery, The",1929,62,NA,4.7,5,0,0,24.5,0,0,0,24.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Studio Stoops",1950,16,NA,7.6,46,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Studio Visit",1946,9,NA,5.9,9,0,0,0,24.5,14.5,14.5,24.5,24.5,0,14.5,"",0,0,1,0,0,0,1 -"Studs Lonigan",1960,95,NA,4.6,56,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Study in Choreography for Camera, A",1945,4,NA,5.5,78,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Study in Color and Black and White",1993,3,NA,6.4,35,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,1 -"Study in Scarlet, A",1933,71,NA,6.1,44,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Study in Terror, A",1965,95,NA,6.6,135,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stuey",2003,110,NA,6,128,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Stuff",1999,87,NA,3.9,28,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Stuff Stephanie in the Incinerator",1989,98,NA,3.3,58,34.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Stuff That Bear!",2003,18,NA,6.5,17,4.5,4.5,4.5,4.5,4.5,0,14.5,0,14.5,34.5,"",0,0,1,1,0,0,1 -"Stuff for Stuff",1949,11,NA,4.6,9,0,0,24.5,0,64.5,0,14.5,0,0,0,"",0,1,0,0,1,0,1 -"Stuff, The",1985,93,1700000,4.9,701,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Stum",2003,12,NA,5.7,10,0,0,0,24.5,24.5,44.5,14.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Stump",2002,10,NA,6.1,11,0,0,0,14.5,0,0,14.5,0,14.5,44.5,"",0,0,1,0,0,0,1 -"Stunde Null",1977,108,NA,7.2,12,0,0,0,0,0,14.5,34.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Stundenhotel",2000,52,NA,5.6,5,0,0,24.5,0,0,24.5,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Stunt C*cks",2004,8,NA,6.8,25,0,4.5,0,0,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Stunt Man, The",1980,131,NA,7.3,1954,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Stunt Rock",1978,86,NA,5.8,13,0,0,0,4.5,4.5,4.5,14.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Stuntman",1968,98,NA,3.8,8,0,45.5,14.5,0,14.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Stunts",1977,89,NA,5.4,38,4.5,4.5,4.5,4.5,24.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Stupeur et tremblements",2003,107,NA,7.1,440,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Stupid Cupid, The",1944,7,NA,6.8,38,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Stupids, The",1996,94,25000000,3.7,1503,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Stupor Duck",1956,7,NA,7.2,42,0,0,0,4.5,4.5,4.5,34.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Stupor Salesman, The",1948,7,NA,6.9,25,0,0,0,0,4.5,14.5,44.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Sturmtruppen",1977,110,NA,4.8,23,14.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Sturzflieger, Die",1995,117,NA,4.8,17,44.5,4.5,4.5,0,14.5,0,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Sturzflug",1989,105,NA,5.4,5,0,0,24.5,0,0,24.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Stuttur frakki",1993,95,NA,5.7,18,4.5,0,0,0,44.5,24.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Style Wars",1983,69,NA,7.5,179,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Styrmand Karlsen",1958,122,NA,5.2,23,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Styx",2001,93,NA,4.4,194,14.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Styx",2004,24,NA,7.9,5,0,0,0,0,0,0,24.5,64.5,24.5,0,"",0,0,0,0,0,0,1 -"Su da yanar",1987,111,NA,6.3,6,14.5,0,0,0,14.5,14.5,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Su excelencia",1966,100,NA,7.3,37,0,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Su le mani, cadavere! Sei in arresto",1971,87,NA,6.9,6,0,0,0,14.5,14.5,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Su qi er",1993,115,NA,5.9,55,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sub Down",1997,93,17000000,4.4,322,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sub terra",2003,105,1200000,7,56,0,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Sub!",2000,9,NA,6.4,17,14.5,0,0,0,14.5,4.5,14.5,4.5,4.5,44.5,"",0,1,0,0,0,0,1 -"SubUrbia",1996,121,NA,6.4,2148,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Subarashiki nichiyobi",1947,108,NA,6.9,98,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Subconscious Art of Graffiti Removal, The",2002,17,NA,8.1,31,4.5,0,4.5,0,0,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Subconscious Cruelty",1999,92,NA,5,105,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Sube y baja",1959,108,NA,6.2,22,0,0,0,0,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Subida al cielo",1952,74,NA,7,77,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Subject Was Roses, The",1968,107,NA,7.2,182,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Sublet",1998,90,NA,5,96,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Sublime, Det",1999,13,NA,4.8,18,14.5,4.5,0,34.5,14.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Sublokator",1967,99,NA,3.9,8,0,24.5,0,14.5,0,24.5,0,34.5,0,0,"",0,0,0,0,0,0,0 -"Submarine",1928,93,150000,6.7,17,0,0,0,0,4.5,24.5,34.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Submarine Alert",1943,66,NA,6.5,10,0,0,0,14.5,44.5,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Submarine Base",1943,65,NA,3.7,8,0,34.5,0,34.5,14.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Submarine Command",1952,87,NA,6.1,40,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Submarine D-1",1937,94,NA,3.7,37,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Submarine Patrol",1938,95,NA,4.4,26,24.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Submarine Seahawk",1958,83,NA,5,26,4.5,0,4.5,14.5,24.5,34.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Submarine X-1",1968,89,NA,4.5,59,4.5,4.5,4.5,34.5,34.5,14.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Submerged",2000,95,NA,3.3,116,34.5,4.5,14.5,14.5,14.5,4.5,0,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Submit to Me",1985,12,NA,6.3,30,4.5,0,4.5,0,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Submit to Me Now",1987,22,NA,6.2,42,14.5,0,0,4.5,4.5,4.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Subotom uvece",1957,91,NA,3.9,14,14.5,4.5,0,4.5,0,0,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Subspecies",1991,90,NA,4.7,324,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Subspecies 4: Bloodstorm",1998,91,NA,4.4,136,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Substance of Fire, The",1996,97,NA,5.7,223,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Substitute, The",1996,114,NA,5.4,2032,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Subterano",2003,91,NA,4.2,135,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Subterfuge",1969,89,NA,5.1,15,0,0,4.5,34.5,24.5,4.5,4.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Subterfuge",1996,95,NA,2.9,51,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"R",0,0,0,0,0,0,0 -"Subterraneans, The",1960,89,931724,4.7,54,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Subub Surprises the Burglar",1903,1,NA,4.3,69,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Suburban Commando",1991,90,NA,3.7,1199,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Suburban Roulette",1968,81,NA,1,18,64.5,0,4.5,0,0,0,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Suburban Wives",1971,87,NA,1.2,6,34.5,14.5,0,0,0,0,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Suburbanators, The",1995,87,NA,6,29,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Suburbanite, The",1904,8,NA,5.3,20,4.5,0,0,4.5,24.5,34.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Suburbans, The",1999,85,NA,4.3,564,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Suburbia",1984,94,1000000,6.8,481,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Suburbia Confidential",1966,82,NA,1,9,64.5,14.5,0,0,0,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Subway",1985,102,NA,6.2,2520,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Subway Riders",1981,120,NA,5.6,15,14.5,0,0,14.5,0,0,14.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Subway in the Sky",1959,87,NA,5,8,0,0,0,14.5,24.5,45.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Success Is the Best Revenge",1984,91,NA,5.7,31,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Success at Any Price",1934,75,NA,5.7,23,0,4.5,4.5,14.5,14.5,4.5,4.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Successful Calamity, A",1932,72,NA,6.6,20,0,0,0,4.5,14.5,24.5,34.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Successful Failure, A",1934,62,NA,4.3,5,0,24.5,24.5,0,24.5,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Successo, Il",1963,106,NA,7.6,14,0,0,0,0,14.5,0,14.5,24.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Successor, The",1996,104,NA,2.8,13,4.5,34.5,4.5,4.5,4.5,0,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Succubare",1981,83,NA,3.5,7,14.5,0,44.5,14.5,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Sucesos distantes",1996,105,NA,5.5,8,0,0,0,14.5,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Such Good Friends",1971,101,NA,5.4,58,4.5,4.5,4.5,4.5,24.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Such Men Are Dangerous",1930,83,NA,3.9,6,0,14.5,14.5,14.5,0,0,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Such a Life",1997,110,NA,8,6,0,0,0,0,0,0,14.5,45.5,0,34.5,"",0,0,0,0,0,0,0 -"Such a Long Journey",1998,113,NA,7.8,177,0,4.5,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Suchwiin bulmyeong",2001,117,NA,7.7,238,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Suck My Dick",2001,82,NA,3.7,104,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sucker List",1941,19,NA,5.6,8,0,0,14.5,0,14.5,14.5,64.5,0,0,0,"",0,0,0,1,0,0,1 -"Sucker Punch",2003,90,NA,3.4,19,24.5,4.5,24.5,0,0,14.5,14.5,0,4.5,24.5,"R",0,0,1,1,0,0,0 -"Sucre, Le",1978,104,NA,6,43,4.5,0,0,4.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Sud",1993,86,NA,6,120,4.5,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sud",1999,70,NA,5.9,28,4.5,0,0,4.5,14.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Sud pralad",2004,120,NA,7.2,215,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Sud sanaeha",2002,109,NA,6.1,149,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Sudan",1945,76,NA,5.5,17,4.5,4.5,0,14.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,1,0 -"Sudario a la medida, Un",1969,95,NA,1.3,7,44.5,0,14.5,0,24.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Sudba",1977,170,NA,8.6,7,0,0,0,0,0,14.5,14.5,0,44.5,24.5,"",0,0,0,1,0,1,0 -"Sudba cheloveka",1959,94,NA,8.5,92,0,0,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Sudba rezidenta",1970,157,NA,6,6,0,0,0,0,34.5,34.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Sudbata kato pluh",2001,75,NA,4.9,11,0,4.5,4.5,4.5,14.5,0,4.5,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Sudden Danger",1955,85,NA,5.9,6,0,0,14.5,0,0,34.5,34.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Sudden Death",1977,84,NA,3,8,14.5,14.5,14.5,24.5,0,0,14.5,0,14.5,14.5,"",1,0,0,1,0,0,0 -"Sudden Death",1985,95,NA,4.2,20,14.5,0,14.5,24.5,14.5,24.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Sudden Death",1995,110,NA,5.1,3053,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Sudden Fear",1952,110,NA,7.5,343,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sudden Fury",1975,92,NA,4.3,18,4.5,0,4.5,24.5,14.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sudden Fury",1997,102,NA,5.2,74,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Sudden Impact",1983,117,NA,6.1,3107,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Sudden Loss of Gravity, A",2000,90,NA,5.2,19,14.5,4.5,4.5,4.5,4.5,14.5,0,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Sudden Manhattan",1997,80,NA,5.5,87,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Suddenly",1954,75,NA,7,672,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Suddenly Naked",2001,105,NA,5.7,153,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,1,0 -"Suddenly, Last Summer",1959,114,3000000,7.5,1381,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sudeste",2001,98,NA,4.6,13,4.5,4.5,4.5,4.5,4.5,34.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Suds",1920,75,NA,6.8,14,0,0,0,0,14.5,4.5,44.5,24.5,0,4.5,"",0,0,1,0,0,0,0 -"Sue",1997,91,NA,7,412,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sued for Libel",1939,66,NA,5.6,17,0,4.5,4.5,0,44.5,24.5,0,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Suerte de la fea... a la bonita no le importa, La",2002,10,NA,8.6,28,4.5,0,4.5,4.5,4.5,0,14.5,24.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Suerte dormida, La",2003,110,NA,7.1,26,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sueurs",2002,103,NA,4.4,134,4.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Suez",1938,100,NA,6.8,69,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Sufferin' Cats",1943,8,NA,6.8,29,0,0,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Suffering Bastards",1989,89,NA,4.3,18,14.5,4.5,14.5,14.5,24.5,0,0,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sugar & Spice",2001,84,11000000,5.3,2901,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Sugar Colt",1966,106,NA,5.5,18,0,0,4.5,0,14.5,34.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Sugar Cookies",1973,89,NA,3.8,46,34.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sugar Daddies",1927,20,NA,6.5,33,0,0,4.5,4.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,1 -"Sugar Factory, The",1998,91,NA,7,36,0,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sugar Hill",1974,91,NA,3.8,79,4.5,24.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sugar Hill",1994,123,NA,5.2,444,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sugar Orange",2004,82,NA,4.9,5,0,0,0,0,64.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Sugar Town",1999,92,250000,5.8,307,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Sugar and Spies",1966,6,NA,5.3,15,0,0,14.5,24.5,4.5,24.5,24.5,4.5,0,0,"",0,1,1,0,0,0,1 -"Sugarfoot",1951,80,NA,4.7,16,4.5,4.5,0,4.5,14.5,44.5,4.5,4.5,14.5,0,"",1,0,0,0,0,1,0 -"Sugarland Express, The",1974,110,3000000,6.7,1461,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sugata Sanshiro",1943,97,NA,6.8,264,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sugata Sanshiro",1965,159,NA,8.3,75,0,0,0,0,4.5,4.5,4.5,34.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Sugihara: Conspiracy of Kindness",2000,103,NA,7.9,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,0,1,0,0 -"Sui woo juen",1972,81,NA,6.6,56,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Sui woo juen ji ying hung boon sik",1992,91,NA,6.1,44,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Suicidal Dog, The",2000,12,NA,4.7,8,14.5,0,0,14.5,0,0,14.5,34.5,0,24.5,"",0,0,1,0,0,0,1 -"Suicide Battalion",1958,79,NA,3.3,28,14.5,14.5,34.5,0,4.5,14.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Suicide Blonde",1999,93,NA,5.3,36,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Suicide Club, The",1988,92,NA,3.4,19,14.5,24.5,24.5,4.5,0,4.5,4.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Suicide Cult",1975,96,NA,2.9,7,44.5,0,14.5,0,14.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Suicide Fleet",1931,87,NA,5.2,23,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,4.5,0,"",0,0,1,1,0,0,0 -"Suicide Inc.",2001,10,8000,3.2,23,4.5,4.5,0,4.5,0,0,4.5,24.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Suicide Kings",1997,106,5000000,7,6117,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Suicide, the Comedy",1998,90,NA,6.4,18,4.5,4.5,0,0,4.5,34.5,4.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Suikerpot, De",1997,14,NA,3.8,19,14.5,0,0,14.5,0,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Suite 16",1994,106,NA,5.1,222,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Suite Habana",2003,84,NA,7.3,114,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Suits",1999,88,NA,3.8,45,14.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Suivez mon regard",1986,85,NA,5.9,14,4.5,0,0,14.5,4.5,34.5,14.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Sujata",1959,161,NA,8.4,23,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Suk san: Sun Suk san geen hap",1983,95,NA,6.7,416,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Sukces",2003,90,NA,6.8,18,0,0,0,14.5,0,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sukdulan",2003,105,NA,5.1,5,0,0,0,0,44.5,44.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Sukeban Deka",1987,93,NA,6.5,8,0,0,14.5,0,0,14.5,14.5,14.5,45.5,0,"",0,0,0,0,0,0,0 -"Sukedachi-ya Sukeroku",2001,88,NA,7.2,12,0,0,0,4.5,4.5,4.5,34.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Sukiny deti",1990,98,NA,5.9,14,0,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Sukkubus - den Teufel im Leib",1989,80,NA,4.2,13,34.5,4.5,0,0,0,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sullivan's Travels",1941,90,689665,8.2,2896,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Sullivans, The",1944,112,NA,7.9,317,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Sult",1966,112,NA,7.3,175,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Sultanat",1986,153,NA,7.6,13,0,0,0,0,14.5,0,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Sultans, Les",1966,94,NA,5.3,6,0,0,34.5,0,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Sulude godine",1988,83,NA,6.7,7,0,14.5,14.5,0,14.5,0,14.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Sum of All Fears, The",2002,123,68000000,6.6,15835,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Sum of Existence",2004,97,NA,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Sum of Us, The",1994,100,NA,7.3,1411,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Sumas y restas",2004,109,1500000,6,12,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sumerki zhenskoi dushi",1913,48,NA,7.2,20,14.5,0,4.5,0,0,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Summer",1930,6,NA,5.2,7,0,0,14.5,0,24.5,0,44.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Summer Blues",2002,25,NA,6.2,12,0,0,4.5,0,0,0,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,1 -"Summer Camp",1978,62,NA,4.8,5,24.5,0,24.5,0,0,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Summer Camp Girls",1983,80,NA,4.4,12,24.5,0,0,0,0,14.5,0,0,4.5,45.5,"",0,0,0,0,0,0,0 -"Summer Camp Nightmare",1987,89,NA,4.3,94,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Summer Catch",2001,105,17000000,4.5,2581,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Summer City",1977,83,NA,3.3,113,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Summer Heat",1987,80,NA,4.1,52,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Summer Holiday",1948,93,2258325,5.7,59,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Summer Holiday",1963,107,NA,5.6,225,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Summer Love",1958,85,NA,6.5,7,0,0,0,14.5,0,14.5,44.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Summer Lovers",1982,98,NA,4.9,684,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Summer Magic",1963,110,NA,6.4,258,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Summer Night Fever",1978,87,NA,3.6,30,24.5,24.5,4.5,24.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Summer Place, A",1959,130,NA,6.3,396,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Summer Rental",1985,88,NA,5.5,1561,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Summer School",1980,73,NA,7.5,13,0,4.5,0,0,0,14.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Summer School",1987,97,NA,6,2444,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Summer School Teachers",1974,85,NA,4.2,18,14.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Summer Soldiers",1972,107,NA,7,9,0,0,0,0,24.5,14.5,24.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Summer Solstice",2003,111,300000,2,5,44.5,24.5,0,0,0,0,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Summer Sonata, A",2004,30,2000,10,5,0,0,0,0,0,0,0,0,0,100,"",0,0,0,1,0,0,1 -"Summer Stock",1950,108,NA,7,418,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Summer Storm",1944,106,NA,6.3,18,4.5,0,0,14.5,14.5,24.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Summer Story",2004,76,NA,4.9,9,0,0,0,14.5,44.5,14.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Summer Story, A",1988,95,NA,7,250,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Summer Thunder",2003,81,NA,2.9,15,34.5,4.5,4.5,4.5,4.5,0,0,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Summer Wishes, Winter Dreams",1973,93,NA,6.4,62,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Summer and Smoke",1961,118,NA,7.4,105,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Summer in the City",1970,125,NA,5.6,20,0,0,4.5,0,24.5,24.5,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Summer of '42",1971,103,NA,6.9,1062,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Summer of My Deflowering, The",2000,28,NA,5.5,20,0,0,0,14.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Summer of Sam",1999,142,22000000,6.5,8151,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Summer of Secrets",1976,100,NA,7.8,5,24.5,0,0,0,0,0,0,24.5,0,64.5,"",0,0,1,0,0,0,0 -"Summer of the Monkeys",1998,101,NA,6,110,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Summer of the Seventeenth Doll",1959,93,NA,6.3,30,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Summer with the Ghosts",2003,85,NA,5.5,10,0,0,0,24.5,34.5,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Summer's Gone",1999,96,15000,6,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Summerdog",1977,90,NA,3,5,24.5,24.5,44.5,0,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Summerfield",1977,95,NA,7.8,27,0,0,0,0,14.5,4.5,4.5,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Summerspell",1983,100,NA,6.8,12,4.5,0,4.5,0,4.5,14.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Summertime",1955,102,NA,7.4,716,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Summertime",1999,27,NA,6,16,4.5,4.5,0,0,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Summertime",2001,104,NA,5.5,23,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Summertime Blue",1978,70,NA,5.9,6,14.5,0,14.5,14.5,0,0,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Summertime Blues: Lemon Popsicle VIII",1988,90,NA,3.3,35,24.5,14.5,4.5,0,14.5,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Summertree",1971,88,NA,5.5,27,4.5,4.5,4.5,0,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Summoned by Shadows",1992,34,NA,3.2,11,14.5,0,4.5,4.5,0,4.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Summoning",2001,29,NA,2.1,25,34.5,4.5,0,0,4.5,0,0,0,4.5,44.5,"",0,0,0,1,0,0,1 -"Sumo Bruno",2000,99,NA,7,46,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sun Also Rises, The",1957,130,NA,6.2,291,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sun Comes Up, The",1949,93,NA,6.3,26,0,0,4.5,4.5,4.5,14.5,34.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Sun Mool",2001,113,NA,7.4,43,4.5,0,0,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Sun Never Sets, The",1939,97,NA,6.5,18,0,0,14.5,0,4.5,34.5,14.5,24.5,0,14.5,"",1,0,0,1,0,0,0 -"Sun Ra: A Joyful Noise",1980,60,NA,7.8,16,0,0,0,0,0,0,14.5,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Sun Shines Bright, The",1953,90,NA,6.3,101,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Sun Valley Serenade",1941,86,NA,7.2,174,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Sun, the Moon and the Stars, The",1996,93,NA,5.7,13,0,0,0,14.5,24.5,34.5,0,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Suna no onna",1964,147,NA,8,808,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Suna no utsuwa",1974,143,NA,7.8,33,0,4.5,0,0,0,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Sunaebo",2000,117,NA,6.8,50,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Sunbeam, The",1912,17,NA,7.4,31,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,1,1 -"Sunbonnet Blue, A",1937,7,NA,6,9,0,0,0,0,34.5,14.5,34.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Sunburn",1979,99,NA,4.2,102,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",1,0,1,0,0,0,0 -"Sunchaser, The",1996,122,NA,5.6,704,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Sundae in New York",1983,4,NA,7.2,31,0,0,4.5,0,14.5,34.5,14.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Sundance 20",2002,55,NA,3.2,16,34.5,0,14.5,0,14.5,4.5,0,4.5,0,34.5,"",0,0,0,0,1,0,0 -"Sunday",1997,94,450000,7.1,249,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Sunday",1999,10,NA,7.6,5,0,0,0,0,0,44.5,24.5,0,24.5,24.5,"",0,0,0,1,0,0,1 -"Sunday Afternoon",2000,4,NA,5.1,11,14.5,0,14.5,14.5,0,4.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,1 -"Sunday Bloody Sunday",1971,110,NA,7.2,520,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sunday Dinner for a Soldier",1944,85,NA,7.3,37,0,0,4.5,0,4.5,14.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Sunday Lovers",1980,125,NA,4.8,56,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sunday Morning",2001,15,NA,6,5,0,0,0,24.5,0,0,24.5,44.5,24.5,0,"",0,0,0,0,0,0,1 -"Sunday Morning Stripper, The",2003,24,22000,7.9,10,24.5,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Sunday Night at the Trocadero",1937,21,NA,6.1,25,4.5,4.5,24.5,4.5,14.5,4.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Sunday Too Far Away",1975,94,NA,6.6,96,4.5,4.5,0,0,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Sunday in New York",1963,105,NA,6.5,289,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Sunday's Game",1999,9,NA,8.8,15,0,0,0,4.5,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Sundown",1941,90,NA,5.4,71,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sundown",2002,19,NA,9.5,6,0,0,0,0,0,0,14.5,0,0,84.5,"",1,0,0,1,0,0,1 -"Sundown Trail",1931,56,NA,4.5,11,0,4.5,4.5,4.5,34.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Sundown: The Vampire in Retreat",1991,104,NA,6.2,191,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Sundowners, The",1950,83,NA,6.3,52,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sundowners, The",1960,133,NA,7.4,397,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sunes familie",1997,85,NA,2.7,27,24.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Sunes sommar",1993,83,NA,5.7,291,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sung ming yun oi dung ting",2001,97,NA,5.4,8,0,0,0,24.5,14.5,14.5,0,14.5,34.5,0,"",0,0,0,0,0,0,0 -"Sungnyangpali sonyeoui jaerim",2002,123,NA,5.9,340,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Sunny",1930,78,NA,5.5,18,14.5,0,4.5,14.5,14.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Sunny Side Up",1929,121,NA,6.4,34,0,0,0,4.5,14.5,14.5,14.5,4.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Sunny Side Up",1994,80,NA,6.4,12,14.5,0,0,4.5,0,0,4.5,4.5,4.5,45.5,"",0,0,1,0,0,1,0 -"Sunny Side of the Street",1951,71,NA,6.4,5,0,0,0,0,24.5,24.5,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Sunny Skies",1930,75,NA,3.2,5,0,0,44.5,24.5,0,0,0,44.5,0,0,"",0,0,1,0,0,0,0 -"Sunnyside",1919,41,NA,6.9,187,4.5,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Sunnyside",1979,100,NA,3.8,5,44.5,0,0,24.5,0,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Sunrise Over Tiananmen Square",1998,29,NA,9.2,26,0,4.5,0,0,0,0,14.5,34.5,14.5,34.5,"",0,1,0,0,1,0,1 -"Sunrise at Campobello",1960,144,NA,7.1,143,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sunrise: A Song of Two Humans",1927,106,NA,8.4,2653,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Sunset",1988,102,NA,5.4,568,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Sunset Blvd.",1950,115,1752000,8.6,16149,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Sunset Boulevard",1991,8,NA,7,6,0,0,0,0,0,0,45.5,0,0,45.5,"",0,0,0,0,0,0,1 -"Sunset Grill",1993,105,NA,4.4,86,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sunset Heat",1991,90,NA,3.9,101,4.5,14.5,14.5,4.5,24.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Sunset Park",1996,99,NA,4.6,236,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Sunset Pass",1946,64,NA,5.6,11,0,0,4.5,14.5,4.5,34.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Sunset Serenade",1942,58,NA,7.1,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Sunset Story",2003,73,NA,7.3,29,4.5,0,4.5,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Sunset Strip",1992,95,NA,4.1,12,24.5,14.5,4.5,4.5,24.5,0,0,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Sunset Strip",2000,90,NA,5.1,239,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Sunset Trail",1939,69,NA,7.5,17,0,0,0,0,4.5,24.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Sunset in El Dorado",1945,65,NA,6,5,0,0,0,0,44.5,0,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Sunset in Wyoming",1941,65,NA,5.7,6,14.5,0,0,0,14.5,14.5,14.5,0,34.5,0,"",0,0,0,0,0,0,0 -"Sunsets",1997,98,NA,5.6,5,0,0,24.5,0,0,0,24.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Sunshine",1999,181,NA,7.3,2920,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Sunshine Boys, The",1975,111,NA,7,811,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Sunshine Deli and Grocery, The",2000,93,300000,8.3,6,0,0,0,0,34.5,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Sunshine Hotel",2001,98,NA,7.2,64,4.5,0,4.5,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Sunshine Makers, The",1935,7,NA,5.4,14,0,0,0,14.5,14.5,24.5,4.5,0,14.5,24.5,"",0,1,0,0,0,0,1 -"Sunshine Reggae auf Ibiza",1983,86,NA,3.1,44,34.5,4.5,4.5,14.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Sunshine State",2002,141,5600000,7,1481,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Sunshine, The",2000,30,NA,5.8,46,45.5,4.5,0,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Sunstone",1979,3,NA,5.6,7,0,14.5,0,14.5,14.5,0,14.5,0,44.5,0,"",0,0,0,0,0,0,1 -"Sunstruck",1972,89,NA,3.9,8,0,14.5,0,0,24.5,24.5,0,0,14.5,24.5,"",0,0,1,1,0,1,0 -"Suo modo di fare, Il",1969,83,NA,2.5,6,0,14.5,34.5,14.5,14.5,0,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Suolaista ja makeaa",1995,105,NA,4.2,31,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Suomisen Olli rakastuu",1944,84,NA,5.5,10,0,0,0,14.5,24.5,34.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Suomisen Ollin tempaus",1942,91,NA,4.8,12,4.5,0,14.5,4.5,4.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Suomisen perhe",1941,110,NA,6.4,11,0,0,4.5,0,4.5,34.5,0,34.5,4.5,0,"",0,0,0,0,0,0,0 -"Suomisen taiteilijat",1943,95,NA,6.9,7,0,0,0,14.5,14.5,14.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Suor Emanuelle",1977,88,NA,5.4,28,14.5,0,0,4.5,4.5,34.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Suor Omicidi",1978,82,NA,5.3,84,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Suor Sorriso",2001,98,NA,8.1,11,4.5,0,4.5,0,0,0,0,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Supari",2003,142,NA,6.3,15,4.5,24.5,0,0,4.5,24.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Super",1984,101,NA,6.1,10,0,0,14.5,14.5,14.5,0,24.5,34.5,0,24.5,"",1,0,0,1,0,0,0 -"Super 8 Stories",2001,90,NA,6.4,154,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Super 8-1/2",1993,99,NA,4,65,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Super Badass",1999,74,NA,2.7,6,34.5,0,14.5,0,14.5,0,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Super Bitchin' Muscle Car",2004,10,NA,9.2,10,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,0,1,0,0,0,1 -"Super Climax",1980,75,NA,3.7,16,14.5,0,0,0,4.5,24.5,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Super Colosso",1995,74,NA,8.2,22,4.5,0,4.5,4.5,0,4.5,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Super Cops, The",1974,90,NA,6.3,85,0,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Super Duper",2000,6,NA,3.3,7,14.5,0,0,14.5,0,0,0,44.5,0,24.5,"",0,0,1,0,0,0,1 -"Super Grass",1994,12,NA,3.4,6,14.5,0,0,0,0,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Super Mario Bros.",1993,104,42000000,3.6,5376,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Super Ninja, The",1984,89,NA,4.1,19,14.5,4.5,4.5,0,14.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Super Pink",1966,6,NA,6,6,0,0,0,0,34.5,45.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Super Size Me",2004,100,300000,7.7,9487,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"PG-13",0,0,0,0,1,0,0 -"Super Snooper, The",1952,7,NA,6.7,23,0,0,4.5,0,14.5,14.5,24.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Super Speedway",1997,50,NA,6.9,163,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,1,0,0 -"Super Sucker",2002,93,NA,4.3,291,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Super Troopers",2001,100,3000000,6.3,7728,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Super Xuxa Contra o Baixo Astral",1988,86,NA,2.6,156,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Super rapina a Milano",1964,93,NA,8.4,5,0,0,0,0,0,0,44.5,0,44.5,24.5,"",0,0,0,0,0,0,0 -"Super, The",1991,95,NA,5.1,999,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Super-Hooper-Dyne Lizzies",1925,20,NA,5.5,17,0,4.5,0,14.5,14.5,44.5,4.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Super-Rabbit",1943,8,NA,7.8,69,4.5,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Super-Sleuth",1937,70,NA,5.6,18,0,0,0,14.5,34.5,24.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"SuperBabies: Baby Geniuses 2",2004,88,NA,1.8,2224,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"SuperTex",2003,97,NA,5.4,38,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Superamigas contra el profesor Vinilo, Las",2003,15,NA,7.2,7,0,0,0,0,24.5,0,44.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Superargo contro Diabolikus",1967,87,NA,4.8,20,14.5,14.5,14.5,0,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Superbeast",1972,90,275000,1.5,27,74.5,14.5,4.5,0,0,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Superchick",1973,94,NA,3.6,37,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Supercock",1975,90,NA,3.1,7,45.5,0,0,0,0,0,0,0,14.5,24.5,"",0,0,1,0,0,0,0 -"Superdad",1973,96,NA,4.1,117,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Superfag",2002,22,NA,3.9,27,4.5,0,0,4.5,0,0,14.5,24.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Superfantagenio",1986,95,NA,5,230,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Superfantozzi",1986,92,NA,6.2,92,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Superficiales, Les",2002,11,NA,7.3,6,0,0,0,0,0,14.5,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Superfights",1995,94,NA,4.5,39,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Superfly",1972,93,NA,5.9,616,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Supergirl",1984,150,35000000,3.9,2490,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Supergirls Do General Hospital",1985,77,NA,6.5,7,0,0,0,0,0,24.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Supergrass, The",1985,96,NA,5.7,117,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Superguy: Behind the Cape",2002,74,NA,7.6,22,24.5,0,0,0,4.5,0,4.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Superhero",2000,1,NA,7.1,7,0,0,0,0,24.5,0,24.5,24.5,0,14.5,"",0,0,0,0,0,0,1 -"Superhero Excelsior!",2003,90,NA,8.2,10,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Superior Duck",1996,5,NA,3.6,13,14.5,0,14.5,0,0,24.5,0,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Superlove",1999,88,NA,5.4,28,4.5,0,0,0,44.5,34.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Superman",1941,10,100000,7.5,148,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,1,0,0,0,0,1 -"Superman",1948,244,NA,6.1,54,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Superman",1973,104,NA,6.6,72,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Superman",1978,151,55000000,7.1,17327,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",1,0,0,0,0,0,0 -"Superman Flies Again",1954,77,NA,5.8,11,0,4.5,0,4.5,4.5,24.5,14.5,0,14.5,4.5,"",1,0,0,0,0,0,0 -"Superman II",1980,127,54000000,6.5,10085,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Superman III",1983,125,NA,4.6,6412,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Superman IV: The Quest for Peace",1987,134,NA,3.3,6171,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Superman and the Jungle Devil",1954,77,NA,6.7,11,0,4.5,0,4.5,0,24.5,24.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Superman and the Mole Men",1951,67,NA,6,89,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Superman in Exile",1954,77,NA,5.9,13,0,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Superman's Peril",1954,77,NA,6.3,9,0,0,14.5,14.5,14.5,34.5,14.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Supermarket",2004,12,NA,2.4,15,44.5,0,0,4.5,4.5,0,4.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Supermarkt",1974,84,NA,6.9,30,0,0,4.5,14.5,0,4.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Supermaterialisme",1995,22,NA,4.8,17,14.5,0,0,0,0,14.5,14.5,44.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Supernasen, Die",1983,88,NA,3.3,205,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Supernatural",1933,65,NA,5.6,70,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Supernaturals, The",1986,91,NA,3.9,80,14.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Supernova",1993,80,NA,2.6,27,64.5,4.5,4.5,0,0,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Superprodukcja",2003,92,NA,5.1,80,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Superstar",1999,81,14000000,4.5,2880,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Superstar Female Serial Killer",2000,120,NA,8.2,25,14.5,4.5,0,4.5,0,0,0,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Superstar in a Housedress",2004,95,NA,7.9,21,4.5,0,0,0,4.5,0,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Superstar: The Karen Carpenter Story",1987,43,NA,8.3,332,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Superstar: The Life and Times of Andy Warhol",1990,87,NA,6.5,84,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Superstarlet A.D.",2000,70,16000,5.4,23,14.5,0,0,4.5,4.5,14.5,4.5,0,14.5,34.5,"",1,0,1,0,0,0,0 -"Superstau",1991,80,NA,5.6,114,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Superstition",1982,85,NA,4.8,159,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Superstition",1997,4,NA,9.5,15,0,0,0,0,4.5,14.5,0,0,24.5,64.5,"",0,0,0,0,0,0,1 -"Superstition",2001,95,NA,5.1,115,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Superuomini, superdonne, superbotte",1975,105,NA,3.7,30,14.5,4.5,4.5,14.5,24.5,0,4.5,14.5,4.5,14.5,"",1,0,0,0,0,1,0 -"Supervan",1977,91,NA,4.3,21,24.5,4.5,0,0,4.5,14.5,0,4.5,0,34.5,"",1,0,1,0,0,0,0 -"Supervivientes de los Andes",1976,85,NA,4.7,49,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Supervixens",1975,99,250000,5.8,518,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Superweib, Das",1996,86,NA,4.6,217,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Suplement",2002,108,NA,5.7,30,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Support Group, The",2003,11,NA,6.4,19,0,0,14.5,0,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Support Your Local Gunfighter",1971,91,NA,6.7,646,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Support Your Local Sheriff!",1969,92,NA,7.4,1539,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Suppose They Gave a War and Nobody Came?",1970,113,NA,5.1,88,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Suppressed Duck",1965,6,NA,6.2,23,0,4.5,4.5,4.5,0,14.5,34.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Sur",1988,127,NA,7.2,140,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sur la plage de Belfast",2000,39,NA,8.5,10,0,0,0,0,0,24.5,14.5,14.5,24.5,44.5,"",0,0,0,0,1,0,1 -"Sur la terre comme au ciel",1992,80,NA,5.7,23,34.5,0,0,4.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sur le bout des doigts",2002,88,NA,6.5,16,0,0,0,14.5,0,14.5,14.5,44.5,0,4.5,"",0,0,0,1,0,0,0 -"Sur le seuil",2003,99,NA,6.6,227,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Sur un air d'autoroute",2000,90,NA,4.9,15,4.5,0,0,4.5,44.5,14.5,0,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sur un air de Charleston",1927,17,NA,7.6,13,0,0,0,4.5,4.5,0,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Sur, El",1983,95,NA,8.6,268,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Suraj Ka Satvan Ghoda",1993,130,NA,4.7,24,4.5,0,4.5,0,4.5,4.5,0,24.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Surat untuk bidadari",1994,118,NA,7.8,16,14.5,0,0,0,0,0,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Surcos",1951,99,NA,7.4,27,0,0,0,0,0,14.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Surcouf, l'eroe dei sette mari",1966,85,NA,7.7,8,0,0,14.5,0,0,14.5,45.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Sure Cures",1946,11,NA,6.8,6,0,0,0,14.5,0,34.5,0,0,0,45.5,"",0,0,1,0,1,0,1 -"Sure Fire",1990,83,NA,5.5,34,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Sure Thing, The",1985,100,NA,6.8,3633,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Sure to Rise",1994,13,NA,6.2,11,4.5,0,0,4.5,4.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Surf Adventures - O Filme",2002,90,NA,4.2,33,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Surf Crazy",1959,72,NA,5.4,10,0,14.5,0,0,14.5,24.5,0,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Surf Nazis Must Die",1987,83,NA,3.2,581,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Surf Ninjas",1993,87,NA,3.5,962,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Surf Party",1964,68,NA,2.8,10,14.5,0,14.5,14.5,14.5,0,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Surf, Sand and Sex",1994,72,NA,2.3,16,24.5,14.5,4.5,14.5,4.5,4.5,0,0,0,24.5,"",0,0,0,0,0,1,0 -"Surf-Bored Cat",1967,6,NA,5.3,13,14.5,0,0,14.5,24.5,24.5,4.5,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Surface Calm",2001,18,15000,5.1,19,0,0,0,0,14.5,0,4.5,24.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Surface to Air",1997,93,NA,4.1,83,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Surfacing",1981,89,NA,4.6,25,4.5,4.5,24.5,14.5,0,34.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Surfacing",2002,89,NA,4.5,15,0,0,4.5,4.5,4.5,0,0,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Surfer, The",1986,90,NA,4.5,5,0,24.5,24.5,0,0,44.5,0,24.5,0,0,"",1,0,0,1,0,0,0 -"Surferne kommer",1998,50,NA,4.5,47,14.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Surfing Hollow Days",1961,84,NA,6.5,9,0,0,0,0,24.5,0,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Surfing Shorts",1960,76,NA,6.2,9,0,0,0,14.5,0,0,24.5,44.5,0,24.5,"",0,0,0,0,1,0,0 -"Surfing for Life",1999,72,NA,4.1,22,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Surfing with William",2003,10,NA,6.2,10,0,0,0,0,34.5,0,45.5,14.5,14.5,0,"",0,0,1,0,0,0,1 -"Surge of Power",2004,98,NA,2.2,14,14.5,4.5,4.5,0,14.5,0,0,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Surgikill",1990,88,NA,6.2,5,44.5,0,0,0,0,0,0,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Suriyothai",2001,142,NA,6.7,431,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"Surname Viet Given Name Nam",1989,108,NA,4.6,21,4.5,4.5,0,4.5,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Surogat",1961,10,NA,8.4,26,4.5,0,0,4.5,0,4.5,14.5,4.5,0,64.5,"",0,1,0,0,0,0,1 -"Surplus: Terrorized Into Being Consumers",2003,54,NA,6.3,160,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Surprise Cinema",1999,7,NA,6.1,39,4.5,0,4.5,0,14.5,24.5,14.5,24.5,4.5,0,"",0,1,1,0,0,0,1 -"Surprise Package",1960,100,NA,5.8,13,0,0,14.5,4.5,14.5,14.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Surprise Party",1983,100,NA,2.6,6,0,14.5,14.5,45.5,14.5,0,0,0,0,0,"",0,0,1,1,0,0,0 -"Surprise!",1995,6,NA,7.7,48,0,0,0,0,4.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Surrender",1950,90,NA,6.4,7,0,0,0,0,24.5,44.5,14.5,0,0,14.5,"",0,0,0,1,0,1,0 -"Surrender",1987,105,NA,4.9,184,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Surrender",2000,94,NA,3.2,39,14.5,14.5,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Surrender",2003,75,NA,2.2,7,14.5,0,0,0,0,14.5,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Surrender - Hell!",1959,85,NA,4.1,5,24.5,24.5,0,0,0,0,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Surrender Dorothy",1998,90,NA,7,89,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Surrender in Paradise",1984,87,NA,5.3,13,0,4.5,0,14.5,0,34.5,4.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Surrogate, The",1984,100,NA,3.8,61,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Surveiller les tortues",1998,20,NA,4.3,11,14.5,0,4.5,4.5,0,34.5,0,0,14.5,4.5,"",0,0,0,0,0,0,1 -"Survenant, Le",2005,138,NA,6.5,35,4.5,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Survival Game",1987,87,NA,3,24,14.5,24.5,14.5,14.5,14.5,4.5,0,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Survival Island",1996,40,NA,7.6,10,0,0,0,0,24.5,0,24.5,44.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Survival Quest",1989,96,NA,5.2,70,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Survival Run",1980,89,NA,3.2,36,14.5,14.5,24.5,14.5,4.5,14.5,0,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Survival Under Atomic Attack",1951,9,NA,5.2,13,0,0,4.5,14.5,4.5,34.5,14.5,0,4.5,14.5,"",0,0,0,0,1,0,1 -"Survival Zone",1983,90,NA,4.2,12,4.5,14.5,4.5,14.5,0,24.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Survivalist, The",1987,93,NA,4.5,25,24.5,24.5,14.5,0,14.5,0,0,0,14.5,14.5,"",1,0,0,1,0,0,0 -"Survive Style 5+",2004,120,NA,7.9,173,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Survivin' the Island",2002,5,NA,6.9,11,0,0,4.5,0,4.5,4.5,24.5,0,24.5,14.5,"",0,0,1,0,0,0,1 -"Surviving Christmas",2004,91,NA,4.5,1480,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Surviving Desire",1991,60,NA,7.4,318,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Surviving Paradise",2000,90,NA,5.8,16,34.5,0,0,0,4.5,0,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Surviving Picasso",1996,125,16000000,6.1,1139,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Surviving the Game",1994,96,NA,5.4,1393,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Survivor",1987,92,NA,3.3,23,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Survivor, The",1981,99,NA,4.8,77,4.5,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Survivor: Los Angeles the Ultimate Parody",2001,36,NA,2.5,11,24.5,0,0,0,4.5,4.5,0,4.5,0,44.5,"",0,0,1,0,0,0,1 -"Survivors Exposed",2001,93,NA,5.5,38,14.5,4.5,4.5,4.5,4.5,14.5,0,14.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Survivors, The",1983,102,NA,5.4,654,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sus demonios",2003,10,NA,5.5,6,0,0,0,0,45.5,14.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Sus ojos se cerraron y el mundo sigue andando",1997,93,NA,7.1,70,4.5,0,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Susan Brinkui arirang",1991,118,NA,4.9,9,24.5,0,0,24.5,34.5,0,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Susan Lenox (Her Fall and Rise)",1931,76,580000,6.2,118,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Susan Slade",1961,116,NA,6,100,0,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Susan Slept Here",1954,98,NA,6.1,143,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Susan and God",1940,117,NA,6.2,115,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Susan's Plan",1998,89,NA,5.1,558,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Susana",1951,86,NA,6.9,82,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Susanna",1996,93,NA,5.4,24,0,0,4.5,4.5,24.5,24.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Susanna Pass",1949,67,NA,6.2,12,0,0,0,0,24.5,14.5,24.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Susanna tutta panna",1958,80,NA,5.6,6,0,0,0,0,34.5,14.5,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Susannah of the Mounties",1939,78,NA,6.8,46,4.5,0,0,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Susanne, die Wirtin von der Lahn",1967,92,NA,2.8,11,34.5,4.5,14.5,0,4.5,14.5,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Susie the Little Blue Coupe",1952,8,NA,7.5,27,4.5,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Susie's Affairs",1934,18,NA,5.9,6,0,0,0,14.5,14.5,14.5,45.5,0,0,0,"",0,0,1,0,0,0,1 -"Suspect",1960,81,NA,5.6,9,0,0,0,14.5,34.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Suspect",1987,121,NA,6.5,1489,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Suspect Zero",2004,99,27000000,5.7,1310,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Suspect, The",1944,85,NA,7.7,115,4.5,4.5,0,0,4.5,4.5,14.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Suspects, Les",1974,90,NA,5,5,0,0,24.5,0,24.5,44.5,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Suspeita, A",2000,25,NA,8.2,48,0,0,0,0,4.5,4.5,4.5,14.5,24.5,45.5,"",0,1,0,0,0,0,1 -"Suspended Animation",2001,114,1900000,5.2,82,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Suspense",1913,10,NA,8.1,6,0,0,0,0,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Suspense",1946,101,NA,7,10,0,0,0,0,0,45.5,24.5,24.5,14.5,0,"",0,0,0,1,0,1,0 -"Suspension of Disbelief",2002,21,NA,9.3,12,0,0,0,0,4.5,0,0,4.5,4.5,74.5,"",1,0,0,0,1,0,1 -"Suspicion",1941,101,NA,7.5,3268,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Suspicions",1995,83,NA,6.4,8,0,14.5,0,14.5,24.5,14.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Suspicious Agenda",1994,97,NA,3,31,14.5,4.5,0,4.5,14.5,14.5,4.5,4.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Suspicious River",2000,92,NA,5.5,208,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Suspiria",1977,95,NA,7.2,4294,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Sussi",1987,100,NA,3.5,21,24.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Sussie",1945,95,NA,4.3,5,0,0,24.5,24.5,44.5,0,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Sussurro nel buio, Un",1976,100,NA,5.2,11,0,14.5,0,4.5,4.5,4.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Sustitutos, Los",2003,15,NA,8.4,5,0,0,0,0,0,24.5,0,44.5,0,44.5,"",1,0,0,0,0,0,1 -"Susuz yaz",1964,90,NA,8.7,38,0,4.5,4.5,0,0,0,14.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Sutalk",1990,109,NA,1.8,6,84.5,14.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,1,0 -"Sutjeska",1973,117,NA,5.8,61,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sutter's Gold",1936,94,2000000,5.9,22,0,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Suture",1993,96,NA,6.5,420,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Suvi",1976,81,NA,7.6,40,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Suxxess",2002,103,NA,5.5,62,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Suzaki paradise: Akashingo",1956,81,NA,7.2,5,0,0,0,0,0,24.5,24.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Suzanne",1980,103,NA,5.1,12,0,0,4.5,0,34.5,24.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Suzanne",1996,130,NA,4.8,9,44.5,0,14.5,0,0,0,0,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Suzanne Farrell: Elusive Muse",1996,90,NA,8.5,15,4.5,0,4.5,4.5,0,0,0,0,34.5,44.5,"",0,0,0,0,1,0,0 -"Suzanne og Leonard",1984,94,NA,3.4,12,4.5,24.5,14.5,34.5,4.5,4.5,0,0,0,0,"",0,0,0,1,0,1,0 -"Suzhou he",2000,83,NA,7.4,742,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Suzie Gold",2004,94,NA,5.2,69,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Suzie Superstar",1982,80,NA,6.3,20,0,0,0,4.5,14.5,34.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Suzie Superstar II",1985,92,NA,8.2,15,4.5,0,0,0,0,4.5,24.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Suzie Washington",1998,89,NA,6.3,48,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Suzy",1936,93,614000,6.2,146,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Svadba",1944,64,NA,8.2,27,0,0,0,0,0,4.5,0,0,14.5,74.5,"",0,0,1,0,0,0,0 -"Svadba",2000,114,NA,7.3,281,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Svadba v Malinovke",1967,95,NA,7.5,21,0,0,0,4.5,4.5,14.5,4.5,0,14.5,44.5,"",0,0,1,0,0,0,0 -"Svampe",1990,79,NA,3.9,11,14.5,14.5,4.5,14.5,4.5,14.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Svar med foto",1999,93,NA,5.5,23,4.5,4.5,0,14.5,24.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Svart Lucia",1992,114,NA,4.9,194,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Svart fredag",1997,24,NA,1.4,10,34.5,14.5,0,0,0,14.5,0,14.5,0,44.5,"",1,0,0,0,0,0,1 -"Svart gryning",1987,96,NA,5.5,6,0,0,0,0,34.5,34.5,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Svarta filmen, Den",1995,20,NA,7.7,36,0,4.5,0,0,4.5,4.5,0,14.5,4.5,74.5,"",0,0,1,1,0,0,1 -"Svarte pantere",1992,85,NA,4.7,34,14.5,4.5,0,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Svartere enn natten",1979,92,NA,5.8,10,14.5,14.5,0,0,0,44.5,0,0,34.5,14.5,"",0,0,0,1,0,0,0 -"Svastica nel ventre, La",1977,85,NA,3,20,4.5,14.5,24.5,14.5,4.5,0,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Svatba jako remen",1967,94,NA,8.3,20,0,0,0,0,0,14.5,4.5,34.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Svatbite na Yoan Asen",1975,161,NA,9.2,11,0,0,0,0,0,0,4.5,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Svegliati e uccidi",1966,102,NA,3.7,7,0,14.5,0,24.5,0,0,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Svemirci su krivi za sve",1991,86,NA,2.5,9,45.5,14.5,0,0,0,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Sven Klangs kvintett",1976,114,NA,7.2,43,0,0,4.5,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sven Tuuva",1958,141,NA,5.5,17,4.5,4.5,4.5,14.5,0,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Svengali",1931,81,NA,6.8,125,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Svengali",1954,82,NA,5,8,14.5,14.5,0,14.5,45.5,0,0,0,0,14.5,"",0,0,0,1,0,1,0 -"Svenska bilder",1964,106,NA,6.7,14,0,0,0,0,0,34.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Svensson Svensson - filmen",1997,81,NA,4.7,147,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Svetlaya lichnost",1988,82,NA,4.1,6,14.5,0,0,0,14.5,0,45.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Sveto mesto",1990,90,NA,9.6,13,0,0,0,0,0,0,4.5,34.5,0,64.5,"",0,0,0,1,0,0,0 -"Svezia, inferno e paradiso",1968,90,NA,9,10,0,0,0,0,0,14.5,0,24.5,24.5,45.5,"",0,0,0,0,1,0,0 -"Svidd neger",2003,87,NA,6.4,219,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Svitati",1999,85,NA,4.4,111,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Svitjod 2000+",2001,11,NA,5.2,9,14.5,24.5,0,0,0,34.5,24.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Svjedoci",2003,90,NA,5.7,105,14.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Svoga tela gospodar",1957,109,NA,8.1,15,14.5,0,0,0,0,0,0,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Svoi",2004,111,2500000,8.4,97,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",1,0,0,1,0,0,0 -"Svoy sredi chuzhikh, chuzhoy sredi svoikh",1974,90,NA,7.1,161,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Swades",2004,210,NA,8,535,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Swaham",1994,141,NA,7.7,20,44.5,4.5,0,0,0,0,4.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Swallow the Leader",1949,7,NA,6.7,10,0,0,0,0,14.5,34.5,24.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Swallows and Amazons",1974,92,NA,4.6,80,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Swallowtail",1996,146,NA,7.3,660,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Swami",1977,129,NA,8.2,18,0,0,0,0,0,4.5,4.5,14.5,45.5,24.5,"",0,0,0,1,0,0,0 -"Swamp Country",1966,93,NA,6.8,11,0,0,0,24.5,0,14.5,4.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Swamp Fire",1946,69,NA,6,17,0,0,14.5,24.5,14.5,0,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Swamp Girl",1971,78,NA,6.6,20,0,0,14.5,14.5,14.5,14.5,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Swamp Thing",1982,91,3000000,5,1179,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Swamp Water",1941,88,NA,7.2,76,4.5,0,0,0,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Swamp Woman",1941,68,NA,2.5,5,64.5,24.5,0,0,0,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Swamp Women",1955,67,NA,3.1,131,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Swamp!",1999,80,NA,6.5,5,0,24.5,0,24.5,24.5,24.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Swan Lake",1978,69,NA,6.9,35,0,0,0,0,4.5,4.5,14.5,14.5,4.5,64.5,"",0,1,0,0,0,1,0 -"Swan Princess II, The",1997,71,NA,5,73,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Swan Princess, The",1994,90,NA,5.7,355,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,1,0 -"Swan Princess: The Mystery of the Enchanted Kingdom, The",1998,71,NA,4.1,39,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,1,0,0,0,0,0 -"Swan Song",1992,23,NA,8,25,0,0,0,4.5,4.5,0,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Swan, The",1925,65,NA,6.9,5,0,0,0,0,0,24.5,0,84.5,0,0,"",0,0,0,0,0,0,0 -"Swan, The",1956,104,NA,6.5,313,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Swanee River",1939,84,NA,5.8,22,4.5,0,4.5,0,14.5,34.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Swann",1996,95,NA,5.8,41,0,4.5,4.5,14.5,4.5,4.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Swap",1990,86,NA,6.1,10,14.5,0,14.5,0,0,24.5,0,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Swap",2004,63,NA,7.2,13,14.5,4.5,0,0,0,4.5,4.5,0,24.5,34.5,"",1,0,1,0,0,0,0 -"Swap Meet",1979,85,NA,4.5,16,14.5,0,14.5,14.5,14.5,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Swap and How They Make It, The",1966,101,NA,7.1,6,0,0,14.5,0,0,0,45.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Swapner Din",2004,89,NA,8.5,20,0,0,0,0,0,0,24.5,44.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Swapped",2001,10,NA,7.4,13,0,0,0,0,0,4.5,24.5,64.5,0,0,"",0,0,1,0,0,0,1 -"Swaraaj",2002,90,NA,7.7,7,0,0,0,14.5,0,24.5,0,14.5,0,44.5,"",0,0,0,0,0,0,0 -"Swarm, The",1978,156,21000000,3.8,986,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Swashbuckler",1976,101,NA,5.5,277,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Swastika",1973,113,NA,9,8,24.5,0,0,0,0,0,0,0,0,74.5,"",0,0,0,0,1,0,0 -"Swat the Fly",1935,6,NA,5.5,18,0,0,24.5,0,14.5,24.5,14.5,0,4.5,4.5,"",0,1,0,0,0,0,1 -"Swearing",1999,1,NA,6.7,10,0,0,0,0,24.5,24.5,44.5,0,14.5,14.5,"",0,1,0,0,0,0,1 -"Sweatbox, The",2002,86,NA,7.1,15,0,0,0,14.5,0,0,34.5,4.5,44.5,4.5,"PG-13",0,0,0,0,1,0,0 -"Sweater Girl",1942,77,NA,7.3,6,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Sweater Girls",1978,84,NA,6.9,7,14.5,0,14.5,0,0,0,14.5,0,44.5,14.5,"",0,0,1,0,0,0,0 -"Sweater, The",1980,10,NA,8.9,77,0,0,4.5,0,4.5,0,4.5,14.5,24.5,45.5,"",0,1,1,0,0,0,1 -"Swedenhielms",1935,88,NA,5.6,43,0,0,4.5,4.5,34.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Swedish Erotica 56",1985,60,NA,6.5,14,24.5,0,0,0,14.5,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Swedish Erotica 57",1985,60,NA,6.5,10,24.5,0,0,0,24.5,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Swedish Sorority Girls",1977,90,NA,4.4,10,14.5,14.5,0,24.5,14.5,0,0,34.5,0,24.5,"",0,0,0,0,0,1,0 -"Sweeney 2",1978,104,NA,6.1,104,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Sweeney Todd: The Demon Barber of Fleet Street",1936,76,NA,6,39,4.5,0,0,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sweeney!",1977,89,NA,6.5,101,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Sweeper, The",1995,90,NA,4.4,95,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Sweepers",1999,93,12500000,3.9,276,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Sweepings",1933,80,NA,6.6,25,0,4.5,0,4.5,4.5,24.5,14.5,44.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sweepstakes Winner",1939,59,NA,4.4,13,24.5,0,4.5,34.5,4.5,4.5,4.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Sweet",2001,10,NA,6.2,40,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,1,1 -"Sweet 16",1983,90,NA,5.3,52,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sweet Adeline",1934,87,NA,4.9,23,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Sweet Alice",1983,75,NA,6,20,4.5,0,0,4.5,0,45.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sweet Angel Mine",1996,88,5000000,5.3,119,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sweet Bird of Youth",1962,120,NA,7.2,498,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sweet Cakes",1976,80,NA,6.7,9,0,0,0,0,0,24.5,14.5,14.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Sweet Charity",1969,154,20000000,6.8,640,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Sweet Country",1987,150,NA,5,22,4.5,0,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sweet Creek County War, The",1979,99,NA,6.3,6,0,0,0,0,34.5,34.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Sweet Devil",1938,71,NA,6,6,0,0,0,14.5,14.5,34.5,0,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Sweet Dreams",1985,115,NA,6.8,546,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sweet Dreams",2000,24,NA,9,7,0,0,0,0,0,14.5,0,0,44.5,44.5,"",0,0,0,1,0,0,1 -"Sweet Hearts Dance",1988,101,NA,5.6,211,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sweet Hereafter, The",1997,112,NA,7.9,9433,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Sweet Hideaway",2003,96,350000,1.9,13,74.5,4.5,0,0,4.5,0,0,0,0,4.5,"",0,0,1,0,0,0,0 -"Sweet Home Alabama",2002,108,38000000,5.8,9943,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Sweet Jane",1998,83,NA,7,133,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sweet Jesus Preacher Man",1973,99,NA,5.5,8,0,0,0,0,34.5,24.5,14.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Sweet Justice",1992,90,NA,3.4,34,4.5,24.5,4.5,24.5,14.5,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Sweet Kill",1973,85,NA,4,35,14.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Sweet Killing",1993,87,NA,4.8,16,0,4.5,24.5,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Sweet Liberty",1986,106,NA,5.5,603,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Sweet Lies",1988,93,NA,4.4,35,14.5,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Sweet Little Things",1985,111,NA,9,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Sweet Lorraine",1987,91,NA,5,68,14.5,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Sweet Love, Bitter",1967,92,NA,6.8,10,0,0,0,0,24.5,0,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Sweet Movie",1974,95,NA,5.6,277,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Sweet Murder",1990,101,NA,5.3,14,4.5,14.5,0,14.5,24.5,4.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Sweet Nightmare",1998,96,NA,3.8,106,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Sweet Nothing",1996,89,NA,5.3,204,14.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Sweet November",1968,114,NA,6.3,224,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Sweet November",2001,115,40000000,5.5,5458,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Sweet Revenge",1976,90,NA,4.6,30,4.5,4.5,0,14.5,24.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Sweet Revenge",1987,78,NA,2.8,27,14.5,24.5,24.5,14.5,4.5,0,0,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Sweet Revenge",1990,89,NA,5.4,57,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Sweet Ride, The",1968,110,NA,5.4,42,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sweet Rosie O'Grady",1943,74,NA,6.6,35,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Sweet Savage",1979,76,NA,3.8,24,14.5,4.5,4.5,4.5,0,0,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Sweet Savior",1971,92,NA,2.9,31,24.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Sweet Sickness, A",1968,65,NA,3,10,14.5,24.5,34.5,0,14.5,14.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Sweet Smell of Sex",1965,70,NA,1,7,84.5,0,0,0,14.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Sweet Smell of Success",1957,96,NA,8,2276,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Sweet Substitute",1964,81,NA,7.4,16,0,0,0,0,14.5,14.5,4.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sweet Sugar",1973,90,NA,4.7,42,14.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Sweet Sweetback's Baad Asssss Song",1971,97,150000,5.3,547,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sweet Talker",1991,86,NA,5.9,66,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sweet Thing",2000,115,NA,6.9,42,4.5,4.5,0,0,0,4.5,4.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Sweet William",1980,92,NA,5,21,0,4.5,14.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Sweet Young Foxes",1983,86,NA,5.3,8,0,14.5,0,14.5,0,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Sweet and Hot",1958,17,NA,4.7,43,24.5,24.5,4.5,24.5,4.5,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,1 -"Sweet and Low-Down",1944,76,NA,5.8,19,4.5,0,0,4.5,14.5,34.5,14.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Sweet and Lowdown",1999,95,NA,7.2,5811,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Sweetener",2002,20,NA,6.1,16,0,0,0,4.5,14.5,34.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Sweeter Song, A",1976,91,NA,5.8,5,0,0,24.5,0,0,64.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Sweetest Sound, The",2001,60,NA,7.5,39,0,0,4.5,4.5,14.5,4.5,14.5,34.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Sweetest Thing, The",2002,90,43000000,4.7,8284,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Sweetheart",2003,13,NA,5.3,11,24.5,0,0,0,64.5,0,0,0,4.5,0,"",0,0,0,0,0,0,1 -"Sweetheart of Sigma Chi",1933,77,NA,6.9,8,0,0,0,14.5,0,0,24.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Sweetheart of the Campus",1941,70,NA,3.6,5,0,0,24.5,44.5,0,24.5,0,24.5,0,0,"",0,0,0,0,0,1,0 -"Sweethearts",1938,114,NA,6.4,92,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Sweethearts",1996,83,NA,6.3,283,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Sweetie",1929,95,NA,5,5,0,0,24.5,24.5,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Sweetie",1989,97,NA,6.6,384,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Sweetnightgoodheart",2001,9,NA,7.5,12,0,0,4.5,0,0,4.5,4.5,34.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Sweetwater",1988,115,NA,4.3,30,14.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Swept Away",2002,89,10000000,3.8,2113,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Swept from the Sea",1997,115,NA,6.7,571,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Swerve",1995,12,NA,7,6,0,0,0,0,0,14.5,34.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Swiateczna przygoda",2000,90,NA,7.9,16,14.5,0,0,0,0,4.5,0,14.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Swidge, The",2004,7,NA,7.4,10,0,14.5,0,0,14.5,0,14.5,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Swim Team",1979,75,NA,3.2,18,24.5,34.5,4.5,4.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Swimfan",2002,85,8500000,4.5,3863,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Swimmer Take All",1952,7,NA,4.8,7,0,0,0,14.5,44.5,14.5,0,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Swimmer, The",1968,95,NA,7.4,810,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Swimming",2000,90,NA,6.3,406,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Swimming Pool",2003,103,NA,6.9,6936,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Swimming Pool - Der Tod feiert mit",2001,89,NA,3.4,449,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Swimming Upstream",2003,105,NA,7.5,259,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Swimming to Cambodia",1987,85,NA,7.5,508,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Swimming with Sharks",1994,101,700000,7.1,4837,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Swimsuit: The Movie",1997,83,NA,2.9,27,14.5,14.5,4.5,14.5,14.5,0,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Swing",1999,97,NA,5.8,135,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Swing Banditry",1936,11,NA,6.9,8,0,0,0,0,14.5,14.5,34.5,24.5,0,14.5,"",0,0,0,0,0,0,1 -"Swing Blade",1997,4,NA,7.2,91,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Swing Cat's Jamboree",1938,9,NA,6.4,7,0,0,0,0,44.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Swing Cleaning",1941,7,NA,5.2,11,0,0,4.5,4.5,4.5,34.5,34.5,0,0,0,"",0,1,0,0,0,0,1 -"Swing Ding Amigo",1966,6,NA,6,14,0,0,0,4.5,24.5,44.5,4.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Swing Fever",1943,79,NA,6.6,22,0,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Swing High",1930,95,NA,7.2,6,0,0,0,0,0,14.5,34.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Swing High",1932,10,NA,7.7,13,0,0,0,4.5,0,24.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Swing High, Swing Low",1937,92,NA,6.3,41,4.5,0,0,4.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Swing Kids",1993,112,NA,5.9,3074,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Swing Parade of 1946",1946,74,NA,6,23,0,0,4.5,0,14.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Swing School, The",1938,7,NA,5.7,7,0,0,0,24.5,0,14.5,0,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Swing Shift",1984,100,NA,5.7,665,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Swing Shift Cinderella",1945,8,NA,8.2,68,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Swing Shift Maisie",1943,87,NA,6,27,4.5,0,0,4.5,14.5,34.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Swing Time",1936,103,886000,7.7,1135,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Swing Your Lady",1938,80,NA,3.3,52,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Swing it magistern",1940,92,NA,7.6,32,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Swing!",1938,69,NA,5,14,24.5,14.5,0,14.5,4.5,4.5,14.5,0,24.5,0,"",0,0,0,1,0,0,0 -"Swinger, The",1966,81,NA,4.6,97,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Swingers",1996,96,200000,7.6,15827,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Swingers",2002,93,NA,5.7,142,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Swingers' Serenade",1999,24,NA,3.9,21,14.5,4.5,4.5,0,4.5,4.5,0,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Swingin' Along",1961,74,NA,2.7,6,14.5,34.5,0,34.5,0,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Swingin' Summer, A",1965,80,NA,4.3,20,0,4.5,14.5,4.5,4.5,14.5,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Swingin' in the Painter's Room",1989,11,NA,9.5,6,0,0,0,0,0,0,0,0,45.5,45.5,"",0,0,0,0,0,0,1 -"Swinging Cheerleaders, The",1974,91,150000,4.2,85,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Swingtime in the Movies",1939,20,NA,6.4,26,0,0,14.5,0,4.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Swiri",1999,125,5000000,6.6,1704,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",1,0,0,0,0,1,0 -"Swiss Conspiracy, The",1976,90,NA,4.8,35,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Swiss Family Robinson",1940,93,NA,6.9,42,4.5,0,4.5,0,4.5,4.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Swiss Family Robinson",1960,126,NA,6.9,1416,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Swiss Miss",1938,72,NA,6.6,203,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Swiss Trick, A",1931,7,NA,5.6,7,0,0,0,24.5,24.5,14.5,14.5,0,14.5,0,"",0,1,1,0,0,0,1 -"Switch",1991,103,NA,5.4,1419,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Switchback",1997,118,38000000,6.1,2195,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Switchblade Sisters",1975,91,320000,5.7,402,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Switchcraft",1994,9,NA,7.3,7,0,0,0,0,24.5,0,44.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Switchin' Kitten",1961,9,NA,3,19,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,24.5,"",0,1,1,0,0,0,1 -"Switching Channels",1988,105,NA,5.5,668,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Swoon",1992,80,250000,7,290,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Swooner Crooner",1944,7,NA,7.6,48,0,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Sword Fishing",1939,10,NA,2.2,17,44.5,14.5,4.5,0,4.5,0,14.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Sword and the Rose, The",1953,92,NA,6.2,88,0,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sword and the Sorcerer, The",1982,100,NA,5.1,683,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Sword in the Desert",1949,101,NA,6,20,14.5,4.5,0,4.5,14.5,24.5,24.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Sword in the Stone, The",1963,79,NA,6.8,2758,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Sword of Ali Baba, The",1965,81,NA,4.9,16,4.5,0,14.5,4.5,14.5,14.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Sword of Bushido",1989,104,NA,4.7,18,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Sword of Monte Cristo, The",1951,80,NA,4.6,18,4.5,0,14.5,4.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sword of Sherwood Forest",1960,80,NA,4.8,69,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Sword of the Valiant: The Legend of Sir Gawain and the Green Knight",1984,102,NA,3.9,349,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,1,0,0,1,0 -"Swordfish",2001,99,80000000,6.2,20455,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Swords and Hearts",1911,17,NA,6.6,14,0,4.5,4.5,0,0,44.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,1 -"Swordsman, The",1948,80,NA,5.9,14,0,0,0,0,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Swordsman, The",1974,90,NA,2.7,7,0,14.5,14.5,14.5,0,0,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Swordsman, The",1993,92,NA,3.5,71,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Swordswallowers and Thin Men",2003,105,2500,8.2,6,14.5,0,0,0,0,0,0,0,34.5,45.5,"",0,0,0,0,0,0,0 -"Sworn Enemy",1936,73,NA,5.8,8,0,0,0,0,34.5,24.5,0,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Sworn to Justice",1996,97,NA,5.4,40,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"Syd Barrett's First Trip",1966,11,NA,6.1,30,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Sydney",1996,102,NA,7.3,4025,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Sylvester",1985,104,NA,5.7,67,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Sylvi",1944,95,NA,4.6,5,0,0,24.5,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Sylvia",1965,115,NA,6.3,43,0,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Sylvia",2003,110,NA,6.1,1213,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"Sylvia Scarlett",1935,95,1000000,6,411,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Sylvia, rimembri ancora?",2002,21,NA,9.6,10,0,0,24.5,0,14.5,14.5,0,0,24.5,44.5,"",0,0,0,0,1,0,1 -"Symbiopsychotaxiplasm: Take One",1968,70,NA,7.3,8,0,0,0,14.5,0,14.5,14.5,34.5,24.5,0,"",0,0,0,0,1,0,0 -"Symetria",2003,99,NA,7.5,228,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Sympathy for the Devil",1968,99,NA,6.6,203,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Symphonie diagonale",1924,5,NA,7,31,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,"",0,1,0,0,0,0,1 -"Symphonie fantastique, La",1942,95,NA,6.5,8,0,0,0,14.5,14.5,0,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Symphonie pastorale, La",1946,110,NA,7.4,53,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Symphonie pour un massacre",1963,115,NA,7.3,7,0,0,0,14.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Symphony Hour",1942,6,NA,7.4,45,0,4.5,0,4.5,0,14.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Symphony for the Spire",1992,65,NA,6.5,7,14.5,0,0,0,14.5,0,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Symphony in Black",1935,9,NA,7.4,15,4.5,0,0,0,0,4.5,14.5,24.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Symphony in Slang",1951,7,NA,8.3,56,0,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,1,1,0,0,0,1 -"Symphony in Spinach",1948,6,NA,6.1,9,0,0,14.5,0,14.5,0,24.5,24.5,0,34.5,"",0,1,1,0,0,0,1 -"Symphony of Silence",2001,107,NA,7.5,22,34.5,0,4.5,0,0,0,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Symphony of Six Million",1932,94,270000,6.3,63,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Symphony of Swing",1939,10,NA,7.1,13,0,0,0,0,0,45.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Symposium on Popular Songs, A",1962,17,NA,5.6,10,0,0,0,14.5,14.5,34.5,24.5,14.5,0,24.5,"",0,1,1,0,0,0,1 -"Symposium: Ladder of Love",1996,72,NA,9,5,0,0,0,0,24.5,0,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Symptoms",1974,91,NA,2.6,21,14.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Synanon",1965,105,NA,3.8,14,14.5,0,0,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Synapse",2001,11,NA,6.6,8,0,0,0,0,34.5,24.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Synchromy",1971,7,NA,6.7,22,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Syncopation",1942,88,NA,5.7,22,0,0,0,14.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Synergy: Visions of Vibe",1999,56,NA,7.9,9,0,0,14.5,0,14.5,0,14.5,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Syngenor",1990,98,NA,3.7,62,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Synoikia to oneiro",1961,95,NA,6.9,11,0,0,0,0,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Synthetic Pleasures",1995,85,NA,6.1,39,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Syntipukki",1935,93,NA,3.8,5,24.5,0,24.5,0,64.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Syntipukki",1957,95,NA,6,8,0,0,0,14.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Syostry",2001,83,NA,6.6,218,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Syrian Bride, The",2004,96,NA,8.3,108,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,"",0,0,1,1,0,0,0 -"Syrinx",1965,3,NA,6.9,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,1,0,0,0,0,1 -"Syrup",1993,11,NA,8.4,11,4.5,0,0,4.5,0,0,0,0,24.5,45.5,"",0,0,1,0,0,0,1 -"System, The",1964,93,NA,5.4,35,4.5,0,0,14.5,14.5,4.5,14.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Sytten",1965,87,NA,2.1,7,14.5,45.5,0,0,0,0,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Syuzhet dlya nebolshogo rasskaza",1969,86,NA,6.1,12,0,0,4.5,0,4.5,0,44.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Syzyfowe prace",2000,99,NA,5.5,11,0,0,0,4.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Szabadgyalog",1981,146,NA,5.5,11,0,0,0,4.5,24.5,0,24.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Szabla od komendanta",1996,102,NA,7,16,0,0,0,0,14.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Szaffi",1984,76,NA,8.3,40,0,0,0,0,0,4.5,4.5,24.5,14.5,45.5,"",0,1,0,0,0,0,0 -"Szamanka",1996,110,NA,4.8,97,14.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Szamba",1996,100,NA,6.1,60,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Szczesliwego Nowego Jorku",1997,95,NA,6.4,55,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Szczesliwy czlowiek",2000,84,NA,6.1,33,4.5,0,4.5,4.5,0,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Szerelem",1971,93,NA,8.2,67,0,0,0,0,0,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Szerelmem, Elektra",1974,70,NA,7.2,36,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Szerelmesfilm",1970,123,NA,7.8,66,0,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Szezon",2004,89,NA,6.2,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Szpital",1976,22,NA,5.7,24,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Szpital przemienienia",1979,90,NA,6.9,13,0,0,0,0,4.5,14.5,4.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Sztos",1997,86,NA,6.6,43,4.5,0,4.5,0,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Sztracsatella",1996,100,NA,5.6,50,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Sztuka spadania",2004,5,100000,7.6,68,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,1,1,0,0,0,1 -"Szuler",1992,130,NA,6.5,11,4.5,0,0,0,0,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Szwadron",1993,100,NA,6.2,21,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Szyfry",1966,80,NA,6.5,9,0,0,0,0,0,44.5,0,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"T for Terrorist",2003,28,NA,6.9,16,34.5,0,0,0,0,0,0,4.5,14.5,45.5,"",0,0,0,0,0,0,1 -"T' Aves Bachtalo",1994,65,NA,8,6,14.5,0,0,0,0,0,0,0,45.5,34.5,"",0,0,0,0,1,0,0 -"T'Choupi",2004,70,NA,5.1,6,0,0,0,14.5,34.5,0,0,14.5,0,34.5,"",0,1,0,0,0,0,0 -"T'aime",2000,90,NA,1.7,106,74.5,4.5,4.5,4.5,0,4.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"T'es belle Jeanne",1990,82,NA,5.2,18,14.5,0,0,0,14.5,14.5,34.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"T,O,U,C,H,I,N,G",1969,12,NA,5.9,25,4.5,0,4.5,4.5,4.5,0,34.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"T-Bird Gang",1959,65,NA,2.6,30,24.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"T-Bone for Two",1942,7,NA,5.8,21,0,0,0,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"T-Force",1995,105,NA,3.1,74,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"T-Men",1947,92,NA,7.3,201,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"T-Rex: Back to the Cretaceous",1998,45,NA,4.7,234,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"T. Sventon och fallet Isabella",1991,80,NA,4.7,6,0,0,14.5,14.5,0,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"T.A.M.I. Show, The",1965,123,NA,7.6,76,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"T.N.T. Jackson",1975,72,NA,3.7,63,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"T.R. Baskin",1971,90,NA,5.4,61,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"T.R.A.N.S.I.T.",1997,12,NA,6.7,38,0,0,4.5,4.5,4.5,14.5,4.5,14.5,24.5,34.5,"",0,1,0,1,0,0,1 -"T.V. of Tomorrow",1953,7,NA,7.1,43,4.5,4.5,0,0,4.5,4.5,24.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"T2 3-D: Battle Across Time",1996,12,60000000,7.2,2243,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",1,0,0,0,0,0,1 -"TC 2000",1993,91,NA,3.3,126,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"TGV",1998,90,NA,6.8,58,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"THX 1138",1971,88,777000,6.5,4274,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"TR's Arrival in Africa",1909,1,NA,3.6,7,0,14.5,44.5,14.5,14.5,14.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Ta Dona",1991,100,NA,7.8,6,0,0,0,0,14.5,34.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Ta divna Splitska noc",2004,100,NA,6.3,40,34.5,14.5,4.5,0,0,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ta' Pelle med",1952,88,NA,5.4,5,0,0,24.5,24.5,24.5,0,0,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Ta' det som en mand, frue!",1975,96,NA,5,11,14.5,0,0,24.5,0,24.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Ta', hvad du vil ha'",1947,100,NA,7.3,11,0,0,0,4.5,0,14.5,34.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Ta'm e guilass",1997,95,NA,7.1,1297,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Taal",1999,179,NA,6.1,206,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Taarzan: The Wonder Car",2004,163,NA,6.8,10,14.5,0,24.5,0,14.5,0,14.5,0,24.5,34.5,"",1,0,1,1,0,0,0 -"Taas tapaamme Suomisen perheen",1959,99,NA,4.4,6,0,14.5,0,34.5,34.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Tabarka",1996,95,NA,5.6,5,44.5,0,0,0,24.5,0,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Tabasco Kid, The",1932,21,NA,5.1,5,0,24.5,0,0,44.5,0,0,44.5,0,0,"",0,0,1,0,0,0,1 -"Taber!",1998,42,NA,4.6,9,0,24.5,14.5,14.5,0,24.5,0,34.5,0,0,"",0,0,0,0,0,0,1 -"Tabi no omosa",1972,90,NA,8.1,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,0,0,0,0,0 -"Tabiate bijan",1974,93,NA,9.1,13,0,0,0,0,0,0,4.5,14.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Table One",2000,90,NA,5.3,85,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Table for Five",1983,122,NA,5.9,172,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Table for One, A",1999,96,NA,4.7,145,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Table tournante, La",1988,80,NA,7.5,17,4.5,0,0,0,4.5,14.5,14.5,14.5,4.5,34.5,"",0,1,0,0,0,0,0 -"Tableau ferraille",1998,92,NA,4.8,14,4.5,4.5,0,14.5,4.5,0,0,45.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tableau noir, Le",1989,73,NA,6.6,7,0,0,14.5,0,24.5,14.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tabloid",2001,112,NA,5.9,24,4.5,4.5,0,14.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Taboo",1980,86,NA,7.8,193,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Taboo American Style 2: The Story Continues",1985,68,NA,7.8,24,0,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Taboo II",1982,97,NA,7.1,125,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Taboo III",1984,95,NA,6.7,42,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Taboo IV: The Younger Generation",1985,105,NA,7,39,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tabor ukhodit v nebo",1975,99,NA,7.2,82,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Tabous - Zohre & Manouchehr",2004,70,NA,6.6,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,1,1,0,0 -"Tabu",1931,84,150000,7.8,313,0,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Tabu",1982,79,NA,6.3,7,24.5,0,0,0,0,0,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Tabu",1988,105,NA,3.8,8,14.5,14.5,0,0,14.5,24.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Tabutta Rovasata",1996,76,NA,8.3,154,4.5,4.5,0,0,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Tach Herr Dokter - Der Heinz Becker Film",1999,90,NA,4.7,60,14.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tackle Box",2004,10,NA,6.4,19,4.5,0,4.5,0,4.5,14.5,0,4.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Tackle Happy",2000,75,NA,6.2,40,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Tacklebox",1999,23,NA,4.6,20,24.5,0,4.5,14.5,24.5,0,0,0,4.5,34.5,"",0,0,0,0,0,0,1 -"Tacones lejanos",1991,112,NA,7.1,1506,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tacos altos",1985,87,NA,4.6,7,14.5,14.5,14.5,14.5,0,14.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Tactical Assault",1998,92,NA,3.6,134,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Tadon to chikuwa",1998,102,NA,7.3,6,14.5,0,0,0,0,14.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Tadpole",2002,78,150000,6.3,1769,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Taebek sanmaek",1994,168,NA,5.4,36,4.5,4.5,4.5,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Taegukgi hwinalrimyeo",2004,140,12800000,8.5,1792,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"R",1,0,0,1,0,0,0 -"Taekoesu Yonggary",1967,74,NA,3.4,102,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Taekwondo",1998,92,NA,5.3,6,0,0,14.5,0,0,14.5,0,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Taeyangeun eobda",1998,108,NA,7.3,48,4.5,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tafelspitz",1994,99,NA,7.7,26,4.5,0,4.5,0,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Taffin",1988,96,NA,5,170,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Taffy Was Born",2004,114,NA,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Tag",1999,8,NA,7.8,8,0,14.5,0,14.5,0,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Tag der Befreiung, Der",2003,15,NA,8.5,8,14.5,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,1,0,0,1 -"Tag der Freiheit - Unsere Wehrmacht",1935,30,NA,5.9,80,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Tag der Idioten, Der",1982,110,NA,7.8,13,14.5,0,0,0,0,24.5,4.5,4.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Tag det som en mand",1941,99,NA,6.4,5,0,0,0,24.5,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Tag ditt liv",1995,82,NA,5.2,5,0,44.5,0,0,0,24.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Tag, der nie zu Ende geht, Ein",1959,99,NA,3,8,24.5,0,0,0,14.5,24.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tag: The Assassination Game",1982,90,NA,5.7,174,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tagebuch einer Verliebten",1953,93,NA,4.4,6,0,0,14.5,34.5,45.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Tagebuch einer Verlorenen, Das",1929,79,NA,8.3,265,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Taggart",1964,65,NA,6.7,17,4.5,4.5,0,4.5,4.5,14.5,4.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Tahiti",2003,100,NA,8,5,24.5,0,0,0,0,0,0,0,24.5,64.5,"",0,0,0,1,0,0,0 -"Tai ji zhang san feng",1993,96,NA,7.1,1718,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,0,0,0,0,0 -"Tai quan zhen jiu zhou",1973,95,NA,5.2,16,14.5,4.5,0,4.5,14.5,14.5,0,4.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Tai yang zhi zi",1990,84,35000000,4.8,24,4.5,0,14.5,14.5,4.5,24.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tai-Pan",1986,127,NA,4.8,223,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Taif Al-Madina",2000,105,NA,7.2,10,0,0,0,0,0,14.5,45.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Taiga",1992,501,NA,4.9,17,4.5,0,0,0,4.5,0,14.5,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Taiga no itteki",2001,113,NA,6.1,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Taiheiyo hitori-botchi",1963,104,NA,7.7,15,0,0,0,0,0,0,24.5,44.5,34.5,4.5,"",0,0,0,0,0,0,0 -"Taiheiyo no tsubasa",1963,101,NA,5.8,6,0,0,0,0,14.5,0,45.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Tail Lights Fade",1999,87,NA,4.3,346,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,1,1,0,0,0 -"Tail Spin",1939,84,NA,7.6,7,0,0,0,0,0,0,44.5,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Tail Sting",2001,97,NA,2.2,97,44.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Tailor of Panama, The",2001,109,18000000,6.1,5997,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Tailspin Tommy",1934,248,NA,7.3,10,0,0,0,0,0,34.5,34.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Tailspin Tommy in The Great Air Mystery",1935,236,NA,9.6,5,0,0,0,0,0,0,44.5,0,44.5,24.5,"",1,0,0,0,0,0,0 -"Tainstvennyy ostrov",1941,75,NA,6.1,6,0,0,0,0,0,34.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Taipin tienguo",1996,118,NA,6.9,20,4.5,0,0,0,0,14.5,24.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Tais-toi quand tu parles!",1981,89,NA,4.1,17,14.5,14.5,4.5,4.5,0,14.5,24.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Tais-toi!",2003,85,NA,6.8,1407,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Taivasmatka",2001,19,NA,8.4,7,0,0,0,0,0,0,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Taiyo no hakaba",1960,87,NA,7.3,37,0,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Taiyo no oji: Horusu no daiboken",1968,82,NA,7.1,77,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,1,0,1,0,0,0 -"Taiyo o nusunda otoko",1979,147,NA,7.5,49,0,0,0,4.5,4.5,14.5,4.5,34.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Tajna Nikole Tesle",1980,115,NA,7.5,18,0,4.5,0,0,0,24.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Tajna manastirske rakije",1988,89,NA,4.7,18,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Tajna porodicnog blaga",2000,92,NA,6.6,5,24.5,24.5,0,0,0,0,0,0,0,64.5,"",0,0,1,0,0,0,0 -"Tajvanska kanasta",1985,101,NA,8.6,31,0,0,0,0,4.5,0,4.5,24.5,0,64.5,"",0,0,1,1,0,0,0 -"Tak for Alt: Survival of a Human Spirit",1999,61,NA,9.2,5,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,0,0,0,1,0,0 -"Tak zhit nelzya",1990,115,NA,7.9,10,0,0,0,14.5,14.5,0,14.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Tak, tak",1992,94,NA,5.6,9,0,0,14.5,14.5,0,24.5,14.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Take Away",2003,88,NA,5.6,118,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Take Care of My Little Girl",1951,93,NA,6.6,19,0,0,0,4.5,14.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Take Down",1979,107,NA,5.6,47,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Take Her, She's Mine",1963,98,NA,5.7,174,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Take It Back",2004,10,NA,9.2,5,0,0,0,0,0,24.5,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Take It Easy",1986,103,NA,3.9,20,14.5,14.5,4.5,24.5,34.5,14.5,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Take It Easy",1999,32,NA,8.1,18,0,0,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Take It Out in Trade",1970,80,NA,1.6,16,45.5,4.5,0,0,0,0,0,0,4.5,34.5,"",0,0,1,0,0,0,0 -"Take It or Leave It",1981,85,NA,7.5,27,0,0,4.5,0,0,4.5,4.5,14.5,4.5,64.5,"",0,0,1,0,1,0,0 -"Take Me Naked",1966,70,NA,5.3,10,14.5,0,0,14.5,24.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Take Me Out to the Ball Game",1949,93,1725970,6.8,386,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Take Me Somewhere Nice",2004,17,8000,8.8,8,14.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,1,0,0,1 -"Take Me to Town",1953,81,NA,6.3,32,0,0,0,4.5,4.5,24.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Take My Life",1947,79,NA,6.7,16,0,0,0,4.5,0,34.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Take Off",1978,85,NA,5.5,20,14.5,0,0,14.5,14.5,4.5,0,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Take One False Step",1949,94,NA,6.4,21,0,0,4.5,0,14.5,24.5,44.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Take Out",2004,91,NA,8.1,21,4.5,0,4.5,0,0,0,14.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Take This Job and Shove It",1981,100,NA,4.7,173,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Take Two",1988,100,NA,3.7,17,14.5,4.5,14.5,24.5,0,24.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Take a Chance",1933,82,NA,4.3,5,0,0,0,24.5,0,24.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Take a Giant Step",1959,100,300000,5.6,6,0,0,0,0,14.5,45.5,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Take a Girl Like You",1970,101,NA,4.5,16,4.5,14.5,0,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Take a Hard Ride",1975,103,NA,5.7,47,4.5,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Take a Letter, Darling",1942,92,NA,6.7,54,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Take the High Ground!",1953,101,NA,6.1,129,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Take the Money and Run",1969,85,1500000,7.3,3025,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Take, The",1974,91,NA,5.1,18,4.5,0,14.5,14.5,34.5,14.5,14.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Take, The",2004,87,NA,8.2,114,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Take-out",2000,37,NA,6.8,26,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Takedown",1995,93,NA,6.2,6,34.5,0,0,0,14.5,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Takedown",2000,96,NA,6.1,1469,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Taken Away",2002,17,NA,3.4,10,74.5,0,0,0,0,0,14.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Taken for a Ride",1996,52,NA,9.4,12,0,0,0,0,0,4.5,0,0,24.5,64.5,"",0,0,0,0,1,0,0 -"Takers, The",1971,81,NA,3.2,5,24.5,0,24.5,0,44.5,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Taketori monogatari",1987,121,NA,6.3,35,14.5,4.5,0,0,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Taki no shiraito",1933,95,NA,7.7,22,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Takilleitor",1997,65,NA,3.8,9,44.5,24.5,0,0,0,14.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Takin' It All Off",1987,91,NA,4.3,69,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Takin' It Back to the Streets",1998,135,NA,8.6,15,14.5,0,0,0,0,0,0,4.5,4.5,74.5,"",1,0,1,0,0,0,0 -"Taking Care of Business",1990,107,NA,5.8,1120,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Taking Liberty",1993,96,NA,3.8,14,0,0,24.5,24.5,4.5,0,14.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Taking Lives",2004,109,NA,5.7,7533,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Taking Off",1971,93,NA,7.3,278,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Taking Sides",2001,142,NA,7.5,607,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Taking Tiger Mountain",1983,81,NA,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,0,0,0 -"Taking of Beverly Hills, The",1991,96,NA,4,167,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Taking of Christina, The",1976,90,NA,5.8,10,14.5,0,14.5,14.5,0,24.5,0,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Taking of Pelham One Two Three, The",1974,104,NA,7.6,2880,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Taking the Wheel",2002,10,NA,8,26,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Taking, The",2004,12,NA,8.3,10,0,0,14.5,0,14.5,14.5,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Tako se kalio celik",1988,101,NA,7,8,0,0,24.5,0,14.5,0,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Taksi",1990,90,NA,6.2,7,0,0,0,0,24.5,0,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Taksi-Blyuz",1990,110,NA,7,156,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Takt og tone i himmelsengen",1972,85,NA,4.9,21,0,14.5,4.5,14.5,24.5,14.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Tal der Ahnungslosen",2003,85,NA,4.2,7,14.5,0,44.5,0,0,0,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Tal der Schatten, Das",1999,93,NA,4.2,18,14.5,4.5,0,34.5,24.5,0,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Talaye sorkh",2003,95,NA,7.4,317,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tale of Five Cities, A",1951,86,NA,4,9,24.5,0,0,34.5,14.5,14.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Tale of Love, A",1995,108,NA,2.8,12,24.5,44.5,4.5,0,0,4.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Tale of Ruby Rose, The",1988,100,NA,7.8,19,0,0,0,4.5,4.5,14.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Tale of Sweety Barrett, The",1998,95,NA,6,30,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tale of Two Cities, A",1917,70,NA,5.4,9,14.5,0,0,24.5,14.5,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Tale of Two Cities, A",1935,121,NA,7.9,777,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tale of Two Cities, A",1958,117,NA,7,156,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tale of Two Kitties, A",1942,7,NA,7.4,55,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Tale of Two Mice, A",1945,7,NA,6.7,16,4.5,0,14.5,0,14.5,4.5,34.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Tale of Two Sisters",1989,89,NA,2.5,41,44.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,1,0,0,0 -"Tale of Two Sisters, A",2004,15,NA,8,32,4.5,4.5,0,4.5,0,4.5,4.5,14.5,14.5,45.5,"R",0,0,0,1,0,0,1 -"Tale of a Tiger",1984,80,NA,3.2,8,14.5,14.5,14.5,14.5,24.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Tale of a Trotter",1956,8,NA,5.2,5,0,0,0,24.5,44.5,24.5,24.5,0,0,0,"",0,0,0,0,1,0,1 -"Tale of a Vampire",1992,93,NA,4.6,139,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Tale of the Floating World, The",2001,24,NA,8,15,0,0,0,0,0,0,34.5,14.5,44.5,4.5,"",0,1,0,1,0,0,1 -"Tale of the Mummy",1998,119,8000000,3.7,570,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Tale of the Navajos",1949,52,NA,4.1,5,24.5,0,0,0,24.5,64.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Tale of the Rat That Wrote, The",1999,14,NA,6,20,4.5,0,0,4.5,14.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Tale of the Three Lost Jewels, The",1994,107,NA,7.3,20,0,4.5,24.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tale of the Vienna Woods",1934,8,NA,9,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,1,0,0,0,0,1 -"Talent Given Us, The",2004,98,NA,6.9,11,0,0,4.5,4.5,0,4.5,14.5,0,4.5,44.5,"",0,0,1,1,0,0,0 -"Talent for Loving, A",1969,110,NA,4.8,28,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Talent for the Game",1991,91,NA,5.6,189,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Talented Mr. Ripley, The",1999,139,40000000,7,25974,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Tales From the Vienna Woods",1992,3,NA,6.7,24,0,0,4.5,0,4.5,24.5,24.5,14.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Tales That Witness Madness",1973,90,NA,4.5,60,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tales from a Hard City",1995,80,NA,6.8,11,4.5,0,0,4.5,0,4.5,4.5,34.5,4.5,14.5,"",0,0,1,0,1,0,0 -"Tales from the Crypt",1972,97,NA,6.1,492,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tales from the Darkside: The Movie",1990,93,NA,5.5,1113,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tales from the Gimli Hospital",1988,72,NA,7.1,206,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tales from the Hood",1995,98,6000000,5.1,548,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Tales of Beatrix Potter",1971,90,NA,6.8,44,4.5,0,0,0,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Tales of Hoffmann, The",1951,128,NA,7.8,156,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Tales of Manhattan",1942,127,NA,7.4,247,4.5,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Tales of Terror",1962,89,NA,6.5,511,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tales of an Island",2000,76,NA,5.5,12,0,0,4.5,14.5,14.5,0,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Tales of the Bronx",1970,22,NA,6.5,5,0,24.5,0,0,0,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Talgo",1983,100,NA,7,9,0,0,0,0,14.5,14.5,34.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Talisman",1998,72,NA,2.9,92,24.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Talk",1994,87,NA,4.2,15,4.5,24.5,0,0,24.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Talk 16",1991,114,NA,6.6,26,14.5,0,0,0,4.5,14.5,4.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Talk About a Stranger",1952,65,NA,6.8,55,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Talk Dirty to Me",1980,78,NA,5.2,42,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Talk Dirty to Me, Part II",1982,80,NA,3.5,16,14.5,14.5,4.5,14.5,0,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Talk Dirty to Me, Part III",1984,90,NA,5.6,49,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Talk Radio",1988,110,4000000,6.9,2080,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Talk of Angels",1998,96,NA,6.5,225,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Talk of a Million",1951,73,NA,3.7,9,24.5,14.5,14.5,24.5,14.5,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Talk of the Town, The",1942,118,NA,7.6,744,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Talk to Taka",2000,12,100000,3.7,37,4.5,4.5,0,4.5,0,4.5,0,14.5,4.5,45.5,"",0,0,1,0,0,1,1 -"Talk with Hitchcock, A",1964,52,NA,7.7,43,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Talkin' Dirty After Dark",1991,89,NA,4.5,49,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Talking Cock the Movie",2002,90,NA,7.9,23,0,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Talking Dessert",1997,28,NA,6.8,5,24.5,0,0,24.5,0,0,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Talking Head",1992,105,NA,7,25,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Talking Magpies, The",1946,6,NA,5.6,17,4.5,0,0,4.5,14.5,4.5,44.5,4.5,0,24.5,"",0,1,0,0,0,0,1 -"Talking Walls",1987,85,NA,1.8,21,34.5,44.5,14.5,4.5,0,4.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Talking to Strangers",1988,90,NA,7.5,6,0,0,0,34.5,0,0,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Talking with Angels",2003,18,NA,5.3,31,4.5,4.5,0,0,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Tall Guy, The",1989,92,NA,6.1,1299,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Tall Man Riding",1955,83,NA,5.6,25,0,4.5,0,24.5,24.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Tall Men, The",1955,122,NA,5.9,150,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tall Story",1960,91,NA,5.8,125,14.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tall Stranger, The",1957,81,NA,5.7,25,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tall T, The",1957,78,NA,7.6,178,0,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tall Tale",1995,98,32000000,4.8,383,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tall Target, The",1951,78,NA,7.3,134,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tall Texan, The",1953,84,NA,6.3,25,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tall Timbers",1940,89,NA,6.5,6,0,0,0,14.5,0,0,84.5,0,0,0,"",0,0,0,0,0,0,0 -"Tall in the Saddle",1944,87,NA,6.6,297,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Tall in the Trap",1962,8,NA,3.1,18,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Tall, Dark and Handsome",1941,78,NA,6.7,11,0,0,0,0,4.5,4.5,24.5,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Tall, Tan, and Terrific",1946,40,NA,6,5,0,0,0,24.5,0,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Talmen",2002,11,NA,7.3,10,0,0,0,0,14.5,14.5,44.5,24.5,24.5,0,"",0,0,0,1,0,0,1 -"Talvisota",1989,195,NA,7.7,1114,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Tam Lin",1970,106,NA,5.3,22,0,4.5,0,0,34.5,4.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Tam i z powrotem",2002,102,NA,6.4,25,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Tam, na nevedomykh dorozhkakh...",1982,69,NA,8.8,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Tama, To",2000,153,NA,6.9,20,0,4.5,4.5,0,0,4.5,24.5,24.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Tamago",2004,32,NA,8.7,7,0,0,0,0,0,0,14.5,14.5,45.5,14.5,"",0,0,0,1,0,0,1 -"Tamahine",1963,95,NA,6.7,15,0,0,0,4.5,4.5,0,0,4.5,64.5,24.5,"",0,0,1,0,0,0,0 -"Tamaiti, O",1996,15,NA,8.8,5,0,0,0,0,0,0,0,24.5,84.5,0,"",0,0,0,0,0,0,1 -"Tamala 2010",2002,92,NA,5.9,98,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,1,0,1,0,0,0 -"Tamango",1957,98,NA,6.5,18,0,0,4.5,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tamara",2004,75,NA,7.6,25,0,0,4.5,4.5,4.5,4.5,4.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Tamarind Seed, The",1974,119,NA,5.8,218,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Tamaro",1999,85,NA,5.6,13,0,0,0,4.5,14.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Taming Power of the Small, The",1995,30,NA,5,6,14.5,0,0,0,34.5,0,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Taming of Rebecca, The",1982,76,NA,4.9,8,0,14.5,0,0,0,0,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Taming of the Shrew, The",1908,17,NA,5.1,5,24.5,0,0,0,24.5,24.5,0,24.5,0,24.5,"",0,0,1,0,0,0,1 -"Taming of the Shrew, The",1929,63,504000,6.2,41,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Taming of the Shrew, The",1967,122,4000000,6.9,612,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Taming of the West, The",1939,55,NA,5.7,5,0,0,0,24.5,24.5,44.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Tammy Tell Me True",1961,97,NA,5.2,105,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tammy and the Bachelor",1957,89,NA,6.3,295,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Tammy and the Doctor",1963,88,NA,4.7,96,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tammy and the Millionaire",1967,87,NA,4.5,24,4.5,4.5,4.5,24.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Tammy and the T-Rex",1994,82,NA,2.4,348,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tamna je noc",1995,110,NA,8.5,18,14.5,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Tamo i natrag",1978,93,NA,6.9,5,0,0,0,0,0,24.5,84.5,0,0,0,"",0,0,0,1,0,0,0 -"Tamozhnya",1982,78,NA,5.5,6,0,0,14.5,0,34.5,34.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Tampico",1944,75,NA,6.8,12,0,0,0,4.5,14.5,4.5,24.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Tampopo",1985,114,NA,7.7,2845,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Tan de repente",2002,92,NA,6.7,197,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Tanase Scatiu",1976,115,NA,6.4,5,24.5,0,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Tancul",2003,67,NA,6.2,9,34.5,0,0,0,0,14.5,0,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Tandem",1987,86,NA,7.4,155,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Tandem",1994,60,NA,5.2,15,0,24.5,4.5,0,24.5,14.5,0,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tandil Forever",2003,74,NA,8.4,6,0,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,0,0,1,0,0 -"Tang ren jie xiao zi",1977,115,NA,6.2,26,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Tang shan da xiong",1971,115,100000,6.3,1468,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Tanganyika",1954,81,NA,5.7,20,0,0,0,14.5,34.5,24.5,24.5,14.5,0,0,"",1,0,0,1,0,0,0 -"Tangents",1994,89,NA,1.8,779,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tangier",1946,74,NA,4.6,5,0,0,24.5,44.5,24.5,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Tangier Cop",1997,96,NA,7.3,6,0,0,0,0,14.5,34.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tangiers",1982,96,NA,4.5,9,0,0,0,34.5,24.5,0,14.5,0,34.5,0,"",1,0,0,0,0,0,0 -"Tangled",2001,86,NA,5.5,467,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Tangled Destinies",1932,56,NA,5.4,14,4.5,0,0,4.5,4.5,24.5,0,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tangna",1973,88,NA,8.9,11,0,0,0,4.5,0,0,4.5,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Tango",1981,8,NA,8,131,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Tango",1993,88,NA,6.6,275,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Tango & Cash",1989,104,55000000,5.4,7657,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Tango Bar",1988,90,NA,6.2,66,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tango Bayle nuestro",1988,70,NA,8.4,8,24.5,0,0,0,0,0,0,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Tango Jalousie",1996,5,NA,5.1,5,0,0,0,24.5,0,84.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Tango Kabaree",2001,95,NA,4.7,20,24.5,14.5,4.5,24.5,14.5,24.5,0,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Tango Lesson, The",1997,100,NA,6.3,615,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"PG",0,0,0,1,0,1,0 -"Tango Tangles",1914,12,NA,5.9,60,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Tango argentino",1992,91,NA,6.1,35,4.5,0,0,0,4.5,14.5,4.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Tango des Rashevski, Le",2003,100,NA,6.2,100,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Tango feroz: la leyenda de Tanguito",1993,124,NA,6.6,181,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tango je tuzna misao koja se plese",1997,90,NA,4.3,5,0,0,0,44.5,0,0,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Tango, no me dejes nunca",1998,126,NA,6.8,696,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Tangos, l'exil de Gardel",1985,119,NA,7.5,111,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Tangsir",1974,112,NA,7.3,13,0,0,4.5,4.5,14.5,0,34.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Tanguy",2001,109,NA,6.5,1048,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Tani tatuwen piyabanna",2002,81,NA,6.3,22,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tanin no kao",1966,124,NA,8.3,69,0,0,4.5,0,0,0,24.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Tank",1984,110,NA,4.9,688,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Tank 'Klim Voroshilov-2'",1990,99,NA,7.9,20,0,0,0,0,0,0,14.5,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Tank Battalion",1958,80,NA,4.4,13,24.5,24.5,0,24.5,14.5,4.5,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Tank Commandos",1959,79,NA,3.8,23,14.5,14.5,4.5,14.5,24.5,4.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Tank Girl",1995,104,25000000,4.6,4400,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Tank Malling",1989,96,NA,3.6,11,14.5,0,4.5,24.5,24.5,4.5,0,0,4.5,0,"",0,0,0,1,0,0,0 -"TankUp.US",2003,11,NA,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,1,0,1 -"Tankovy prapor",1991,83,NA,7.2,43,0,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tanks Are Coming, The",1941,20,NA,5.5,16,0,0,14.5,14.5,0,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Tanks Are Coming, The",1951,90,NA,5.8,24,0,0,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Tanks a Million",1941,50,NA,8.3,8,0,0,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Tannenberg",1932,100,NA,6.1,5,0,0,24.5,24.5,24.5,0,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Tano da morire",1997,80,NA,5.7,43,14.5,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tanssi yli hautojen",1950,101,NA,4.7,10,0,0,34.5,24.5,24.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Tant qu'il y aura des femmes",1987,86,NA,5.2,8,0,0,0,14.5,34.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Tantalizing Fly, The",1919,4,NA,6,8,0,0,0,14.5,0,24.5,45.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Tante Pose",1940,92,NA,6.3,44,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Tante Trude aus Buxtehude",1971,87,NA,2.2,28,34.5,24.5,14.5,4.5,4.5,0,0,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Tante Zita",1968,92,NA,5,19,0,0,0,14.5,0,14.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Tantei monogatari",1983,111,NA,5.8,8,0,0,14.5,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Tanto tiempo",1992,26,NA,3.7,15,0,24.5,24.5,0,24.5,4.5,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Tanya's Island",1980,90,NA,4.3,48,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tao of Pong, The",2004,22,NA,8.3,18,0,0,0,0,0,0,4.5,0,14.5,84.5,"",0,0,1,0,0,0,1 -"Tao of Steve, The",2000,81,NA,6.8,2524,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,1,0 -"Tap",1989,111,NA,6.2,255,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Tap Roots",1948,109,NA,6.3,37,4.5,4.5,0,14.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tapage nocturne",1979,97,NA,4.8,7,14.5,0,14.5,0,0,24.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Tape",2001,86,NA,7.2,2976,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Tapeheads",1988,93,NA,5.8,743,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tapfere Schneiderlein, Das",1942,73,NA,5.1,6,0,0,0,0,64.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Tapped Out",2001,95,NA,6.2,6,14.5,0,0,14.5,14.5,0,0,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Taps",1981,126,NA,6.4,2568,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Taqueria, La",2003,82,NA,6.3,20,24.5,4.5,4.5,0,0,24.5,4.5,4.5,14.5,34.5,"R",0,0,1,0,0,0,0 -"Tar",1997,90,NA,5.7,10,34.5,0,0,0,0,24.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Taralezhite se razhdat bez bodli",1971,84,NA,8.1,8,0,0,0,0,0,0,14.5,14.5,0,74.5,"",0,0,1,0,0,0,0 -"Tarang",1984,171,NA,8.8,8,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,0,0,0,0 -"Tarantella",1996,100,NA,5.8,46,14.5,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Tarantola dal ventre nero, La",1971,89,NA,5.8,28,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Tarantos, Los",1963,83,NA,6.6,28,0,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tarantula",1955,80,NA,6.3,769,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tarantulas and Other Conveniences",1999,107,NA,8.7,6,0,0,14.5,0,0,0,0,0,14.5,64.5,"",0,0,0,1,0,0,0 -"Taras Bulba",1962,124,7000000,6,412,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Tarawa Beachhead",1958,77,NA,6.8,8,0,0,0,0,14.5,34.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Tarde Demais",2000,95,NA,6.5,31,0,0,0,14.5,4.5,4.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Tarde de toros",1956,75,NA,5.5,6,0,0,0,14.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Tarde de un matrimonio de clase media, La",1995,3,NA,8.7,7,0,0,0,0,0,0,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,1 -"Tarea prohibida, La",1992,80,NA,5.6,24,14.5,0,0,0,4.5,24.5,24.5,4.5,0,24.5,"",0,0,1,1,0,0,0 -"Tarea, La",1991,85,NA,7,118,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Tarfaya",2004,97,NA,6.5,11,0,4.5,0,4.5,0,45.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Target",1995,122,NA,3,12,24.5,0,14.5,0,0,0,0,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Target",2004,84,NA,2.4,131,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Target Audience",2002,12,NA,6.5,28,4.5,4.5,0,0,4.5,0,4.5,4.5,34.5,45.5,"",0,0,1,0,0,0,1 -"Target Earth",1954,75,85000,5.8,106,4.5,4.5,0,14.5,14.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Target Shoots First, The",2000,70,NA,6.7,67,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,1,0,0 -"Target Tokyo",1945,22,NA,2.1,16,45.5,14.5,0,0,0,0,14.5,14.5,0,4.5,"",0,0,0,0,1,0,1 -"Target Unknown",1951,90,NA,6.7,12,4.5,0,0,4.5,4.5,24.5,24.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Target Zero",1955,92,NA,5.5,19,14.5,0,0,4.5,14.5,14.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Target for Tonight",1941,48,NA,8.6,26,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,1,0,0 -"Target of Opportunity",2004,90,NA,6.5,16,14.5,4.5,0,4.5,4.5,0,4.5,0,0,45.5,"R",1,0,0,1,0,0,0 -"Target of Seduction",1995,87,NA,3.7,12,14.5,4.5,24.5,4.5,14.5,0,0,4.5,0,14.5,"R",0,0,0,1,0,0,0 -"Target of an Assassin",1976,105,NA,5.5,28,14.5,4.5,4.5,14.5,14.5,4.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Target: Harry",1969,81,NA,3.3,20,14.5,14.5,14.5,24.5,14.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Targets",1968,90,130000,7.4,793,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Tarheels and Short Skirts",2003,53,NA,9.2,5,0,0,0,0,0,24.5,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Tarifa Traffic: Death in the Straits of Gibraltar",2003,60,NA,7.2,8,0,0,14.5,0,14.5,0,0,64.5,0,14.5,"",0,0,0,0,1,0,0 -"Tarik El Hob",2001,70,NA,7.5,48,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Taris, roi de l'eau",1931,10,NA,5.8,46,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Tarka the Otter",1979,87,NA,6.4,46,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tarnation",2003,88,0,7.7,596,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Tarnished Angel",1938,67,NA,4.5,12,0,4.5,14.5,14.5,14.5,4.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Tarnished Angels, The",1958,91,NA,7.5,212,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tarnished Lady",1931,83,NA,5.9,12,0,0,0,4.5,14.5,4.5,24.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Tarnovskata tzaritza",1981,97,NA,8.1,8,0,0,0,0,0,0,0,24.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Tarpan",1994,140,NA,7,7,0,0,0,14.5,0,0,45.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Tars and Spars",1946,86,NA,7.5,11,0,0,0,0,0,4.5,0,4.5,4.5,74.5,"",0,0,0,0,0,0,0 -"Tars and Stripes",1935,20,NA,6.7,8,0,0,0,24.5,0,24.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Tarsi se saprug za mama",1985,88,NA,8,5,0,0,0,0,0,24.5,0,64.5,0,24.5,"",0,0,0,0,0,0,0 -"Tart",2001,94,3300000,4.6,714,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Tartari, I",1961,83,NA,4.7,32,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Tartassati, I",1959,105,NA,7.7,48,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Tarts and Flowers",1950,7,NA,6,12,0,0,0,4.5,4.5,14.5,4.5,24.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Tartuffe, Le",1984,140,NA,7.1,29,0,0,0,4.5,4.5,24.5,34.5,44.5,0,0,"",0,0,1,1,0,0,0 -"Tarva yeghanakner",1975,29,NA,8.1,21,0,0,0,0,4.5,0,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Tarz and Jane and Boy and Cheeta",1976,80,NA,7.6,5,24.5,0,0,0,24.5,0,24.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Tarzan",1999,88,150000000,7.1,10672,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Tarzan Escapes",1936,90,NA,6.3,290,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan Finds a Son!",1939,82,NA,6.4,315,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan Goes to India",1962,88,NA,4.6,62,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tarzan Mama-Mia",1989,85,NA,5.2,59,4.5,4.5,4.5,24.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tarzan Triumphs",1943,76,NA,5.8,174,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan and His Mate",1934,104,1279000,7.4,538,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan and the Amazons",1945,76,NA,6.2,206,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan and the Golden Lion",1927,57,NA,4.1,9,24.5,0,14.5,44.5,0,0,14.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Tarzan and the Great River",1967,88,NA,5.3,40,0,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan and the Green Goddess",1938,72,NA,5.1,88,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan and the Huntress",1947,72,NA,5.7,144,0,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan and the Jungle Boy",1968,99,NA,5.2,51,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tarzan and the Leopard Woman",1946,72,NA,6.1,202,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan and the Lost City",1998,83,20000000,3.6,510,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"PG",1,0,0,0,0,0,0 -"Tarzan and the Lost Safari",1957,80,NA,5.4,73,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tarzan and the Mermaids",1948,68,1000000,5.5,177,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan and the She-Devil",1953,75,NA,4.7,60,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan and the Slave Girl",1950,74,NA,5.1,55,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tarzan and the Trappers",1958,70,NA,4.4,56,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Tarzan and the Valley of Gold",1966,90,NA,6,50,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan of the Apes",1918,55,NA,5.9,60,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan the Ape Man",1932,99,NA,6.9,729,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan the Fearless",1933,85,NA,4.5,147,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan the Magnificent",1960,82,NA,5.6,98,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan's Deadly Silence",1970,88,NA,4.8,16,0,0,14.5,0,34.5,34.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Tarzan's Desert Mystery",1943,70,NA,6.3,168,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan's Fight for Life",1958,86,NA,4.8,63,4.5,4.5,14.5,4.5,34.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tarzan's Greatest Adventure",1959,88,NA,5.8,167,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan's Hidden Jungle",1955,72,NA,5.4,69,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan's Jungle Rebellion",1967,94,NA,5.3,7,0,0,0,14.5,45.5,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Tarzan's Magic Fountain",1949,73,NA,5.3,54,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tarzan's New York Adventure",1942,71,NA,6.6,313,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan's Peril",1951,78,NA,5.5,50,4.5,0,4.5,4.5,34.5,24.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tarzan's Revenge",1938,70,NA,4.9,112,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan's Savage Fury",1952,81,NA,5.3,37,4.5,0,0,24.5,24.5,4.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tarzan's Secret Treasure",1941,81,NA,6.3,220,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tarzan's Three Challenges",1963,92,NA,5.2,58,4.5,14.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tarzan, the Ape Man",1959,82,NA,3.6,45,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Tarzan, the Ape Man",1981,107,NA,3,1256,34.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tarzana, sesso selvaggio",1969,87,NA,4,15,14.5,4.5,14.5,24.5,0,4.5,4.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Tarzoon, la honte de la jungle",1975,79,NA,4.7,150,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Taschenorgan, Das",2000,11,NA,7.4,28,0,0,0,0,0,14.5,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Tashunga",1996,88,NA,4.4,234,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Tasio",1984,95,NA,7.2,62,4.5,0,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Tasjesdief, De",1995,96,NA,6.6,73,4.5,0,0,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tasogare Seibei",2002,129,NA,8.2,1829,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Tasogare sakaba",1955,94,NA,8.2,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,0,1,0,0,0 -"Tassels in the Air",1938,17,NA,8,74,0,4.5,0,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Tassinaro a New York, Un",1987,115,NA,4.5,20,4.5,14.5,4.5,24.5,14.5,4.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Taste",2001,22,NA,6.1,10,0,0,0,14.5,24.5,44.5,24.5,14.5,0,0,"",0,0,1,1,0,0,1 -"Taste of Blood, A",1967,117,65000,2.4,44,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Taste of Catnip, A",1966,6,NA,5.8,18,0,0,4.5,0,24.5,24.5,24.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Taste of Excitement",1969,99,NA,7.8,7,0,0,14.5,0,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Taste of Hell, A",1973,90,NA,3.8,19,24.5,14.5,4.5,14.5,24.5,0,4.5,0,0,24.5,"",1,0,0,1,0,0,0 -"Taste of Her Flesh, A",1967,73,NA,1.9,7,45.5,0,0,0,0,0,0,0,24.5,14.5,"",0,0,0,1,0,0,0 -"Taste of Honey, A",1961,100,NA,8,316,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Taste of Money, A",1983,85,NA,5.7,7,0,0,14.5,0,24.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Taste the Blood of Dracula",1970,91,NA,5.4,345,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"Taste the Sweat!",1997,13,NA,9.3,6,0,0,0,0,0,0,0,0,45.5,45.5,"",0,0,1,0,0,0,1 -"Tasty",1999,14,NA,9.6,7,0,0,0,0,0,0,14.5,0,0,84.5,"",0,0,1,0,0,0,1 -"Tasty Bust Reunion, The",2004,52,NA,7.8,11,0,0,0,0,0,34.5,4.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Tatar Ramazan",1990,95,NA,9,13,4.5,0,0,0,0,0,0,4.5,14.5,64.5,"",0,0,0,1,0,1,0 -"Tatarin",2001,60,NA,7.3,7,0,0,24.5,0,0,14.5,0,0,14.5,44.5,"",0,0,0,1,0,1,0 -"Tatawo",2000,90,NA,3.5,6,64.5,0,0,0,0,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Tatie Danielle",1990,112,NA,7.1,507,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tatlo... magkasalo",1998,86,NA,3,5,24.5,0,44.5,0,44.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Tattered Dress, The",1957,93,NA,6.7,27,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tattoo",1981,103,NA,4.8,151,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tattoo",2002,108,NA,6.5,564,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tattoo Ari",1982,107,NA,7.4,5,0,0,0,0,24.5,0,44.5,24.5,0,24.5,"",0,0,0,1,0,1,0 -"Tattooed Stranger, The",1950,64,124000,6.5,61,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Taugenichts",1978,91,NA,4.5,7,0,0,14.5,24.5,14.5,14.5,0,0,0,24.5,"",0,0,1,0,0,1,0 -"Taule, La",2000,90,NA,4.8,8,0,0,24.5,14.5,14.5,0,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Taur, il re della forza bruta",1960,89,NA,2.6,14,34.5,24.5,0,4.5,4.5,4.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Taureau",1973,98,NA,7.2,7,0,0,0,14.5,14.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Tauro",2002,4,NA,5.9,9,0,0,14.5,0,0,14.5,24.5,0,14.5,44.5,"",0,1,0,0,0,0,1 -"Tause flertall, Det",1977,91,NA,6.4,11,14.5,0,0,4.5,14.5,4.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Tausend Augen",1984,85,NA,4.2,18,0,24.5,14.5,14.5,0,24.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Tausend Augen des Dr. Mabuse, Die",1960,103,NA,6.2,242,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tauw",1970,24,NA,7,8,0,0,0,0,24.5,0,45.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Tavalod-E Parvaneh",1998,110,NA,8.2,5,0,0,0,0,24.5,0,0,24.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Tavaratalo Lapatossu & Vinski",1940,110,NA,4,6,0,0,34.5,14.5,14.5,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Tavern, The",1999,95,NA,5.3,53,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tawipop",2004,150,NA,5.7,13,0,0,4.5,0,24.5,4.5,4.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tawny Pipit, The",1944,81,NA,6.2,21,0,4.5,0,0,0,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tax Day",1998,76,NA,7.6,11,0,14.5,0,0,0,4.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Taxa K 1640 efterlyses",1956,96,NA,5.9,6,0,0,0,14.5,34.5,0,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Taxandria",1996,90,NA,6.5,89,0,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Taxi",1953,77,NA,6.7,8,0,0,0,14.5,14.5,0,0,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Taxi",1996,112,NA,7.1,231,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Taxi",1998,86,NA,6.7,6191,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,1,0,0,0,0 -"Taxi 2",2000,88,NA,6.1,3847,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Taxi 3",2003,87,NA,5.2,2047,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Taxi Driver",1976,110,1300000,8.5,47873,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Taxi Girls",1980,82,NA,4.4,25,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Taxi Service",1996,12,NA,8.6,5,0,0,0,0,0,0,44.5,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Taxi Tangle",1931,10,NA,6.8,7,0,14.5,0,0,0,14.5,45.5,0,0,14.5,"",0,0,1,0,0,0,1 -"Taxi for Two",1932,20,NA,4.2,5,0,44.5,24.5,24.5,0,0,24.5,0,0,0,"",0,0,1,0,0,0,1 -"Taxi nach Kairo",1987,90,NA,5.5,10,0,0,14.5,0,44.5,34.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Taxi para tres",2001,90,NA,7.1,165,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Taxi to L.A.",1997,78,NA,6.8,14,4.5,0,0,0,14.5,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Taxi zum Klo",1981,98,NA,6.9,132,4.5,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Taxi!",1932,69,NA,6.5,98,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Taxi, Roulotte et Corrida",1958,86,NA,5.4,23,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Taxi, un encuentro",2001,90,NA,7.5,38,0,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Taxi-Turvy",1954,6,NA,5.4,18,0,0,14.5,4.5,24.5,14.5,14.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Taxidi sta Kithira",1984,120,NA,8.6,103,4.5,4.5,4.5,4.5,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Taxidi, To",1962,92,NA,9,14,0,4.5,0,0,0,0,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Taxman, The",1999,104,1000000,5.7,169,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Taylor Made",1989,82,NA,7.3,5,0,0,0,24.5,0,0,44.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Taylor's Return",1997,92,NA,1.9,23,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Tayna chyornykh drozdov",1983,97,NA,7.3,18,0,0,0,14.5,0,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tayna tretey planety",1981,48,NA,8.6,73,0,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,1,0,0,0,0,0 -"Tayna zheleznoy dveri",1970,69,NA,6.1,5,0,0,0,0,0,44.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Tayny madam Vong",1986,91,NA,2.6,14,24.5,34.5,24.5,0,14.5,0,0,0,0,4.5,"",1,0,0,0,0,0,0 -"Taza, Son of Cochise",1954,79,NA,5.3,52,4.5,0,4.5,4.5,24.5,34.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Tchao pantin",1983,100,NA,7.5,250,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tcherike-ye Tara",1979,110,NA,8.6,5,0,0,0,0,0,0,24.5,44.5,0,44.5,"",0,0,0,0,0,0,0 -"Tchou-tchou",1972,14,NA,8.4,7,0,0,0,0,0,0,24.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Te Gek Om Los te Lopen",1981,94,NA,4.7,5,0,0,0,24.5,24.5,44.5,0,24.5,0,0,"",0,0,1,1,0,0,0 -"Te Rua",1991,96,NA,7.8,6,14.5,0,0,0,0,0,0,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Te amo (made in Chile)",2001,102,NA,7.4,90,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Te deum",1972,99,NA,5.3,15,4.5,4.5,14.5,14.5,0,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Te doy mis ojos",2003,107,NA,7.5,582,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Te quiero",2001,85,NA,5,26,4.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Te rompo el rating",1981,79,NA,4.3,17,4.5,4.5,0,14.5,4.5,4.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Te'alat Blaumilch",1970,89,NA,8.2,80,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Tea and Sympathy",1956,122,NA,7.2,224,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tea for Two",1950,98,NA,6.4,195,4.5,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tea for Two Hundred",1948,6,NA,8.1,27,0,0,0,4.5,0,14.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Tea with Grandma",2001,22,NA,8.2,11,0,0,0,0,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,1,1,0,0,1 -"Tea with Mussolini",1999,117,12000000,6.7,2711,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,1,0,0,0 -"Tea with Tiffany",2003,6,10000,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Teach",2001,34,NA,8,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Teach Me",1998,90,NA,3.9,28,24.5,4.5,14.5,14.5,14.5,0,24.5,0,0,4.5,"R",0,0,0,0,0,0,0 -"Teach Me Tonight",1997,92,NA,4.7,56,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Teacher's Pet",1930,20,NA,8,43,0,0,0,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Teacher's Pet",1958,120,NA,7,425,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Teacher's Pet",2004,74,10000000,5.6,218,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,1,1,0,0,0,0 -"Teacher, The",1974,98,NA,2.6,28,34.5,4.5,24.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Teachers",1984,106,NA,5.6,853,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Teaching Mrs. Tingle",1999,96,13000000,5,5244,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Teahouse of the August Moon, The",1956,123,NA,6.6,455,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Team America: World Police",2004,98,30000000,7.3,13104,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",1,0,1,0,0,0,0 -"Team-Mates",1978,84,NA,8.3,7,0,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Tear Gas Squad",1940,55,NA,5.6,35,4.5,0,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tears",1998,15,NA,4,8,0,0,64.5,14.5,0,14.5,14.5,0,0,0,"",0,0,0,1,0,0,1 -"Tears Are Not Enough",1985,84,NA,6.2,8,0,0,0,14.5,0,34.5,24.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Tears of Kali",2004,110,NA,5.7,82,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tears of a Lotus",1998,10,NA,6.4,21,0,0,0,0,4.5,0,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Tears of the Sun",2003,121,70000000,6.2,8690,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Tease for Two",1965,6,NA,6.4,23,0,4.5,0,4.5,14.5,14.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Teaserama",1955,69,NA,5.3,32,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Teatertosset",1944,96,NA,5.7,8,0,0,14.5,14.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Teatro di guerra",1998,113,NA,6,31,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Technical Writer, The",2003,96,NA,2.1,73,45.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Technological Threat",1988,7,NA,7.6,30,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Techo de cristal, El",1971,92,NA,6.1,7,0,0,0,0,24.5,0,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Techo del mundo, El",1995,85,NA,8.1,7,0,0,0,0,0,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Teckman Mystery, The",1954,90,NA,4.8,7,0,0,0,45.5,14.5,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Tecnica di un omicidio",1966,95,NA,6.1,11,0,0,0,4.5,4.5,0,44.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Tectonic Plates",1992,106,NA,4.5,9,34.5,0,14.5,0,14.5,0,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Ted",1998,85,NA,8.4,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Ted Bundy",2002,99,1200000,5.2,852,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Ted and Venus",1991,100,NA,4.3,53,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Teddy Bears' Christmas",1993,30,NA,8.1,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,1,0,0,0,0,1 -"Teddy Bears' Picnic",2002,80,NA,3.4,220,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Teddy at the Throttle",1917,18,NA,7.5,19,0,0,0,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Teddy boy agapi mou",1965,80,NA,6.9,8,0,0,14.5,0,14.5,24.5,24.5,24.5,0,0,"",0,0,1,0,0,1,0 -"Teddy the Rough Rider",1940,19,NA,7.4,10,0,0,0,0,0,34.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Tee for Two",1945,7,NA,7.4,41,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Teekond nirvaanasse",2000,13,NA,8,7,0,14.5,0,14.5,0,0,0,45.5,0,14.5,"",0,1,0,0,0,0,1 -"Teen Kanya",1961,173,NA,7.8,87,0,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Teen Lust",1979,89,NA,3.1,33,24.5,14.5,4.5,14.5,4.5,4.5,4.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Teen Sorcery",1999,90,NA,3.9,57,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",0,0,1,0,0,0,0 -"Teen Witch",1989,90,NA,5.5,537,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Teen Wolf",1985,91,NA,5.3,4820,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Teen Wolf Too",1987,95,3000000,2.7,2209,34.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Teen-Age Crime Wave",1955,77,NA,2.3,48,44.5,14.5,14.5,4.5,4.5,0,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Teen-Age Strangler",1968,61,NA,2.3,76,44.5,14.5,4.5,4.5,0,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"TeenAlien",1978,88,NA,1.6,14,45.5,14.5,14.5,14.5,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Teenage Bonnie and Klepto Clyde",1993,90,NA,4.2,138,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Teenage Catgirls in Heat",1997,84,NA,3.3,92,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Teenage Cave Man",1958,65,70000,3.1,169,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Teenage Devil Dolls",1955,61,NA,2.7,40,24.5,14.5,14.5,0,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Teenage Doll",1957,71,NA,3.7,30,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Teenage Father",1978,25,NA,5.2,7,14.5,0,0,0,14.5,14.5,14.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Teenage Gang Debs",1966,75,NA,3.4,27,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Teenage Millionaire, The",1961,84,NA,4.2,28,14.5,4.5,14.5,4.5,24.5,14.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Teenage Monster",1958,65,57000,3.3,59,24.5,14.5,4.5,4.5,0,14.5,0,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Teenage Mother",1967,78,NA,3.7,14,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Teenage Mutant Ninja Turtles",1990,93,13500000,5.5,6946,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Teenage Mutant Ninja Turtles II: The Secret of the Ooze",1991,88,25000000,4.6,3429,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Teenage Mutant Ninja Turtles III",1993,96,NA,4.1,2075,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,1,0,0,0,0,0 -"Teenage Rebel",1956,90,NA,5.6,46,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Teenage Space Vampires",1998,90,NA,2.4,55,34.5,4.5,34.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"PG",1,0,0,0,0,0,0 -"Teenage Thunder",1957,78,46000,4.5,6,0,34.5,0,0,14.5,14.5,0,0,0,34.5,"",0,0,0,1,0,0,0 -"Teenage Tupelo",1995,83,NA,7.2,19,0,0,0,4.5,0,4.5,0,24.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Teenage Twins",1976,67,NA,5,17,0,0,24.5,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Teenage Zombies",1959,73,NA,2.1,74,44.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Teenagers from Outer Space",1959,86,NA,3,391,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Teenagers on Trial",1955,19,NA,3,11,24.5,0,0,4.5,45.5,0,4.5,0,0,0,"",0,0,0,0,1,0,1 -"Teesh and Trude",2002,93,NA,5.1,22,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Teesra Kaun?",1994,160,NA,5,7,14.5,0,14.5,0,24.5,0,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Teesri Kasam",1966,159,NA,9,39,0,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Teesri Manzil",1966,172,NA,9,17,0,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Teeth",1996,26,NA,5.9,13,14.5,4.5,14.5,4.5,0,4.5,4.5,0,0,34.5,"",1,0,1,0,0,0,1 -"Tehran 7:00 a.m.",2003,85,500000,6.9,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Tehzeeb",2003,143,NA,7.3,47,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Teito monogatari",1988,135,NA,6.2,58,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tejing xinrenlei",1999,113,NA,6.1,495,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"R",1,0,1,0,0,0,0 -"Tejing xinrenlei 2",2000,120,NA,4.6,237,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Teken van het beest, Het",1980,98,NA,6.7,20,0,0,0,4.5,14.5,24.5,24.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Tekken",1990,128,NA,4.7,52,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Teknolust",2002,85,NA,5.1,259,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Telefantasy",1978,85,NA,4.2,5,44.5,0,24.5,24.5,0,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Telefon",1977,102,NA,6.4,724,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Telefoni bianchi",1976,120,NA,6.2,29,4.5,4.5,0,0,14.5,34.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Telefteo psemma, To",1957,104,NA,8.5,45,0,0,4.5,4.5,0,4.5,4.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Telegrafisten",1993,102,NA,6.5,183,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Telegram",2001,82,NA,6.2,20,14.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Telegraph Trail, The",1933,60,NA,4.3,41,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Telephone",2002,19,NA,2.3,24,4.5,4.5,0,0,4.5,0,0,0,4.5,84.5,"",0,0,0,0,0,0,1 -"Telephone, The",1988,96,NA,3,222,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Telets",2001,94,NA,6.3,57,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tell England",1931,80,NA,6.2,7,24.5,0,0,0,0,44.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Tell It to the Judge",1949,87,NA,6.7,19,0,0,0,0,24.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tell It to the Marines",1926,103,NA,7.6,85,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Tell Me If It Hurts",1934,20,NA,8,9,0,0,0,0,0,0,64.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Tell Me Lies",1968,118,NA,4.7,5,0,0,0,24.5,0,0,44.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Tell Me That You Love Me",1983,91,1000000,3.4,5,24.5,0,0,24.5,24.5,0,0,0,0,44.5,"",0,0,1,1,0,0,0 -"Tell Me That You Love Me, Junie Moon",1970,113,NA,6,116,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Tell No Tales",1939,69,NA,6.5,26,0,0,0,0,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tell Them Johnny Wadd Is Here",1975,74,12000,4.6,25,44.5,4.5,4.5,14.5,4.5,4.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Tell Them Who You Are",2004,95,NA,6.7,64,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,45.5,"R",0,0,0,0,1,0,0 -"Tell Them Willie Boy Is Here",1969,98,NA,6.1,325,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tell the Truth and Run: George Seldes and the American Press",1996,90,NA,8.8,30,4.5,0,4.5,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Tell-Tale Heart, The",1941,20,NA,7.1,74,4.5,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Tell-Tale Heart, The",1960,78,NA,6,23,0,0,4.5,4.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Telling Lies",2001,6,NA,6.4,11,0,0,0,4.5,14.5,14.5,4.5,14.5,24.5,0,"",0,1,1,1,0,0,1 -"Telling Lies in America",1997,101,4000000,6.4,646,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Telling Nicholas",2002,85,NA,6.8,90,4.5,0,4.5,0,4.5,0,4.5,4.5,4.5,84.5,"",0,0,0,1,0,0,0 -"Telling You",1998,94,NA,4.5,274,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Telmisseomding",1999,118,NA,6.7,575,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Telo y la tele, El",1985,108,NA,3.7,6,34.5,0,14.5,14.5,14.5,0,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Telos epochis",1994,98,NA,6.5,51,4.5,0,0,0,4.5,4.5,24.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Tema",1979,153,NA,4.6,26,4.5,4.5,0,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Tembelides tis eforis kiladas, I",1978,118,NA,7.1,14,0,0,14.5,0,4.5,0,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Temni angeli usode",1999,96,NA,6.5,10,14.5,0,14.5,14.5,14.5,0,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Temp, The",1993,99,15000000,4.9,668,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tempe Tip",2002,93,NA,4.7,8,34.5,0,0,0,14.5,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Tempest",1982,136,NA,6,474,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Tempest, The",1908,12,NA,6.2,8,0,0,0,0,14.5,34.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,1 -"Tempest, The",1979,95,NA,7.1,111,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tempest, The",1992,26,NA,7.2,9,0,0,0,0,0,24.5,14.5,34.5,24.5,14.5,"",0,1,1,1,0,0,1 -"Tempesta, La",1958,120,NA,5.4,30,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tempi duri per i vampiri",1959,85,NA,4,14,4.5,14.5,4.5,0,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tempi nostri",1954,134,NA,5.8,9,0,0,0,0,14.5,64.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Templer, Der",2002,23,NA,5.7,42,34.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,1 -"Tempo",2002,4,NA,5.9,18,0,4.5,0,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Tempo",2003,85,NA,4.7,192,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"Tempo degli assassini, Il",1975,102,NA,4.6,6,0,0,0,34.5,14.5,0,0,0,14.5,34.5,"",1,0,0,1,0,0,0 -"Tempo dell'amore, Il",1999,108,NA,5.7,28,0,0,14.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Tempo di Charleston - Chicago 1929",1969,85,NA,3.7,8,14.5,14.5,24.5,45.5,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Tempo di massacro",1966,93,NA,6,83,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tempo di uccidere",1990,110,NA,5,73,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Temporada de patos",2004,90,NA,7.9,215,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Temporale Rosy",1980,118,NA,3.8,25,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",1,0,1,1,0,1,0 -"Temporary Girl",1998,90,250000,7.5,21,0,0,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Temporary Widow, The",1930,84,NA,7.7,6,0,0,0,0,14.5,14.5,14.5,14.5,34.5,0,"",0,0,1,0,0,0,0 -"Temps",1999,93,NA,6.2,24,4.5,0,4.5,0,4.5,0,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Temps d'une chasse, Le",1972,98,NA,7.1,23,0,0,0,4.5,4.5,4.5,44.5,4.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Temps de vivre, Le",1969,100,NA,6.8,6,0,0,0,0,14.5,34.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Temps des bouffons, Le",1985,15,NA,7.1,55,4.5,4.5,0,4.5,4.5,4.5,0,14.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Temps des loups, Le",1969,105,NA,5.4,21,0,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Temps du loup, Le",2003,114,NA,6.4,557,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Temps qui changent, Les",2004,90,NA,6.5,96,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Temptation",1946,98,NA,6,12,0,0,0,0,14.5,14.5,45.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Temptations",1976,80,NA,4.7,5,0,0,0,44.5,0,24.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Tempted",2001,97,NA,5.4,246,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Temptress",1994,93,NA,3.9,94,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Temptress, The",1926,106,669000,7.3,62,0,4.5,4.5,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Tempus fugit",2001,13,NA,6.5,9,0,24.5,0,0,24.5,14.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Ten",2002,94,NA,7.3,482,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,1,0,0 -"Ten",2004,3,NA,5.3,5,0,24.5,0,0,44.5,0,0,24.5,24.5,0,"",0,0,1,0,0,0,1 -"Ten Cents a Dance",1931,75,NA,3.6,12,34.5,0,0,4.5,24.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Ten Commandments Number 10: Thou Shalt Not Covet Thy Neighbour's Wife, The",1996,10,NA,7.8,5,0,0,0,0,0,0,44.5,64.5,0,0,"",0,1,1,0,0,0,1 -"Ten Commandments Number 3: Remember to Keep Holy the Sabbath Day, The",1995,6,NA,7.6,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Ten Commandments Number 6: Thou Shalt Not Commit Adultery, The",1994,5,NA,7.4,5,0,0,0,0,24.5,24.5,24.5,44.5,0,0,"",0,1,1,0,0,0,1 -"Ten Commandments Number 7: Thou Shalt Not Steal, The",1994,5,NA,7.5,6,0,0,0,0,14.5,14.5,0,64.5,0,0,"",0,1,1,0,0,0,1 -"Ten Commandments Number 9: Thou Shalt Not Covet Thy Neighbour's Goods, The",1995,5,NA,7.6,5,0,0,0,0,24.5,0,24.5,64.5,0,0,"",0,1,1,0,0,0,1 -"Ten Commandments, The",1923,146,1800000,7.5,97,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ten Commandments, The",1956,220,13500000,7.7,8895,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ten Days to Tulara",1958,77,NA,3.8,5,0,24.5,24.5,0,44.5,24.5,0,0,0,0,"",1,0,0,0,0,0,0 -"Ten Gentlemen from West Point",1942,102,NA,6.3,37,0,0,4.5,4.5,14.5,14.5,4.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Ten Little Indians",1965,91,NA,6.4,304,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ten Little Indians",1989,98,NA,4.2,170,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ten Little Maidens",1985,88,NA,5.5,16,14.5,0,0,4.5,14.5,0,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Ten Minutes Older: The Cello",2002,146,NA,5.9,127,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Ten Minutes Older: The Trumpet",2002,92,NA,7.1,341,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ten North Frederick",1958,102,NA,6.8,124,4.5,0,0,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Ten Second Film",1965,1,NA,6.1,13,0,0,4.5,0,34.5,4.5,4.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Ten Seconds to Hell",1959,93,NA,6.6,65,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ten Tall Men",1951,97,NA,6.1,83,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Ten Thousand Bedrooms",1957,114,NA,4.8,54,0,0,4.5,14.5,24.5,24.5,14.5,0,4.5,14.5,"",0,0,1,0,0,1,0 -"Ten Tiny Love Stories",2001,96,NA,5.9,94,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Ten Wanted Men",1955,80,NA,5.8,51,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ten Who Dared",1960,92,NA,4.2,24,14.5,14.5,4.5,0,24.5,24.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Ten to Chi to",1990,215,42000000,6.4,240,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Ten-Year Lunch, The",1987,56,NA,8.6,9,0,0,0,0,14.5,0,14.5,44.5,0,34.5,"",0,0,0,0,1,0,0 -"Tenamonya yurei dochu",1967,90,NA,9.3,15,4.5,0,0,0,0,0,0,4.5,0,84.5,"",0,0,0,0,0,0,0 -"Tenda dos Milagres",1977,132,NA,6.3,14,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tender Comrade",1943,102,NA,5.8,84,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tender Flesh",1998,93,NA,3.3,79,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tender Is the Night",1962,142,NA,5.6,75,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tender Loving Care",1974,72,NA,1.1,6,64.5,0,14.5,0,0,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Tender Mercies",1983,100,NA,7.4,1575,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tender Tale of Cinderella Penguin, The",1981,10,NA,6.9,18,0,0,0,14.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Tender Trap, The",1955,111,NA,6,280,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tender Years, The",1948,81,NA,6.1,5,0,0,24.5,0,24.5,44.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Tenderfoot, The",1932,70,NA,5,28,0,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Tendre Dracula",1974,98,NA,4.2,8,14.5,24.5,0,0,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Tendre ennemie, La",1936,69,NA,6.3,15,4.5,0,4.5,0,14.5,14.5,44.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"Tendre et perverse Emanuelle",1973,75,NA,3.9,36,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tendre poulet",1978,105,NA,6.8,93,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Tendre voyou",1966,94,NA,6.5,19,0,0,0,14.5,14.5,14.5,44.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tendrement vache",1979,94,NA,2.8,8,24.5,24.5,34.5,14.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Tendres cousines",1980,92,NA,5.9,184,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Tenebre",1982,91,NA,6.8,1486,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tenement",1985,94,NA,3.9,33,14.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tenente dei carabinieri, Il",1986,108,NA,4.5,16,4.5,0,14.5,4.5,14.5,34.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Tengo una casa",1996,85,NA,6.2,28,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tengoku",2003,15,NA,5.6,14,0,0,14.5,0,24.5,45.5,0,0,0,4.5,"",1,0,0,1,0,0,1 -"Tengoku kara kita otoko-tachi",2000,114,NA,7.1,66,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tengoku no honya - koibi",2004,111,NA,7.2,33,0,4.5,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Tengoku to jigoku",1963,142,NA,8,1937,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Tennessee Champ",1954,73,NA,5.3,33,0,4.5,4.5,4.5,34.5,24.5,14.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Tennessee Johnson",1942,103,NA,7.1,57,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tennessee Nights",1989,95,NA,5.8,57,0,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tennessee's Partner",1955,87,NA,4.5,52,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tennis Chumps",1949,7,NA,7,28,0,0,0,0,14.5,14.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Tennis Racquet",1949,7,NA,6.2,40,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Tennis Technique",1932,8,NA,5.3,8,0,0,0,0,74.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Tenrankai no e",1966,50,NA,7.9,10,0,0,0,0,14.5,14.5,14.5,24.5,34.5,24.5,"",0,1,0,0,0,0,0 -"Tenshi no harawata: Akai inga",1981,67,NA,4.1,8,14.5,0,0,14.5,14.5,0,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tenshi no harawata: Akai memai",1988,74,NA,6.5,9,0,0,0,0,14.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tenshi no harawata: Nami",1979,98,NA,7.9,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Tenshi no rakuen",2000,61,NA,6.7,14,0,0,4.5,0,4.5,4.5,74.5,0,0,0,"",0,0,0,1,0,0,0 -"Tenshi no tamago",1985,71,NA,7.5,37,4.5,0,0,4.5,0,4.5,4.5,4.5,14.5,45.5,"",0,1,0,1,0,0,1 -"Tension",1950,95,NA,6.8,151,4.5,4.5,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tension at Table Rock",1956,93,NA,5.7,56,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tentacoli",1977,102,750000,2.8,237,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tentation d'Isabelle, La",1985,86,NA,4.7,11,4.5,0,4.5,4.5,4.5,24.5,4.5,4.5,14.5,0,"",0,0,0,1,0,1,0 -"Tentazioni proibite",1965,88,NA,3.5,6,34.5,0,14.5,0,0,14.5,14.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Tenth Avenue Angel",1948,74,NA,5,36,4.5,4.5,0,4.5,24.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Teodora, imperatrice di Bisanzio",1954,88,NA,4.7,19,0,0,14.5,34.5,4.5,44.5,0,4.5,4.5,0,"",0,0,0,1,0,1,0 -"Teorema",1968,97,NA,7,682,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Teoriya zapoya",2003,70,NA,6,24,14.5,0,4.5,4.5,4.5,14.5,4.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Tepepa",1968,96,NA,5.8,39,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Teppich des Grauens, Der",1962,85,NA,5.5,10,0,0,0,14.5,24.5,34.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Tequila Body Shots",1999,97,NA,3.2,110,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Tequila Sunrise",1988,115,NA,5.7,4990,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Terca vida",2000,98,NA,5,10,24.5,14.5,0,0,14.5,24.5,14.5,14.5,0,24.5,"",0,0,1,1,0,0,0 -"Terceira Margem do Rio, A",1994,98,NA,7.3,49,4.5,0,0,4.5,4.5,14.5,14.5,14.5,45.5,4.5,"",0,0,0,1,0,0,0 -"Tercera palabra, La",1956,110,NA,6.4,11,0,0,0,4.5,4.5,0,4.5,24.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Tercero B",2002,19,NA,7.5,17,4.5,0,0,0,0,14.5,24.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Tere Ghar Ke Samne",1963,149,NA,8.4,13,0,0,0,0,0,0,34.5,14.5,34.5,14.5,"",0,0,1,0,0,1,0 -"Tere Mere Sapne",1971,175,NA,7.7,19,0,0,0,4.5,0,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tere Naam",2003,132,NA,7.5,80,4.5,0,4.5,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Terence Davies Trilogy, The",1984,94,NA,7.1,17,0,0,0,0,0,24.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Teresa",1951,102,NA,6.1,58,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Teresa",1961,90,NA,6.2,7,0,0,24.5,0,0,0,0,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Teresa",1987,98,NA,4.6,6,0,0,34.5,34.5,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Teresa's Tattoo",1994,88,NA,4.3,121,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Terje Vigen",1917,56,NA,7.6,40,0,0,0,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Term of Trial",1962,130,NA,6.5,51,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Terminal Bar",2003,23,NA,7.4,42,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Terminal Bliss",1992,93,NA,3.3,61,34.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Terminal Choice",1985,93,3900000,5.1,69,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Terminal City Ricochet",1990,107,NA,4.6,28,4.5,4.5,0,0,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,0,0,0,0 -"Terminal Entry",1986,98,NA,3.9,22,14.5,14.5,4.5,4.5,24.5,14.5,0,0,0,14.5,"",1,0,0,0,0,0,0 -"Terminal Error",2002,120,NA,4.7,122,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Terminal Exposure",1987,105,NA,4.3,29,14.5,4.5,4.5,4.5,34.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Terminal Island",1973,88,NA,4.7,62,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Terminal Justice",1998,94,NA,3.8,126,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Terminal Man, The",1974,107,NA,5.7,292,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Terminal Rush",1995,94,NA,2.9,51,34.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Terminal USA",1993,54,365000,6.9,37,4.5,4.5,0,4.5,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Terminal Velocity",1994,97,NA,5.2,2603,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Terminal, The",2004,128,60000000,7.1,15809,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Termination Man",2000,92,NA,1.9,29,44.5,14.5,24.5,0,4.5,4.5,4.5,0,0,4.5,"R",1,0,0,1,0,0,0 -"Terminator 2: Judgment Day",1991,154,100000000,8.2,77614,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",1,0,0,1,0,0,0 -"Terminator 3: Rise of the Machines",2003,109,175000000,6.9,32111,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Terminator Woman",1993,105,NA,3.7,39,34.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Terminator, The",1984,108,6400000,7.9,59772,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,1,0 -"Termini Station",1989,108,NA,5.8,35,14.5,4.5,0,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Terminus",1961,33,NA,6.2,19,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Terminus",1987,81,NA,3.2,55,34.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Terminus paradis",1998,99,NA,7.4,88,4.5,0,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Termites From Mars",1952,6,NA,6.7,6,0,0,14.5,0,0,0,14.5,14.5,0,45.5,"",0,1,1,0,0,0,1 -"Terms of Endearment",1983,132,NA,7.3,6050,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Terms, The",2000,11,NA,8.9,6,0,0,0,0,14.5,14.5,14.5,14.5,34.5,0,"",0,0,1,0,0,0,1 -"Ternitz, Tennessee",2000,80,NA,6.4,34,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Terra",2003,7,NA,7.2,20,4.5,4.5,4.5,0,0,14.5,24.5,24.5,14.5,14.5,"",0,1,0,1,0,0,1 -"Terra Estrangeira",1996,110,NA,8.1,311,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",1,0,0,1,0,1,0 -"Terra Nova",1998,85,NA,5.3,18,0,0,14.5,4.5,0,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Terra bruciata",1999,100,NA,4.9,36,24.5,14.5,0,14.5,14.5,14.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Terra em Transe",1967,106,NA,7,149,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Terra incognita",2002,120,NA,6.9,23,14.5,0,4.5,0,4.5,14.5,34.5,24.5,4.5,0,"",0,0,1,1,0,0,0 -"Terra para Rose",1987,84,NA,8.9,8,0,0,0,0,0,0,0,24.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Terra trema: Episodio del mare, La",1948,160,NA,8,346,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Terrain vague",1960,103,NA,6.8,12,0,0,0,0,14.5,4.5,34.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Terrarium",2003,81,NA,7.4,7,0,0,0,0,14.5,0,44.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Terraza, La",1963,90,NA,7.4,12,4.5,0,0,0,0,4.5,4.5,4.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Terrazza, La",1980,124,NA,7.3,81,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Terre vue du ciel, La",2004,67,NA,3.9,10,24.5,24.5,14.5,0,24.5,14.5,0,24.5,0,0,"",0,0,0,0,1,0,0 -"Terrible Beauty, A",1960,90,NA,5.9,28,4.5,0,4.5,4.5,24.5,4.5,44.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Terrible Teddy, the Grizzly King",1901,1,NA,4,15,4.5,0,24.5,44.5,14.5,14.5,4.5,0,0,0,"",0,0,1,0,0,0,1 -"Terrible Truth, The",1951,10,1000,3.7,10,24.5,14.5,14.5,14.5,0,34.5,0,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Terrible toreador, El",1929,6,NA,5,5,44.5,0,0,0,0,44.5,0,0,0,24.5,"",0,1,1,0,0,0,1 -"Terriens, Les",2000,84,NA,7.1,10,0,0,0,0,14.5,14.5,24.5,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Terrier-Stricken",1952,7,NA,7.4,14,0,0,0,0,0,24.5,24.5,14.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Terrified",1962,85,NA,4.4,15,4.5,0,4.5,24.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Terrified",1996,95,NA,3.9,157,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Territorio Comanche",1997,90,NA,6.9,82,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Territory, The",1981,100,NA,6.6,5,0,24.5,0,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Terror",1977,102,NA,5,13,0,4.5,0,4.5,74.5,4.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Terror Aboard",1933,69,NA,6.4,5,0,0,0,0,64.5,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Terror Firmer",1999,98,NA,5.6,782,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Terror House",1972,78,NA,4.2,48,14.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Terror Is a Man",1959,89,NA,4.9,63,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Terror Night",1987,84,NA,6,13,24.5,0,4.5,4.5,4.5,4.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Terror Squad",1987,92,NA,4,30,34.5,14.5,14.5,14.5,4.5,0,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Terror Tract",2000,96,11000000,5.6,281,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Terror Trail",1946,57,NA,5.1,10,0,14.5,14.5,24.5,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Terror Train",1980,97,3500000,5.2,567,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Terror Within, The",1989,90,NA,3.6,67,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Terror at Tenkiller",1986,87,NA,4.3,23,24.5,34.5,0,4.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Terror by Night",1946,60,NA,6.5,384,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Terror from the Year 5000",1958,66,NA,2.5,233,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Terror in Paradise",1990,93,NA,2.6,10,34.5,0,24.5,14.5,14.5,0,34.5,0,0,0,"",1,0,0,0,0,0,0 -"Terror in a Texas Town",1958,81,80000,6.7,114,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Terror in the Aisles",1984,84,NA,5.5,376,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Terror in the Hot Tubs",1992,12,NA,7.8,9,14.5,0,0,0,0,24.5,14.5,0,0,45.5,"",0,0,1,0,0,0,1 -"Terror in the Jungle",1968,84,NA,2.7,12,45.5,14.5,4.5,0,14.5,0,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Terror in the Swamp",1985,87,NA,3.1,30,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Terror in the Wax Museum",1973,93,NA,4.6,45,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Terror of Tiny Town, The",1938,62,100000,3,195,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Terror of the Bloodhunters",1962,72,NA,1.7,11,64.5,4.5,0,0,14.5,0,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Terror of the Tongs, The",1961,80,NA,5.7,43,0,4.5,4.5,14.5,14.5,4.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Terror on Alcatraz",1986,90,NA,4.6,10,34.5,14.5,0,0,34.5,34.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Terror on Tape",1983,90,NA,5.2,44,14.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Terror on Tour",1980,90,NA,3.8,25,24.5,24.5,14.5,4.5,14.5,0,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Terror on the Midway",1942,8,NA,6.2,46,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Terror y encajes negros",1985,90,NA,5.1,10,14.5,24.5,0,0,24.5,0,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Terror! Il castello delle donne maledette",1974,90,NA,2.8,57,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Terror, The",1938,70,NA,5.6,10,0,0,14.5,34.5,0,24.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Terror, The",1963,81,NA,4.7,805,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"TerrorVision",1986,83,NA,4.2,232,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Terrorama!",2001,103,NA,5.8,35,14.5,4.5,4.5,4.5,4.5,0,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Terrore dei barbari, Il",1959,86,NA,4.9,29,0,0,14.5,14.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Terrore dei mari, Il",1961,81,NA,3.2,9,14.5,0,0,24.5,14.5,24.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Terrore nello spazio",1965,88,NA,6,376,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Terrorgram",1988,88,NA,5.1,7,24.5,0,0,0,14.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Terrorist",1995,108,NA,5.7,9,44.5,0,0,0,0,14.5,34.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Terrorist, The",1999,95,NA,7.3,464,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Terroristen!, Die",1992,90,NA,6.6,9,0,0,0,0,14.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Terrorists",2004,72,80000,9.4,9,0,0,0,0,0,0,14.5,0,24.5,64.5,"",0,0,1,0,0,0,0 -"Terrornauts, The",1967,75,NA,3.5,22,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Terry Tate, Office Linebacker",2002,5,NA,8.7,242,4.5,0,0,0,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,1,0,0,0,1 -"Terug naar Oegstgeest",1987,95,NA,5.7,34,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Terza luna, La",1997,85,NA,7.4,5,0,0,0,0,0,44.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Terzo occhio, Il",1966,98,NA,6.8,9,0,0,0,0,14.5,24.5,34.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Teseo contro il minotauro",1961,92,NA,4.2,12,4.5,0,24.5,4.5,14.5,44.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Tesis",1996,118,NA,7.6,4066,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Tesna koza",1982,92,NA,7.5,33,4.5,4.5,4.5,4.5,0,0,4.5,0,14.5,45.5,"",0,0,1,0,0,0,0 -"Tesna koza 2",1987,87,NA,7,14,0,0,0,0,4.5,14.5,14.5,4.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Tesna koza 3",1988,95,NA,7.9,10,0,0,0,0,0,0,24.5,0,34.5,45.5,"",0,0,1,0,0,0,0 -"Tesna koza 4",1991,90,NA,8.1,14,0,0,0,0,0,0,14.5,4.5,4.5,74.5,"",0,0,1,0,0,0,0 -"Tesoro de la diosa blanca, El",1983,91,NA,4.1,39,14.5,24.5,14.5,14.5,14.5,4.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Tesoro de las cuatro coronas, El",1983,97,NA,3,118,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tesoro della foresta pietrificata, Il",1965,111,NA,2.8,5,44.5,0,24.5,0,24.5,24.5,0,0,0,0,"",1,0,0,1,0,0,0 -"Tess",1979,172,NA,7.1,1531,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Tess of the Storm Country",1922,137,400000,7.8,56,0,0,4.5,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tess of the Storm Country",1960,95,NA,5.6,6,0,0,0,0,14.5,45.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Tesseract, The",2003,96,NA,5.2,165,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Test",2000,7,NA,7,12,14.5,0,0,0,4.5,0,14.5,0,14.5,44.5,"",0,1,0,1,0,0,1 -"Test Pilot",1938,118,NA,6.8,264,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Test Pilot Donald",1951,7,NA,6.8,24,0,0,4.5,0,4.5,4.5,44.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Test Tube Teens from the Year 2000",1994,74,NA,3.3,84,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Test pilota Pirksa",1979,104,NA,5.9,48,4.5,4.5,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Testa di sbarco per otto implacabili",1969,90,NA,4.1,7,14.5,0,24.5,14.5,0,24.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Testa t'ammazzo, croce... sei morto... Mi chiamano Alleluja",1971,94,NA,3.5,18,14.5,0,4.5,24.5,4.5,4.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Testament",1975,80,NA,4.2,5,0,0,0,64.5,0,0,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Testament",1983,90,NA,7.5,985,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Testament des Dr. Mabuse, Das",1933,122,NA,7.6,717,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Testament des Dr. Mabuse, Das",1962,88,NA,4,75,14.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Testament du Docteur Cordelier, Le",1959,95,NA,6.8,74,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Testament du Dr. Mabuse, Le",1933,95,NA,4.9,49,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Testament of Tom Jacoby, The",2001,7,3000,9.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Testamento do Senhor Napumoceno, O",1997,117,NA,7.3,63,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Testaments: Of One Fold and One Shepherd, The",2000,67,NA,8.2,74,4.5,4.5,4.5,4.5,4.5,0,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Teste di cocco",2000,95,NA,3.5,21,24.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Testimone a rischio",1996,90,NA,7.2,29,0,4.5,0,4.5,0,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Testimone dello sposo, Il",1998,101,NA,5.8,137,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Testimone, Il",1946,98,NA,6.1,7,14.5,0,0,0,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Testimony",1988,157,NA,6.2,63,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Testimony of Taliesin Jones, The",2000,93,NA,6.5,63,4.5,0,0,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Testing Large Turbines",1904,4,NA,2.7,5,24.5,24.5,44.5,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Testing the Limits",1998,100,NA,5.7,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Testosterone",2003,105,NA,5.4,137,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Teta y la luna, La",1994,90,NA,6.6,360,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Tetsuo",1988,69,NA,6.6,1551,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Tetsuo II: Body Hammer",1992,83,NA,6.1,582,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Tetto, Il",1956,91,NA,6.5,21,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Teufel in Seide",1956,106,NA,5.2,5,0,0,0,0,64.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Teufel kam aus Akasava, Der",1971,84,NA,5.3,68,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Teufel von Rudow, Der",2004,82,NA,4.5,26,14.5,14.5,4.5,0,4.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Teufels General, Des",1955,117,NA,7.3,101,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Teufelscamp der verlorenen Frauen",1977,78,NA,4.2,5,0,0,24.5,44.5,44.5,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Teuflischen Schwestern, Die",1976,85,NA,5.2,30,4.5,4.5,14.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tevya",1939,93,70000,6.4,46,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Tex",1982,103,NA,6.3,262,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tex Willer e il signore degli abissi",1985,90,NA,3.6,27,14.5,4.5,4.5,24.5,4.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Tex, the Passive-Aggressive Gunslinger",2000,10,NA,7.1,42,4.5,4.5,4.5,4.5,0,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Texan Meets Calamity Jane, The",1950,71,NA,4.1,9,0,44.5,24.5,14.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Texans Never Cry",1951,66,NA,6,12,4.5,4.5,0,0,4.5,34.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Texans, The",1938,92,NA,5.8,16,0,0,14.5,0,24.5,34.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Texas",1941,93,NA,7.4,80,0,0,0,4.5,4.5,4.5,34.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Texas",2002,78,NA,6.6,72,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"R",0,0,0,0,1,0,0 -"Texas 46",2002,96,NA,5.1,51,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Texas Across the River",1966,96,NA,6.1,171,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Texas Carnival",1951,77,NA,5.7,48,0,0,4.5,14.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Texas Chain Saw Massacre, The",1974,75,140000,7,10224,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Texas Chainsaw Massacre 2, The",1986,111,4700000,4.6,2107,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Texas Chainsaw Massacre, The",2003,98,9200000,5.9,9587,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Texas Cyclone",1932,63,NA,3.5,23,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Texas Detour",1978,92,NA,3.8,9,0,14.5,24.5,14.5,24.5,0,0,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Texas Funeral, A",1999,98,NA,6.4,136,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Texas Lady",1955,86,NA,4.9,42,0,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Texas Lightning",1981,91,NA,3.4,34,24.5,4.5,14.5,0,4.5,14.5,4.5,0,4.5,24.5,"",1,0,0,1,0,0,0 -"Texas Masquerade",1944,58,NA,6.9,17,0,0,0,0,14.5,24.5,0,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Texas Payback",1994,96,NA,5.5,19,14.5,24.5,0,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,1,0,0,0 -"Texas Political Chainsaw Massacre",2002,5,NA,9,19,34.5,0,0,0,0,0,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Texas Rangers",2001,86,38000000,5.1,945,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Texas Rangers Ride Again, The",1940,68,NA,5.4,11,0,0,0,4.5,14.5,44.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Texas Rangers, The",1936,98,NA,7.1,33,0,0,0,4.5,4.5,14.5,44.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Texas Rangers, The",1951,74,NA,5.5,23,4.5,0,4.5,4.5,34.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Texas Style",1984,29,NA,4,8,0,0,0,100,0,0,0,0,0,0,"",0,0,0,0,1,0,1 -"Texas Terror",1935,58,NA,4.4,86,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Texas Tom",1950,7,NA,7.2,37,0,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Texas Trail",1937,58,NA,7.1,18,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Texas, Brooklyn and Heaven",1948,76,NA,6.6,13,0,24.5,0,14.5,14.5,4.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Texas, addio",1966,90,NA,5.6,85,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Texas: The Big Picture",2003,40,NA,6.2,10,14.5,0,0,0,0,34.5,34.5,14.5,24.5,0,"",0,0,0,0,1,0,1 -"Texasville",1990,123,NA,5.5,490,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Texel Fretsaw Massacre, The",2004,6,NA,3.7,25,4.5,4.5,0,4.5,0,0,0,14.5,4.5,64.5,"",0,0,0,1,0,1,1 -"Texican, The",1966,81,NA,6,41,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Text of Light, The",1974,71,NA,9.8,9,14.5,0,0,0,0,14.5,0,0,0,74.5,"",0,0,0,0,0,0,0 -"Textiles, Les",2004,92,NA,5.1,27,0,14.5,4.5,24.5,4.5,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Tezaab",1988,173,NA,7.3,66,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,1,0 -"Tghamardik",1973,69,NA,8.5,7,14.5,0,0,0,0,0,0,24.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Tha se do stin Kolassi, agapi mou",1999,100,NA,4.9,20,4.5,14.5,0,14.5,0,24.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tha se kano vasilissa",1964,93,NA,8.1,24,0,0,0,4.5,0,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Tha to metaniossis",2002,100,NA,6.3,19,0,4.5,14.5,4.5,0,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thakshak",1999,163,NA,5.9,41,0,4.5,0,4.5,24.5,4.5,4.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Thalassa, Thalassa",1994,89,NA,7.3,12,0,0,0,0,4.5,0,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Thalassies oi hadres, Oi",1967,94,NA,7,14,0,0,0,24.5,4.5,4.5,24.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Thalavattam",1986,147,NA,8.5,6,0,0,0,0,0,0,14.5,34.5,34.5,14.5,"",0,0,1,1,0,1,0 -"Thanasi pare t'oplo sou",1972,86,NA,6.5,9,0,0,24.5,0,0,24.5,14.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Thanasi sfikse ki allo to zonari",1980,95,NA,3.7,13,14.5,0,0,0,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Thanasis stin hora tis sfaliaras, O",1976,88,NA,8.4,8,0,0,0,0,0,24.5,14.5,0,24.5,34.5,"",0,0,1,0,0,0,0 -"Thanassis kai to katarameno fidi, O",1982,86,NA,7.2,5,0,0,0,0,0,24.5,0,44.5,0,44.5,"",0,0,1,0,0,1,0 -"Thanatopsis",1962,5,NA,9.2,8,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Thanatos",1998,5,NA,9.2,6,0,0,0,0,14.5,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Thaneer Thaneer",1981,143,NA,8.4,5,0,0,0,0,0,0,0,84.5,0,24.5,"",0,0,0,0,0,0,0 -"Thank God He Met Lizzie",1997,91,2500000,5.9,196,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Thank God I'm a Lesbian",1992,59,NA,8.3,12,14.5,4.5,0,0,0,0,14.5,0,4.5,45.5,"",0,0,0,0,1,0,0 -"Thank God It's Friday",1978,89,2200000,3.5,343,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Thank You Mask Man",1971,8,NA,6.8,56,0,4.5,0,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Thank You and Good Night",1991,83,NA,6.1,17,0,0,0,4.5,14.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Thank You, Good Night",2001,104,NA,2.9,27,4.5,4.5,0,0,14.5,0,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Thank You, Jeeves!",1936,57,NA,6.4,18,0,0,0,0,4.5,34.5,24.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Thank You, Mr. Moto",1937,69,NA,6.5,48,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Thank Your Lucky Stars",1943,124,NA,7.3,212,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Thanks a Million",1935,87,NA,6.6,15,0,0,0,0,24.5,24.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Thanks for Everything",1938,70,NA,5.6,5,0,0,0,44.5,0,0,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Thanks for Nothing",2002,12,NA,9.7,7,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,1,0,0,0,1 -"Thanksgiving",2004,12,150000,7.9,9,14.5,0,0,14.5,0,14.5,0,0,0,64.5,"",0,0,0,1,0,0,1 -"Thanksgiving Prayer",1991,3,NA,5.5,22,0,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Thar She Blows!",1969,84,NA,1.3,5,24.5,44.5,0,24.5,0,0,0,0,24.5,0,"",0,0,1,0,0,0,0 -"Thartharah fawq al-Nil",1971,115,NA,5.8,13,0,0,0,0,34.5,0,44.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"That 70's Matrix",2001,35,1200,3.9,24,34.5,4.5,0,4.5,24.5,4.5,4.5,0,0,24.5,"",1,0,1,0,0,0,1 -"That Burning Question",1988,30,NA,5.7,7,0,0,0,14.5,14.5,14.5,0,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"That Certain Age",1938,95,NA,7.1,31,4.5,0,4.5,0,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"That Certain Feeling",1956,103,NA,5.6,53,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"That Certain Thing",1928,69,NA,7.9,9,0,0,0,0,0,24.5,24.5,44.5,14.5,0,"",0,0,1,1,0,0,0 -"That Certain Woman",1937,93,NA,6.2,156,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"That Championship Season",1982,110,NA,5.5,122,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"That Chink at Golden Gulch",1910,17,NA,4.3,9,24.5,0,0,0,0,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"That Cold Day in the Park",1969,113,500000,6.2,106,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"That Darn Bill",2004,12,NA,6.2,11,0,0,24.5,0,4.5,0,4.5,4.5,4.5,34.5,"",0,0,1,0,0,0,1 -"That Darn Cat",1997,89,NA,4.2,696,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",1,0,1,0,0,0,0 -"That Darn Cat!",1965,116,NA,6.2,676,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"That Eye, the Sky",1994,105,NA,5.4,37,14.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"That Fatal Sneeze",1907,6,NA,6.7,34,4.5,0,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"That Forsyte Woman",1949,105,NA,5.9,150,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"That Funny Feeling",1965,93,NA,5.8,64,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"That Gang of Mine",1940,62,NA,6.1,60,0,0,0,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"That Girl from Paris",1936,104,NA,6.8,30,0,0,0,4.5,24.5,34.5,14.5,4.5,24.5,4.5,"",0,0,1,0,0,0,0 -"That Goes Double",1933,20,NA,5.9,6,0,0,0,14.5,14.5,14.5,45.5,0,0,0,"",0,0,0,0,0,0,1 -"That Hagen Girl",1947,83,NA,3.7,76,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"That Hamilton Woman",1941,128,NA,7,244,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"That Inferior Feeling",1940,9,NA,7.1,6,0,0,0,0,14.5,14.5,14.5,0,0,45.5,"",0,0,1,0,0,0,1 -"That Kind of Woman",1959,92,NA,5.7,49,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,1,0 -"That Lady",1955,95,NA,5.1,18,4.5,14.5,4.5,14.5,34.5,14.5,0,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"That Lady From Peking",1970,93,NA,9.7,6,0,14.5,0,0,14.5,0,14.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"That Lady from Rio",1976,76,NA,5.4,15,4.5,14.5,0,4.5,14.5,24.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"That Lady in Ermine",1948,89,NA,5.2,60,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"That Little Monster",1994,56,30000,6.6,65,14.5,0,4.5,0,4.5,4.5,14.5,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"That Lucky Touch",1975,89,NA,4.7,43,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"That Man Bolt",1973,102,NA,4.9,37,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"That Man's Here Again",1937,58,NA,5.1,18,0,4.5,14.5,24.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,1,1,0,1,0 -"That Marino Thing",1999,14,NA,6.3,6,0,0,14.5,0,0,45.5,14.5,0,0,14.5,"",0,0,1,0,0,0,1 -"That Midnight Kiss",1949,96,NA,6.6,62,0,0,0,4.5,14.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"That Night",1992,89,NA,6,506,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"That Night in Rio",1941,91,NA,6.9,66,0,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"That Night!",1957,88,NA,8.9,18,0,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"That Old Feeling",1997,105,NA,5.8,674,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"That Riviera Touch",1966,98,NA,5.5,50,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"That Sinking Feeling",1980,93,NA,6.7,163,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"That Strange Person",1998,4,NA,6.6,21,0,4.5,4.5,4.5,4.5,14.5,14.5,0,4.5,34.5,"",0,1,0,0,0,0,1 -"That Summer",1979,94,NA,6.1,13,4.5,0,0,0,0,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"That Tender Touch",1969,88,NA,4.9,5,0,0,24.5,24.5,0,24.5,24.5,0,24.5,0,"",0,0,0,1,0,0,0 -"That Tennessee Beat",1966,84,NA,5,5,0,0,24.5,0,24.5,24.5,0,0,0,44.5,"",0,0,0,1,0,0,0 -"That Thing We Do",2002,16,NA,9.1,7,0,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,0,1,0,1,1 -"That Thing You Do!",1996,108,2500000,6.6,11701,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"That Time",2000,20,NA,6.4,7,0,0,0,0,24.5,24.5,0,44.5,0,0,"",0,0,0,1,0,0,1 -"That Touch of Mink",1962,99,NA,6.6,1094,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"That Uncertain Feeling",1941,84,NA,6.8,279,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"That Was Then... This Is Now",1985,102,NA,5.4,377,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"That Woman Opposite",1957,85,NA,5.6,5,0,24.5,0,24.5,0,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"That Wonderful Urge",1948,82,NA,6.7,36,0,0,0,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"That'll Be the Day",1973,91,NA,6.8,123,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"That's Adequate",1989,82,NA,4.6,48,14.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"That's All Right",1989,5,NA,1.3,5,64.5,0,0,0,0,0,24.5,0,0,24.5,"",0,0,0,0,0,0,1 -"That's Black Entertainment",1990,60,NA,8.1,16,14.5,0,0,0,0,0,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"That's Carry On",1977,95,NA,5.4,53,4.5,4.5,4.5,4.5,4.5,34.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"That's Cunning! Shijo saidai no sakusen",1996,99,NA,4.2,8,14.5,14.5,0,14.5,0,34.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"That's Dancing!",1985,105,NA,6.7,245,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"That's Entertainment!",1974,134,NA,7.5,1356,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"That's Entertainment! III",1994,113,NA,7.3,229,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"That's Entertainment, Part II",1976,133,NA,7.2,420,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"That's Life!",1986,102,NA,5.7,265,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"That's My Boy",1932,71,NA,3.1,14,24.5,14.5,4.5,24.5,0,0,24.5,0,0,4.5,"",0,0,1,0,0,0,0 -"That's My Boy",1951,104,NA,5.6,117,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"That's My Daughter",1982,79,NA,6.6,6,0,0,0,0,34.5,14.5,34.5,0,14.5,0,"",0,0,0,0,0,0,0 -"That's My Face",2001,56,NA,8.1,17,0,0,0,4.5,0,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"That's My Man",1947,60,NA,5.2,12,0,0,4.5,14.5,4.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"That's My Mommy",1955,6,NA,6.1,29,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",0,1,1,0,0,0,1 -"That's My Pup!",1953,7,NA,7,31,0,0,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"That's My Wife",1929,20,NA,7.1,46,14.5,0,0,4.5,0,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"That's Right - You're Wrong",1939,94,NA,6.1,27,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"That's Why I Left You",1943,10,NA,5.7,10,0,0,0,0,64.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"That's Your Funeral",1972,79,NA,3.1,23,34.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"That's the Spirit",1933,11,NA,6.1,9,0,0,0,24.5,14.5,14.5,14.5,14.5,0,34.5,"",0,0,1,0,0,0,1 -"That's the Spirit",1945,87,NA,6.6,6,0,0,0,0,14.5,0,0,34.5,0,45.5,"",0,0,1,0,0,0,0 -"That's the Way of the World",1975,100,NA,5.8,24,0,0,0,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Thaumaturge chinois, Le",1904,3,NA,6,77,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Thaw",2000,14,15000,8.2,6,0,0,0,0,0,0,0,84.5,14.5,0,"",0,0,0,1,0,0,1 -"The... Copanoi",1989,85,NA,7.3,34,0,4.5,4.5,4.5,0,4.5,14.5,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Theater in Trance",1981,91,NA,6.8,6,0,34.5,0,0,0,0,0,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Theatre of Blood",1973,104,NA,7.1,1059,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Theatre of Death",1966,91,NA,5.3,106,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Theia apo to Sikago, I",1957,72,NA,8.8,40,0,0,0,0,4.5,0,14.5,24.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Theia mou i hipissa, I",1970,93,NA,7,7,0,0,0,0,44.5,0,44.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Their First Mistake",1932,21,NA,7.1,121,4.5,0,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Their Mad Moment",1931,55,NA,6.6,5,24.5,0,0,0,0,24.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Their Own Desire",1929,65,NA,6.2,56,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Their Purple Moment",1928,22,NA,7,57,0,0,0,14.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Thelma",2002,95,NA,6.7,17,0,0,4.5,14.5,24.5,4.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Thelma & Louise",1991,129,16500000,7.3,18075,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Thelonious Monk: Straight, No Chaser",1989,90,NA,7.5,134,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Them Thar Hills",1934,20,NA,8.1,183,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Them!",1954,94,NA,7.2,2113,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Thema Nr. 1",2001,84,NA,5.2,8,24.5,14.5,0,0,14.5,0,0,0,14.5,34.5,"",0,0,1,1,0,0,0 -"Themis",1940,4,NA,4.2,13,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,0,"",0,1,0,0,0,0,1 -"Themroc",1973,110,NA,7.4,204,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Theo en Thea en de ontmaskering van het tenenkaasimperium",1989,104,NA,5.9,137,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Theo gegen den Rest der Welt",1980,106,NA,6.9,127,0,0,4.5,4.5,4.5,4.5,44.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Theodor Hirneis oder Wie man ehem. Hofkoch wird",1973,84,NA,6.2,10,0,0,0,14.5,14.5,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Theodora Goes Wild",1936,94,NA,7.5,130,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Theodore Case Sound Tests: Gus Visser and His Singing Duck",1925,5,NA,7,18,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Theodore Rex",1995,92,33000000,2.2,567,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Theodoros kai to dikano",1962,98,NA,7,12,0,0,4.5,4.5,0,4.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Theory of Achievement",1991,18,NA,7.2,115,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,1 -"Theory of Flight, The",1998,101,NA,6.5,634,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,1,0 -"Theory of Revenge",2003,85,NA,9.1,9,0,0,0,0,0,0,14.5,24.5,14.5,45.5,"",1,0,0,1,0,0,0 -"Therapy Group",2003,3,1000,6.1,5,0,0,0,0,0,24.5,0,44.5,24.5,24.5,"",0,0,1,0,0,0,1 -"There Auto Be a Law",1953,7,NA,4.3,17,14.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,0,"",0,1,1,0,0,0,1 -"There Goes My Baby",1994,110,10500000,6.1,253,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,1,1,0,0,0 -"There Goes My Girl",1937,74,NA,7,16,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,0,"",0,0,1,0,0,1,0 -"There Goes My Heart",1938,84,NA,6.5,12,0,0,0,4.5,44.5,0,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"There Goes the Bride",1932,79,NA,6.1,13,0,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"There Goes the Bride",1980,88,NA,2.2,13,34.5,14.5,4.5,4.5,4.5,4.5,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"There Goes the Neighborhood",1992,88,NA,5.1,238,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"There It Is",1928,19,NA,7.5,27,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"There They Go-Go-Go!",1956,6,NA,7,47,0,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"There Was a Crooked Man",1960,107,NA,6.9,8,14.5,0,0,0,14.5,14.5,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"There Was a Crooked Man...",1970,126,NA,6.8,396,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"There Was a Little Girl",1981,92,NA,5.4,37,4.5,14.5,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"There We Are, John",1993,32,NA,8,5,0,0,24.5,0,0,0,24.5,24.5,44.5,0,"",0,0,0,0,1,0,1 -"There's Always Tomorrow",1956,84,NA,6.9,97,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"There's Always Vanilla",1971,91,90000,3.2,49,24.5,4.5,4.5,4.5,4.5,14.5,24.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"There's Always a Thursday",1957,60,NA,4.6,7,0,0,14.5,0,45.5,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"There's Always a Woman",1938,81,NA,6.5,6,0,0,0,0,0,64.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"There's Good Boos To-Night",1948,7,NA,5.3,21,0,4.5,4.5,0,14.5,4.5,34.5,24.5,0,4.5,"",0,1,0,0,0,0,1 -"There's Magic in Music",1941,80,NA,5,7,0,14.5,0,0,14.5,0,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"There's No Business Like Show Business",1954,117,NA,6.6,568,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"There's No Fish Food In Heaven",1998,92,NA,3.8,70,14.5,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"There's Nothing Out There",1991,91,NA,5.8,124,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"There's One Born Every Minute",1942,60,NA,4,6,34.5,0,0,45.5,0,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"There's Only One Jimmy Grimble",2000,98,NA,6.5,608,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"There's Something About Mary",1998,134,23000000,7.2,46343,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"There's Something About a Soldier",1934,7,NA,4.7,6,0,0,14.5,14.5,14.5,34.5,0,0,14.5,0,"",0,1,1,0,0,0,1 -"There's Something About a Soldier",1943,81,NA,9.8,8,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"There's a Girl in My Soup",1970,95,NA,5.1,297,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Theremin: An Electronic Odyssey",1994,83,NA,7.2,280,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"PG",0,0,0,0,1,0,0 -"Therese und Isabell",1968,118,NA,6.3,92,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Theresienstadt",1944,23,NA,7.2,11,14.5,4.5,0,0,0,14.5,0,0,4.5,44.5,"",0,0,0,0,0,0,1 -"These Boots",1992,5,NA,6.9,22,4.5,0,0,0,4.5,24.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,1 -"These Glamour Girls",1939,79,NA,6.2,34,0,0,0,4.5,14.5,34.5,24.5,14.5,4.5,0,"",0,0,1,1,0,0,0 -"These Hands",1992,45,NA,7.1,5,0,0,0,0,0,24.5,64.5,24.5,0,0,"",0,0,0,0,1,0,0 -"These Thousand Hills",1959,96,NA,6,32,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"These Three",1936,93,NA,7.8,296,4.5,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"These Wilder Years",1956,91,NA,6.2,94,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Thetford au milieu de notre vie",1980,84,NA,3.9,30,0,0,45.5,0,44.5,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Thevar Magan",1992,145,NA,5,46,4.5,0,4.5,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"They",2002,89,17000000,4.4,2660,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"They All Come Out",1939,70,NA,6,7,0,0,0,0,24.5,24.5,24.5,0,14.5,0,"",0,0,0,1,0,0,0 -"They All Kissed the Bride",1942,85,NA,6.8,29,4.5,4.5,0,0,14.5,4.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"They All Laughed",1981,115,NA,6,252,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"They Call Him Sasquatch",2003,100,1000000,6.5,11,4.5,0,4.5,0,4.5,0,4.5,24.5,0,34.5,"",0,0,1,0,0,0,0 -"They Call It Sin",1932,69,NA,6.3,53,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"They Call Me Bruce?",1982,86,NA,4.8,248,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"They Call Me MISTER Tibbs!",1970,108,NA,5.8,279,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"They Call Me Macho Woman",1989,81,NA,4.1,26,34.5,0,0,14.5,24.5,0,4.5,0,14.5,4.5,"",1,0,0,0,0,0,0 -"They Came From Beyond Space",1967,85,NA,3.6,86,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"They Came to Attack Us",2001,7,NA,7.6,21,14.5,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,"",0,0,0,0,0,0,1 -"They Came to Cordura",1959,123,4000000,6.3,163,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"They Can't Hang Me",1955,75,NA,5.4,7,0,0,0,44.5,24.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"They Come at Night",1998,95,NA,4,9,14.5,34.5,0,0,14.5,14.5,0,0,14.5,24.5,"",0,0,0,1,0,0,0 -"They Crawl",2001,93,NA,3.5,132,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"They Dare Not Love",1941,75,NA,7,7,0,0,0,0,14.5,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"They Died with Their Boots On",1941,140,2200000,7.1,693,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"They Don't Cut the Grass Anymore",1985,70,NA,2.7,34,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"They Drive by Night",1938,84,NA,8,25,4.5,0,4.5,4.5,4.5,4.5,4.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"They Drive by Night",1940,95,500000,7.3,667,0,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"They Eat Scum",1979,73,NA,2.1,20,14.5,4.5,4.5,4.5,0,4.5,0,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"They Flew Alone",1942,108,NA,6.5,17,0,4.5,0,0,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"They Gave Him a Gun",1937,94,NA,6.7,26,4.5,0,4.5,0,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"They Go Boom!",1929,20,NA,7.2,70,0,0,4.5,0,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"They Got Me Covered",1943,95,NA,6.5,73,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"They Had to See Paris",1929,83,NA,5,9,0,0,0,24.5,14.5,14.5,0,44.5,0,14.5,"",0,0,1,0,0,0,0 -"They Knew What They Wanted",1940,96,NA,6.7,36,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"They Learned About Women",1930,95,NA,4.7,28,0,4.5,14.5,14.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"They Live",1988,93,4000000,6.5,5131,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"They Live by Night",1949,95,NA,7.8,383,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"They Made Her a Spy",1939,69,NA,5.6,10,0,0,0,24.5,14.5,34.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"They Made Me a Criminal",1939,92,NA,7,192,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"They Made Me a Fugitive",1947,78,NA,6.5,42,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"They Made Me a Killer",1946,64,NA,6.7,5,0,0,0,0,0,24.5,64.5,24.5,0,0,"",0,0,0,0,0,0,0 -"They Meet Again",1941,69,NA,3.2,6,14.5,0,14.5,14.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"They Met In Argentina",1941,77,NA,4.5,13,4.5,4.5,4.5,24.5,4.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"They Met in Bombay",1941,92,NA,6.3,90,4.5,4.5,0,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"They Met in a Taxi",1936,70,NA,5.1,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"They Met in the Dark",1943,95,NA,9,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,0,0,0,0 -"They Might Be Giants",1971,98,NA,7,487,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"They Only Kill Their Masters",1972,97,NA,6.1,150,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"They Raid by Night",1942,73,NA,4.8,16,0,0,14.5,34.5,14.5,14.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"They Ran for Their Lives",1968,92,NA,4.8,7,0,14.5,0,24.5,44.5,0,0,14.5,0,0,"",0,0,0,1,0,0,0 -"They Rode West",1954,84,NA,5.9,28,0,0,0,14.5,24.5,34.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"They Shall Have Music",1939,105,NA,6.4,37,0,0,0,4.5,4.5,24.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"They Shoot Horses, Don't They?",1969,120,NA,7.6,2057,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"They Shoot Movies, Don't They?",2000,87,NA,9,60,4.5,0,0,4.5,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"They Still Call Me Bruce",1987,91,NA,3.7,111,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"They Stooge to Conga",1943,18,NA,7.5,57,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"They Went That-A-Way & That-A-Way",1979,95,NA,3.9,50,4.5,4.5,24.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"They Were Expendable",1945,135,NA,7.3,886,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"They Were Not Divided",1950,102,NA,5.9,17,0,0,14.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"They Were Sisters",1945,115,NA,6.3,21,0,0,4.5,0,4.5,14.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"They Who Dare",1953,107,NA,5.7,34,4.5,4.5,0,14.5,14.5,24.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"They Won't Believe Me",1947,80,NA,7.3,184,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"They Won't Forget",1937,95,NA,7.6,171,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"They're Always Caught",1938,22,NA,6.8,10,0,0,0,0,14.5,34.5,34.5,24.5,14.5,0,"",0,0,0,0,0,0,1 -"They're Off",1948,7,NA,6.3,40,4.5,0,0,14.5,4.5,24.5,44.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"They're Playing with Fire",1984,96,NA,3.7,53,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"They're a Weird Mob",1966,112,NA,7.4,75,0,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Thi Tran Yen Tinh",1986,90,NA,7.8,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Thiassos, O",1975,230,NA,8.1,223,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Thick as Thieves",1991,101,NA,6.8,11,0,0,0,4.5,24.5,4.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Thick as Thieves",1998,93,NA,5.8,540,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Thicker Than Water",1935,20,NA,7.3,89,0,4.5,0,4.5,4.5,4.5,34.5,34.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Thicker Than Water",1999,91,NA,4.1,106,24.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Thicker Than Water",2002,90,NA,7.8,5,0,0,0,0,0,44.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Thief",1981,117,NA,7.2,1541,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Thief & the Stripper, The",1998,84,NA,3,10,24.5,24.5,0,14.5,0,0,14.5,14.5,0,34.5,"R",0,0,0,1,0,0,0 -"Thief Who Came to Dinner, The",1973,104,NA,5.8,153,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Thief in the Night, A",1972,69,NA,5.2,90,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Thief of Bagdad, The",1924,139,2000000,7.9,362,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,0,0,0,0 -"Thief of Bagdad, The",1940,106,NA,7.6,1314,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Thief of Damascus",1952,78,NA,5,8,14.5,0,0,0,45.5,0,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Thief of Hearts",1984,100,9000000,5.1,371,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Thief, The",1952,85,NA,6.9,43,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Thief, The",2004,31,1000,7.3,24,14.5,4.5,0,4.5,0,0,4.5,4.5,4.5,45.5,"",0,0,1,0,0,0,1 -"Thieves",1977,92,NA,4.1,25,14.5,4.5,14.5,4.5,4.5,14.5,14.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Thieves Fall Out",1941,72,NA,5.7,13,0,0,14.5,4.5,34.5,14.5,24.5,0,4.5,0,"",0,0,1,0,0,0,0 -"Thieves Like Us",1974,123,800000,7,310,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Thieves of Fortune",1990,100,NA,4.8,19,24.5,0,24.5,14.5,4.5,4.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Thieves' Highway",1949,94,NA,7.7,145,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Thieving Hand, The",1908,5,NA,6.9,34,0,0,0,0,14.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Thigh Line Lyre Triangular",1961,5,NA,7.6,19,0,0,0,4.5,4.5,34.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Thin Air",1969,91,NA,3.5,36,14.5,24.5,4.5,24.5,24.5,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Thin Blue Line, The",1988,103,NA,7.9,2135,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Thin Ice",1937,79,NA,7,37,0,0,0,4.5,4.5,24.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Thin Ice",1995,78,NA,7.2,23,0,0,0,4.5,14.5,4.5,14.5,24.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Thin Line Between Love and Hate, A",1996,108,8000000,4.4,458,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Thin Man Goes Home, The",1945,100,1000000,7.1,495,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Thin Man, The",1934,93,NA,8.1,4755,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Thin Pink Line, The",1998,106,NA,4.6,63,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Thin Red Line, The",1964,99,NA,6.8,120,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Thin Red Line, The",1998,170,52000000,7.2,25637,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",1,0,0,1,0,0,0 -"Thing About My Folks, The",2004,96,NA,8.3,92,4.5,4.5,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Thing Called Love, The",1993,116,14000000,6,1217,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Thing From Another World, The",1951,85,NA,7.5,2810,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Thing That Couldn't Die, The",1958,69,NA,3.1,233,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thing with Two Heads, The",1972,93,NA,3.3,290,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Thing, The",1982,109,10000000,7.8,17071,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Things",1989,83,NA,4,22,45.5,4.5,4.5,4.5,0,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Things Are Looking Up",1935,77,NA,6.9,13,0,0,0,0,14.5,0,4.5,0,14.5,64.5,"",0,0,1,0,0,0,0 -"Things Are Tough All Over",1982,90,NA,5.2,400,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Things Behind the Sun",2001,120,NA,7.5,347,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Things Change",1988,100,NA,6.7,700,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Things Happen at Night",1947,79,NA,5,5,24.5,0,0,0,64.5,0,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Things You Can Tell Just by Looking at Her",2000,109,NA,6.6,1779,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Things to Come",1936,100,NA,6.7,556,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Things to Do in Denver When You're Dead",1995,115,8000000,6.6,5703,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Think Before You Pink",1969,6,NA,6,12,0,0,0,0,4.5,64.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"Think Big",1990,86,NA,3.9,121,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Think Fast, Mr. Moto",1937,67,NA,6.1,75,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Think Twentieth",1967,30,NA,6.5,18,0,0,0,4.5,4.5,44.5,24.5,0,4.5,14.5,"",0,0,0,0,1,0,1 -"Thinner",1996,92,NA,5,2633,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Thinning the Herd",2004,10,NA,6,6,14.5,0,0,0,14.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Thir13en Ghosts",2001,87,20000000,5.1,8292,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Thira 7 - i megali stigmi",1983,107,NA,5.9,8,24.5,0,0,0,24.5,0,14.5,0,0,34.5,"",1,0,0,1,0,0,0 -"Third Day, The",1965,119,NA,5.9,53,0,0,0,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Third Dimensional Murder",1941,7,NA,6,8,0,0,0,14.5,24.5,45.5,14.5,0,0,0,"",0,0,1,0,0,0,1 -"Third Finger, Left Hand",1940,96,NA,6.4,71,0,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Third Man on the Mountain",1959,105,NA,6.7,100,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Third Man, The",1949,93,NA,8.5,18394,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Third Miracle, The",1999,119,NA,6.7,997,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Third Party",2003,108,NA,6,5,44.5,0,0,0,0,0,0,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Third Party Risk",1954,63,NA,4.9,7,0,14.5,0,44.5,0,44.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Third Rail, The",2001,8,NA,6.9,15,0,0,0,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Third Secret, The",1964,103,NA,6.2,59,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Third Society, The",2002,84,NA,4.4,44,14.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"R",1,0,1,0,0,0,0 -"Third Time Lucky",1930,85,NA,4.5,9,0,0,0,45.5,14.5,14.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Third Walker, The",1978,84,NA,6.5,9,14.5,0,14.5,0,34.5,14.5,0,34.5,0,0,"",0,0,0,1,0,0,0 -"Third World Cop",1999,98,NA,4.8,79,14.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Thirst",1979,93,NA,5.2,109,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thirsty Dead, The",1974,88,NA,2.5,38,34.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Thirteen",1997,87,NA,5.4,26,4.5,0,0,0,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Thirteen",2003,100,1500000,7.1,8652,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Thirteen Conversations About One Thing",2001,104,3000000,7.2,2883,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Thirteen Days",2000,145,80000000,7.4,10926,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Thirteen Hours by Air",1936,77,NA,7.1,8,0,0,0,0,0,14.5,34.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Thirteen Women",1932,59,NA,6.2,79,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Thirteenth Chair, The",1929,72,NA,5.6,64,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Thirteenth Floor, The",1999,100,16000000,6.4,7712,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Thirteenth Guest, The",1932,69,NA,6.1,28,4.5,0,0,14.5,4.5,34.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thirty Day Princess",1934,74,NA,5.4,22,0,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Thirty Seconds Over Tokyo",1944,138,NA,7.4,669,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Thirty Two Short Films About Glenn Gould",1993,98,NA,7.5,1011,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Thirty-Nine Steps, The",1978,102,NA,6.2,329,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Thiruda Thiruda",1993,140,NA,4.5,36,14.5,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"This Above All",1942,110,NA,6.9,60,0,0,0,4.5,14.5,24.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"This Angry Age",1958,100,NA,5,21,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"This Boy's Life",1993,115,NA,7.1,3913,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"This Corrosion",2003,75,NA,5.8,11,4.5,14.5,4.5,0,0,14.5,0,0,4.5,34.5,"",0,0,0,0,0,0,0 -"This Could Be the Night",1957,104,NA,6.6,79,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"This Day and Age",1933,86,NA,6.1,21,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"This Divided State",2005,88,10000,5.5,35,14.5,4.5,0,0,4.5,0,4.5,4.5,4.5,74.5,"",0,0,0,0,1,0,0 -"This Earth Is Mine",1959,124,NA,5.8,93,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"This Filthy Earth",2001,111,NA,5.6,43,14.5,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"This Girl's Life",2003,104,NA,6.3,284,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"This Gun for Hire",1942,80,NA,7.7,571,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"This Guy Is Falling",2000,12,NA,7,31,0,4.5,0,4.5,4.5,14.5,14.5,4.5,24.5,24.5,"",0,0,1,0,0,0,1 -"This Happy Breed",1944,114,NA,7.2,226,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"This Happy Feeling",1958,92,NA,5.6,52,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"This Is America Part 2",1977,102,NA,4.4,17,4.5,14.5,0,24.5,14.5,14.5,0,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"This Is Cinerama",1952,116,NA,7.5,73,0,0,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"This Is Elvis",1981,144,5000000,6.2,200,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,1,0,0 -"This Is Harry Lehman",1999,18,NA,4.7,5,0,0,0,24.5,44.5,0,0,24.5,0,24.5,"",0,0,0,0,0,0,1 -"This Is It",1971,10,NA,6,11,4.5,0,0,4.5,14.5,4.5,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"This Is John",2003,8,NA,6.1,16,4.5,0,0,4.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"This Is Korea!",1951,50,NA,4.1,19,24.5,14.5,4.5,0,4.5,4.5,14.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"This Is My Affair",1937,100,NA,6.9,41,4.5,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"This Is My Life",1992,105,NA,5.6,247,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"This Is My Love",1954,91,NA,4.4,19,24.5,0,0,14.5,34.5,0,4.5,4.5,24.5,4.5,"",0,0,0,1,0,0,0 -"This Is My Street",1963,94,NA,6.7,6,0,0,0,0,34.5,0,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"This Is Not a Film",2003,88,NA,5,48,14.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"This Is Not a Love Song",2002,94,NA,6.6,125,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"This Is Not a Love Story",2002,81,1000000,4.2,9,14.5,14.5,0,0,14.5,34.5,14.5,0,0,24.5,"",0,0,1,1,0,0,0 -"This Is Not an Exit: The Fictional World of Bret Easton Ellis",2000,80,NA,6.8,22,4.5,0,4.5,0,14.5,4.5,34.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"This Is Spinal Tap",1984,82,NA,8,20576,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"This Is Tomorrow",1943,11,NA,6.2,5,0,0,0,24.5,24.5,0,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"This Is What Democracy Looks Like",2000,72,NA,8.1,44,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"This Is a Hijack",1973,90,NA,5.4,9,0,14.5,24.5,0,14.5,34.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"This Is a Life?",1955,7,NA,7,41,4.5,0,4.5,4.5,4.5,4.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"This Is the Army",1943,121,NA,5.3,113,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"This Is the Disk-O-Boyz",1999,85,NA,4.3,41,4.5,24.5,0,4.5,14.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"This Is the Night",1932,80,NA,6.4,24,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"This Island Earth",1955,87,800000,5.4,1294,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"This Land",2004,2,NA,8.4,67,0,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,1,0,0,0,1 -"This Land Is Mine",1943,103,NA,7.2,245,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"This Love of Ours",1945,90,2000000,5.3,21,0,0,4.5,4.5,24.5,4.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"This Man Is Mine",1934,76,NA,5.9,15,0,0,0,4.5,24.5,44.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"This Man Is News",1938,63,NA,7.8,14,4.5,0,0,4.5,0,0,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"This Man in Paris",1939,86,NA,8.7,8,0,0,0,0,0,0,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"This Man's Navy",1945,100,NA,5.3,24,0,4.5,4.5,0,24.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"This Might Be Good",2000,6,NA,6.9,31,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"This Modern Age",1931,68,NA,6.2,40,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"This Old Cub",2004,86,NA,6.2,78,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,1,0,0 -"This Property Is Condemned",1966,110,4000000,6.4,497,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"This Rebel Breed",1960,90,NA,4.7,8,0,14.5,0,34.5,0,24.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"This Side of the Law",1950,74,NA,5.7,14,0,0,4.5,4.5,24.5,14.5,24.5,0,24.5,4.5,"",0,0,0,1,0,0,0 -"This So-Called Disaster: Sam Shepard Directs the Late Henry Moss",2003,90,NA,5.8,46,4.5,4.5,14.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,"R",0,0,0,0,1,0,0 -"This Space Between Us",2000,98,1290000,4.3,32,0,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,1,0,1,0 -"This Sporting Life",1963,134,NA,7.7,405,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"This Stuff'll Kill Ya!",1971,98,NA,2.5,31,24.5,24.5,14.5,0,4.5,0,4.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"This Thing Called Love",1941,98,NA,6.5,13,0,0,0,0,14.5,34.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"This Thing of Ours",2003,100,NA,5.5,51,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"This Time for Keeps",1942,73,NA,7.2,11,0,0,14.5,0,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"This Time for Keeps",1947,105,NA,6.1,45,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"This Unfamiliar Place",1992,10,NA,4.6,9,0,24.5,0,14.5,14.5,24.5,14.5,0,14.5,14.5,"",0,0,0,0,1,0,1 -"This Unnameable Little Broom",1985,11,NA,8.1,69,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,1,0,0,0,0,1 -"This Was Paris",1942,77,NA,5,9,0,0,34.5,14.5,34.5,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"This Woman Is Dangerous",1952,100,NA,5.8,53,0,4.5,0,14.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"This Won't Hurt a Bit",1993,85,NA,5.7,12,0,0,4.5,4.5,4.5,14.5,0,24.5,0,34.5,"",0,0,1,0,0,0,0 -"This World of Ours: Ireland",1954,9,NA,1.3,8,74.5,24.5,0,0,0,0,0,0,0,0,"",0,0,0,0,1,0,1 -"This World, Then the Fireworks",1997,100,NA,4.6,340,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"This Year's Love",1999,108,NA,6.1,522,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Thisavros tou makariti, O",1959,89,NA,9.2,12,0,0,0,0,4.5,0,4.5,34.5,0,45.5,"",0,0,1,0,0,0,0 -"Thodasa Roomani Ho Jaayen",1990,160,NA,5.9,14,0,0,0,0,4.5,0,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Thodisi Bewafaii",1980,150,NA,8.3,6,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Thomas Crown Affair, The",1968,102,4300000,6.7,2766,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Thomas Crown Affair, The",1999,113,48000000,6.7,17220,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Thomas Pynchon: A Journey Into the Mind of P.",2001,96,NA,8.2,17,4.5,0,0,0,0,0,4.5,44.5,44.5,0,"",0,0,0,0,1,0,0 -"Thomas and the Magic Railroad",2000,85,19000000,4.2,364,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thomas est amoureux",2000,97,NA,7.2,623,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Thomas l'imposteur",1964,92,NA,7.2,11,0,0,0,0,4.5,14.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Thomasine & Bushrod",1974,95,NA,5.3,30,4.5,14.5,0,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Thor il conquistatore",1983,91,NA,2.7,34,44.5,24.5,14.5,0,4.5,4.5,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Thorn, The",1974,93,NA,4.4,13,14.5,4.5,0,14.5,4.5,14.5,0,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Thoroughbreds Don't Cry",1937,80,NA,6,58,0,0,0,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Thoroughly Modern Millie",1967,138,6000000,6.6,814,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Thorvald og Linda",1982,88,NA,3.8,7,0,45.5,0,14.5,0,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Thorvaldsen",1949,10,NA,6.4,8,0,0,0,0,14.5,34.5,14.5,34.5,0,0,"",0,0,0,0,1,0,1 -"Those Awful Hats",1909,2,NA,6.8,76,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Those Beautiful Dames",1934,7,NA,5.6,8,0,0,0,0,45.5,24.5,14.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Those Calloways",1965,131,NA,6.4,78,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Those Dear Departed",1987,88,NA,3.7,14,24.5,4.5,24.5,0,0,14.5,0,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Those Endearing Young Charms",1945,83,NA,5.4,30,4.5,0,0,4.5,24.5,34.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Those Good Old Days",1941,11,NA,5.3,17,0,0,24.5,4.5,4.5,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Those Lips, Those Eyes",1980,105,NA,6,50,4.5,4.5,4.5,14.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Those Love Pangs",1914,16,NA,5.3,52,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Those Magnificent Men in Their Flying Machines, or How I Flew from London to Paris in 25 hours 11 minutes",1965,138,5600000,6.7,1064,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Those Redheads from Seattle",1953,90,NA,5.6,28,0,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Those We Love",1932,72,NA,5.5,7,0,0,14.5,14.5,24.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Those Were the Days",1933,80,NA,7.3,18,0,0,4.5,0,14.5,4.5,24.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Those Were the Days",1992,6,NA,6.9,33,4.5,0,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Those Were the Days!",1940,74,NA,7.6,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,1,0,0,1,0 -"Thoth",2002,40,NA,7.7,36,4.5,0,0,4.5,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,1,0,1 -"Thou-Vou falakros praktor, epixeirisis Gis Madiam",1969,94,NA,8,70,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Thoughtcrimes",2003,89,NA,6.6,209,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Thousand Acres, A",1997,105,NA,5.7,1403,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Thousand Clowns, A",1965,118,NA,7.4,583,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,1,0,1,0 -"Thousand Pieces of Gold",1991,105,NA,6.9,126,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Thousand Plane Raid, The",1969,93,NA,5.6,27,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Thousand Pleasures, A",1968,70,NA,5.3,17,24.5,4.5,0,4.5,4.5,0,24.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Thousand and One Erotic Nights, A",1982,86,NA,5.7,45,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Thousand and One Nights, A",1945,93,NA,6,34,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thousands Cheer",1943,125,NA,6.6,103,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Thrashin'",1986,93,NA,5,259,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Thread",2000,10,NA,6.7,18,0,14.5,14.5,4.5,14.5,0,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Threads",1976,10,NA,7.9,16,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,1 -"Threat, The",1949,66,NA,6.9,62,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Three Ages",1923,55,NA,7.5,276,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Three American Beauties",1906,1,NA,7.1,44,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Three Arabian Nuts",1951,16,NA,8.2,43,0,0,0,0,4.5,4.5,24.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Three Barbecues: A Blackened Comedy",2004,95,25000,9.8,9,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,1,0,0,0,0 -"Three Bears, The",1935,8,NA,4.4,11,4.5,14.5,0,4.5,4.5,4.5,4.5,24.5,4.5,0,"",0,1,0,0,0,0,1 -"Three Below Zero",1998,87,NA,6.1,32,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Three Bewildered People in the Night",1987,92,5000,5.7,22,34.5,0,0,0,14.5,4.5,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Three Bites of the Apple",1967,105,NA,3.4,17,4.5,0,14.5,14.5,4.5,4.5,14.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Three Blind Mice",1938,75,NA,6.5,28,0,0,0,14.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Three Blind Mice",2003,93,NA,4.3,207,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Three Blind Mousketeers",1936,9,NA,6.3,25,0,0,14.5,14.5,14.5,14.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Three Brave Men",1956,88,NA,6.6,17,0,0,0,0,14.5,24.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Three Brothers, The",1944,3,NA,6.3,6,0,0,0,0,45.5,0,14.5,34.5,0,0,"",0,1,0,0,0,0,1 -"Three Bullets for a Long Gun",1970,89,NA,2.8,5,0,24.5,44.5,0,0,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Three Businessmen",1998,82,NA,7,73,4.5,4.5,4.5,4.5,0,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Three Caballeros, The",1944,70,NA,6.5,578,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Three Came Home",1950,106,NA,7.4,149,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Three Came to Kill",1960,70,NA,5.5,9,0,0,0,0,45.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Three Card Monte",1978,93,NA,5.1,9,14.5,0,14.5,14.5,14.5,14.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Three Card Studs",2002,9,NA,8.5,8,0,0,0,0,0,0,0,34.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Three Cases of Murder",1955,99,NA,7.1,92,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Three Cheers for the Irish",1940,99,NA,4.3,37,14.5,4.5,0,4.5,14.5,24.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Three Coins in the Fountain",1954,102,NA,6.2,358,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Three Comrades",1938,100,NA,7.2,178,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Three Daring Daughters",1948,115,NA,5.5,67,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Three Dark Horses",1952,17,NA,7.4,59,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Three Daughters",1986,108,NA,7.1,21,0,0,0,0,0,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Three Days",1997,90,NA,7.9,7,14.5,0,0,0,0,0,0,44.5,0,44.5,"",0,0,0,0,0,0,0 -"Three Days of the Condor",1975,117,NA,7.4,4897,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Three Desperate Men",1951,71,NA,4.2,11,24.5,0,4.5,4.5,4.5,0,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Three Dollars",2005,119,NA,5.2,61,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Three Faces West",1940,79,100000,5.1,101,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Three Faces of Eve, The",1957,91,NA,7.4,720,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Three Fugitives",1989,92,15000000,5.5,1664,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Three Girls About Town",1941,75,NA,6.8,18,0,0,0,0,14.5,14.5,14.5,34.5,24.5,0,"",0,0,1,0,0,0,0 -"Three Girls Lost",1931,80,NA,3.8,15,14.5,14.5,14.5,14.5,14.5,0,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Three Godfathers",1936,81,NA,7.6,68,4.5,0,4.5,0,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Three Guns for Texas",1968,99,NA,6.2,31,0,0,0,4.5,24.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Three Guys Named Mike",1951,90,NA,5.8,51,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Three Hams on Rye",1950,15,NA,8,34,0,0,0,0,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Three Hats for Lisa",1965,99,NA,3.5,13,34.5,0,14.5,0,14.5,4.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Three Hearts for Julia",1943,83,NA,6.5,7,0,0,0,0,14.5,24.5,24.5,14.5,14.5,0,"",0,0,1,0,0,1,0 -"Three Hours to Kill",1954,77,NA,6.2,38,0,0,0,4.5,24.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Three Into Two Won't Go",1969,92,NA,4.9,28,0,4.5,14.5,4.5,24.5,24.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Three Kinds of Heat",1987,87,NA,3.5,17,14.5,14.5,24.5,4.5,14.5,4.5,14.5,0,0,4.5,"",1,0,1,0,0,0,0 -"Three Kings",1999,114,48000000,7.3,31503,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,1,1,0,0,0 -"Three Little Beers",1935,17,NA,8,100,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Three Little Bops",1957,7,NA,8.2,84,0,4.5,0,4.5,0,4.5,4.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Three Little Girls in Blue",1946,100,NA,6.6,38,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Three Little Pigs",1933,8,15720,7.9,260,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Three Little Pigskins",1934,20,NA,7.3,134,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Three Little Pirates",1946,18,NA,7.2,68,4.5,0,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Three Little Pups, The",1953,7,NA,7.9,39,0,0,0,0,4.5,4.5,24.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Three Little Twirps",1943,15,NA,8.1,31,4.5,0,0,0,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Three Little Wolves",1936,9,NA,7.7,53,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Three Little Words",1950,102,NA,6.8,204,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Three Live Ghosts",1922,60,NA,6.6,9,14.5,0,0,24.5,0,0,0,0,24.5,44.5,"",0,0,1,0,0,0,0 -"Three Live Ghosts",1936,61,NA,5.1,10,0,0,0,24.5,44.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Three Lives of Thomasina, The",1964,97,NA,7,331,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Three Loan Wolves",1946,17,NA,6.3,44,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Three Long Years",2003,76,NA,7.8,11,4.5,0,4.5,0,0,4.5,0,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Three Loves Has Nancy",1938,70,NA,5.9,45,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Three Men and a Baby",1987,102,NA,5.7,7973,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Three Men from Texas",1940,76,NA,7.5,22,0,0,0,4.5,4.5,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Three Men in White",1944,85,NA,5.9,6,0,0,0,14.5,14.5,34.5,34.5,0,0,0,"",0,0,1,1,0,0,0 -"Three Men in a Boat",1956,84,NA,6,27,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Three Men on a Horse",1936,86,NA,6.4,44,4.5,0,0,0,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Three Missing Links",1938,18,NA,7.2,53,0,0,4.5,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Three Musketeers, The",1916,63,NA,6.2,6,14.5,0,0,14.5,0,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Three Musketeers, The",1921,119,NA,7.5,73,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Three Musketeers, The",1935,96,NA,5.4,30,4.5,0,4.5,0,14.5,24.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Three Musketeers, The",1939,72,NA,5.7,48,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Three Musketeers, The",1948,125,NA,7.2,659,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,1,0 -"Three Musketeers, The",1973,105,NA,7.3,2649,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Three Musketeers, The",1993,105,NA,6,6624,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,1,0 -"Three Must-Get-Theres, The",1922,58,NA,7.9,20,0,0,0,0,14.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Three O'Clock High",1987,101,NA,6.6,1279,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Three Orphan Kittens",1935,9,NA,8.2,40,0,0,0,0,4.5,14.5,14.5,24.5,34.5,14.5,"",0,1,1,0,0,0,1 -"Three Pests in a Mess",1945,15,NA,7.3,38,0,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Three Sailors and a Girl",1953,95,NA,5.6,25,0,0,0,4.5,24.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Three Sappy People",1939,18,NA,8.1,72,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Three Seasons",1999,104,NA,7.2,1027,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Three Secrets",1950,98,NA,7.2,52,0,0,0,4.5,4.5,4.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Three Shake-a-Leg Steps to Heaven",1993,90,NA,6.8,17,44.5,14.5,14.5,14.5,4.5,0,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Three Sisters",1970,165,NA,5.8,52,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Three Sisters on Moon Lake",2001,22,NA,9.2,11,0,0,0,0,0,0,4.5,0,45.5,34.5,"",0,0,0,0,0,0,1 -"Three Smart Boys",1937,11,NA,6.7,15,0,0,0,14.5,14.5,0,44.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Three Smart Girls",1936,84,326000,7.1,107,4.5,0,0,0,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Three Smart Girls Grow Up",1939,90,NA,7.3,45,0,0,0,0,0,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Three Smart Saps",1942,16,NA,8.1,46,0,0,0,4.5,4.5,4.5,14.5,34.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Three Sons o' Guns",1941,65,NA,6.3,11,4.5,0,0,4.5,14.5,24.5,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Three Steps North",1951,85,NA,6.4,7,0,0,0,0,0,24.5,14.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Three Stooges in Orbit, The",1962,90,450000,5.5,156,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Three Strangers",1946,92,NA,7.1,177,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Three Stripes in the Sun",1955,93,NA,5.6,9,0,0,0,0,24.5,34.5,0,34.5,14.5,0,"",0,0,0,1,0,1,0 -"Three Texas Steers",1939,56,NA,4.4,42,14.5,4.5,4.5,4.5,34.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Three Troubledoers, The",1946,17,NA,6.7,47,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Three Violent People",1957,100,NA,5.7,78,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Three Warriors",1978,100,NA,5.6,15,0,4.5,0,4.5,24.5,0,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Three Weird Sisters, The",1948,82,NA,6,5,0,0,0,24.5,0,64.5,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Three Who Loved",1931,64,NA,5.7,9,14.5,0,0,14.5,14.5,34.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Three Wise Fools",1946,90,NA,6.3,50,0,0,0,4.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Three Wise Girls",1932,68,NA,5.1,13,0,14.5,4.5,4.5,4.5,4.5,34.5,4.5,0,4.5,"",0,0,1,1,0,1,0 -"Three Wishes",1995,115,NA,5.5,552,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"Three and a Half",2002,85,NA,2.8,16,34.5,0,14.5,14.5,0,4.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Three at Once",1986,8,NA,8.4,8,0,0,0,0,14.5,14.5,0,24.5,0,45.5,"",0,0,0,0,0,0,1 -"Three for All",1974,90,NA,3.8,9,14.5,0,24.5,34.5,24.5,0,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Three for Bedroom C",1952,74,NA,3,8,14.5,14.5,0,14.5,24.5,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Three for Breakfast",1948,7,NA,7.6,34,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Three for the Road",1987,88,NA,4.3,210,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Three in the Attic",1968,90,NA,4.5,74,0,4.5,4.5,4.5,24.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Three of Hearts",1993,102,NA,5.4,546,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Three of Hearts: A Postmodern Family",2004,95,NA,7.9,10,14.5,0,0,0,0,14.5,14.5,34.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Three of Us, The",2003,3,NA,9.8,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,1,0,0,0,0,1 -"Three of a Kind",1926,23,NA,3.3,8,0,0,45.5,24.5,14.5,0,0,14.5,0,0,"",0,0,1,0,0,0,1 -"Three of a Kind",1944,60,NA,5.5,10,0,0,0,14.5,34.5,24.5,0,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Three on a Couch",1966,109,NA,5.6,111,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Three on a Match",1932,63,NA,7.1,271,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Three on a Meathook",1972,80,20000,3,70,24.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Three on the Trail",1936,67,NA,7.2,21,0,0,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Three the Hard Way",1974,89,NA,5.4,93,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Three to Tango",1999,98,20000000,6,5719,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Three-Cornered Moon",1933,77,NA,5.8,17,0,0,4.5,4.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Three-Way Weekend",1980,78,NA,6.2,5,24.5,0,0,24.5,0,24.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Three... Extremes",2004,118,NA,6.9,377,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Threesome",1994,93,NA,6,3620,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Threshold",1981,97,NA,5.4,70,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Threshold, The",1998,8,NA,5.5,6,0,0,0,0,64.5,34.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Threshold: The Blue Angels Experience",1975,93,NA,9.3,6,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,0,0,1,0,0 -"Thrifty Pig, The",1941,4,NA,5.4,33,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Thrill Kill Jack in Hale Manor",2000,80,10000,7.7,7,0,24.5,0,0,0,0,0,0,0,74.5,"",1,0,0,0,0,0,0 -"Thrill Killers, The",1964,69,NA,3.4,60,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Thrill Ride: The Science of Fun",1997,38,NA,5.8,64,0,4.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Thrill Street Blues",1986,85,NA,7.8,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Thrill for Thelma, A",1935,18,NA,6.7,9,0,0,0,0,24.5,14.5,34.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Thrill of It All, The",1963,108,NA,6.8,454,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Thrill of a Romance",1945,105,NA,6.4,56,0,0,4.5,4.5,14.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Thriller",1979,45,NA,4.5,18,34.5,0,4.5,0,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Thriller",2002,7,NA,3.8,12,14.5,0,14.5,4.5,4.5,0,14.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Thriller - en grym film",1974,79,NA,6.4,336,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Thrilling",1965,117,NA,5.5,5,0,0,0,0,44.5,24.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Thrillkill",1986,96,NA,2.9,24,14.5,14.5,24.5,14.5,4.5,0,0,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Through Dead Eyes",1999,79,NA,4,5,24.5,24.5,0,44.5,0,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Through My Thick Glasses",2004,13,NA,6.5,25,24.5,0,0,0,14.5,4.5,14.5,14.5,14.5,4.5,"",0,1,0,0,0,0,1 -"Through Riley's Eyes",2000,30,NA,2.6,11,0,14.5,4.5,4.5,0,0,0,0,0,64.5,"",0,0,0,1,0,0,1 -"Through the Looking Glass",1976,91,NA,6.3,34,4.5,0,0,4.5,14.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Throw Momma from the Train",1987,87,NA,5.9,5726,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Throwing Down",1995,90,NA,9.7,6,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,0,1,0,0,0 -"Throwing Mail Into Bags, U.S.P.O.",1903,1,NA,3.5,5,0,24.5,44.5,24.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Thru the Mirror",1936,10,NA,7.5,82,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Thru the Wire",1987,6,NA,6,18,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Thrust In Me",1985,8,NA,5.8,33,14.5,0,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Thug Life in D.C.",1999,70,NA,5.6,25,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Thugs",1998,83,NA,2.6,14,34.5,14.5,0,0,4.5,4.5,4.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Thugs with Dirty Mugs",1939,8,NA,6.6,26,4.5,0,0,0,4.5,34.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Thumb Fun",1952,7,NA,6.8,25,0,0,4.5,0,14.5,14.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Thumb Tripping",1972,94,NA,3.3,14,14.5,24.5,0,24.5,4.5,24.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Thumbelina",1991,50,NA,6.9,7,0,0,14.5,0,44.5,0,0,0,0,44.5,"",0,1,0,0,0,0,0 -"Thumbelina",1994,86,NA,5.5,368,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,1,0,1,0,0,0 -"Thumbsucker",2005,95,NA,4.5,129,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Thumbtanic",2002,26,NA,6.7,225,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Thunder",1983,86,NA,3.9,39,24.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Thunder Afloat",1939,95,1000000,6,15,0,0,0,4.5,14.5,64.5,0,4.5,0,4.5,"",1,0,0,1,0,1,0 -"Thunder Alley",1967,90,NA,5.4,26,0,0,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",1,0,0,1,0,1,0 -"Thunder Bay",1953,103,NA,6.4,179,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thunder Below",1932,67,NA,3,8,24.5,0,34.5,0,0,24.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Thunder Birds",1942,78,NA,5.4,19,4.5,0,0,14.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Thunder II",1985,90,NA,3.5,19,34.5,24.5,14.5,14.5,4.5,0,4.5,14.5,0,4.5,"",1,0,0,1,0,0,0 -"Thunder III",1988,90,NA,2.9,18,24.5,14.5,14.5,14.5,4.5,0,4.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Thunder In Dixie",1964,73,NA,5,8,0,0,0,14.5,14.5,14.5,0,0,0,64.5,"",1,0,0,1,0,0,0 -"Thunder Island",1963,65,NA,5.6,14,0,0,0,24.5,24.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Thunder Mountain",1947,60,NA,5.9,10,0,0,0,0,24.5,14.5,0,45.5,0,24.5,"",0,0,0,0,0,0,0 -"Thunder Ninja Kids: The Hunt for the Devil Boxer",1991,90,NA,1.8,11,44.5,4.5,0,0,0,0,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thunder Over Arizona",1956,70,NA,4.9,7,0,14.5,0,24.5,24.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Thunder Over Mexico",1933,70,NA,6.8,11,0,0,4.5,0,0,44.5,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Thunder Over the Plains",1953,82,NA,5.3,41,0,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thunder Pass",1954,76,NA,5.3,9,14.5,0,0,14.5,34.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Thunder Road",1958,92,NA,6.6,444,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Thunder Rock",1943,112,NA,6.3,51,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Thunder Run",1986,90,NA,4.4,37,4.5,0,4.5,24.5,14.5,24.5,4.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Thunder Town",1946,57,NA,5.3,8,0,14.5,24.5,14.5,14.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Thunder Trail",1937,58,NA,5.3,8,0,0,0,0,34.5,0,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Thunder and Lightning",1977,95,NA,4,30,14.5,0,14.5,34.5,24.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Thunder in Carolina",1960,92,NA,5.6,19,0,14.5,4.5,0,24.5,4.5,14.5,0,4.5,34.5,"",1,0,0,1,0,0,0 -"Thunder in Guyana",2003,50,150000,9.3,6,0,0,0,0,0,0,14.5,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Thunder in the City",1937,87,NA,5.9,23,0,0,14.5,4.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Thunder in the East",1952,97,NA,5.3,30,0,4.5,14.5,14.5,24.5,24.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Thunder in the Pines",1948,61,NA,6.3,9,0,0,0,0,14.5,14.5,34.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Thunder in the Sun",1959,81,NA,5.4,37,4.5,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thunder in the Valley",1947,103,NA,6.5,13,0,0,0,4.5,4.5,0,24.5,24.5,0,34.5,"",0,0,0,1,0,0,0 -"Thunder of Drums, A",1961,97,NA,5.5,83,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Thunder on the Hill",1951,84,NA,6.3,49,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Thunderball",1965,130,9000000,6.8,8226,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Thunderbird",2001,18,NA,6.6,12,0,0,0,0,4.5,4.5,14.5,0,0,64.5,"",0,0,1,1,0,0,1 -"Thunderbird 6",1968,89,NA,6.1,140,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Thunderbirds",1952,98,NA,5.1,20,14.5,0,4.5,14.5,4.5,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Thunderbirds",2004,95,57000000,4.4,1419,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",1,0,1,0,0,0,0 -"Thunderbirds Are GO",1966,93,NA,6.5,278,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Thunderbolt",1929,85,NA,7.1,28,4.5,0,0,14.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Thunderbolt",1947,44,NA,6.9,24,0,0,14.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Thunderbolt and Lightfoot",1974,114,4000000,6.8,1983,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Thundercrack!",1977,158,NA,5.8,74,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Thunderhead - Son of Flicka",1945,78,NA,5.2,43,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Thunderheart",1992,119,NA,6.5,2680,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Thundering 8th, The",2000,100,NA,6.2,8,14.5,0,0,0,34.5,0,24.5,0,14.5,14.5,"",1,0,0,1,0,1,1 -"Thundering Herd, The",1933,62,NA,5.9,13,0,0,0,4.5,34.5,34.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Thundering Hoofs",1942,61,NA,7,6,0,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Thundering Jets",1958,73,NA,6.2,6,0,0,0,0,45.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Thunderman",2004,18,NA,6,13,34.5,0,0,0,0,4.5,4.5,0,0,44.5,"",1,0,1,0,0,0,1 -"Thunderpants",2002,87,7000000,4.2,353,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Thunderpoint",1998,75,NA,7,9,24.5,0,0,0,14.5,0,14.5,0,14.5,44.5,"",1,0,0,0,0,0,0 -"Thunderstruck",2004,98,NA,5.4,114,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Thung lung hoang vang",2000,90,NA,8,11,0,0,0,0,0,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Thuong nho dong que",1995,116,NA,7.1,7,0,0,14.5,0,0,0,0,45.5,0,24.5,"",0,0,0,0,0,0,0 -"Thursday",1998,87,NA,6.6,1572,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",1,0,0,0,0,0,0 -"Thursday Afternoon",1998,18,NA,6.9,7,14.5,0,0,0,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Thursday's Child",1943,81,NA,5.5,7,0,0,0,0,14.5,45.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Thursday's Children",1954,21,NA,7.5,6,0,0,0,0,0,14.5,34.5,34.5,14.5,0,"",0,0,0,0,1,0,1 -"Thy Neighbor's Wife",2001,92,NA,3.9,92,4.5,14.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Thyagayya",1946,186,NA,8.9,8,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Thymios ta ekane thalassa, O",1959,80,NA,6.3,5,0,0,24.5,0,0,24.5,64.5,0,0,0,"",0,0,1,0,0,0,0 -"Ti 30..., ti 40..., ti 50...",1972,98,NA,6.7,16,4.5,0,0,0,14.5,14.5,14.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Ti ekanes ston polemo, Thanassi?",1971,85,NA,7.6,44,4.5,0,4.5,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,1,1,0,0,0 -"Ti kniver i hjertet",1994,96,NA,6.2,173,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ti tian xing dao zhi sha xiong",1994,84,NA,5.8,18,0,0,0,4.5,24.5,24.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ti, koyto si na nebeto",1990,102,NA,6.3,7,0,0,14.5,0,0,0,0,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Ti-Cul Tougas",1976,84,NA,5.6,11,0,0,4.5,0,4.5,14.5,14.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Ti-mine, Bernie pis la gang...",1977,124,NA,6.3,14,0,0,0,0,24.5,14.5,34.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Tia Juana After Midnite",1954,58,NA,1,8,84.5,0,0,0,0,0,14.5,0,0,0,"",0,0,0,0,1,0,0 -"Tian di ying xiong",2003,115,NA,6.4,567,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Tian ma cha fang",1999,93,NA,5.1,26,4.5,4.5,4.5,0,4.5,0,24.5,14.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Tian mi mi",1996,116,NA,7.6,630,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Tian ruo you qing er",1992,87,NA,3.9,21,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tian shang de lian ren",2002,93,NA,6.5,13,0,0,0,14.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tian shi xing dong",1987,93,NA,5.3,35,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Tian shi xing dong II zhi huo feng jiao long",1989,90,NA,6.1,20,0,0,4.5,0,14.5,24.5,24.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tian xia di yi quan",1973,104,NA,6,163,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Tian xia wu zei",2004,100,NA,7.2,273,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tian xuan di lian",1999,102,NA,6.3,18,4.5,0,0,0,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tian ya hai jiao",1996,101,NA,7.8,88,0,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Tian you yan",2000,106,NA,7.7,29,0,4.5,0,0,14.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Tian yu",1998,99,NA,7.3,849,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Tian yu di",1994,140,NA,5.9,37,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tianguo niezi",1994,99,NA,6.5,77,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Tianming",1933,116,NA,5.2,9,0,0,0,14.5,0,14.5,14.5,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Tianqiao bu jianle",2002,25,NA,6.8,57,0,0,4.5,4.5,4.5,4.5,24.5,44.5,4.5,4.5,"",0,0,1,1,0,0,1 -"Tiara Tahiti",1962,100,NA,5.3,36,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Tibet: Cry of the Snow Lion",2003,104,NA,6.6,106,4.5,0,4.5,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Tiburoneros",1963,100,NA,4.8,19,4.5,14.5,0,4.5,4.5,0,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Tiburzi",1996,81,NA,4.8,5,44.5,0,0,0,0,0,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Tic Code, The",1999,91,NA,5.8,164,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Tichborne Claimant, The",1998,98,NA,6.2,70,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Tick Tock",2000,93,NA,5.8,163,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Tick Tock Tuckered",1944,7,NA,6.9,32,0,0,0,14.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Ticker",2001,92,NA,3.3,1491,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Ticket",1986,100,NA,6.9,11,0,0,0,0,14.5,14.5,4.5,44.5,4.5,0,"",0,0,0,0,0,0,0 -"Ticket to Heaven",1981,108,NA,6.5,143,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ticket to Jerusalem",2002,85,NA,4.6,89,34.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ticket to Tomahawk, A",1950,90,NA,5.8,47,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ticket, The",1994,27,NA,5.3,18,4.5,0,4.5,0,14.5,0,14.5,4.5,4.5,44.5,"",0,0,1,0,0,0,1 -"Ticking Man, The",2003,85,NA,4.8,23,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tickle Me",1965,90,1480000,4.4,181,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tickle in the Heart, A",1996,90,NA,7.1,34,0,0,0,0,4.5,14.5,14.5,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Tickled Pink",1968,6,NA,6.2,11,0,0,0,0,24.5,34.5,4.5,4.5,14.5,0,"",0,1,0,0,0,0,1 -"Ticklish Affair, A",1963,88,NA,5.5,42,0,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Ticks",1999,10,NA,8.6,8,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,0,0,1 -"Tide",1999,12,NA,3.5,12,0,4.5,0,44.5,24.5,4.5,0,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Tide of Empire",1929,73,NA,5.7,9,0,0,0,14.5,34.5,34.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Tides of War",1990,91,NA,4.6,17,0,14.5,14.5,4.5,14.5,34.5,0,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Tie That Binds, The",1995,99,NA,4.7,307,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Tie Xi Qu: West of the Tracks - Part 1: Rust",2003,240,NA,9.5,14,0,0,0,0,0,0,0,24.5,4.5,74.5,"",0,0,0,0,1,0,0 -"Tie Xi Qu: West of the Tracks - Part 2: Remnants",2003,176,NA,9.5,12,0,0,0,0,0,0,4.5,0,24.5,64.5,"",0,0,0,0,1,0,0 -"Tie Xi Qu: West of the Tracks - Part 3: Rails",2003,135,NA,9.8,11,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,0,0,1,0,0 -"Tie ma liu",1977,91,NA,6.5,99,4.5,4.5,4.5,14.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tie qi men",1980,113,NA,7.4,30,0,4.5,0,0,4.5,4.5,24.5,14.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Tie wa",1973,89,NA,6.8,12,4.5,0,0,4.5,0,4.5,4.5,0,24.5,44.5,"",1,0,0,1,0,0,0 -"Tie-died: Rock 'n Roll's Most Deadicated Fans",1995,80,NA,6,28,4.5,4.5,4.5,0,14.5,24.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Tief oben",1994,90,NA,5,10,0,14.5,0,0,44.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Tiempo de la felicidad, El",1997,102,NA,7.7,75,0,0,0,4.5,4.5,4.5,14.5,44.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tiempo de morir",1966,90,NA,6.6,17,0,0,0,4.5,14.5,0,0,14.5,45.5,14.5,"",0,0,0,1,0,0,0 -"Tiempo de morir",1985,98,NA,7.2,25,4.5,0,0,4.5,4.5,4.5,4.5,44.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tiempo de revancha",1981,112,NA,7.7,79,4.5,0,0,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Tiempo de silencio",1986,111,NA,6.8,34,4.5,0,4.5,0,0,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tiempo de tormenta",2003,87,NA,6.9,34,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tiempo real",2002,90,NA,5.6,50,4.5,0,4.5,0,4.5,4.5,4.5,0,4.5,84.5,"",0,0,0,0,0,0,0 -"Tien ya, ming yueh tao",1976,86,NA,7.8,53,0,4.5,0,4.5,0,4.5,24.5,34.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Tierische Liebe",1995,120,NA,8.1,51,4.5,4.5,0,0,0,4.5,14.5,4.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Tierno verano de lujurias y azoteas",1993,91,NA,7.4,29,0,4.5,4.5,4.5,4.5,24.5,4.5,34.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Tierra",1996,125,NA,7.4,812,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Tierra brutal",1962,83,NA,4.4,9,0,14.5,14.5,24.5,34.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Tierra del fuego",2000,108,NA,5.7,44,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tierra prometida, La",1971,80,NA,4.3,10,24.5,0,0,0,14.5,0,0,0,24.5,45.5,"",0,0,0,0,0,0,0 -"Ties That Bind, The",1984,55,NA,8.8,6,0,0,0,14.5,0,0,0,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Tieta do Agreste",1996,140,NA,7.9,265,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Tifanfaya",1997,40,NA,5.4,5,0,0,0,0,44.5,44.5,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Tiffany Jones",1973,90,NA,3.7,26,4.5,4.5,14.5,4.5,24.5,4.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Tifoso, l'arbitro e il calciatore, Il",1983,93,NA,6,18,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tigar",1978,103,NA,5.5,8,0,14.5,0,0,0,14.5,0,45.5,24.5,0,"",0,0,0,1,0,0,0 -"Tiger Bay",1959,105,NA,7.7,306,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tiger Claws",1992,92,NA,4.1,64,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tiger Claws III",1999,95,NA,3,43,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Tiger Fangs",1943,59,NA,6,5,0,0,0,0,0,64.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Tiger Heart",1996,90,NA,3.5,76,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tiger Makes Out, The",1967,94,NA,4.8,43,0,4.5,4.5,24.5,4.5,14.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tiger Shark",1932,77,NA,6.4,88,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Tiger Street",1998,82,NA,4.5,26,34.5,4.5,4.5,4.5,4.5,0,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Tiger Trouble",1945,7,NA,7,49,4.5,0,4.5,4.5,4.5,4.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Tiger Walks, A",1964,91,NA,6.5,47,0,0,4.5,0,4.5,34.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tiger Warsaw",1988,93,NA,4.2,122,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Tiger Woman, The",1944,196,NA,7.2,23,0,0,0,4.5,0,14.5,14.5,4.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Tiger by the Tail",1968,99,NA,5.9,11,4.5,0,0,4.5,24.5,0,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Tiger in the Smoke",1956,94,NA,6.2,17,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tiger von Eschnapur, Der",1938,94,NA,6.5,7,0,14.5,0,14.5,0,0,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Tiger von Eschnapur, Der",1959,95,NA,6.4,187,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Tiger's Tale, A",1988,97,NA,4.9,120,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Tigerin, Die",1992,83,NA,4.1,28,14.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Tigerland",2000,100,NA,7.2,5945,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Tigershark",1987,98,NA,2.5,9,34.5,0,14.5,24.5,0,0,24.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Tigerstreifenbaby wartet auf Tarzan",1998,118,NA,5.3,31,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tigger Movie, The",2000,77,20000000,6.1,1376,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Tight Spot",1955,97,NA,6.5,106,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tightrope",1984,115,NA,6.2,1591,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tightrope",1998,5,NA,5.8,25,0,14.5,4.5,0,4.5,14.5,24.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Tigra, La",1990,80,NA,5,12,4.5,0,4.5,24.5,0,4.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Tigre aime la chair fraiche, Le",1964,90,NA,6.1,9,14.5,0,0,0,34.5,14.5,34.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Tigre de Santa Julia, El",2002,128,2000000,6.1,75,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Tigre dei sette mari, La",1963,90,NA,5.4,11,0,4.5,0,0,24.5,14.5,24.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Tigre reale",1916,80,NA,7.5,12,0,0,0,0,0,24.5,4.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Tigre, Il",1967,105,NA,5.4,41,4.5,4.5,0,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Tigrero: A Film That Was Never Made",1994,75,NA,5.9,82,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,1,0,0 -"Tigress",1977,85,NA,4.7,139,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tigresses... and Other Maneaters",1979,77,NA,2.7,12,24.5,4.5,4.5,0,4.5,0,0,44.5,4.5,0,"",0,0,0,0,0,0,0 -"Tih Minh",1918,418,NA,7.7,6,0,0,0,0,14.5,14.5,0,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Tikhiy Don",1957,107,NA,7.5,38,4.5,4.5,0,4.5,4.5,14.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Tikhiye stranitsy",1993,77,NA,6.8,46,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Tiko and the Shark",1964,88,NA,5.7,6,0,0,0,0,34.5,14.5,14.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Til en ukjent",1990,80,NA,5.7,8,0,0,0,0,14.5,45.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Tilai",1990,81,NA,7.1,68,0,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tile-kannivaloi",1987,91,NA,6.4,10,14.5,0,0,14.5,0,24.5,24.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Tilinteko",1987,70,NA,6.1,22,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Till Death",1978,80,NA,3.6,9,0,0,24.5,14.5,14.5,14.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Till Death Us Do Part",1969,96,NA,5.3,45,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Till Eulenspiegel",2003,85,NA,4.6,48,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Till Human Voices Wake Us",2002,101,NA,6,456,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Till There Was You",1990,90,NA,5.6,113,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Till There Was You",2003,109,NA,7.5,12,4.5,0,0,0,24.5,0,0,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Till We Meet Again",1936,72,NA,7.3,8,0,0,14.5,14.5,0,24.5,24.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Till We Meet Again",1944,88,NA,6.5,17,0,0,0,4.5,14.5,14.5,4.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Till the Clouds Roll by",1946,132,2841000,6.5,252,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Till the End of Time",1946,105,NA,6.6,133,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Till the End of the Night",1994,90,NA,3.6,29,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Tillbaka till Ararat",1988,99,NA,4.8,13,4.5,4.5,0,0,24.5,0,14.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Tillie and Gus",1933,58,NA,7.5,57,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tillie's Punctured Romance",1914,82,50000,6.3,247,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tillsammans",2000,106,NA,7.5,4277,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,1,1,0,0,0 -"Tilt",1979,111,NA,4,59,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tim",1979,109,NA,6,537,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Tim Tom",2003,5,NA,7.7,17,0,0,0,0,0,24.5,14.5,34.5,24.5,0,"",0,0,0,0,0,0,1 -"Timber",1941,8,NA,7.3,45,0,0,0,4.5,0,24.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Timber Stampede",1939,59,NA,4.9,11,0,0,0,14.5,45.5,14.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Timber Tramps",1975,98,NA,4.3,12,24.5,0,0,14.5,34.5,4.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Timberjack",1955,94,NA,4.4,26,4.5,4.5,4.5,14.5,34.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Timbuktu",1959,91,NA,4.9,15,0,0,4.5,14.5,34.5,24.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Time After Time",1979,112,NA,7.2,2164,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Time Bandits",1981,110,5000000,6.9,9434,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Time Bomb",1953,72,NA,6.5,69,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Time Changer",2002,95,825000,4.5,304,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Time Expired",1992,29,NA,4.8,11,4.5,24.5,0,0,4.5,4.5,0,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Time Flies",1944,88,NA,4.7,13,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Time Gentlemen Please!",1952,79,NA,7.9,6,0,0,0,0,0,34.5,14.5,45.5,0,0,"",0,0,1,0,0,0,0 -"Time Guardian, The",1987,87,NA,3.6,102,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Time In the Sun",1940,55,NA,7.1,10,0,14.5,14.5,0,0,14.5,0,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Time Limit",1957,96,NA,6.7,64,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Time Lock",1957,73,NA,5.8,40,0,4.5,4.5,14.5,24.5,14.5,34.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Time Machine",1997,23,NA,4,12,0,4.5,34.5,4.5,0,24.5,4.5,0,0,14.5,"",0,0,0,1,0,0,1 -"Time Machine, The",1960,89,750000,7.3,4269,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Time Machine, The",2002,96,80000000,5.5,12424,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Time Out",1988,83,NA,4.8,35,0,4.5,4.5,24.5,14.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Time Out",2004,19,45000,7,62,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Time Out for Rhythm",1941,75,NA,7.6,8,0,0,0,24.5,0,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Time Out of Mind",1947,88,NA,6.8,7,0,14.5,0,0,0,24.5,14.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Time Out of War, A",1954,20,NA,6,15,0,0,0,0,24.5,4.5,0,14.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Time Piece",1965,9,NA,8.8,31,0,4.5,0,0,4.5,4.5,0,4.5,14.5,74.5,"",0,0,0,0,0,0,1 -"Time Runner",1993,90,NA,3.1,246,24.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Time Served",1999,94,NA,3.1,115,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Time Share",2000,87,NA,5.2,327,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,0,0,1,0 -"Time Table",1956,79,NA,5.4,7,0,0,0,14.5,24.5,0,44.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Time Tracers",1997,101,NA,3.7,13,14.5,24.5,14.5,0,0,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Time Trackers",1989,86,NA,3.4,58,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Time Travelers, The",1964,82,250000,5.2,133,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Time Under Fire",1996,88,NA,3.6,104,24.5,24.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Time Walker",1982,83,750000,2.4,170,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Time We Killed, The",2004,94,NA,5.4,13,4.5,0,4.5,0,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Time Without Pity",1957,85,NA,6.5,67,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Time at the Top",1999,96,NA,4.6,103,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Time for Killing, A",1967,88,NA,5.3,91,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Time for Loving, A",1971,104,NA,4.9,8,0,0,0,14.5,45.5,0,24.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Time of Destiny, A",1988,118,NA,4.8,116,14.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Time of Fear",2002,88,800000,5.1,26,24.5,4.5,0,4.5,4.5,0,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Time of Their Lives, The",1946,82,NA,7.7,376,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Time of Your Life, The",1948,105,NA,6.2,154,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Time of the Wolf",2002,87,NA,6.3,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Time to Die, A",1982,91,NA,4.7,34,4.5,0,4.5,14.5,24.5,14.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Time to Die, A",1991,93,NA,4,48,14.5,4.5,24.5,14.5,14.5,0,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Time to Kill",1943,61,NA,8,11,0,0,0,0,0,0,24.5,4.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Time to Kill, A",1996,149,40000000,6.9,15577,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Time to Love and a Time to Die, A",1958,132,NA,7.2,175,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Time to Remember, A",1987,77,NA,7.2,6,0,0,34.5,0,0,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Time to Run",1973,97,NA,4.5,21,4.5,4.5,0,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Time to Say Goodbye?",1997,91,NA,4.4,19,14.5,4.5,0,14.5,34.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Time to Sing, A",1968,91,NA,5,7,14.5,0,14.5,24.5,0,0,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Time with Nyenne",2000,26,NA,9.4,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,0,0,1,0,0,1 -"Time's Up!",2001,94,NA,6.6,27,4.5,0,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Time, the Place and the Girl, The",1946,105,NA,5.7,41,0,4.5,4.5,4.5,14.5,44.5,14.5,0,4.5,4.5,"",0,0,1,0,0,1,0 -"Timebomb",1991,96,NA,4.8,257,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Timecode",2000,97,4000000,6.2,2320,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Timecop",1994,98,NA,5.5,5976,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Timecop: The Berlin Decision",2003,82,NA,4.8,346,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Timekeeper, The",2004,10,NA,9.3,6,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,0,0,0,0,1 -"Timeless",1996,90,NA,4.9,24,14.5,4.5,4.5,0,14.5,4.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Timeless Melody",2000,95,NA,5.6,8,0,0,0,14.5,24.5,14.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Timeless Obsession",1997,89,NA,3.8,15,4.5,24.5,0,24.5,24.5,0,24.5,4.5,0,0,"R",0,0,0,1,0,0,0 -"Timeline",2003,116,80000000,5.2,5803,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Timelock",1996,90,NA,2.8,101,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Timemaster",1995,100,NA,4.3,101,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Timequest",2002,92,NA,4.4,147,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Timerider: The Adventure of Lyle Swann",1982,94,NA,5.1,251,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Times Square",1980,111,NA,5,227,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Times Square Lady",1935,68,NA,5.7,20,0,0,4.5,14.5,14.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Times Square Playboy",1936,62,NA,6.1,7,0,0,0,14.5,14.5,24.5,44.5,0,0,0,"",0,0,1,1,0,0,0 -"Times of Harvey Milk, The",1984,90,NA,8.6,401,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Timescape",2000,6,NA,6.1,27,4.5,4.5,4.5,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Timeslip",1956,76,NA,5.1,19,4.5,0,0,24.5,44.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Timi tis agapis, I",1984,110,NA,5.4,9,0,0,0,14.5,14.5,0,24.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Timid Tabby",1957,7,NA,6.3,26,0,0,0,14.5,0,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Timid Toreador, The",1940,6,NA,6.3,22,4.5,0,0,0,4.5,24.5,14.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Timide, Le",2001,8,NA,6.6,13,0,0,0,24.5,0,0,4.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Timmy's Wish",2002,10,NA,8.1,24,4.5,0,0,0,0,4.5,24.5,4.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Timothy Leary's Dead",1996,80,NA,5.5,38,4.5,14.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"R",0,0,0,0,1,0,0 -"Timothy Leary's Last Trip",1997,56,NA,6.3,28,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Tin Cup",1996,135,45000000,6.2,7521,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Tin Man",1983,89,NA,4.5,28,0,14.5,0,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Tin Men",1987,110,11000000,6.4,2065,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Tin Pan Alley",1940,94,NA,6.7,79,0,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tin Star, The",1957,93,NA,7.2,388,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Tin Toy",1988,5,NA,7.2,515,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Tin loh daai poh ng hang chan",1977,88,NA,2,5,44.5,44.5,0,0,0,0,0,0,0,24.5,"",1,0,0,1,0,0,0 -"Tin seung yan gaan",1999,109,NA,5.1,55,4.5,4.5,4.5,24.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tina and the Professor",1995,93,NA,3.2,11,14.5,24.5,4.5,0,0,0,0,4.5,0,34.5,"",0,0,1,0,0,1,0 -"Tine",1964,137,NA,5.9,7,14.5,0,14.5,0,14.5,44.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Tingler, The",1959,82,250000,6.5,550,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tini zabutykh predkiv",1964,97,NA,7.7,260,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Tino",1985,28,NA,9.3,7,14.5,0,0,0,0,0,0,24.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Tino",1994,31,NA,5.4,5,0,0,0,0,44.5,0,0,24.5,0,44.5,"",0,0,0,0,1,0,1 -"Tino II",1986,25,NA,8,6,0,0,0,0,0,0,0,84.5,14.5,0,"",0,0,0,0,0,0,1 -"Tinpis Run",1991,94,NA,6.2,8,0,0,0,0,0,45.5,24.5,24.5,0,0,"",0,0,1,1,0,0,0 -"Tinseltown",1997,88,NA,4.4,89,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Tinta roja",1998,75,NA,2,11,24.5,0,4.5,0,0,0,4.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Tinta roja",2000,121,NA,7,75,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tintin et le lac aux requins",1972,81,NA,5.7,131,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Tintin et le temple du soleil",1969,77,NA,6.1,101,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Tintin et les oranges bleues",1964,102,NA,4.9,89,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tintin et moi",2003,75,NA,7.4,89,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Tintorera",1977,85,NA,3.8,68,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Tiny Heroes",1997,76,NA,3.8,6,14.5,45.5,0,0,0,0,0,34.5,0,0,"",0,0,0,0,0,0,0 -"Tiny Magic",2003,22,NA,8.7,7,0,0,0,0,0,0,0,44.5,44.5,14.5,"",0,0,0,1,0,0,1 -"Tioga Kid, The",1948,54,NA,5.2,6,0,14.5,14.5,0,14.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Tiovivo c. 1950",2004,150,NA,5.6,71,14.5,4.5,0,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Tip Tap Toe",1932,19,NA,6.2,10,0,14.5,0,14.5,14.5,14.5,24.5,14.5,24.5,14.5,"",0,0,1,0,0,0,1 -"Tip on a Dead Jockey",1957,98,NA,5.4,25,4.5,0,4.5,14.5,24.5,14.5,4.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Tip-Off, The",1931,71,NA,5.4,18,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tipat Mazal",1992,90,NA,5.4,10,34.5,0,0,0,14.5,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Tipo con una faccia strana ti cerca per ucciderti, Un",1973,89,NA,5.9,22,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Tipota",1999,31,NA,5.5,16,14.5,0,4.5,0,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Tiptoes",2003,90,NA,4.9,443,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,1,0 -"Tiradentes",1999,128,NA,5.2,18,24.5,0,0,14.5,24.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Tiranga",1992,168,NA,9,10,0,0,0,0,0,0,14.5,0,74.5,24.5,"",0,0,0,0,0,0,0 -"Tirannoui baltob",1994,92,NA,4.9,8,0,14.5,14.5,0,14.5,0,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Tirano Banderas",1993,91,NA,6,10,0,14.5,0,14.5,24.5,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Tire-au-flanc",1928,120,NA,5.7,20,0,0,4.5,24.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tire-au-flanc 62",1960,87,NA,7.2,10,14.5,0,0,24.5,0,14.5,14.5,24.5,0,34.5,"",0,0,1,0,0,0,0 -"Tired Tailor's Dream, The",1907,7,NA,5.2,5,24.5,0,0,0,24.5,24.5,24.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Tired and Feathered",1965,6,NA,3.6,15,24.5,14.5,14.5,0,14.5,34.5,4.5,0,0,0,"",0,1,1,0,0,0,1 -"Tirelire Combines & Cie",1992,90,NA,5.7,34,4.5,4.5,0,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tiresia",2003,116,NA,8,115,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tirez sur le pianiste",1960,92,NA,7.4,1451,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Tis a Gift to Be Simple",1994,30,NA,8.2,33,4.5,4.5,0,4.5,0,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Tis kakomoiras",1963,96,NA,9.6,86,4.5,0,0,0,0,0,4.5,4.5,4.5,74.5,"",0,0,0,0,0,0,0 -"Tis the Season",1998,17,10000,9,5,0,0,0,0,0,0,0,24.5,64.5,24.5,"",0,0,0,0,0,0,1 -"Tish",1942,84,NA,6.3,30,0,4.5,4.5,14.5,4.5,34.5,14.5,34.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Tishe!",2002,82,NA,8.2,26,0,0,0,0,14.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Tishina",1991,86,NA,9,6,0,0,0,0,0,0,0,14.5,64.5,14.5,"",0,0,0,0,0,0,0 -"Tistega lepega dne",1962,91,NA,7.9,27,0,0,0,0,4.5,0,14.5,4.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Tiszta Amerika",1987,113,NA,5.5,10,0,14.5,0,0,24.5,0,14.5,34.5,34.5,0,"",0,0,0,1,0,0,0 -"Tit Coq",1953,104,NA,6.9,10,14.5,0,0,0,0,34.5,34.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Tit for Tat",1935,19,NA,8.2,184,4.5,0,4.5,4.5,4.5,4.5,4.5,34.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Titan A.E.",2000,94,75000000,6.4,9373,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG",1,1,0,0,0,0,0 -"Titanic",1943,85,NA,6.5,102,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Titanic",1953,98,NA,6.8,887,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Titanic",1997,194,200000000,6.9,90195,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,1,0 -"Titanic Town",1998,100,NA,6.5,100,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Titanic vals",1964,92,NA,9.9,13,0,0,0,0,0,0,4.5,4.5,4.5,74.5,"",0,0,1,0,0,0,0 -"Titanic: Anatomy of a Disaster",1997,105,NA,5.2,66,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Titanic: The Animated Movie",2001,90,NA,2.7,18,45.5,14.5,4.5,4.5,14.5,0,0,0,0,14.5,"",0,1,0,0,0,0,0 -"Titanica",1995,40,NA,6,101,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Titash Ekti Nadir Naam",1973,159,NA,6.2,26,4.5,0,4.5,0,4.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Titfield Thunderbolt, The",1953,84,NA,7.2,284,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Titicut Follies",1967,84,NA,8.6,266,0,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Titik hitam",2002,115,NA,4.6,7,0,0,24.5,24.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Title Shot",1979,88,NA,4.7,7,0,14.5,14.5,0,44.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Titler",2000,6,NA,7.9,16,4.5,0,0,4.5,0,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Tito",2004,120,NA,8,25,0,0,0,4.5,0,4.5,14.5,14.5,24.5,44.5,"",1,0,0,0,0,1,0 -"Tito i ja",1992,118,NA,7.1,196,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Tits and Asphalt",2001,71,NA,8.1,8,14.5,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Titsiana Booberini",1997,11,NA,6.6,30,34.5,0,4.5,0,4.5,0,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Titus",1999,162,NA,7.2,5465,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Titus Andronicus",1999,147,NA,5,22,24.5,0,4.5,4.5,4.5,4.5,14.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Titus Andronicus",2000,167,16000,3.3,11,4.5,0,4.5,0,0,0,14.5,4.5,0,45.5,"",0,0,0,1,0,0,0 -"Tizoc",1957,109,NA,6.9,69,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Tjoet Nja' Dhien",1988,150,NA,7.1,18,4.5,0,0,0,4.5,0,14.5,4.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Tjorven och Mysak",1966,95,NA,6.1,28,0,4.5,0,0,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tlayucan",1962,105,NA,7.4,5,0,0,0,0,0,0,24.5,24.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Tma/Svetlo/Tma",1989,6,NA,8.2,141,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"To All a Good Night",1980,90,NA,4.2,54,24.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"To Be",1990,10,NA,6.9,16,0,0,0,4.5,4.5,14.5,4.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"To Be Alive!",1964,18,NA,9.5,9,14.5,0,0,0,0,14.5,0,0,0,74.5,"",0,0,0,0,1,0,1 -"To Be Continued...",2000,5,NA,6,25,0,4.5,4.5,0,24.5,24.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,1 -"To Be or Not to Be",1942,99,NA,8.3,3579,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"To Be or Not to Be",1983,107,NA,6.2,1531,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"To Be the Best",1993,99,NA,2.9,32,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"To Beat the Band",1935,70,NA,6.3,7,0,0,0,0,24.5,44.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"To Beep or Not to Beep",1963,7,NA,6.9,34,4.5,0,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"To Build a Better Mousetrap",1999,2,NA,6.5,10,0,0,14.5,0,14.5,14.5,24.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"To Catch a Spy",1971,94,NA,5.3,42,4.5,0,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"To Catch a Thief",1955,106,2500000,7.4,6053,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,1,0 -"To Catch a Woodpecker",1957,6,NA,5.3,6,0,0,34.5,14.5,0,14.5,0,34.5,0,0,"",0,1,1,0,0,0,1 -"To Die For",1989,94,NA,5,94,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"To Die For",1994,101,NA,5.9,110,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"To Die For",1995,110,20000000,6.7,7737,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"To Die Standing",1990,87,NA,4.9,11,0,4.5,14.5,14.5,0,0,0,4.5,14.5,24.5,"",1,0,0,1,0,0,0 -"To Die, to Sleep",1994,86,NA,4.7,33,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"PG-13",0,0,0,1,0,0,0 -"To Dorothy a Son",1954,79,NA,5.1,11,4.5,0,0,14.5,14.5,24.5,0,4.5,0,14.5,"",0,0,1,0,0,0,0 -"To Duck... or Not to Duck",1943,7,NA,7.1,58,4.5,0,0,4.5,4.5,14.5,14.5,44.5,4.5,4.5,"",0,1,1,0,0,0,1 -"To Each His Own",1946,122,NA,7.7,255,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"To End All Wars",2001,110,NA,7.1,1447,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",1,0,0,1,0,0,0 -"To Find a Man",1972,90,NA,5.9,35,0,4.5,0,0,4.5,14.5,14.5,24.5,4.5,34.5,"",0,0,1,1,0,0,0 -"To Fly!",1976,27,NA,6.9,38,0,0,4.5,0,4.5,24.5,4.5,14.5,24.5,24.5,"",0,0,0,0,1,0,1 -"To Gillian on Her 37th Birthday",1996,93,NA,5.6,1421,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"To Hare Is Human",1956,7,NA,7.2,51,4.5,4.5,0,4.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"To Have and Have Not",1944,100,NA,7.9,4039,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,1,0 -"To Have and to Hold",1996,99,NA,5.2,43,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"To Have and to Hold",2000,13,NA,6.6,26,0,0,4.5,4.5,0,14.5,14.5,44.5,4.5,4.5,"",0,0,0,0,0,0,1 -"To Hell and Back",1955,106,NA,7.3,610,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"To Hell with Love",1998,98,NA,6.3,26,0,0,0,4.5,0,4.5,14.5,34.5,14.5,34.5,"",0,0,1,0,0,1,0 -"To Itch His Own",1958,6,NA,7,19,0,0,0,0,14.5,14.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"To Kill a Clown",1972,104,NA,4.5,58,14.5,4.5,4.5,14.5,14.5,24.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"To Kill a Dead Man",1994,11,NA,6.6,50,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"To Kill a King",2003,102,14300000,6.1,364,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"To Kill a Mockingbird",1962,129,2000000,8.5,30139,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"To Kill a Priest",1988,117,NA,5.7,245,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"To Live Is Better Than to Die",2003,88,NA,7.8,9,0,0,0,0,0,14.5,34.5,34.5,0,24.5,"",0,0,0,0,1,0,0 -"To Live and Die in L.A.",1985,116,NA,6.9,3050,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"To Market to Market",1987,88,NA,4.4,6,0,14.5,0,0,34.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"To Paris with Love",1955,78,NA,6.2,55,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"To Parsifal",1963,16,NA,6.5,9,0,0,0,14.5,0,34.5,24.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"To Please a Lady",1950,91,NA,6,97,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"To Protect and Serve",1992,92,NA,4.7,53,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"To Protect and Serve",2001,91,NA,7,11,4.5,0,0,14.5,4.5,4.5,0,0,24.5,24.5,"",0,0,1,0,0,0,0 -"To Render a Life",1992,88,NA,9.6,9,0,0,0,0,0,0,0,0,44.5,45.5,"",0,0,0,0,1,0,0 -"To See Such Fun",1977,90,NA,8.1,21,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,1,0,0 -"To Sir, with Love",1967,105,640000,7.4,1999,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"To Sleep with Anger",1990,101,NA,6.2,221,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"To Sleep with a Vampire",1993,81,NA,4.1,109,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"To Speak",1999,14,NA,5.1,21,4.5,4.5,4.5,4.5,34.5,14.5,4.5,0,4.5,0,"",0,0,0,0,0,0,1 -"To Speak or Not to Speak",1970,11,NA,7.5,10,0,0,14.5,0,0,14.5,24.5,14.5,24.5,34.5,"",0,1,0,0,0,0,1 -"To Spring",1936,9,NA,6.4,23,0,0,4.5,4.5,34.5,4.5,14.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"To Trap a Spy",1964,92,NA,6,64,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",1,0,1,1,0,0,0 -"To Walk with Lions",1999,108,NA,6.1,151,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"To Wong Foo, Thanks for Everything! Julie Newmar",1995,109,NA,5.5,3646,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"To Woody Allen from Europe with Love",1980,90,NA,5.2,16,4.5,4.5,4.5,0,4.5,0,0,4.5,14.5,45.5,"",0,0,0,0,1,0,0 -"To ja, zlodziej",2000,100,NA,5.9,55,4.5,4.5,0,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"To kvinder",2001,22,NA,6.4,7,0,0,0,0,14.5,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,1 -"To mand i en sofa",1994,105,NA,5.5,13,0,0,0,0,14.5,45.5,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"To my",2000,94,NA,3.8,21,14.5,24.5,14.5,14.5,14.5,4.5,0,0,0,0,"",0,0,1,1,0,0,0 -"To so gadi",1977,96,NA,7.5,40,0,0,0,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"To the Death",1993,90,NA,5,11,14.5,0,0,4.5,4.5,14.5,14.5,24.5,0,0,"",1,0,0,0,0,0,0 -"To the Devil a Daughter",1976,95,NA,5.2,272,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"To the Ends of the Earth",1948,109,NA,7,65,0,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"To the Last Man",1933,70,NA,6.5,35,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"To the Limit",1989,35,NA,5.5,21,0,0,4.5,4.5,0,4.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,1 -"To the Limit",1995,98,NA,2.6,229,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"To the Public Danger",1948,43,NA,6.8,18,0,4.5,4.5,14.5,14.5,14.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,1 -"To the Shores of Hell",1966,82,NA,5.2,13,34.5,0,0,4.5,24.5,4.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"To the Shores of Tripoli",1942,86,NA,5.6,75,0,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"To the Victor",1948,100,NA,6.1,20,0,0,0,24.5,14.5,34.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Toad Warrior",1996,90,NA,2.5,15,34.5,4.5,14.5,0,0,0,0,0,0,44.5,"",1,0,0,0,0,0,0 -"Toast of New Orleans, The",1950,97,NA,5.8,84,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Toast of New York, The",1937,109,1072000,6.9,122,4.5,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Tobacco Road",1941,84,NA,6.6,234,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Tobor the Great",1954,77,NA,4.2,65,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tobruk",1967,107,NA,5.9,232,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tobu yume wo shibaraku minai",1992,90,NA,7,6,0,0,0,0,0,14.5,0,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Toby McTeague",1986,96,NA,6.6,18,4.5,0,0,4.5,14.5,4.5,14.5,24.5,0,24.5,"",1,0,0,0,0,0,0 -"Toby Tortoise Returns",1936,7,NA,7.3,47,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Toby Tyler, or Ten Weeks with a Circus",1960,96,NA,6.9,137,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tocaia no Asfalto",1962,101,NA,8.2,6,0,0,0,0,0,0,14.5,34.5,45.5,0,"",0,0,0,0,0,0,0 -"Tocando fondo",1993,88,NA,4.9,11,14.5,0,24.5,4.5,4.5,0,24.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Toccata for Toy Trains",1959,14,NA,7.2,10,0,0,0,0,24.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Tocco: la sfida, Il",1997,105,NA,3.4,11,4.5,14.5,4.5,0,4.5,24.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Tochka, tochka, zapyataya...",1972,84,NA,8,9,0,0,0,0,14.5,0,14.5,24.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Tod der Maria Malibran, Der",1972,104,NA,6.4,15,0,4.5,4.5,0,4.5,24.5,4.5,0,0,45.5,"",0,0,1,1,0,0,0 -"Tod des Empedokles, Der",1987,132,NA,3.4,13,14.5,0,0,4.5,0,4.5,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Tod eines Fremden",1973,113,NA,4.9,7,0,14.5,0,0,44.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Tod im roten Jaguar, Der",1968,91,NA,6.1,22,4.5,0,0,14.5,14.5,34.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Todake no kyodai",1941,105,NA,8.4,38,0,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Todas as Mulheres do Mundo",1967,86,NA,8.1,49,4.5,4.5,4.5,0,0,4.5,14.5,4.5,4.5,64.5,"",0,0,0,1,0,1,0 -"Todas hieren",1998,82,NA,3.3,13,24.5,0,14.5,0,4.5,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Todas las azafatas van al cielo",2002,96,NA,6.8,173,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Today Was Thursday",2004,16,1000,9.4,7,0,0,0,0,0,0,14.5,0,14.5,74.5,"",0,0,0,1,0,0,1 -"Today We Live",1933,113,NA,6.1,102,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Today You Are a Fountain Pen",2002,25,NA,8,42,4.5,4.5,0,0,4.5,0,0,4.5,34.5,45.5,"",0,0,1,1,0,1,1 -"Today's Life",2000,13,NA,5.2,16,0,14.5,0,4.5,4.5,14.5,4.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Todd Killings, The",1971,93,NA,4,22,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Todd and the Book of Pure Evil",2003,18,NA,6,15,0,0,14.5,4.5,0,14.5,4.5,4.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Todesauge von Ceylon, Das",1963,82,NA,3.7,8,0,14.5,0,0,14.5,0,14.5,14.5,45.5,0,"",0,0,0,0,0,0,0 -"Todesking, Der",1989,80,NA,5.8,148,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Todesstrahlen des Dr. Mabuse, Die",1964,90,NA,2.4,34,24.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Todo dia todo",1998,11,NA,7.6,8,0,0,0,0,24.5,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Todo es mentira",1994,99,NA,6.7,135,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Todo modo",1976,120,NA,7.6,44,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Todo por la pasta",1991,88,NA,6.5,56,4.5,0,4.5,14.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Todo sobre mi madre",1999,101,NA,7.9,13497,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,0,0 -"Todos al suelo",1981,87,NA,3.3,15,24.5,4.5,4.5,14.5,0,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Todos los aviones del mundo",2001,28,NA,2,9,14.5,64.5,0,0,0,14.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Todos los hombres sois iguales",1994,102,NA,6.9,133,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Todos somos estrellas",1993,88,NA,6.8,9,14.5,0,0,0,14.5,24.5,0,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Toemarok",1998,98,NA,4.9,69,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Toestanden",1976,80,NA,7.6,12,0,0,0,0,0,4.5,14.5,0,24.5,45.5,"",0,0,0,0,0,0,0 -"Tofflan",1967,99,NA,6,7,0,0,0,14.5,45.5,14.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Together",1956,52,NA,5.1,5,0,0,0,0,24.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Together",1971,72,NA,3,27,24.5,4.5,4.5,14.5,4.5,4.5,0,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Together & Alone",1998,84,NA,5.2,16,14.5,0,0,0,0,4.5,4.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Together Again",1944,93,NA,6.5,17,0,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Together Alone",1991,87,NA,6.5,38,4.5,4.5,0,4.5,4.5,0,4.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Together Brothers",1974,94,NA,2.3,10,0,24.5,0,14.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Together for Days",1972,84,NA,4.7,10,14.5,0,24.5,0,0,14.5,0,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Toi, le venin",1958,92,NA,8.1,18,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Toile, La",2001,13,NA,7.4,12,4.5,0,0,14.5,0,4.5,14.5,0,44.5,4.5,"",0,0,0,0,0,0,1 -"Toilers and the Wayfarers, The",1996,75,NA,7.4,95,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Tokaido Yotsuya kaidan",1959,76,NA,7.4,21,0,0,4.5,0,0,4.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Tokarefu",1994,103,NA,8.6,15,0,0,0,0,0,14.5,4.5,24.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Token for Your Thoughts, A",2003,14,NA,5.5,7,14.5,14.5,0,0,14.5,14.5,0,14.5,0,24.5,"",0,0,1,0,0,0,1 -"Toki wo kakeru shoujo",1983,104,NA,7.4,22,0,0,4.5,0,0,4.5,34.5,14.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Tokimeki ni shisu",1984,105,NA,6.9,5,0,0,0,0,24.5,0,44.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Tokio Jokio",1943,7,NA,5.2,31,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Tokiwa-so no seishun",1996,110,NA,7,10,0,0,0,0,0,14.5,14.5,34.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Tokugawa irezumi-shi: Seme jigoku",1969,90,NA,5,29,24.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Tokugawa onna keibatsu-emaki: Ushi-zaki no kei",1976,80,NA,4.2,17,0,4.5,14.5,14.5,4.5,4.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Tokugawa onna keibatsu-shi",1968,85,NA,2.9,15,14.5,0,4.5,0,0,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tokyo 10+01",2003,70,NA,5.6,21,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Tokyo Breakfast",2001,6,25000,7.5,23,4.5,0,0,0,4.5,0,4.5,4.5,34.5,44.5,"",0,0,1,0,0,0,1 -"Tokyo Cowboy",1994,94,NA,5.5,32,4.5,0,0,0,4.5,24.5,4.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tokyo Eyes",1998,97,NA,6.8,438,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tokyo File 212",1951,84,NA,6.3,7,0,0,0,0,24.5,45.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Tokyo Fist",1995,87,NA,7,391,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tokyo Girls",2000,57,NA,6.6,26,0,0,0,0,14.5,4.5,45.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Tokyo Godfathers",2003,93,NA,7.6,904,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"PG-13",0,1,1,1,0,0,0 -"Tokyo Joe",1949,88,NA,5.8,177,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tokyo Mafia: Battle for Shinjuku",1996,85,NA,5.3,8,14.5,0,14.5,0,0,14.5,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Tokyo Noise",2002,80,NA,5.3,26,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Tokyo Rose",1946,69,NA,6,8,0,0,0,14.5,14.5,45.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Tokyo Skin",1996,92,NA,7.8,8,0,14.5,0,0,14.5,24.5,14.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Tokyo X Erotica",2001,77,NA,7.1,19,0,4.5,0,4.5,4.5,24.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tokyo biyori",1997,121,NA,6.9,47,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tokyo boshoku",1957,140,NA,7.4,50,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Tokyo gomi onna",2000,88,NA,7.3,32,0,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tokyo monogatari",1953,136,NA,8,2046,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Tokyo no onna",1933,47,NA,7,30,4.5,0,0,0,4.5,4.5,34.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tokyo no yado",1935,80,NA,8,31,0,0,0,4.5,4.5,4.5,24.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Tokyo orimpikku",1965,93,NA,8.1,199,0,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Tokyo saiban",1983,277,NA,6.7,6,0,0,0,14.5,0,14.5,0,14.5,45.5,0,"",0,0,0,1,0,0,0 -"Tokyo senso sengo hiwa",1970,94,NA,6.2,13,4.5,0,0,0,4.5,0,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tokyo yakyoku",1997,85,NA,2.8,15,24.5,0,0,24.5,0,4.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Tokyo-Ga",1985,92,NA,7.3,153,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Tokyo.Sora",2002,127,NA,7.2,21,0,4.5,0,0,4.5,4.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tol'able David",1921,99,NA,7.4,65,0,0,4.5,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tolgo il disturbo",1990,97,NA,5,15,4.5,0,4.5,0,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Toll Collector, The",2003,10,NA,6.2,12,4.5,4.5,0,0,4.5,4.5,14.5,34.5,4.5,4.5,"",0,1,0,0,0,0,1 -"Toll Gate, The",1920,73,NA,6.9,33,0,4.5,0,0,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Toll of the Sea, The",1922,53,NA,7.1,65,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Tollbooth",1994,108,NA,4.6,106,14.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Tolle Bomberg, Der",1957,95,NA,5.2,15,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Tolle Lage",2000,80,NA,7.3,22,14.5,0,0,0,4.5,14.5,24.5,34.5,0,0,"",0,0,1,0,0,1,0 -"Tolle Nacht",1957,81,NA,8.8,5,0,0,0,0,0,0,0,44.5,64.5,0,"",0,0,1,0,0,0,0 -"Tollen Tanten schlagen zu, Die",1971,93,NA,1.9,23,45.5,24.5,4.5,4.5,4.5,0,0,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Toller Hecht auf krummer Tour",1961,72,NA,5.2,5,24.5,24.5,0,0,0,0,44.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Tom",2002,75,NA,7.6,9,0,0,0,14.5,0,24.5,14.5,44.5,14.5,0,"",0,0,0,0,1,0,0 -"Tom & Thomas",2002,110,NA,7.1,149,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tom & Viv",1994,115,NA,6.5,336,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tom Brown of Culver",1932,82,NA,6.3,13,0,0,4.5,0,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tom Brown's School Days",1940,86,NA,6.4,55,0,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tom Brown's Schooldays",1951,93,NA,6.9,54,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Tom Clay Jesus",2001,17,NA,4.8,23,4.5,0,0,0,24.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Tom Dick and Harry",1941,87,NA,6.6,129,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Tom Dowd & the Language of Music",2003,90,NA,8.4,65,0,4.5,4.5,4.5,0,0,4.5,24.5,34.5,34.5,"",0,0,0,0,1,0,0 -"Tom Hits His Head",2003,10,NA,6.6,28,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Tom Horn",1980,98,3000000,6.4,404,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tom Jones",1963,128,1000000,7.2,1392,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Tom Petty and the Heartbreakers: High Grass Dogs, Live from the Fillmore",1999,90,NA,6.5,44,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tom Sawyer",1917,44,NA,6,28,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,1 -"Tom Sawyer",1930,86,NA,6.5,19,4.5,0,0,14.5,4.5,14.5,34.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tom Thumb In the Land of the Giants",1999,3,NA,6.3,9,0,14.5,0,0,24.5,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Tom Thumb in Trouble",1940,8,NA,5.8,15,4.5,0,4.5,4.5,14.5,24.5,4.5,24.5,0,24.5,"",0,1,0,1,0,0,1 -"Tom Tom Tomcat",1953,7,NA,6.7,14,0,4.5,0,4.5,0,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Tom Turk and Daffy",1944,7,NA,6.9,42,0,0,0,4.5,4.5,14.5,34.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Tom Turkey and His Harmonica Humdingers",1940,7,NA,7.3,9,0,0,14.5,0,0,14.5,0,34.5,34.5,14.5,"",0,1,1,0,0,0,1 -"Tom White",2004,106,NA,6.7,60,4.5,0,0,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tom and Huck",1995,97,NA,5.3,1242,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"PG",0,0,0,0,0,0,0 -"Tom and Jerry Cartoon Kit, The",1962,7,NA,4.8,40,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Tom and Jerry in the Hollywood Bowl",1950,7,NA,7.4,59,4.5,0,0,4.5,4.5,4.5,4.5,24.5,34.5,4.5,"",0,1,1,0,0,0,1 -"Tom and Jerry: The Movie",1992,84,NA,3.9,389,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,1,1,0,0,0,0 -"Tom est tout seul",1995,87,NA,5.7,12,14.5,4.5,0,4.5,0,24.5,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Tom et Lola",1990,97,NA,6.5,49,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tom's Midnight Garden",1999,92,NA,6.8,153,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tom's Photo Finish",1957,6,NA,5.9,21,0,4.5,0,4.5,14.5,24.5,4.5,4.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Tom's Wife",2004,91,NA,9.1,11,0,0,0,0,0,0,0,34.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Tom, Tom, the Piper's Son",1905,8,NA,3.1,9,14.5,0,44.5,24.5,14.5,14.5,0,0,0,0,"",0,0,1,0,0,0,1 -"Tom, Tom, the Piper's Son",1969,86,NA,6.1,9,14.5,14.5,14.5,0,0,0,24.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Tom-ic Energy",1965,7,NA,4.4,22,34.5,0,4.5,14.5,4.5,4.5,14.5,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Toma de la embajada, La",2000,110,NA,5.1,13,0,14.5,0,14.5,4.5,4.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Tomahawk",1951,82,NA,6.2,29,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tomahawk Trail",1957,60,NA,4.6,13,0,0,14.5,14.5,45.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Tomb of Ligeia, The",1965,81,NA,6.3,371,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Tomb, The",1986,84,NA,3.1,59,24.5,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tombales, Les",2002,15,NA,7.7,7,0,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Tombeau d'Alexandre, Le",1992,120,NA,7.4,48,4.5,0,0,0,0,4.5,0,24.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Tomboy",1985,91,NA,3.2,147,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tombstone",1993,130,NA,7.4,16618,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,0,1,0,0,0 -"Tombstone Canyon",1932,62,NA,4.9,7,0,14.5,14.5,14.5,24.5,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Tombstone, the Town Too Tough to Die",1942,79,NA,7.1,13,0,4.5,0,0,0,24.5,14.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Tomcat: Dangerous Desires",1993,85,NA,2.9,59,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tomcats",2001,95,11000000,4.7,3717,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Tomei ningen",1954,70,NA,5.1,7,0,0,0,0,45.5,0,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Tomer Ve-Hasrutim",2001,57,NA,8.3,7,14.5,0,0,0,0,0,0,0,44.5,44.5,"",0,0,0,0,1,0,0 -"Tomie",1999,95,NA,5.5,255,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tomie: Re-birth",2001,101,NA,5.9,50,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tomie: Replay",2000,95,NA,5.9,87,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tommy",1975,111,5000000,6.1,2916,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tommy Boy",1995,97,NA,6.5,8875,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Tommy Steele Story, The",1957,70,NA,3.7,13,4.5,4.5,14.5,24.5,24.5,14.5,0,0,0,4.5,"",0,0,0,1,0,0,0 -"Tommy Tricker and the Stamp Traveller",1988,105,NA,6.4,165,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tommy the Toreador",1959,90,NA,4.6,18,4.5,4.5,14.5,24.5,24.5,4.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Tomo",2003,20,NA,7.9,10,0,0,0,0,14.5,0,24.5,44.5,34.5,0,"",0,0,0,0,0,0,1 -"Tomorrow",1972,103,NA,7.7,180,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Tomorrow - ashita",1988,105,NA,7,9,0,0,0,0,0,24.5,34.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Tomorrow Is Another Day",1951,90,NA,7.7,31,0,0,0,4.5,4.5,14.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tomorrow Is Forever",1946,105,NA,7.3,230,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tomorrow La Scala!",2002,108,NA,7.4,62,4.5,4.5,0,0,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tomorrow Man, The",2001,90,NA,4.7,123,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tomorrow Never Comes",1978,102,NA,4.3,49,14.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Tomorrow Never Dies",1997,119,110000000,6.4,19397,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Tomorrow Night",1998,87,NA,7.3,17,0,0,0,14.5,0,14.5,14.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Tomorrow We Live",1942,64,NA,5.2,21,4.5,4.5,4.5,4.5,44.5,14.5,14.5,4.5,0,0,"",1,0,0,1,0,0,0 -"Tomorrow at Seven",1933,62,NA,6,13,0,0,0,0,4.5,34.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Tomorrow at Ten",1964,80,NA,6.5,6,0,0,0,0,0,34.5,14.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Tomorrow by Midnight",1999,89,NA,5.6,102,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tomorrow's Children",1934,70,NA,4.9,6,0,14.5,0,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Tomorrow's Drivers",1954,11,NA,4.1,11,0,4.5,14.5,14.5,4.5,24.5,4.5,4.5,0,0,"",0,0,0,0,0,0,1 -"Tomorrow's Memoir",2004,27,NA,8.3,34,4.5,4.5,0,0,0,4.5,4.5,4.5,24.5,64.5,"",0,0,0,1,0,0,1 -"Tomorrow, the World!",1944,86,NA,6.7,109,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tompta Gudh",2002,30,NA,7.3,31,0,0,4.5,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,1,0,1 -"Tomten",1941,12,NA,5.7,5,0,0,0,0,24.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Tonari no Totoro",1988,86,NA,8.1,5245,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,0,0,0,0,0 -"Tonespor",1983,8,NA,6.4,8,0,0,0,24.5,0,14.5,14.5,34.5,14.5,0,"",0,1,0,0,0,0,1 -"Tong Man, The",1919,50,350000,6.5,12,0,0,4.5,4.5,0,14.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Tong Tana - En resa till Borneos inre",1989,88,NA,5.5,10,14.5,0,0,14.5,44.5,0,34.5,14.5,0,0,"",0,0,0,0,1,0,0 -"Tong hau goo si",1986,87,NA,3.9,11,4.5,0,24.5,4.5,14.5,14.5,4.5,0,4.5,0,"",1,0,0,0,0,0,0 -"Tong nien wang shi",1985,138,NA,8.1,172,0,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Tongan Ninja",2002,83,NA,6.4,95,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",1,0,1,0,0,1,0 -"Tongues Untied",1990,55,NA,6.9,72,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Tongues and Taxis",2000,7,NA,5.1,11,14.5,4.5,0,0,4.5,24.5,14.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Toni",1999,90,NA,5.6,18,14.5,0,4.5,14.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tonight Is Ours",1933,75,NA,7.9,11,0,0,0,0,0,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Tonight We Raid Calais",1943,70,NA,7.5,6,0,0,0,0,0,0,64.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Tonight We Sing",1953,109,NA,4.1,19,4.5,4.5,4.5,4.5,24.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tonight and Every Night",1945,92,NA,6,66,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tonight for Sure",1962,69,NA,2.5,19,14.5,14.5,14.5,14.5,14.5,0,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Tonight or Never",1931,80,NA,5.8,29,0,0,4.5,14.5,14.5,4.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tonino",2002,10,NA,7.8,31,0,0,0,0,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,1 -"Tonite Let's All Make Love in London",1967,70,NA,4.6,33,4.5,0,4.5,0,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Tonka",1958,97,NA,6.2,57,4.5,0,0,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tonka",1997,113,NA,6.6,28,0,0,0,4.5,14.5,14.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Tonka Sibenice",1930,85,NA,6.7,6,0,0,0,14.5,0,0,14.5,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Tonnerre de Dieu, Le",1965,91,NA,5.3,17,0,0,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Tonny",1962,86,NA,6.1,7,0,0,0,0,14.5,14.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Tonta del bote, La",1970,105,NA,1.8,12,44.5,0,0,0,14.5,4.5,4.5,0,14.5,4.5,"",0,0,1,0,0,0,0 -"Tonto Kid, The",1934,61,NA,4.4,5,0,24.5,0,44.5,24.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Tontons flingueurs, Les",1963,105,NA,7.5,782,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",1,0,1,0,0,0,0 -"Tony Arzenta",1973,90,NA,6.5,140,0,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Tony Blair Witch Project, The",2000,70,NA,1,34,64.5,4.5,0,0,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Tony Rome",1967,110,NA,6.3,251,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tony Takitani",2004,75,NA,7.4,46,4.5,0,4.5,4.5,0,14.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Tony de Peltrie",1985,8,NA,6.8,7,0,0,0,0,0,14.5,24.5,0,0,45.5,"",0,1,0,0,0,0,1 -"Too Big for His Britches",1988,75,NA,7.4,5,0,0,0,0,0,24.5,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Too Hop to Handle",1956,7,NA,6.5,18,4.5,0,0,4.5,14.5,4.5,44.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Too Hot to Handle",1938,107,NA,6.6,158,4.5,4.5,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Too Hot to Handle",1960,90,NA,6.8,30,0,0,0,4.5,4.5,34.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Too Hot to Handle",1977,85,NA,4.7,27,4.5,4.5,14.5,14.5,4.5,0,24.5,0,4.5,24.5,"",1,0,0,1,0,0,0 -"Too Late Blues",1961,103,375000,6.6,64,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Too Late for Tears",1949,99,NA,7.3,110,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Too Late the Hero",1970,145,NA,6.7,371,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Too Many Cooks",1931,77,NA,6.1,10,14.5,0,0,14.5,14.5,14.5,14.5,45.5,0,0,"",0,0,1,0,0,1,0 -"Too Many Crooks",1959,85,NA,6.2,75,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Too Many Girls",1940,85,NA,5.8,91,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Too Many Husbands",1940,84,NA,6.1,30,0,0,4.5,4.5,14.5,24.5,4.5,44.5,0,4.5,"",0,0,1,0,0,0,0 -"Too Many Parents",1936,73,NA,6.2,9,0,0,14.5,0,14.5,14.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Too Many Thieves",1966,100,NA,4.7,12,4.5,0,4.5,14.5,24.5,14.5,0,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Too Many Winners",1947,61,NA,8.2,5,0,0,0,0,0,24.5,24.5,0,44.5,24.5,"",0,0,0,1,0,0,0 -"Too Much Flesh",2000,109,NA,4.9,218,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Too Much Harmony",1933,76,NA,6.6,9,0,0,0,0,14.5,14.5,64.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Too Much Oregano",1983,8,NA,6.8,8,0,0,0,0,14.5,0,74.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Too Much Sex",2000,84,NA,5,24,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Too Much Sun",1991,110,NA,2.7,68,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Too Much Too Often!",1968,72,NA,1.5,6,45.5,0,0,0,14.5,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Too Much, Too Soon",1958,121,NA,6.1,44,0,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Too Naughty to Say No",1985,75,NA,5.4,19,4.5,0,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Too Outrageous!",1987,105,NA,3.9,16,14.5,4.5,14.5,14.5,0,14.5,4.5,4.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Too Scared to Scream",1985,100,NA,3.7,48,4.5,14.5,14.5,34.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Too Soon to Love",1960,85,NA,5.3,11,0,0,0,4.5,24.5,0,0,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Too Tired to Die",1998,97,NA,5.5,161,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Too Weak to Work",1943,7,NA,6,5,0,0,0,24.5,0,44.5,24.5,0,24.5,0,"",0,1,1,0,0,0,1 -"Too Wise Wives",1921,80,NA,5.3,33,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Too Young to Kiss",1951,89,NA,6.3,50,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Tooi ashita",1979,95,NA,8.2,18,0,0,0,0,0,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Toolbox Murders",2003,95,NA,5.1,542,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Toolbox Murders, The",1978,93,185000,4.3,259,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Toomorrow",1970,95,NA,6.7,37,0,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Toonerville Trolley",1936,7,NA,6.2,10,0,0,24.5,0,14.5,34.5,24.5,0,24.5,0,"",0,1,1,0,0,0,1 -"Toot Whistle Plunk and Boom",1953,10,NA,8.1,97,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,1,0,1 -"Tooth",2004,91,12000000,4.3,84,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tooth Fairy",2001,5,NA,3.3,12,14.5,4.5,0,0,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Tooth Fairy",2004,5,NA,6.5,129,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Tooth Will Out, The",1951,16,NA,6.9,45,0,4.5,4.5,4.5,0,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Toothpaste",2002,5,NA,6.6,22,14.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Tootsie",1982,119,NA,7.5,13802,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Top Banana",1954,100,150000,5.8,47,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Top Cat and the Beverly Hills Cats",1987,92,NA,4.1,14,24.5,4.5,4.5,14.5,0,0,0,24.5,4.5,24.5,"",0,1,1,0,0,0,0 -"Top Dog",1995,86,6000000,3.3,348,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Top Flat",1935,18,NA,7.7,11,0,0,0,4.5,14.5,0,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Top Gun",1955,73,NA,5.8,43,14.5,4.5,0,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Top Gun",1986,110,15000000,6.5,32410,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,1,0 -"Top Hat",1935,101,609000,7.8,2240,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Top It Off",1990,83,NA,3.6,7,24.5,0,0,24.5,0,0,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Top Man",1943,74,NA,5.8,5,0,0,0,0,44.5,0,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Top Model",1988,85,NA,3.9,65,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Top Secret",1952,93,NA,6,9,0,24.5,0,0,14.5,14.5,0,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Top Secret Affair",1957,100,NA,5.5,45,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,0,"",0,0,1,0,0,0,0 -"Top Secret!",1984,90,NA,6.8,8089,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Top Sensation",1969,86,NA,6.3,23,4.5,0,4.5,4.5,24.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Top Speed",1930,73,NA,6.4,16,0,0,0,14.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Top o' the Morning",1949,100,NA,6,28,4.5,0,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Top of His Head, The",1989,110,NA,6.6,10,0,14.5,0,14.5,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Top of the Food Chain",1999,99,NA,5.9,280,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Top of the Form",1953,72,NA,4.7,8,0,0,0,34.5,34.5,14.5,0,14.5,0,0,"",0,0,1,0,0,0,0 -"Top of the Heap",1972,83,NA,6.8,9,0,14.5,0,0,0,24.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Top of the Town",1937,86,NA,5.1,8,14.5,0,0,0,14.5,34.5,0,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Top of the World",1993,109,NA,3.6,6,0,34.5,14.5,34.5,0,0,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Topa Topa Bluffs",2002,83,NA,5.4,5,24.5,0,24.5,0,0,0,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Topaz",1969,143,4000000,6.1,1918,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Topaze",1933,78,NA,6.6,78,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Topaze",1935,103,NA,6.3,11,0,0,4.5,0,0,0,45.5,4.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Topaze",1951,136,NA,6.6,49,0,4.5,0,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Topeka Terror, The",1945,55,NA,6.1,5,0,0,0,24.5,24.5,24.5,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Topio stin omichli",1988,127,NA,8.3,333,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Topkapi",1964,119,NA,7.1,1099,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Topless Women Talk About Their Lives",1997,87,NA,6.4,168,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Toplo",1978,97,NA,7.7,54,0,0,0,4.5,0,4.5,14.5,4.5,4.5,64.5,"",0,0,1,0,0,0,0 -"Topo Galileo",1987,90,NA,6.2,17,0,4.5,14.5,0,4.5,24.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Topo y el hada, El",1998,8,NA,8.4,5,0,0,0,0,0,0,0,24.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Topo, El",1970,125,400000,7.3,1008,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Topper",1937,97,NA,7.4,880,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Topper Returns",1941,87,NA,7,300,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Topper Takes a Trip",1939,85,NA,7,109,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Tops & Bottoms",1999,80,NA,3.3,17,24.5,24.5,0,4.5,4.5,4.5,14.5,14.5,0,4.5,"",0,0,0,0,1,0,0 -"Tops in the Big Top",1945,6,NA,5.9,8,0,0,0,14.5,14.5,0,34.5,0,14.5,24.5,"",0,1,1,0,0,0,1 -"Topsy-Turvy",1999,160,NA,7.4,3637,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Tora no o wo fumu otokotachi",1945,60,NA,6.9,178,4.5,4.5,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tora! Tora! Tora!",1970,144,25000000,7.4,3663,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Toraoji annun haebyong",1963,88,NA,3.6,10,0,0,34.5,14.5,0,14.5,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Torapia",2004,100,NA,3.7,20,24.5,4.5,14.5,14.5,24.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Torch Singer",1933,71,NA,6.7,53,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Torch Song",1953,90,NA,5.5,61,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Torch Song Trilogy",1988,114,NA,6.9,1793,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Torch, The",1950,83,NA,4.5,16,14.5,4.5,0,14.5,4.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Torchlight",1984,90,NA,3.4,17,24.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Torchy Blane in Chinatown",1939,58,NA,5.9,37,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Torchy Blane in Panama",1938,59,NA,5.7,28,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Torchy Gets Her Man",1938,63,NA,6.1,27,0,0,0,14.5,14.5,14.5,44.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Torchy Plays with Dynamite",1939,59,NA,6.6,20,0,0,4.5,4.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Torchy Runs for Mayor",1939,60,NA,6.8,28,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Torero",1956,75,NA,4.7,8,14.5,0,0,0,14.5,14.5,14.5,24.5,0,24.5,"",0,0,0,1,1,0,0 -"Toreros",2000,85,NA,4.3,14,14.5,24.5,4.5,24.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Tori Amos: The Complete Videos 1991-1998",1998,75,NA,8.3,21,4.5,0,0,0,4.5,0,0,14.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Torino nera",1972,105,NA,4.6,10,14.5,14.5,0,14.5,34.5,0,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Torino violenta",1978,82,NA,3.8,9,0,14.5,24.5,24.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Torment",1986,85,NA,3.3,22,34.5,14.5,24.5,14.5,4.5,0,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Tormented",1960,75,NA,3.9,165,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tormento",1974,89,NA,5.3,14,0,0,4.5,0,24.5,24.5,4.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Tormentors, The",1971,78,NA,3.7,16,14.5,14.5,0,34.5,34.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Torn Allegiance",1984,97,NA,5.1,6,0,0,0,14.5,0,0,45.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Torn Apart",2004,84,1500000,2.5,21,4.5,4.5,14.5,0,0,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Torn Curtain",1966,126,6000000,6.5,2477,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Torn Page of Glory, A",1968,89,NA,2.5,8,74.5,14.5,0,0,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Tornado",1983,90,NA,4.6,26,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Tornado Range",1948,56,NA,6.3,5,0,0,24.5,24.5,24.5,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Tornando a casa",2001,88,NA,6.4,28,0,0,4.5,0,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Toro",2000,105,NA,6.4,15,0,4.5,14.5,0,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Toro Pink",1979,7,NA,5.8,9,0,0,0,0,34.5,14.5,44.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Toro, Il",1994,105,NA,6,62,4.5,0,0,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Torowisko",1999,83,NA,5.2,39,4.5,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Torpedo Alley",1953,84,NA,5.7,37,4.5,4.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Torpedo Run",1958,98,NA,6.4,226,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Torpedo Squadron",1942,8,NA,1.2,10,64.5,14.5,0,0,0,0,0,24.5,0,14.5,"",0,0,0,0,1,0,1 -"Torpedonostsy",1983,96,NA,7.3,20,4.5,0,0,0,0,24.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Torque",2004,81,40000000,3.2,4050,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Torrance Rises",1999,34,NA,5.9,61,24.5,4.5,4.5,4.5,0,4.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Torre de los siete jorobados, La",1944,85,NA,7.9,59,0,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Torremolinos 73",2003,87,NA,6.6,248,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Torrent",1926,88,250000,7.2,75,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Torrente, el brazo tonto de la ley",1998,97,NA,6.5,1120,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Torrents of Spring",1989,101,NA,4.9,61,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Torrid House",1989,76,NA,5.7,8,0,14.5,0,0,14.5,24.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Torrid Without a Cause 2",1990,86,NA,6,5,24.5,0,0,24.5,0,0,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Torrid Zone",1940,88,NA,6.9,130,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tortilla Flaps",1958,6,NA,6.6,12,0,0,0,14.5,0,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Tortilla Flat",1942,99,NA,6.5,180,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Tortilla Soup",2001,103,NA,5.9,1194,14.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Tortoise Beats Hare",1941,7,NA,7.6,83,0,0,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Tortoise Wins by a Hare",1943,7,NA,7.4,102,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Tortoise and the Hare, The",1934,9,NA,7.2,128,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Tortue sur le dos, La",1978,110,NA,6.9,6,0,0,0,14.5,0,34.5,34.5,0,14.5,0,"",0,0,1,1,0,0,0 -"Torture Dungeon",1970,80,NA,2.1,21,34.5,24.5,4.5,0,4.5,0,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Torture Garden",1967,93,NA,5.8,103,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Torture Money",1937,21,NA,6.4,6,0,0,14.5,0,0,14.5,34.5,34.5,0,0,"",0,0,0,0,0,0,1 -"Torture Ship",1939,57,NA,4.2,10,0,14.5,34.5,14.5,34.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Tortured Females",1965,62,NA,4,9,14.5,0,14.5,34.5,14.5,0,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Tosca",1941,100,NA,5,11,0,0,0,14.5,14.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tosca",1956,112,NA,9.9,10,0,0,0,0,0,0,14.5,0,24.5,74.5,"",0,0,0,1,0,1,0 -"Tosca",2001,126,NA,7.9,115,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Tosca, La",1973,104,NA,5.7,19,0,0,0,4.5,14.5,0,24.5,4.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Tosca, La",1976,117,NA,7.5,13,0,0,4.5,0,0,4.5,4.5,34.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Tossede paradis, Det",1962,95,NA,6.5,15,0,24.5,0,14.5,4.5,0,44.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Tot Watchers",1958,7,NA,5.2,18,0,4.5,14.5,14.5,4.5,24.5,24.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Tot ziens",1995,114,NA,6.6,62,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Total Balalaika Show",1994,54,NA,6.1,83,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Total Eclipse",1995,111,NA,5.8,1495,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Total Kheops",2002,90,NA,5.2,34,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Total Loss",2000,95,NA,6.2,51,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Total Reality",1997,100,NA,4,111,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Total Recall",1990,113,65000000,7.2,26486,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Total western",2000,84,NA,6.4,181,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Totale Therapie, Die",1996,125,NA,7.1,34,4.5,0,0,0,14.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Totale!, La",1991,102,NA,6.3,210,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Totally Blonde",2001,94,NA,3.6,168,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"PG-13",0,0,1,0,0,0,0 -"Totally Confused",1998,88,NA,4.8,19,14.5,14.5,4.5,0,0,34.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Totally F***ed Up",1993,78,NA,5.5,258,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tote Taucher im Wald, Der",2000,94,NA,7.7,46,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tote aus der Themse, Die",1971,89,NA,5,36,4.5,4.5,4.5,14.5,34.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Totem: The Return of the G'psgolox Pole",2003,70,NA,4.1,5,0,0,0,44.5,0,0,44.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Toten Augen von London, Die",1961,104,NA,5.8,91,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Totenschiff, Das",1959,97,NA,7.1,22,0,0,0,0,4.5,4.5,44.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Totenschmecker, Die",1979,85,NA,2.1,5,24.5,24.5,0,24.5,0,0,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Toter hing im Netz, Ein",1960,77,NA,1.9,389,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Totmacher, Der",1995,110,NA,7.5,434,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Toto",1933,80,NA,5.6,11,0,4.5,0,4.5,14.5,4.5,34.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Totoong buhay ni Pacita M., Ang",1991,108,NA,9.1,7,0,0,0,0,0,0,24.5,0,0,74.5,"",0,0,0,1,0,0,0 -"Tototruffa '62",1961,107,NA,7.5,47,0,0,0,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Totul pentru fotbal",1978,80,NA,9.2,6,0,0,0,0,0,0,0,0,14.5,84.5,"",0,0,1,0,0,0,0 -"Tou bun no hoi",1982,111,NA,7.8,29,0,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Toubib, Le",1979,95,NA,5.3,110,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Touch & Go",2003,103,NA,5.5,11,0,4.5,0,4.5,14.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Touch Base",1994,19,NA,7.1,27,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Touch Me",1993,29,NA,3.2,36,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Touch Me",1997,107,NA,5.6,172,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Touch and Die",1991,180,NA,3.4,32,34.5,4.5,14.5,0,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Touch and Go",1955,85,NA,5,10,0,0,14.5,0,14.5,24.5,24.5,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Touch and Go",1980,93,NA,5.4,7,14.5,0,0,14.5,14.5,44.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Touch and Go",1986,101,NA,5.1,140,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Touch of Class, A",1973,106,NA,6.3,366,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Touch of Evil",1958,106,829000,8.4,11745,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Touch of Flesh, The",1960,72,NA,5.4,5,24.5,0,0,0,24.5,44.5,0,0,24.5,0,"",0,0,0,1,0,0,0 -"Touch of Greatness, A",1964,42,NA,1,12,45.5,0,0,0,4.5,0,0,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Touch of Her Flesh, The",1967,78,NA,4.8,29,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Touch of Larceny, A",1959,93,NA,6.6,66,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Touch of Love, A",1969,107,NA,6.7,50,4.5,4.5,0,4.5,24.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Touch of Pink",2004,91,NA,6.8,486,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Touch of Satan, The",1974,90,NA,1.8,459,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Touch of Sweden, A",1971,59,NA,4.7,12,24.5,0,0,0,0,24.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Touch of the Sun, A",1979,95,NA,2.2,23,64.5,14.5,4.5,4.5,0,4.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Touch the Sound",2004,99,NA,6.7,39,0,4.5,0,14.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Touch, The",2002,103,20000000,4.5,417,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,1,0 -"Touchables, The",1968,93,NA,4.6,33,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Touchdown Mickey",1932,7,NA,6.3,30,0,0,4.5,4.5,4.5,24.5,14.5,24.5,0,24.5,"",0,1,1,0,0,0,1 -"Touched",1983,93,NA,4.3,19,0,4.5,14.5,24.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,1,0 -"Touched",1999,105,NA,4.3,21,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Touched by Love",1980,95,NA,5.2,82,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Touchez pas au grisbi",1954,94,NA,7.6,344,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Touching Wild Horses",2002,90,NA,6,80,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,34.5,"PG",0,0,0,1,0,0,0 -"Touching the Void",2003,106,NA,8.1,3671,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"R",0,0,0,1,1,0,0 -"Tough Assignment",1949,64,NA,7,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Tough Enough",1983,106,NA,4.8,138,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tough Guy",1936,76,NA,5.3,28,4.5,4.5,0,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tough Guys",1986,104,NA,5.7,1088,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tough Guys Don't Dance",1987,110,5000000,4.8,233,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Tough Luck",2003,88,NA,5.9,99,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Tough Winter, A",1930,20,NA,7.2,14,0,0,14.5,0,14.5,4.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Toughest Gun in Tombstone",1958,72,NA,4.8,9,14.5,0,0,44.5,14.5,14.5,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Toughest Man in Arizona",1952,85,NA,4.1,28,14.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Touki Bouki",1973,85,NA,5.7,47,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tour Eiffel",1994,10,NA,7.9,9,0,0,0,0,0,34.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Tour Montparnasse infernale, La",2001,92,NA,4.8,369,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tour de France",1994,15,NA,7.2,14,0,0,0,14.5,24.5,4.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,1 -"Tour de Nesle, La",1955,120,NA,4.7,12,0,4.5,24.5,0,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Tour, La",1928,14,NA,7.1,14,0,0,0,0,4.5,24.5,4.5,24.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Tourfilm",1990,85,NA,8.3,49,0,0,0,4.5,0,0,14.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Tourist Trap",1979,90,NA,5,358,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tourist Trap",1984,60,NA,3.7,9,14.5,0,0,0,0,14.5,0,0,0,74.5,"",1,0,0,0,0,0,0 -"Tous les I de Paris s'illuminent",1999,10,NA,5.7,7,0,0,0,0,24.5,44.5,14.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Tous les matins du monde",1991,115,NA,7.2,941,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Tout baigne!",1999,90,NA,5.6,26,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tout droit jusqu'au matin",1994,11,NA,7.5,9,0,0,0,0,0,0,44.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Tout feu, tout flamme",1982,108,NA,6.2,102,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,1,1,0,0,0 -"Tout l'or du monde",1961,88,NA,6.2,35,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tout le monde il en a deux",1974,106,NA,4.2,31,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Tout le monde n'a pas eu la chance d'avoir des parents communistes",1993,90,NA,6,54,4.5,4.5,0,14.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tout le plaisir est pour moi",2004,82,NA,5.2,47,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tout n'est pas en noir",1996,4,NA,6.6,5,0,24.5,0,0,0,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Tout pour l'oseille",2004,94,NA,3.6,10,34.5,0,24.5,0,0,24.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Tout pour plaire",2005,105,NA,6.4,51,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tout rien",1980,11,NA,7.5,6,0,0,0,0,0,14.5,14.5,64.5,0,0,"",0,1,0,0,0,0,1 -"Tout un hiver sans feu",2004,88,NA,6.4,33,4.5,0,0,0,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Tout va bien",1972,95,NA,6.4,166,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tout va bien, on s'en va",2000,96,NA,7,182,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Toute une nuit",1982,90,NA,6,48,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Toute une vie",1974,121,NA,7.6,119,4.5,4.5,0,0,4.5,14.5,14.5,4.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Toutes ces belles promesses",2003,85,NA,6.1,24,4.5,0,0,4.5,14.5,44.5,4.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Toutes les filles sont folles",2003,84,NA,5.2,75,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Toutes les nuits",2001,112,NA,8.5,11,24.5,0,4.5,0,0,4.5,0,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Toutes peines confondues",1992,107,NA,6.2,60,4.5,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Touvla, Ta",1985,96,NA,5.3,8,14.5,0,0,14.5,14.5,14.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Tovarich",1937,98,1400000,7.2,134,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Toward the Unknown",1956,115,NA,6,58,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Towed in a Hole",1932,21,NA,8,185,0,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Tower of Babble, The",2002,22,NA,6.3,33,4.5,0,4.5,0,14.5,14.5,14.5,4.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Tower of Evil",1972,85,400000,4.3,111,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tower of London",1939,92,NA,6.6,128,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tower of London",1962,79,NA,5.5,120,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tower of Terror",1941,62,NA,6.2,5,0,0,0,24.5,0,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Towering Inferno, The",1974,165,14000000,6.4,5386,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Towers Open Fire",1963,10,NA,6.8,39,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Town & Country",2001,104,90000000,4.5,1434,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Town Bloody Hall",1979,85,NA,6.4,21,0,0,4.5,4.5,0,0,44.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Town Called Hell, A",1971,97,NA,3.9,49,14.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Town Like Alice, A",1956,107,NA,6.9,120,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Town Tamer",1965,89,NA,5,16,4.5,0,4.5,4.5,24.5,4.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Town That Dreaded Sundown, The",1976,90,NA,5.4,226,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Town Went Wild, The",1944,77,NA,4.4,5,24.5,0,24.5,0,64.5,0,0,0,0,0,"",0,0,1,0,0,1,0 -"Town Without Pity",1961,105,NA,7.2,183,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Town on Trial",1957,95,NA,6.2,37,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Town, The",1944,12,NA,6.6,5,24.5,0,0,0,24.5,0,24.5,44.5,0,0,"",0,0,0,0,0,0,1 -"Townies",1999,69,NA,3.1,38,34.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Toxi",1952,79,NA,8.6,7,0,0,0,0,0,0,14.5,24.5,44.5,14.5,"",0,0,1,0,0,0,0 -"Toxic Affair",1993,89,NA,3.8,104,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Toxic Avenger Part III: The Last Temptation of Toxie, The",1989,102,NA,3.3,337,14.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Toxic Avenger, Part II, The",1989,96,2300000,4.2,574,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Toxios, Los",1998,10,NA,6.7,8,14.5,0,0,0,34.5,14.5,24.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Toy Box, The",1971,72,NA,6.5,34,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Toy Love",2002,88,NA,6.7,38,4.5,4.5,4.5,0,0,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Toy Soldiers",1984,85,NA,5.6,127,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Toy Soldiers",1991,112,NA,5.8,2721,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Toy Soldiers",1999,7,NA,6.1,47,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Toy Story",1995,81,30000000,7.9,46019,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,1,1,0,0,0,0 -"Toy Story 2",1999,92,90000000,8.1,40941,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,0 -"Toy Tiger, The",1956,88,NA,5.4,48,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Toy Tinkers",1949,7,NA,8.6,38,0,0,0,4.5,4.5,0,14.5,24.5,24.5,34.5,"",0,1,0,0,0,0,1 -"Toy Town Hall",1936,6,NA,5.3,9,0,0,0,24.5,34.5,44.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Toy Trouble",1941,7,NA,6.2,12,0,0,0,4.5,4.5,44.5,14.5,4.5,14.5,0,"",0,1,1,0,0,0,1 -"Toy Wife, The",1938,96,NA,4.7,23,0,0,4.5,24.5,24.5,24.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Toy, The",1982,102,NA,5.1,1646,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Toyland Broadcast",1934,8,NA,4.7,13,4.5,0,4.5,14.5,14.5,4.5,24.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Toys",1966,8,NA,8.2,17,0,4.5,4.5,4.5,0,0,0,4.5,24.5,44.5,"",0,1,0,0,0,0,1 -"Toys",1992,122,NA,4.7,5606,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Toys Are Not for Children",1972,85,NA,4.8,28,4.5,4.5,14.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Toys in the Attic",1963,90,NA,6.7,155,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Trabalho dos Homens, O",1997,10,NA,7.2,6,14.5,0,0,0,0,0,64.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Traberg",1992,90,NA,5.7,24,0,0,0,4.5,4.5,24.5,0,45.5,0,0,"",0,0,0,0,1,0,0 -"Tracce di vita amorosa",1990,105,NA,5.4,9,0,34.5,0,0,14.5,24.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Trace, La",1983,103,NA,8.2,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,0,0,0,0 -"Traces of Red",1992,105,NA,4.7,354,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Traces of a Dragon: Jackie Chan & His Lost Family",2003,96,NA,6.6,12,4.5,0,0,0,0,14.5,14.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Tracie Lords",1984,80,NA,7.7,13,0,4.5,0,0,0,0,0,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Track",1999,98,NA,5.2,23,0,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Track 16",2001,90,NA,8,10,24.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,0,0,0 -"Track 29",1988,90,5000000,5.5,417,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Track Addict",2003,10,NA,9,9,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Track of the Cat",1954,102,NA,5.3,101,14.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Track of the Moon Beast",1976,90,NA,1.7,424,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Trackdown",1976,98,NA,5.2,33,4.5,4.5,0,14.5,24.5,4.5,24.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Tracker, The",2002,90,NA,7.3,239,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Tracking Down Maggie: The Unofficial Biography of Margaret Thatcher",1994,87,NA,7.1,9,0,0,0,0,0,34.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Tracks",1976,90,NA,4.7,60,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Tracks",2002,92,1000000,5,5,0,24.5,0,0,24.5,0,0,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Tracks of a Killer",1995,99,NA,3.7,59,14.5,4.5,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Trade Off",2000,95,NA,6.7,52,44.5,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Trade Offs",2003,97,NA,8.8,12,0,0,0,0,4.5,0,4.5,4.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Trade Tattoo",1937,5,NA,7.8,16,0,0,4.5,14.5,4.5,0,14.5,34.5,14.5,14.5,"",0,1,0,1,0,0,1 -"Trade Winds",1938,93,NA,6.5,29,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Trader Horn",1931,122,1320000,6.8,83,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Trader Horn",1973,101,NA,3.7,12,4.5,24.5,14.5,14.5,24.5,0,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Trader Hound",1931,15,NA,3.1,12,14.5,4.5,4.5,14.5,14.5,14.5,4.5,0,0,4.5,"",0,0,1,0,0,0,1 -"Trader Mickey",1932,8,NA,5.1,6,0,0,0,34.5,0,45.5,0,0,0,14.5,"",0,1,1,0,0,0,1 -"Trader Tom of the China Seas",1954,167,NA,3.6,8,0,0,45.5,24.5,14.5,0,14.5,0,0,0,"",1,0,0,0,0,0,0 -"Trading Mom",1994,83,NA,4.5,208,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Trading Places",1983,118,NA,7.3,11293,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Tradita",1954,93,NA,3.8,5,24.5,0,0,24.5,24.5,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Traffic",2000,147,48000000,7.8,41268,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Traffic Troubles",1931,8,NA,6.5,14,0,14.5,0,0,4.5,4.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Traffic in Souls",1913,88,5700,6.2,44,0,0,4.5,4.5,14.5,34.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Traffic with the Devil",1946,19,NA,6.4,15,0,0,14.5,0,0,34.5,34.5,14.5,0,4.5,"",0,0,0,0,1,0,1 -"Trafficone, Il",1974,102,NA,6.8,5,0,0,0,0,0,24.5,84.5,0,0,0,"",0,0,1,0,0,0,0 -"Trafic",1971,96,NA,6.7,460,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Trafic",2004,15,NA,7,20,4.5,4.5,0,0,14.5,0,34.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Trafic d'influence",1999,95,NA,4.5,120,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Trafico, El",2004,5,1000,9.2,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,0,0,1,0,0,1 -"Tragedia di un uomo ridicolo, La",1981,116,NA,6,78,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tragedy of Macbeth, The",1971,140,NA,7.4,1498,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tragedy of Othello: The Moor of Venice, The",1952,90,NA,7.8,939,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tragoudi de ftanei, Ena",2003,118,NA,8.2,6,0,0,0,0,0,14.5,14.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Tragoudia tis fotias, Ta",1975,110,NA,8.8,8,0,0,0,0,0,14.5,14.5,0,0,74.5,"",0,0,0,0,0,0,0 -"Trahir",1993,103,NA,7.9,12,0,0,0,0,0,4.5,0,14.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Traidores, Los",1972,113,NA,6.1,6,0,0,0,0,0,34.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Trail Beyond, The",1934,55,NA,4.7,80,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Trail Dust",1936,77,NA,6.7,20,0,0,0,0,24.5,24.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Trail Guide",1952,60,NA,5.1,6,0,0,14.5,0,14.5,34.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Trail Mix-Up",1993,8,NA,7.3,83,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Trail Street",1947,84,NA,5.9,36,4.5,4.5,0,4.5,14.5,34.5,34.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Trail of '98, The",1928,87,2000000,8.2,41,0,0,4.5,4.5,0,14.5,14.5,14.5,24.5,24.5,"",1,0,0,1,0,1,0 -"Trail of Robin Hood",1950,67,NA,6.1,34,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Trail of the Lonesome Pine, The",1936,102,NA,6.9,87,0,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Trail of the Pink Panther",1982,96,NA,4.4,1103,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Trail of the Rustlers",1950,55,NA,4.9,6,14.5,0,14.5,14.5,14.5,0,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Trail of the Vigilantes",1940,75,NA,4.4,9,14.5,0,14.5,0,24.5,0,14.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Trail to San Antone",1947,67,NA,5.9,7,0,14.5,0,0,14.5,0,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Trailer Horn",1950,6,NA,6.8,25,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Trailer Park Boys",1999,90,NA,8.6,167,4.5,4.5,4.5,0,0,4.5,4.5,4.5,14.5,74.5,"",0,0,1,0,0,0,0 -"Trailer Town",2003,80,NA,7.7,25,14.5,4.5,4.5,4.5,4.5,0,4.5,14.5,4.5,44.5,"",0,0,1,1,0,0,0 -"Trailer: The Movie!",2001,9,NA,7.3,26,4.5,0,0,4.5,0,0,14.5,4.5,14.5,45.5,"",1,0,1,0,0,0,1 -"Trailin' West",1936,56,NA,4.5,8,14.5,0,24.5,0,34.5,14.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"Train",1966,5,NA,8.7,17,0,0,0,0,0,0,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Train Quest",2001,80,NA,6.8,21,4.5,4.5,4.5,4.5,0,4.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Train Ride",2000,93,NA,9,23,4.5,0,0,0,0,0,0,4.5,4.5,74.5,"R",0,0,0,1,0,0,0 -"Train Ride to Hollywood",1975,89,NA,2.3,31,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Train Robbers, The",1973,92,NA,5.8,401,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Train d'enfer",1965,92,NA,4.6,6,0,0,34.5,0,34.5,34.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Train d'enfer",1984,90,NA,5.1,15,4.5,14.5,4.5,4.5,14.5,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Train de vie",1998,103,NA,7.3,1191,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,1,1,0,1,0 -"Train en marche, Le",1971,32,NA,6.1,5,0,0,0,0,24.5,24.5,44.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Train of Dreams",1987,88,NA,6.9,6,0,0,0,0,14.5,14.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Train of Events",1949,88,NA,7.6,28,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Train on the Brain",2000,50,NA,7.2,15,0,0,0,0,4.5,4.5,4.5,34.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Train to Pakistan",1998,111,NA,6.7,11,0,0,0,4.5,4.5,24.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Train to Tombstone",1950,56,NA,3.3,14,4.5,0,14.5,24.5,34.5,0,0,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Train, Le",1973,95,NA,7.4,72,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Train, The",1964,133,6700000,7.7,1616,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Trained to Kill",1988,90,NA,2.8,15,24.5,4.5,14.5,14.5,0,0,4.5,4.5,0,34.5,"",1,0,0,0,0,0,0 -"Training Day",2001,120,45000000,7.3,22776,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Training Pigeons",1936,7,NA,5.1,6,0,0,0,14.5,34.5,45.5,0,0,0,0,"",0,1,1,0,0,0,1 -"Training Wheels",2002,90,NA,5,8,34.5,0,0,0,24.5,0,14.5,0,0,24.5,"",0,0,1,1,0,0,0 -"Trainspotting",1996,94,3500000,8,51887,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Trait d'union",1999,12,NA,6.2,5,0,0,0,0,64.5,24.5,0,0,0,24.5,"",0,0,0,1,0,0,1 -"Traitement de choc",1973,90,NA,6.2,143,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Traitor's Heart",1999,91,NA,2.7,52,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Traitor, The",1957,88,NA,5.3,7,0,0,0,24.5,14.5,0,24.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Traitorous",1976,90,NA,8.3,8,0,0,0,34.5,0,14.5,14.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Traje, El",2002,102,NA,6.8,36,4.5,0,0,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Tramontana",1991,85,NA,4.2,5,0,24.5,24.5,44.5,0,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Tramp and the Dictator, The",2002,56,NA,7.1,120,4.5,4.5,4.5,0,0,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Tramp, The",1915,32,NA,7.2,285,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Trampa",1978,90,NA,6.2,6,0,0,0,0,0,14.5,0,0,34.5,45.5,"",0,0,0,1,0,0,0 -"Trampa infernal",1990,90,NA,6.3,12,0,0,0,4.5,0,0,4.5,0,14.5,64.5,"",0,0,0,0,0,0,0 -"Tramper",2004,14,NA,6.7,15,0,0,0,0,4.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Tramposos, Los",1959,81,NA,6.3,32,0,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tramwaj",1966,5,NA,5.9,40,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Trance",1998,94,4000000,3.9,392,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Tranceformer - A Portrait of Lars von Trier",1997,54,NA,4.9,128,24.5,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Trancers",1985,76,400000,6.1,509,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Trancers II",1991,85,NA,4.9,241,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tranen van Castro, De",1997,50,NA,2.6,12,24.5,0,0,0,14.5,0,0,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Tranen van Maria Machita, De",1991,40,NA,5.8,18,0,0,0,14.5,0,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Tranquillo posto di campagna, Un",1969,106,NA,5.3,31,4.5,4.5,0,4.5,14.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Trans",1998,80,NA,5.9,186,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Trans-Europ-Express",1966,105,NA,6.6,33,0,0,4.5,4.5,4.5,14.5,4.5,14.5,34.5,14.5,"",0,0,0,0,0,0,0 -"TransAmazon: A Gender Queer Journey",2003,41,NA,9.6,5,0,0,0,0,0,0,0,0,44.5,64.5,"",0,0,0,0,1,0,1 -"Transamerica",2005,103,NA,8.8,25,4.5,4.5,0,0,4.5,0,0,4.5,14.5,64.5,"",0,0,1,1,0,0,0 -"Transatlantic",1931,78,NA,6.4,16,0,0,0,4.5,24.5,14.5,24.5,14.5,14.5,0,"",0,0,1,1,0,0,0 -"Transatlantic Merry-Go-Round",1934,91,NA,6.3,32,0,4.5,4.5,4.5,4.5,14.5,44.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Transatlantique",1996,112,NA,5.8,6,0,14.5,0,14.5,0,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Transatlantis",1995,116,NA,3.3,16,14.5,14.5,0,4.5,4.5,0,0,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Transfer",1966,7,0,5.3,17,4.5,14.5,4.5,0,14.5,14.5,0,0,14.5,44.5,"",0,0,0,0,0,0,1 -"Transformations",1989,84,NA,3,39,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Transformers: The Movie, The",1986,85,NA,6.6,5802,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,1,0,0,0,0,0 -"Transgression",1931,70,NA,5.5,26,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Transport z raje",1962,93,NA,7.9,16,0,0,0,0,0,14.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Transporter, The",2002,92,NA,6,9150,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Transsibirskiy ekspress",1977,93,NA,6.6,10,0,0,0,14.5,14.5,0,14.5,24.5,14.5,44.5,"",1,0,0,0,0,0,0 -"Transylvania 6-5000",1963,8,NA,7.2,105,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Transylvania 6-5000",1985,93,NA,4.2,1084,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Transylvania Mania",1968,7,NA,6.8,6,0,0,0,0,14.5,34.5,0,34.5,0,14.5,"",0,1,0,0,0,0,1 -"Transylvania Twist",1990,90,NA,4.1,62,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Trap Happy",1946,7,NA,7.6,33,0,0,0,4.5,4.5,4.5,24.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Trap Happy Porky",1945,6,NA,7.2,38,0,4.5,4.5,0,14.5,4.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Trap, The",1946,62,75000,6.2,86,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Trap, The",1959,84,NA,7.4,33,0,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Trap, The",1966,106,NA,7.2,178,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Trapeze",1956,105,4000000,6.6,475,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Trapeze Disrobing Act",1901,2,NA,5,10,0,0,0,34.5,24.5,45.5,0,0,0,0,"",0,0,1,0,0,0,1 -"Trapp-Familie in Amerika, Die",1958,87,NA,5.1,20,4.5,24.5,0,4.5,24.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Trapp-Familie, Die",1956,106,NA,4.9,32,4.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Trapped",1949,78,NA,6.4,28,0,0,0,0,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Trapped",1982,95,2000000,4.7,17,14.5,0,0,0,44.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Trapped",1999,92,NA,5.5,24,0,4.5,0,4.5,14.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Trapped",2002,106,30000000,6,3718,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Trapped Alive",1993,92,NA,1.8,7,44.5,44.5,14.5,0,0,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Trapped by Boston Blackie",1948,67,NA,7,9,0,0,0,0,0,34.5,34.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Trapped by Television",1936,64,NA,5.7,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Trapped by the Mormons",1922,97,NA,2.6,25,44.5,4.5,14.5,0,0,4.5,4.5,0,4.5,24.5,"",0,0,0,1,0,0,0 -"Trapped in Paradise",1994,111,NA,5.3,1700,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Trapped in Space",1994,87,NA,4.6,106,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Trappedinfreedom",2002,5,NA,6.5,18,0,0,4.5,0,14.5,14.5,14.5,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Trapper County War",1989,98,NA,4.6,24,24.5,4.5,14.5,14.5,0,4.5,4.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Trappola diabolica",1988,95,NA,3.2,22,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Tras el cristal",1987,100,NA,7,172,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Trasgredire",2000,84,NA,4.7,126,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Trash",1970,110,25000,6.7,316,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Trash",1999,95,NA,5.1,124,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Trashy Lady",1985,88,NA,5.9,10,0,0,24.5,0,14.5,0,34.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Tratta delle bianche, La",1953,75,NA,6.1,5,0,0,24.5,0,0,0,24.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Traum ist aus - Die Erben der Scherben, Der",2001,95,NA,8,19,0,0,4.5,4.5,0,4.5,24.5,44.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Trauma",1962,93,69000,4.4,6,14.5,0,14.5,0,0,34.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Trauma",1983,92,NA,3.8,29,14.5,0,4.5,4.5,0,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Trauma",1993,106,7000000,5.5,652,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Traumbus",1979,90,NA,2.9,8,24.5,14.5,14.5,24.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Travail",2002,118,NA,9.4,11,0,0,0,4.5,4.5,4.5,0,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Travail d'Arabe",2003,88,NA,6.5,23,0,0,0,4.5,14.5,14.5,44.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Traveler",2001,13,NA,6.1,8,0,0,0,14.5,34.5,24.5,14.5,14.5,0,0,"",0,0,0,1,0,0,1 -"Traveling Executioner, The",1970,95,NA,6,54,0,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Traveling Husbands",1931,73,NA,4.3,5,0,0,24.5,0,44.5,24.5,0,24.5,0,0,"",0,0,1,0,0,0,0 -"Traveling Poet, The",1993,8,NA,3.4,16,4.5,0,0,0,0,0,4.5,14.5,14.5,64.5,"",0,0,0,0,0,0,1 -"Traveling Saleslady",1935,65,NA,6,13,0,0,0,0,14.5,24.5,34.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Traveling Saleswoman",1950,75,NA,5,10,14.5,0,14.5,0,14.5,24.5,34.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Traveller",1981,81,NA,2.2,11,24.5,24.5,14.5,4.5,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Traveller",1997,101,NA,5.9,474,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Traveller's Joy",1949,78,NA,4,7,14.5,0,0,44.5,0,14.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Travellers and Magicians",2003,108,1800000,7.2,187,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Travellinckx",1999,17,NA,5.4,22,0,34.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Travelling Light",2003,88,NA,4.6,25,24.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Travelling North",1987,96,NA,6.2,58,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Travelling avant",1987,114,NA,6.6,15,0,0,0,4.5,0,4.5,24.5,44.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Travels with My Aunt",1972,109,NA,6.1,225,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Traviata, La",1982,109,NA,8.4,250,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Travis",1997,57,NA,8.5,6,14.5,0,0,0,0,0,0,0,0,84.5,"",0,0,0,0,1,0,0 -"Travolti da un insolito destino nell'azzurro mare d'agosto",1974,116,NA,7.2,864,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Traxx",1988,84,NA,2.8,79,24.5,4.5,24.5,14.5,4.5,4.5,0,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Tre",1996,84,NA,3.2,5,44.5,0,0,0,24.5,0,0,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Tre aquilotti, I",1942,80,NA,5.4,5,0,0,0,44.5,24.5,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"Tre che sconvolsero il West - vado, vedo e sparo, I",1968,91,NA,5.9,11,4.5,4.5,0,0,14.5,34.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Tre colonne in cronaca",1990,100,NA,6,5,0,0,0,24.5,0,64.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Tre dar i buren",1963,86,NA,2.9,8,14.5,0,45.5,0,0,0,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Tre fratelli",1981,113,NA,7.6,124,0,4.5,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tre giorni di anarchia",2004,102,NA,8.6,8,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,1,0,0,0 -"Tre ladri, I",1954,100,NA,5.2,8,14.5,0,14.5,0,24.5,24.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Tre metri sopra il cielo",2004,101,NA,5.8,39,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Tre mogli",2001,105,NA,6.2,35,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Tre piger fra Jylland",1957,96,NA,8,6,0,0,0,0,0,0,45.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Tre piger i Paris",1963,105,NA,5.1,29,0,4.5,4.5,14.5,4.5,4.5,64.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Tre skojiga skojare",1942,80,NA,3.4,8,34.5,0,14.5,0,14.5,24.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Tre solar",2004,102,NA,2.7,128,34.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tre spade di Zorro, Le",1963,88,NA,5.2,9,14.5,34.5,0,14.5,24.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Tre storie",1998,85,NA,4,14,14.5,0,0,0,14.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Tre tigri contro tre tigri",1977,115,NA,3.5,6,14.5,0,0,34.5,0,0,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Tre uomini e una gamba",1997,100,NA,6.9,393,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Tre volti della paura, I",1963,95,NA,6.9,528,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tre volti, I",1965,25,NA,6.7,12,0,0,0,4.5,14.5,0,14.5,14.5,4.5,34.5,"",0,0,0,1,1,1,1 -"Treacherous",1994,95,NA,2.9,244,84.5,4.5,4.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Treachery Rides the Range",1936,56,NA,4.7,6,0,0,14.5,14.5,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Tread Softly Stranger",1958,90,NA,5.6,7,0,0,0,14.5,0,0,14.5,44.5,0,24.5,"",0,0,0,1,0,0,0 -"Treading Water",2001,94,NA,5.1,71,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Treasure Chest",1985,85,NA,6.7,6,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Treasure Island",1934,110,NA,7.2,267,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Treasure Island",1950,96,NA,6.9,507,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Treasure Island",1972,94,NA,6.5,113,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Treasure Island",1985,115,NA,5.8,32,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Treasure Island",1997,91,NA,3.3,12,14.5,0,0,0,14.5,4.5,4.5,14.5,0,34.5,"",0,1,0,0,0,0,0 -"Treasure Planet",2002,95,140000000,6.6,3724,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG",0,1,0,1,0,0,0 -"Treasure of Alpheus T. Winterborn, The",1980,35,NA,1,8,74.5,0,0,14.5,0,0,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Treasure of Lost Canyon, The",1952,82,NA,5.8,27,0,0,0,4.5,24.5,24.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Treasure of Matecumbe",1976,117,NA,5,44,0,4.5,4.5,14.5,14.5,4.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Treasure of Monte Cristo",1949,76,NA,5.8,8,0,0,0,14.5,14.5,0,64.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Treasure of Monte Cristo, The",1961,95,NA,5,17,0,4.5,14.5,14.5,14.5,44.5,0,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Treasure of Pancho Villa, The",1955,92,NA,5.3,32,4.5,0,0,14.5,14.5,44.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Treasure of Pirate's Point",1999,85,NA,4.8,29,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Treasure of Ruby Hills",1955,71,NA,6,5,0,0,0,24.5,0,24.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Treasure of San Teresa, The",1959,81,NA,7,7,0,0,0,0,24.5,24.5,24.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Treasure of Thomas Beale, The",2003,53,NA,8.7,9,14.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,0,0,0,0,0 -"Treasure of the Amazon, The",1985,104,NA,5,63,0,14.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Treasure of the Golden Condor",1953,93,NA,5.7,20,4.5,4.5,0,14.5,4.5,4.5,14.5,44.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Treasure of the Moon Goddess",1987,90,NA,3.3,17,14.5,4.5,14.5,0,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Treasure of the Sierra Madre, The",1948,126,3800000,8.4,10470,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",1,0,0,1,0,0,0 -"Treasurer's Report, The",1928,10,NA,8.3,9,0,0,0,0,0,14.5,0,24.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Treasures of the Snow",1980,108,NA,4.6,26,14.5,4.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Treat, The",1998,82,NA,3.6,237,4.5,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Treca sreca",1995,90,NA,6.2,15,14.5,0,0,0,14.5,14.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Treca zena",1997,103,NA,6.4,10,0,0,0,24.5,0,34.5,14.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Trece campanadas",2002,108,NA,4.6,71,4.5,4.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Treci kljuc",1983,81,NA,7.1,7,0,0,0,0,0,45.5,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Tredowata",1976,100,NA,4.2,10,14.5,0,0,14.5,0,14.5,14.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Tree",1966,16,NA,8.3,6,0,0,0,14.5,0,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Tree Cornered Tweety",1956,7,NA,6.4,23,0,0,0,4.5,14.5,24.5,34.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Tree Grows in Brooklyn, A",1945,128,NA,7.7,1010,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Tree Shade",1998,30,NA,4.3,6,0,14.5,14.5,0,0,0,0,0,0,64.5,"",0,0,0,0,0,0,1 -"Tree for Two",1952,7,NA,7.4,25,0,0,0,0,0,14.5,24.5,45.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Tree in a Test Tube, The",1943,5,NA,4.7,36,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,1,0,1 -"Tree of Hands",1989,89,NA,5.2,24,4.5,4.5,4.5,4.5,4.5,24.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Treed Murray",2001,89,NA,7.8,343,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Treehouse Hostage",1999,91,NA,4.8,82,4.5,4.5,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Trees",2000,147,NA,4.8,8,0,14.5,14.5,24.5,0,14.5,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Trees Lounge",1996,95,1300000,7.1,3155,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Treevil",2003,7,NA,7,11,0,0,0,0,4.5,0,24.5,4.5,4.5,44.5,"",0,1,0,0,0,0,1 -"Tregua, La",1974,108,NA,7.9,85,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,1,0 -"Tregua, La",1997,125,NA,6.6,328,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Tregua, La",2003,101,NA,5.9,10,34.5,14.5,0,0,0,14.5,0,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Treitum",2000,15,NA,6.6,19,0,0,4.5,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Trekkies",1997,86,375000,6.9,1526,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"PG",0,0,0,0,1,0,0 -"Trekkies 2",2004,93,NA,6.4,128,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"PG",0,0,0,0,1,0,0 -"Trelew",2004,98,NA,8,18,0,0,0,0,0,4.5,14.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Trelokoritso, To",1958,68,NA,6.7,5,0,0,0,0,24.5,0,64.5,0,0,24.5,"",0,0,1,0,0,1,0 -"Trelopenindaris, O",1971,98,NA,7,9,14.5,0,0,0,24.5,14.5,14.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Trelos ta'hei tetrakosia, O",1968,87,NA,5.9,14,0,0,0,4.5,14.5,24.5,44.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Trelos, palavos kai Vengos",1967,85,NA,8.7,12,0,0,0,0,4.5,4.5,0,0,14.5,64.5,"",0,0,1,0,0,0,0 -"Trembita",1968,92,NA,6.2,6,0,0,0,0,14.5,14.5,14.5,34.5,14.5,0,"",0,0,1,0,0,1,0 -"Trembling Before G-d",2001,84,NA,7.7,301,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Tremendo amanecer",2004,80,NA,8.3,7,0,14.5,0,0,0,0,0,0,45.5,24.5,"",0,0,0,0,0,0,0 -"Tremors",1990,96,10000000,6.9,9657,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Trempistim",1998,50,NA,5,9,24.5,0,0,0,24.5,0,0,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Tren de la bruja, El",2003,19,NA,6.5,10,0,0,0,0,24.5,14.5,0,44.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Tren de sombras",1997,88,NA,7.5,54,14.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Tren del desierto, El",1996,27,NA,6.1,15,0,4.5,4.5,14.5,14.5,4.5,4.5,44.5,0,0,"",0,0,0,0,1,0,1 -"Trench, The",1999,98,NA,6.2,186,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Trenchcoat",1983,91,NA,4.7,81,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Treno per Durango, Un",1967,92,NA,6.2,8,0,0,0,0,14.5,24.5,45.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Trent's Last Case",1952,90,NA,6.2,21,0,0,0,4.5,14.5,34.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Trenutki odlocitve",1955,101,NA,6.4,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Tres Berretines, Los",1933,65,NA,6.1,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Tres alegres compadres, Los",1952,118,NA,7.4,5,0,0,0,0,24.5,0,44.5,24.5,0,24.5,"",0,0,1,1,0,0,0 -"Tres de la Cruz Roja",1961,90,NA,4.5,8,0,14.5,0,0,14.5,34.5,14.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Tres huastecos, Los",1948,120,NA,7.8,40,0,0,4.5,0,0,4.5,4.5,24.5,24.5,45.5,"",0,0,1,1,0,0,0 -"Tres mosqueteros y medio, Los",1957,100,NA,5.9,14,0,0,0,0,14.5,4.5,44.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Tres mosqueteros, Los",1942,136,NA,4.8,14,4.5,0,0,4.5,24.5,24.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Tres palabras",1993,91,NA,6.1,11,4.5,14.5,0,0,4.5,34.5,4.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Tres tristes tigres",1968,100,NA,9.3,14,24.5,4.5,0,0,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,0 -"Trespass",1992,101,NA,5.9,1373,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Trespasser, The",1929,90,NA,7.4,9,0,0,0,14.5,24.5,0,14.5,0,24.5,34.5,"",0,0,0,1,0,0,0 -"Trespasses",1986,90,NA,2.9,5,0,24.5,64.5,0,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Tretya meshchanskaya",1927,95,NA,7.6,48,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Trevor",1994,23,NA,7.9,225,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,1,1,0,0,1 -"Treyf",1998,54,NA,2.9,5,24.5,0,24.5,0,0,0,24.5,24.5,0,24.5,"",0,0,0,0,1,0,0 -"Trhala fialky dynamitem",1992,90,NA,2,14,34.5,24.5,24.5,14.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Tri",1965,80,NA,7.9,32,0,0,0,4.5,4.5,0,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Tri istorii",1997,109,500000,7.3,85,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Tri karte za Holivud",1993,118,NA,8.5,23,4.5,0,0,0,0,4.5,14.5,14.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Tri letnja dana",1997,90,NA,7.4,12,4.5,34.5,4.5,4.5,4.5,0,0,0,24.5,4.5,"",0,0,0,0,0,0,0 -"Tri palme za dve bitange i ribicu",1998,103,NA,8.1,52,0,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Tri pesni o Lenine",1934,57,NA,6.4,53,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Tri tolstyaka",1966,92,NA,7.5,19,0,0,0,4.5,0,4.5,14.5,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Tri topolya na Plyushchikhe",1967,79,NA,7.9,32,0,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,1,0 -"Triads, Yardies & Onion Bhajees",2003,105,NA,5.4,19,14.5,24.5,14.5,0,14.5,0,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Trial",1955,109,NA,7,134,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Trial Run",1984,91,NA,3.1,7,14.5,24.5,0,24.5,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Trial and Error",1997,98,NA,5.5,1722,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Trial by Combat",1976,88,NA,5.4,32,4.5,0,4.5,4.5,44.5,24.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Trial by Jury",1994,107,NA,5.1,457,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Trial by Trigger",1944,20,NA,6.1,12,0,0,0,14.5,24.5,24.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Trial of Billy Jack, The",1974,170,7800000,4,258,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Trial of Donald Duck, The",1948,7,NA,6.5,23,0,0,0,14.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Trial of Jack, The",2004,9,NA,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,0,0,1 -"Trial of Lee Harvey Oswald, The",1964,98,NA,3.7,18,14.5,14.5,14.5,14.5,24.5,4.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Trial of Mary Dugan, The",1929,113,NA,7.3,6,14.5,0,0,0,0,34.5,0,0,0,45.5,"",0,0,0,1,0,0,0 -"Trial of Mr. Wolf, The",1941,7,NA,7.7,20,0,0,0,4.5,0,4.5,14.5,64.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Trial of Vivienne Ware, The",1932,56,NA,4.1,6,0,0,0,34.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Trial of the Catonsville Nine, The",1972,85,NA,4.8,20,0,0,0,14.5,44.5,4.5,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Trial, The",1993,120,NA,5.7,378,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Trials of Alger Hiss, The",1980,164,NA,6,6,0,0,0,14.5,14.5,0,0,14.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Trials of Chickie Tetrazzini, The",1974,60,NA,5.4,19,4.5,0,0,45.5,24.5,14.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Trials of Henry Kissinger, The",2002,80,NA,7.7,373,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Trials of Oscar Wilde, The",1960,130,NA,6.9,106,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Triangle",1994,9,NA,6.8,6,0,0,0,0,14.5,14.5,0,14.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Triangle Square",2001,94,NA,6.4,15,4.5,0,0,14.5,0,0,14.5,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Tribe of Joseph",2002,99,NA,3.9,11,4.5,0,4.5,0,4.5,4.5,34.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Tribu",2001,23,NA,5.6,6,0,14.5,34.5,0,0,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Tribulation",2000,95,NA,4.4,178,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Tribulation 99: Alien Anomalies Under America",1992,48,NA,5.1,39,4.5,0,4.5,4.5,14.5,4.5,4.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Tribulations d'un chinois en Chine, Les",1965,104,NA,6.2,200,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Tribute",1980,121,8400000,5.7,106,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Tribute",2001,90,NA,7.2,51,0,0,4.5,4.5,4.5,4.5,34.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Tribute to a Bad Man",1956,95,NA,6.6,155,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tribute to the Will Rogers Memorial Hospital, A",1965,3,NA,5.3,8,14.5,0,0,0,34.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"Triche, La",1984,100,NA,4.8,7,0,0,14.5,24.5,0,0,0,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Tricheurs",1984,94,NA,6,40,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tricheurs, Les",1958,120,NA,6.8,54,0,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Trick",1999,89,NA,6.8,2234,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,0,0,1,0 -"Trick Baby",1973,89,NA,6.8,30,4.5,0,0,0,14.5,4.5,24.5,14.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Trick Tracy",1990,82,NA,6.2,8,0,14.5,24.5,0,14.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Trick or Treat",1952,8,NA,7.1,65,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Trick or Treat",1986,98,NA,4.7,508,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Trick or Treats",1982,91,NA,2.9,39,14.5,24.5,14.5,14.5,4.5,14.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Trick or Tweet",1959,7,NA,6.6,17,0,0,0,0,24.5,14.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Trickle",1998,19,NA,5.5,15,0,4.5,0,14.5,0,0,4.5,0,0,74.5,"",0,0,1,0,0,0,1 -"Tricky Dicks",1953,16,NA,7.3,36,0,0,4.5,0,4.5,4.5,24.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Trident Force",1988,90,NA,1.2,5,44.5,24.5,24.5,0,0,0,24.5,0,0,0,"",1,0,0,0,0,0,0 -"Tridev",1989,173,NA,6.3,32,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Tridtsat tri (Nenauchnaya fantastika)",1965,77,NA,7.8,30,0,0,0,4.5,0,14.5,4.5,44.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Tridtsatogo unichtozhit!",1992,93,NA,2.7,9,24.5,14.5,44.5,0,0,0,14.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Trifles of Importance",1940,9,NA,6.2,6,0,0,0,0,14.5,14.5,45.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Trifling with Fate",2000,93,NA,4.9,18,4.5,4.5,4.5,0,14.5,4.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,1,0 -"Trigger Effect, The",1996,94,8000000,5.4,1591,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Trigger Fast",1994,96,NA,1.5,399,84.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Trigger Happy",2001,100,NA,8.4,22,0,0,0,4.5,4.5,0,4.5,4.5,34.5,45.5,"",0,0,0,0,0,0,0 -"Trigger, Jr.",1950,68,NA,5.8,21,0,0,4.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Triggermen",2002,96,12000000,5.8,317,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Trikal: (Past, Present, Future)",1985,137,NA,5.6,32,4.5,0,0,4.5,0,0,14.5,45.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Trilby",1915,59,NA,6.8,9,0,0,0,14.5,34.5,0,0,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Trileros",2003,112,NA,3.7,9,24.5,14.5,24.5,0,24.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Trilogia I: To Livadi pou dakryzei",2004,170,NA,7.2,109,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Trilogy",1969,110,NA,7.5,27,4.5,0,4.5,0,0,4.5,4.5,4.5,0,74.5,"",0,0,0,1,0,0,0 -"Trimata ot zapasa",1971,97,NA,8.2,19,0,0,0,0,0,0,14.5,14.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Trimmed in Furs",1934,20,NA,3.6,8,0,14.5,24.5,14.5,34.5,0,0,14.5,0,0,"",0,0,1,0,0,0,1 -"Trimurti",1995,187,NA,5.5,32,14.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Trinadtsat",1937,90,NA,7,5,0,0,0,0,0,24.5,44.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Trinity",2001,82,NA,2.4,23,24.5,24.5,4.5,4.5,4.5,0,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Trinket-Maker, The",2002,8,NA,8.1,16,0,0,0,0,0,14.5,24.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Trio",1950,91,NA,7.8,56,0,0,0,4.5,4.5,14.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Trio",2003,102,1200000,4.7,18,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Trio infernal, Le",1974,84,NA,5.8,79,4.5,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Trio, Das",1998,93,NA,6.8,140,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Triomphe de Michel Strogoff, Le",1961,118,NA,5.1,15,14.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Trionfo di Ercole, Il",1964,94,NA,2.3,27,24.5,14.5,14.5,14.5,14.5,0,0,0,0,24.5,"",1,0,0,0,0,0,0 -"Trip - Die nackte Gitarre 0,5, Der",1996,90,NA,3.1,30,24.5,14.5,0,0,14.5,24.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Trip Down Market Street Before the Fire, A",1905,13,NA,3.9,8,14.5,0,0,24.5,24.5,0,14.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Trip Down Memory Lane, A",1965,13,NA,7.6,6,0,0,0,0,0,0,34.5,34.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Trip Thru a Hollywood Studio, A",1935,10,NA,7.1,6,0,0,0,0,34.5,14.5,34.5,0,0,14.5,"",0,0,0,0,1,0,1 -"Trip for Tat",1960,6,NA,6,19,0,0,0,14.5,14.5,34.5,14.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Trip to Bountiful, The",1985,108,NA,7.4,646,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Trip to the Moon, A",1914,14,NA,8.6,57,4.5,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Trip to the Orphanage, A",2004,4,NA,6,16,4.5,0,0,14.5,4.5,14.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,1 -"Trip van Teetje, De",1998,90,NA,6.1,59,4.5,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Trip with the Teacher",1975,91,NA,3.7,22,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"TripFall",2000,91,NA,4.1,84,14.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Triple Bogey on a Par Five Hole",1991,85,NA,7.4,17,0,4.5,0,4.5,0,14.5,0,34.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Triple Cross",1967,126,NA,6.2,165,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Triple Crossed",1959,16,NA,4.7,29,14.5,24.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Triple Echo, The",1972,94,NA,6.4,62,0,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Triple Justice",1940,66,NA,5.4,8,0,0,0,34.5,14.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Triple Trouble",1918,23,NA,5.7,80,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Triple Trouble",1950,67,NA,6.9,31,0,0,0,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Triple agent",2004,115,NA,6.4,137,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Triplet Trouble",1952,7,NA,6.6,25,0,0,0,4.5,14.5,4.5,24.5,24.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Triplettes de Belleville, Les",2003,78,8000000,7.7,6618,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,1,1,0,0,0,0 -"Tripoli",1950,95,NA,5.7,34,0,0,4.5,24.5,14.5,14.5,24.5,14.5,0,4.5,"",1,0,0,0,0,0,0 -"Triporteur, Le",1957,93,NA,4.4,25,4.5,4.5,0,34.5,0,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Tripot clandestin, Le",1905,3,NA,6.4,58,4.5,4.5,0,4.5,24.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Trippin'",1999,94,NA,4.3,291,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Tripping the Rift",2000,5,NA,8,150,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Tripwire",1990,87,NA,4.5,41,4.5,0,4.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Trishagni",1988,102,NA,9.1,9,0,0,0,0,0,14.5,0,0,44.5,44.5,"",0,0,0,0,0,0,0 -"Trishul",1978,167,NA,7.5,94,4.5,0,4.5,0,4.5,4.5,4.5,14.5,34.5,34.5,"",1,0,0,1,0,0,0 -"Tristan",2003,100,NA,5.1,78,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tristan et Iseut",2002,77,NA,5.6,18,14.5,14.5,0,4.5,34.5,14.5,4.5,14.5,0,0,"",0,1,0,0,0,1,0 -"Tristana",1970,105,NA,7.5,652,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tristana",1987,12,NA,7.4,35,0,0,0,4.5,4.5,0,14.5,24.5,14.5,44.5,"",0,0,0,0,0,1,1 -"Triti kai 13",1963,95,NA,7.3,6,0,0,0,14.5,0,34.5,14.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Triumph des Willens",1935,110,NA,7.3,1697,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Triumph of Lester Snapwell, The",1963,22,NA,7.5,6,0,0,0,0,45.5,0,0,34.5,0,14.5,"",0,0,1,0,0,0,1 -"Triumph of Love, The",2001,112,5000000,5.7,423,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Triumph of Sherlock Holmes, The",1935,75,NA,5.9,57,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Triumph of the Spirit",1989,120,NA,6.8,249,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Triumphs of a Man Called Horse",1982,86,NA,4.6,103,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Trixie",2000,116,NA,4.8,552,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Trog",1970,93,NA,3.2,202,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Trohonomos Varvara",1981,94,NA,5.9,9,0,14.5,0,14.5,14.5,0,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Trois",2000,93,200000,3.1,176,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Trois 3: The Escort",2004,95,1000000,4.8,38,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Trois couleurs: Bleu",1993,100,NA,7.8,9517,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Trois couleurs: Rouge",1994,99,NA,8.1,10385,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Trois couronnes du matelot, Les",1983,117,NA,6.9,47,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Trois huit",2001,95,NA,7.2,98,0,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Trois milliards sans ascenseur",1972,92,NA,5.7,8,0,0,0,24.5,14.5,45.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Trois mousquetaires, Les",1921,26,NA,6.1,11,4.5,0,0,0,0,24.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Trois mousquetaires, Les",1953,120,NA,6.2,28,0,0,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Trois mousquetaires: La vengeance de Milady, Les",1961,91,NA,5.7,26,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Trois mousquetaires: Les ferrets de la reine, Les",1961,95,NA,5.6,35,0,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Trois offrandes, Les",2001,75,NA,4.2,6,0,14.5,0,14.5,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Trois petites filles",2004,102,NA,5,9,0,0,14.5,34.5,14.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Trois places pour le 26",1988,106,NA,5.5,37,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Trois vies & une seule mort",1996,120,NA,7.4,190,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Trojan Eddie",1996,105,NA,6,89,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Trojan War",1997,85,NA,5.5,1082,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Trojan Warrior",2002,95,NA,4.2,44,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Trojan Women, The",1971,110,NA,5.4,117,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Troll",1971,99,NA,3.9,18,14.5,14.5,0,4.5,14.5,4.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Troll",1986,82,NA,3.9,651,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Troll 2",1990,95,NA,1.8,1952,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Troll in Central Park, A",1994,76,NA,4.5,147,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,1,0,0,0,0,0 -"Trollenberg Terror, The",1958,84,NA,4.3,357,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Trolley Ahoy",1936,8,NA,5.8,6,0,0,0,14.5,0,45.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Trollkarlen - en film om Jan Johansson",1999,56,NA,6.6,9,0,0,0,24.5,0,0,24.5,24.5,34.5,0,"",0,0,0,0,1,0,0 -"Trollsommar",1980,85,NA,5.8,15,0,4.5,4.5,0,14.5,34.5,4.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Trollsyn",1994,93,NA,5.9,23,4.5,0,0,4.5,14.5,4.5,14.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Trollywood",2004,82,1000000,9.6,14,0,0,0,0,0,4.5,0,0,14.5,74.5,"",0,0,0,0,1,0,0 -"Troma's War",1988,87,NA,4.5,251,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Trombone Trouble",1944,7,NA,7.1,14,0,0,0,14.5,0,24.5,14.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Tromeo and Juliet",1996,108,350000,5.8,1030,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Tron",1982,96,17000000,6.4,9084,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Trona",2004,63,5000,8,6,0,14.5,0,0,0,0,0,14.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Tronc, Le",1993,80,NA,3,13,34.5,14.5,0,24.5,4.5,4.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Tronco, O",1999,109,NA,6.8,30,0,0,0,14.5,14.5,0,24.5,45.5,0,4.5,"",0,0,0,1,0,0,0 -"Trono di fuoco, Il",1970,84,NA,5.1,98,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Trono di fuoco, Il",1982,89,NA,4.9,17,14.5,0,14.5,14.5,14.5,4.5,14.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Troop Beverly Hills",1989,105,NA,4.4,1332,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Trooper Hook",1957,81,NA,6.3,61,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Troops",1998,10,NA,7.3,1157,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Trop (peu) d'amour",1998,119,NA,4.5,20,24.5,0,0,4.5,14.5,24.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Trop belle pour toi",1989,91,NA,6.7,431,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Trop c'est trop",1975,95,NA,5.7,55,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Trop de bonheur",1994,85,NA,5.9,22,4.5,4.5,0,0,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Trop petit prince, Le",2002,7,NA,6.7,8,0,0,0,0,0,34.5,45.5,14.5,0,0,"",0,1,0,0,0,0,1 -"Trop tot, trop tard",1982,100,NA,4.3,14,4.5,0,24.5,4.5,0,4.5,0,0,14.5,44.5,"",0,0,0,0,0,0,0 -"Tropic Zone",1953,94,NA,2.7,30,24.5,14.5,14.5,14.5,14.5,14.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Tropic of Cancer",1970,87,NA,6,73,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tropical Heat",1993,86,NA,4.4,49,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tropical Rainforest",1992,40,NA,4.8,30,4.5,0,4.5,14.5,14.5,24.5,34.5,14.5,0,4.5,"",0,0,0,0,1,0,1 -"Troppo per vivere... poco per morire",1967,118,NA,5.1,6,14.5,0,0,14.5,0,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Troppo rischio per un uomo solo",1973,110,NA,4,5,0,44.5,0,44.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Trost i taklampa",1955,81,NA,5,5,0,0,0,24.5,24.5,0,0,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Trots",1952,95,NA,6.1,5,0,0,24.5,0,24.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Trotsky",1993,98,1500000,4.3,8,14.5,14.5,24.5,14.5,0,14.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Trottie True",1949,91,NA,5.9,22,4.5,0,0,4.5,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Trou normand, Le",1952,80,NA,5.8,29,0,0,4.5,0,14.5,34.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Trou, Le",1960,109,NA,7.1,1110,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Trouble",1996,102,NA,6,5,0,0,0,44.5,0,0,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Trouble",2005,98,NA,6.5,26,4.5,4.5,14.5,0,0,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Trouble Along the Way",1953,110,NA,6.1,201,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Trouble Bound",1993,90,NA,5.1,174,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Trouble Brewing",1939,87,NA,5.6,13,24.5,0,0,0,4.5,0,34.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Trouble Every Day",2001,102,NA,5.6,769,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Trouble Maker",1990,75,NA,7.9,5,0,0,0,24.5,24.5,0,0,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Trouble Makers",1948,66,NA,7,15,0,0,4.5,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Trouble Man",1972,99,NA,4.8,42,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Trouble for Two",1936,75,NA,6.7,38,0,0,0,0,14.5,24.5,44.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Trouble in Mind",1985,111,NA,6.1,274,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Trouble in Paradise",1932,83,519706,8.1,1304,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Trouble in Paradise",1989,100,NA,5,52,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Trouble in Store",1953,85,NA,5.8,96,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Trouble in Sundown",1939,60,NA,6.3,11,0,0,0,4.5,14.5,34.5,24.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Trouble in Texas",1937,63,NA,4.5,7,0,14.5,0,14.5,45.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Trouble in the Air",1948,55,NA,5.1,6,0,0,0,14.5,45.5,14.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Trouble in the Glen",1953,91,NA,4.9,35,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Trouble on the Corner",1997,114,NA,3.8,45,14.5,24.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Trouble with Angels, The",1966,112,NA,7.2,597,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"PG",0,0,1,0,0,0,0 -"Trouble with Dick, The",1987,86,NA,4.8,22,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Trouble with Girls, The",1969,97,NA,4.9,167,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Trouble with Harry, The",1955,99,1200000,7.3,3674,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Trouble with Lou, The",2001,85,90000,6,13,0,0,4.5,14.5,0,4.5,0,14.5,14.5,34.5,"",0,0,1,0,0,1,0 -"Trouble with Men and Women, The",2003,80,NA,3.3,5,0,0,44.5,0,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Trouble with Perpetual Deja-Vu, The",1999,90,NA,5.3,14,14.5,0,0,14.5,4.5,0,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Trouble with Spies, The",1987,91,NA,3.4,51,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Troublemaker, The",1964,80,NA,5.4,18,0,4.5,0,14.5,0,14.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Troublesome Creek: A Midwestern",1995,88,NA,7.3,103,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Trovatore, Il",1949,102,NA,5.4,15,0,0,0,0,4.5,4.5,0,4.5,0,84.5,"",0,0,0,0,0,0,0 -"Troy",2004,162,185000000,7.1,33979,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",1,0,0,1,0,1,0 -"Truant Officer Donald",1941,8,NA,8.1,49,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Trubel um Trixie",1972,89,NA,2.7,10,24.5,45.5,0,14.5,0,14.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Truce Hurts, The",1948,8,NA,7.2,34,0,0,0,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Truce, The",2001,9,10000,7.8,6,14.5,0,0,0,0,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Trucido e lo sbirro, Il",1976,90,NA,5.4,28,0,0,0,4.5,4.5,24.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Truck Farmer, The",1954,11,NA,1.6,22,64.5,14.5,24.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Truck Stop Women",1974,82,NA,4.7,33,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Truck Turner",1974,91,NA,6.3,229,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"True",1999,3,1000,7.3,32,4.5,4.5,4.5,0,4.5,4.5,4.5,34.5,4.5,24.5,"",0,0,0,0,0,0,1 -"True",2004,10,NA,7.6,112,4.5,4.5,4.5,4.5,0,0,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,1 -"True Believer",1989,105,NA,6.5,712,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"True Blood",1989,100,NA,4.6,50,4.5,4.5,4.5,24.5,24.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"True Blue",1996,118,NA,6.3,73,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"True Blue",2001,97,NA,5.2,185,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"True Colors",1991,111,NA,6.1,991,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"True Confession",1937,85,NA,5.6,30,4.5,0,0,4.5,24.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"True Confessions",1981,110,NA,6.3,938,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"True Confessions of Tori Welles",1989,76,NA,7.3,8,0,0,0,0,24.5,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"True Confessions of a Sushi Addict",1999,14,NA,6,17,0,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,1 -"True Crime",1996,94,NA,5.1,492,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"True Crime",1999,127,NA,6.3,5116,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"True Friends",1998,103,NA,4.7,60,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"True Game of Death, The",1981,81,NA,1.9,8,24.5,24.5,0,14.5,14.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"True Glory, The",1945,87,NA,8.3,18,0,0,0,0,0,14.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"True Grit",1969,128,NA,7.2,3091,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"True Heart",1997,92,NA,4.6,129,4.5,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"PG",0,0,0,1,0,0,0 -"True Identity",1991,93,NA,5.2,219,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"True Lies",1994,141,100000000,7,31011,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,1,0,0,1,0 -"True Love and Chaos",1997,97,NA,5,99,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"True Meaning of Pictures: Shelby Lee Adams' Appalachia, The",2002,75,NA,7.8,30,0,4.5,0,0,0,4.5,34.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"True Rights",2000,101,NA,5.1,22,4.5,4.5,4.5,0,4.5,4.5,0,0,14.5,44.5,"",0,0,0,1,0,0,0 -"True Romance",1993,121,12500000,7.7,25896,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,1,0 -"True Stories",1986,90,NA,6.3,987,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"True Story of Eskimo Nell, The",1975,103,NA,2.9,6,14.5,45.5,0,0,0,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"True Story of Glory Continues, The",1991,46,NA,3.9,38,45.5,4.5,0,0,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"True Story of Jesse James, The",1957,92,NA,6.1,74,4.5,0,0,4.5,14.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"True Vinyl",2000,89,NA,3.1,32,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,0,24.5,"PG-13",0,0,0,1,0,1,0 -"True as a Turtle",1956,96,NA,5.1,20,0,4.5,4.5,14.5,4.5,44.5,4.5,24.5,0,0,"",0,0,1,0,0,0,0 -"True to Life",1943,94,NA,6.3,7,0,0,0,0,0,24.5,0,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"True to the Navy",1930,71,NA,6.8,16,0,0,0,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Truffes, Les",1995,85,NA,4.3,23,14.5,4.5,14.5,14.5,14.5,14.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Truhanes",1983,96,NA,6,14,0,0,4.5,0,24.5,14.5,14.5,4.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Truite, La",1982,103,NA,7,64,4.5,0,4.5,4.5,0,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Truly Madly Deeply",1991,106,NA,6.8,1834,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Truman Show, The",1998,103,60000000,7.7,62434,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"PG",0,0,1,1,0,0,0 -"Trumouse Show, The",2003,6,NA,5.4,8,0,0,34.5,0,0,14.5,24.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Trumpet of the Swan, The",2001,75,NA,4.3,90,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Trunk to Cairo",1966,103,NA,7.2,11,0,0,4.5,4.5,14.5,4.5,0,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Trust",1990,107,NA,7.4,1953,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Trust Me",1989,104,NA,5.8,30,4.5,0,14.5,14.5,4.5,24.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Trust, The",1993,120,NA,2.3,22,14.5,4.5,4.5,24.5,0,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Truth About Cats & Dogs, The",1996,97,NA,6.5,7714,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Truth About Charlie, The",2002,104,NA,4.6,2417,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Truth About Love, The",2004,100,NA,8.3,15,14.5,0,0,0,0,0,4.5,14.5,4.5,64.5,"",0,0,1,0,0,1,0 -"Truth About Mother Goose, The",1957,15,NA,7.6,16,4.5,0,4.5,0,14.5,0,14.5,14.5,4.5,34.5,"",0,1,0,0,1,0,1 -"Truth About Murder, The",1946,63,NA,6.2,22,0,4.5,4.5,0,24.5,34.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Truth About Spring, The",1964,102,NA,6.7,126,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,1,0 -"Truth About Women, The",1958,107,NA,5.5,6,0,0,0,0,34.5,34.5,0,0,14.5,14.5,"",0,0,1,1,0,0,0 -"Truth About Youth, The",1930,67,NA,5.8,26,0,14.5,0,14.5,14.5,14.5,24.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Truth About the Head, The",2003,12,NA,6,6,0,0,14.5,14.5,0,45.5,0,14.5,0,0,"",0,0,1,0,0,0,1 -"Truth or Consequences, N.M.",1997,106,NA,6.1,1174,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,1,1,0,1,0 -"Truth or Dare",1999,11,NA,4.4,22,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Truth or Dare? - A Critical Madness",1986,90,200000,4.7,85,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Try",2000,15,NA,8.2,54,0,0,0,0,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Try Seventeen",2002,96,NA,6.1,1373,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Tryasina",1978,132,NA,6.5,11,0,0,0,0,14.5,4.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Tryggare kan ingen vara...",1993,94,NA,5.3,7,0,0,24.5,0,14.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Trygon Factor, The",1966,88,NA,5.4,35,4.5,0,4.5,14.5,4.5,24.5,14.5,14.5,0,4.5,"",0,0,1,1,0,0,0 -"Trys dienos",1991,75,NA,6.9,31,4.5,0,0,0,4.5,4.5,34.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Tryst",1994,101,NA,2.8,46,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Trysting",2001,10,NA,5,12,0,4.5,0,4.5,0,4.5,44.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Trzeba zabic te milosc",1972,92,NA,6.3,9,0,0,0,24.5,24.5,14.5,0,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Trzeci",2004,95,NA,8,8,0,0,0,0,14.5,0,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Trzecia czesc nocy",1971,105,NA,7,29,0,4.5,4.5,4.5,0,14.5,4.5,24.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Trzy kolory: Bialy",1994,91,NA,7.6,6225,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Tsahal",1994,316,NA,4,18,24.5,0,0,4.5,4.5,14.5,0,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Tsakalia, Ta",1981,103,NA,4.9,27,4.5,14.5,0,0,14.5,4.5,14.5,4.5,0,45.5,"",1,0,0,1,0,0,0 -"Tsar i general",1966,76,NA,8.7,7,0,0,0,14.5,0,0,0,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Tsareubiytsa",1991,104,NA,6.9,45,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Tsarskaya okhota",1990,134,NA,4.6,9,0,0,0,24.5,0,14.5,14.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Tsatsiki, morsan och polisen",1999,91,NA,6.6,362,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Tschetan, der Indianerjunge",1973,90,NA,5.9,14,0,0,4.5,0,14.5,24.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Tsigoineruwaizen",1980,144,NA,8.8,31,0,0,4.5,0,0,4.5,14.5,4.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Tsikatriz",1996,87,NA,5.6,7,14.5,24.5,0,0,0,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Tsirk",1936,89,NA,7.9,28,0,0,0,0,0,14.5,4.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Tsirk sgorel i klouny razbezhalis",1998,114,NA,6.2,6,0,0,0,0,14.5,0,0,64.5,0,14.5,"",0,0,0,1,0,0,0 -"Tsisperi mtebi anu arachveulebrivi ambavi",1984,97,NA,9.2,26,0,0,0,0,0,0,4.5,0,34.5,64.5,"",0,0,1,0,0,0,0 -"Tsuki no sabaku",2001,131,NA,6.3,42,4.5,4.5,0,4.5,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tsuki to kyabetsu",1996,100,NA,4.2,6,0,0,14.5,14.5,34.5,0,0,34.5,0,0,"",0,0,0,0,0,0,0 -"Tsuki wa dotchi ni dete iru",1993,109,NA,7.7,9,0,0,0,0,0,24.5,0,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tsuma wa kokuhaku suru",1961,91,NA,6.2,14,0,4.5,0,4.5,4.5,14.5,0,4.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Tsuma yo bara no yo ni",1935,74,NA,7.9,15,0,0,0,4.5,4.5,0,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Tsumetai chi",1997,109,NA,6,5,24.5,0,0,24.5,0,0,0,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Tsuribaka nisshi",1988,93,NA,5.9,9,0,0,0,0,24.5,0,34.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Tsuru",1988,93,NA,5.6,6,0,0,0,0,14.5,14.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Tsuzurikata kyoshitsu",1938,87,NA,7.1,8,14.5,0,0,14.5,0,0,14.5,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Tsvety kalenduly",1998,120,NA,6.3,9,14.5,0,0,14.5,0,0,0,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Tteni",1979,19,NA,9,7,0,0,0,0,0,0,14.5,14.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Tu",2003,90,NA,7.2,81,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Tu la conosci Claudia?",2004,98,NA,6.3,96,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Tu mi turbi",1983,96,NA,6.6,27,0,0,0,0,4.5,24.5,44.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Tu ne tueras point",1961,148,NA,5,7,0,0,0,0,24.5,0,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Tu pa tam",2004,92,NA,5.9,67,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",1,0,1,0,0,0,0 -"Tu ran fa cai",2004,115,NA,5.7,9,24.5,0,0,0,14.5,14.5,34.5,14.5,14.5,0,"",0,0,1,1,0,0,0 -"Tu ridi",1998,104,NA,6.4,107,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tua lingua sul mio cuore, La",1999,4,NA,6.3,16,24.5,4.5,0,0,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Tuareg - Il guerriero del deserto",1984,97,NA,5.5,98,4.5,4.5,4.5,4.5,64.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Tuba Girl",1999,29,NA,4.5,12,0,4.5,0,4.5,0,0,44.5,14.5,0,24.5,"",0,0,1,1,0,0,1 -"Tubby the Tuba",1947,10,NA,8.1,31,0,0,0,4.5,4.5,0,4.5,24.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Tube",2003,113,NA,5.2,283,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Tube, Le",2001,81,NA,6.5,7,0,0,0,14.5,14.5,24.5,14.5,0,24.5,0,"",0,0,0,0,1,0,0 -"Tuck Everlasting",1981,90,NA,6.5,100,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tuck Everlasting",2002,96,15000000,6.5,2055,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,0,1,0,1,0 -"Tucker: The Man and His Dream",1988,110,25000000,6.8,2944,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Tudo Bem",1978,110,NA,6.1,21,14.5,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Tudor Rose",1936,78,NA,6.7,15,0,0,4.5,4.5,4.5,24.5,4.5,0,24.5,34.5,"",0,0,0,1,0,0,0 -"Tuesday",2001,13,NA,6.7,11,4.5,0,0,0,0,24.5,14.5,0,4.5,34.5,"",0,1,0,0,0,0,1 -"Tuesday Morning Ride",1995,35,NA,5.5,8,0,0,0,0,14.5,14.5,24.5,14.5,0,34.5,"",0,0,0,1,0,0,1 -"Tueur, Le",1972,87,NA,4.5,29,4.5,4.5,14.5,24.5,24.5,0,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Tueurs de petits poissons",1998,15,NA,6.4,8,0,0,0,24.5,14.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Tuff Turf",1985,112,NA,5,348,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Tuffo, Il",1993,90,NA,6.5,19,0,0,4.5,0,4.5,14.5,34.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Tuftsablanca",1999,50,NA,3.2,10,14.5,14.5,24.5,0,14.5,14.5,0,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Tugboat Annie",1933,86,NA,6.6,66,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Tugboat Annie Sails Again",1940,77,NA,3.9,32,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Tugboat Granny",1956,7,NA,6.5,24,0,0,0,4.5,0,34.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Tugboat Mickey",1940,7,NA,6.8,52,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Tugumi",1990,105,NA,6.4,16,4.5,4.5,0,0,4.5,14.5,24.5,0,34.5,4.5,"",0,0,0,1,0,0,0 -"Tuhlaajapoika",1992,97,NA,6.8,75,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Tuhog",2001,105,NA,7.6,7,0,0,14.5,0,14.5,0,14.5,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Tui shou",1992,105,400000,7.1,317,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Tukabseu",1993,110,NA,5.7,84,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Tukkijoella",1951,93,NA,7.2,5,0,0,0,0,0,44.5,0,64.5,0,0,"",0,0,0,0,0,0,0 -"Tukuma",1984,100,NA,6.2,11,0,0,4.5,4.5,0,44.5,4.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Tule tagasi, Lumumba",1992,78,NA,8.2,6,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Tulip",1998,15,NA,8.4,51,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Tulipany",2004,92,NA,7,8,14.5,0,0,0,0,14.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Tulipe noire, La",1964,115,NA,6.6,225,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,34.5,"",1,0,1,0,0,0,0 -"Tulips",1981,93,NA,2.9,10,34.5,0,24.5,0,14.5,14.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Tulips Shall Grow",1942,7,NA,7.8,19,0,14.5,4.5,0,0,0,14.5,4.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Tulitikkuja lainaamassa",1938,77,NA,7.1,13,0,0,0,4.5,0,14.5,24.5,45.5,0,0,"",0,0,1,0,0,0,0 -"Tulivesi",1994,94,NA,5.2,32,4.5,0,4.5,0,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Tully",2000,102,NA,7.5,630,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Tulsa",1949,90,NA,6,105,4.5,4.5,0,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Tulse Luper Suitcases, Part 1: The Moab Story, The",2003,127,10000000,6.6,211,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Tulse Luper Suitcases, Part 2: Vaux to the Sea, The",2004,108,NA,8,44,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Tulse Luper Suitcases, Part 3: From Sark to the Finish, The",2003,105,NA,8,45,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tum: A Dangerous Obsession",2004,150,NA,5.4,5,0,0,64.5,0,0,0,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Tumannost Andromedy",1967,77,NA,8.7,7,0,0,0,0,14.5,0,0,24.5,0,45.5,"",0,0,0,0,0,1,0 -"Tumba de los muertos vivientes, La",1983,82,NA,2.3,176,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tumbas, Las",1991,90,NA,4.7,11,4.5,0,4.5,4.5,14.5,4.5,14.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Tumble",1991,4,NA,5.3,5,24.5,0,24.5,24.5,0,0,0,44.5,0,0,"",0,0,0,0,0,0,1 -"Tumbled",1999,5,NA,6.5,12,0,0,4.5,4.5,4.5,0,14.5,14.5,44.5,0,"",0,0,1,0,0,0,1 -"Tumbleweed",1953,79,NA,6.6,40,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tumbleweed Trail",1946,57,NA,6.5,8,0,24.5,0,14.5,14.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Tumbleweeds",1925,82,312000,6.9,58,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tumbleweeds",1999,102,312000,6.9,1146,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Tumbling Tumbleweeds",1935,61,12500,8.2,11,4.5,0,0,0,4.5,0,4.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Tumko Na Bhool Paayenge",2002,160,NA,6,34,14.5,0,0,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Tummy Trouble",1989,7,NA,7.1,235,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Tumult",1969,90,NA,4.3,8,0,24.5,24.5,24.5,0,14.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Tumultes",1990,91,NA,7,7,0,0,0,24.5,14.5,0,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Tune in Tomorrow...",1990,107,NA,6.1,426,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Tune, The",1992,69,NA,7.1,132,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Tunes of Glory",1960,106,NA,7.6,612,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Tung gui mat yau",2001,102,NA,6.6,74,4.5,0,4.5,0,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Tunguska - Die Kisten sind da",1984,71,NA,8.1,7,24.5,0,0,0,0,0,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Tunisian Victory",1944,75,NA,8.2,22,4.5,0,4.5,0,0,0,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Tunnel",2000,94,NA,3,82,24.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Tunnel Vision",1976,95,250000,4.8,166,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tunnel Vision",1995,100,NA,4.6,62,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Tunnel Workers, The",1906,9,NA,3.8,5,24.5,0,0,24.5,24.5,24.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Tunnel of Love",1997,12,NA,4.1,22,14.5,0,24.5,4.5,14.5,14.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Tunnel of Love, The",1958,98,NA,5.9,112,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tunnel, Der",1933,72,NA,7.4,5,0,0,0,0,0,44.5,0,44.5,24.5,0,"",0,0,0,0,0,0,0 -"Tunnel, Der",2001,188,7100000,8.2,446,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Tunnel, Le",1933,72,NA,4.9,10,0,0,14.5,14.5,44.5,0,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Tunnel, The",1935,94,NA,5.8,38,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Tunnel, The",2001,35,NA,5.7,44,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Tuno negro",2001,98,NA,5,255,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Tuntematon sotilas",1955,121,NA,7.8,1287,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Tuntematon sotilas",1985,228,NA,7.5,424,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Tup-akka-lakko",1980,105,NA,4.4,76,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tupac Amaru",1984,95,NA,6.9,8,24.5,0,0,0,0,14.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Tupac Shakur: Before I Wake...",2001,100,NA,4.9,50,24.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Tupac Shakur: Thug Angel",2002,92,NA,7.4,107,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Tupac: Resurrection",2003,90,NA,7.3,773,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,0,1,0,0 -"Tupamaros",1997,95,NA,6.9,8,24.5,0,0,0,0,0,0,24.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Tupla-Uuno",1988,101,NA,4.5,110,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Tuppen",1981,94,NA,6,135,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Tupperware!",2004,63,NA,9.7,5,0,0,44.5,0,0,0,0,0,24.5,44.5,"",0,0,0,1,1,0,0 -"Tur & retur",2003,89,NA,6.4,48,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Turandot Project, The",2000,87,NA,7.3,42,0,0,0,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Turbo: A Power Rangers Movie",1997,99,NA,2.1,1296,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG",1,0,0,0,0,0,0 -"Turbulence des fluides, La",2002,115,NA,7,337,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Turco napoletano, Un",1953,92,NA,6,37,4.5,4.5,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ture Sventon - Privatdetektiv",1972,105,NA,5.2,16,0,4.5,0,24.5,14.5,34.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Turetskii gambit",2005,130,4000000,6.9,247,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Turismo es un gran invento, El",1968,92,NA,4.6,26,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Turistas quieren guerra, Los",1977,85,NA,7.4,5,0,0,24.5,0,0,24.5,0,24.5,0,44.5,"",0,0,1,0,0,0,0 -"Turk 182!",1985,102,NA,5.4,940,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Turkey Shoot",1981,80,3200000,4.2,167,24.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Turkey. Cake.",1999,22,NA,5.3,17,14.5,0,14.5,0,14.5,14.5,4.5,0,14.5,24.5,"",0,0,1,0,0,0,1 -"Turks fruit",1973,112,NA,6.8,1218,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Turksib",1929,57,NA,7.1,19,0,0,0,0,0,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Turlupins, Les",1980,95,NA,3.9,19,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Turm der verbotenen Liebe, Der",1968,89,NA,4.7,18,24.5,14.5,4.5,14.5,14.5,24.5,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Turn Back the Clock",1933,79,NA,6.2,53,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Turn It Up",2000,86,9000000,4.3,129,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Turn of Faith",2001,96,NA,4.6,26,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Turn of the Screw, The",1994,95,NA,4.9,123,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Turn of the Tide",1935,80,NA,8.4,7,0,0,0,0,14.5,0,0,24.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Turn the Key Softly",1953,81,NA,5.8,15,0,0,0,14.5,14.5,4.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Turn-Tale Wolf, The",1952,7,NA,6.9,15,0,0,0,4.5,4.5,4.5,44.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Turnabout",1940,83,NA,5.8,28,4.5,0,0,4.5,4.5,34.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Turnabout: The Story of the Yale Puppeteers",1993,60,NA,8.6,5,0,0,0,0,0,0,0,64.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Turnaround",1987,90,NA,4.6,27,34.5,0,4.5,14.5,14.5,0,0,0,0,34.5,"",1,0,0,0,0,0,0 -"Turnaround, The",1994,90,NA,9,8,0,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Turned Out Nice Again",1941,81,NA,2.8,14,24.5,0,0,0,24.5,14.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Turner & Hooch",1989,97,NA,5.5,6665,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Turning April",1996,101,NA,3.2,15,0,4.5,0,0,14.5,14.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Turning Paige",2001,109,1000000,6.9,95,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Turning Point, The",1952,85,NA,6.6,82,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Turning Point, The",1977,119,NA,6.8,489,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Turning, The",1997,91,NA,3.1,204,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Turnpike",1996,5,NA,7.2,38,4.5,0,4.5,4.5,0,0,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Turntables",2000,35,NA,8.5,12,4.5,0,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,1 -"Turtle Beach",1992,90,NA,4.6,69,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Turtle Diary",1985,96,NA,6.8,235,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Tus ojos brillaban",2004,100,NA,2,13,74.5,0,0,4.5,4.5,0,4.5,0,0,0,"",0,0,1,0,0,0,0 -"Tusalava",1929,9,NA,8.2,8,0,0,0,0,0,24.5,0,0,45.5,24.5,"",0,1,0,0,0,0,1 -"Tusk",1980,119,1500000,5,25,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Tusks",1990,100,NA,3.2,13,34.5,4.5,0,4.5,4.5,4.5,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Tussentijd, De",1993,100,NA,4.9,10,0,14.5,14.5,0,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tusuk jelangkung",2003,103,NA,4.2,24,14.5,14.5,4.5,4.5,14.5,0,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Tut mir leid wegen gestern",1997,87,NA,3.3,16,14.5,14.5,4.5,14.5,34.5,0,0,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Tutajosok",1989,131,NA,6.3,15,0,0,0,0,4.5,4.5,0,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Tutta colpa del paradiso",1985,102,NA,6,65,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Tutta la conoscenza del mondo",2001,99,NA,5.6,47,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Tutta una vita",1992,93,NA,6.1,13,0,0,0,4.5,4.5,44.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Tutti a casa",1960,120,NA,6.7,72,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Tutti defunti... tranne i morti",1977,105,NA,5.6,21,0,0,4.5,4.5,4.5,4.5,44.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Tutti gli anni una volta l'anno",1995,88,NA,6.7,6,0,0,0,0,0,45.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Tutti gli uomini di Sara",1992,90,NA,5,5,0,0,0,0,24.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Tutti i colori del buio",1972,88,NA,6.1,93,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Tutti per uno... botte per tutti",1973,87,NA,2.6,5,0,24.5,24.5,0,44.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Tuttles of Tahiti, The",1942,90,NA,6,26,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Tutto Benigni",1983,90,NA,8.4,25,0,0,0,4.5,4.5,0,4.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Tutto a posto e niente in ordine",1974,105,NA,5.5,20,0,24.5,0,4.5,24.5,24.5,14.5,14.5,14.5,0,"",0,0,1,1,0,0,0 -"Tuvalu",1999,107,NA,7.2,654,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Tuxedo",1995,11,NA,3.8,9,0,0,24.5,34.5,0,14.5,14.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Tuxedo Warrior",1982,93,NA,1.8,10,74.5,24.5,0,0,14.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Tuxedo, The",2002,98,60000000,5.1,6070,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Tvilling",2003,91,NA,3.9,41,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Twee vorstinnen en een vorst",1981,102,NA,5.3,27,0,0,0,14.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Twee vrouwen",1979,110,NA,4.6,30,4.5,0,4.5,24.5,0,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Tweeling, De",2002,135,NA,8,1073,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"R",0,0,0,1,0,1,0 -"Tweet Dreams",1959,7,NA,6.8,19,0,0,0,4.5,14.5,24.5,44.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Tweet Tweet Tweety",1951,7,NA,6.7,41,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Tweet Zoo",1957,7,NA,6.7,29,0,0,0,4.5,14.5,4.5,45.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Tweet and Lovely",1959,6,NA,7,28,0,0,0,0,4.5,24.5,45.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Tweet and Sour",1956,7,NA,7.2,28,0,0,0,0,4.5,34.5,14.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Tweetie Pie",1947,7,NA,7.6,67,0,0,4.5,0,4.5,4.5,44.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Tweety and the Beanstalk",1957,6,NA,7.3,42,0,0,0,4.5,4.5,4.5,44.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Tweety's Circus",1955,8,NA,7.2,28,0,0,0,4.5,4.5,4.5,44.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Tweety's S.O.S.",1951,7,NA,6.9,74,0,0,4.5,4.5,4.5,14.5,44.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Twelfth Night",1910,12,NA,5.6,16,4.5,0,0,0,34.5,34.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Twelfth Night",1987,117,NA,6.4,25,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Twelfth Night: Or What You Will",1996,134,NA,7.1,1332,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"PG",0,0,1,1,0,1,0 -"Twelve",2001,83,NA,7.9,14,14.5,0,4.5,0,0,0,4.5,4.5,0,64.5,"",0,0,0,0,0,0,0 -"Twelve Chairs, The",1970,94,NA,6.6,524,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Twelve Crowded Hours",1939,64,NA,6.5,11,0,0,0,4.5,0,34.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Twelve Deadly Cyns... and Then Some",1994,75,NA,8.5,29,0,0,0,0,0,0,14.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Twelve Hours to Kill",1960,83,NA,7.5,6,0,0,14.5,0,14.5,0,14.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Twelve Miles Out",1927,85,NA,7.8,10,0,0,0,0,0,34.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Twelve Monkeys",1995,129,29000000,7.9,62301,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Twelve Months",1984,65,NA,9.4,8,0,0,0,0,0,0,14.5,14.5,0,74.5,"",0,1,0,0,0,0,0 -"Twelve O'Clock High",1949,132,NA,7.7,2024,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Twelve Steps Outside",2002,88,25000,8.3,7,0,0,0,0,14.5,0,24.5,0,14.5,44.5,"",0,0,1,0,0,0,0 -"Twentieth Century",1934,91,NA,8,446,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Twenty Bucks",1993,92,NA,6.2,989,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Twenty Million Sweethearts",1934,89,NA,6.8,49,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Twenty Minutes of Immortality",2004,5,NA,6,7,14.5,0,0,0,14.5,24.5,14.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Twenty Minutes of Love",1914,10,NA,6,30,0,0,14.5,4.5,14.5,24.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,1 -"Twenty Plus Two",1961,102,NA,6.4,8,0,0,0,0,24.5,14.5,14.5,14.5,34.5,0,"",0,0,0,0,0,0,0 -"Twenty-Four Hours to Kill",1965,88,NA,5.3,23,0,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Twenty-One",1991,92,NA,5,168,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Twentynine Palms",2003,119,NA,5.4,350,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Twice Blessed",1945,76,NA,6.4,18,0,4.5,0,0,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Twice Dead",1988,85,NA,3.9,42,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Twice Round the Daffodils",1962,89,NA,5,48,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Twice Today",2001,80,40000,8.2,5,0,0,0,0,24.5,0,24.5,0,24.5,44.5,"",0,0,0,1,0,0,0 -"Twice Two",1933,20,NA,7,100,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Twice Under",1987,85,NA,3.9,12,34.5,0,4.5,24.5,14.5,4.5,0,4.5,0,0,"",1,0,0,0,0,0,0 -"Twice Upon a Time",1953,75,NA,7.6,11,4.5,0,0,0,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Twice Upon a Time",1983,75,NA,7.2,241,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,0,0,0,0,0 -"Twice a Man",1964,49,NA,6.6,6,0,0,14.5,0,0,0,34.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Twice in a Lifetime",1985,111,NA,6.3,215,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Twice-Told Tales",1963,120,NA,6.7,200,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Twilight",1998,94,NA,6.1,2220,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Twilight People, The",1973,84,150000,3.1,43,24.5,14.5,14.5,14.5,14.5,0,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Twilight Time",1982,102,NA,5.4,19,4.5,4.5,14.5,0,14.5,14.5,34.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Twilight Zone: The Movie",1983,120,10000000,6,4458,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Twilight for the Gods",1958,120,NA,5.4,44,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Twilight in the Sierras",1950,67,NA,7,10,0,0,0,0,0,44.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Twilight of Honor",1963,104,NA,5.9,51,0,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Twilight of the Dark Master",1997,50,NA,4.6,62,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Twilight of the Gods",1995,15,NA,7.8,27,0,0,0,0,0,4.5,24.5,14.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Twilight of the Ice Nymphs",1997,91,NA,5.6,189,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Twilight on the Rio Grande",1947,71,NA,5.5,8,14.5,14.5,0,14.5,0,14.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Twilight on the Trail",1941,57,NA,7.1,18,0,0,4.5,4.5,14.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Twilight's Last Gleaming",1977,146,6200000,6.6,313,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Twilight: Los Angeles",2000,76,NA,7.8,21,0,4.5,0,0,4.5,0,4.5,14.5,4.5,45.5,"",0,0,0,1,1,0,0 -"Twin Beds",1942,85,NA,5.3,9,0,0,0,14.5,74.5,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Twin Dragon Encounter",1986,79,NA,2.6,11,45.5,0,0,0,14.5,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Twin Falls Idaho",1999,111,500000,7.1,1547,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Twin Husbands",1946,18,NA,6,27,0,0,14.5,0,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Twin Peaks: Fire Walk with Me",1992,135,10000000,6.5,6927,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Twin Sitters",1994,93,NA,3.4,153,24.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Twin Towers",2003,34,NA,8.1,39,4.5,0,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Twin Town",1997,99,3300000,6.1,1172,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Twinkle in God's Eye, The",1955,73,NA,5.4,6,14.5,0,0,14.5,0,45.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Twinkle, Twinkle, Little Pink",1968,6,NA,6,9,0,0,0,0,0,45.5,0,14.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Twinky",1969,98,NA,4.9,111,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Twinni",2003,89,NA,8.6,13,0,0,4.5,0,0,14.5,0,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Twins",1988,105,15000000,5.9,13213,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Twins of Evil",1971,87,NA,6.1,363,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Twisker Pitcher, The",1937,7,NA,6.7,14,0,4.5,4.5,0,0,24.5,4.5,24.5,24.5,4.5,"",0,1,1,0,0,0,1 -"Twist",1992,74,NA,6.9,32,4.5,0,0,0,0,14.5,24.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Twist",2003,97,350000,6,197,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Twist Around the Clock",1961,86,NA,4.4,31,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Twist Craze",1961,10,NA,5,6,0,0,0,0,64.5,0,0,0,0,34.5,"",0,0,0,0,1,0,1 -"Twist of Sand, A",1968,90,NA,5.2,13,0,0,0,14.5,24.5,4.5,14.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Twisted",1986,85,NA,3.9,46,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Twisted",1991,86,NA,5.8,11,0,0,0,0,24.5,0,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Twisted",1996,100,NA,5.6,36,14.5,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Twisted Brain",1974,85,NA,3.2,79,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Twisted Fate",1994,90,NA,1.7,9,45.5,14.5,0,0,0,0,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Twisted Justice",1990,90,NA,2.6,37,24.5,14.5,24.5,14.5,4.5,4.5,0,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Twisted Love",1995,85,NA,2.9,49,24.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Twisted Nerve",1968,118,NA,5.3,46,4.5,0,4.5,14.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Twisted Nightmare",1987,91,NA,4.2,32,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Twisted Sheets",1996,14,NA,5.5,9,0,0,0,0,44.5,0,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Twisted Tales",1994,90,NA,3.7,12,34.5,0,0,0,4.5,4.5,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Twister",1990,93,NA,5.1,431,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Twister",1996,113,92000000,5.9,28315,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Twitch and Shout",1993,59,NA,7.1,8,0,0,0,0,0,0,34.5,0,24.5,34.5,"",0,0,0,0,1,0,0 -"Two Against the World",1932,70,NA,5.6,19,4.5,0,0,14.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Two Against the World",1936,64,NA,5.4,35,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Two Alone",1934,75,NA,5.6,10,0,0,0,14.5,24.5,24.5,14.5,14.5,34.5,0,"",0,0,0,1,0,0,0 -"Two Arabian Knights",1927,93,NA,7.1,51,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Two Bits",1995,85,NA,5.9,497,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Two Bits & Pepper",1995,89,NA,1.8,26,24.5,4.5,4.5,14.5,4.5,14.5,4.5,0,14.5,14.5,"PG",0,0,1,0,0,0,0 -"Two Boneheads",1993,27,NA,6.3,7,14.5,0,24.5,0,0,0,14.5,0,0,44.5,"",0,0,0,0,0,0,1 -"Two Boobs in a Balloon",1935,10,NA,6.2,5,0,0,0,24.5,0,0,44.5,0,24.5,24.5,"",0,0,1,0,0,0,1 -"Two Brothers",2000,90,NA,6.6,26,4.5,0,0,0,4.5,14.5,34.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Two Brothers",2004,109,NA,6.9,1614,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Two Brothers Running",1988,87,NA,4.7,5,0,0,0,64.5,0,0,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Two Brothers, a Girl and a Gun",1993,93,NA,6.6,9,14.5,0,0,14.5,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Two Can Play That Game",2001,93,6000000,5.8,843,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Two Cars, One Night",2003,12,NA,7.5,92,0,0,0,0,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,1 -"Two Chips and a Miss",1952,7,NA,6.6,41,0,0,0,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Two Coyotes",2000,90,NA,3,21,14.5,4.5,0,4.5,4.5,4.5,0,0,14.5,44.5,"R",0,0,0,1,0,0,0 -"Two Days",2003,90,NA,6.7,167,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Two Days with Juliet",2004,104,NA,9.6,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,0,1,0,1,0 -"Two Days, Nine Lives",2000,94,NA,4.5,24,45.5,0,4.5,0,0,0,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Two Deaths",1995,99,NA,6.8,145,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Two Degrees",2001,119,NA,4.8,9,34.5,0,14.5,0,0,0,0,0,0,45.5,"",0,0,0,1,0,0,0 -"Two Down and One to Go",1945,32,NA,7.6,12,0,4.5,0,0,4.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Two Faces of Dr. Jekyll, The",1960,88,NA,5.5,80,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Two Family House",2000,109,NA,7.2,417,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Two Fisted",2004,101,NA,9,7,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Two Flags West",1950,92,NA,6.2,30,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Two Gentlemen Sharing",1969,112,NA,4.7,8,14.5,0,14.5,34.5,14.5,0,24.5,0,0,0,"",0,0,0,1,0,1,0 -"Two Girls and a Baby",1998,24,NA,7.9,16,0,4.5,0,4.5,4.5,34.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Two Girls and a Guy",1997,84,1000000,5.6,2014,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"NC-17",0,0,1,1,0,0,0 -"Two Girls and a Sailor",1944,124,NA,6.6,88,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Two Girls on Broadway",1940,73,NA,5.6,36,0,4.5,0,14.5,34.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,1,0 -"Two Gophers from Texas",1948,7,NA,6.6,22,0,4.5,0,0,4.5,14.5,45.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Two Gun Goofy",1952,7,NA,6.8,48,0,4.5,0,4.5,4.5,4.5,44.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Two Gun Man from Harlem",1938,60,NA,5.3,16,0,0,4.5,14.5,14.5,34.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Two Guys from Milwaukee",1946,90,NA,6.4,51,0,0,0,4.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Two Guys from Texas",1948,86,NA,6.5,39,0,4.5,0,24.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Two Handfuls",1988,87,NA,7.5,6,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Two Hands",1999,89,NA,7.2,1660,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Two Hearts in Wax Time",1935,17,NA,5.8,14,4.5,0,0,24.5,4.5,24.5,24.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Two Henrys, The",2000,102,NA,4.1,7,45.5,0,0,0,14.5,0,0,0,0,24.5,"",0,0,0,1,0,1,0 -"Two Idiots in Hollywood",1988,85,NA,5.4,32,4.5,0,4.5,0,0,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Two If by Sea",1996,96,NA,4.9,1516,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Two Jakes, The",1990,138,NA,5.9,1761,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Two Left Feet",1963,93,NA,5.8,13,0,0,0,0,34.5,4.5,4.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Two Little Bears, The",1963,81,NA,4.3,23,4.5,0,14.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Two Little Indians",1953,7,NA,6.2,27,0,0,4.5,4.5,4.5,14.5,44.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Two Living, One Dead",1961,105,NA,7.8,6,0,0,0,14.5,0,14.5,14.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Two Lords",2002,8,2500,9.5,6,0,0,0,0,0,0,0,14.5,14.5,64.5,"",0,0,1,0,0,0,1 -"Two Lost Worlds",1951,61,NA,3.8,18,0,24.5,4.5,24.5,4.5,14.5,0,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Two Loves",1961,96,NA,4.7,37,4.5,0,14.5,14.5,34.5,14.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"Two Men Went to War",2002,109,NA,6.9,142,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,1,0,0,0 -"Two Minutes After Midnight",2003,11,NA,8.7,7,0,0,0,0,0,0,24.5,14.5,45.5,0,"",0,0,1,0,0,0,1 -"Two Moon Junction",1988,104,NA,4.7,892,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Two Mouseketeers, The",1951,8,NA,7.6,66,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Two Mrs. Carrolls, The",1947,99,NA,6.4,318,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Two Much",1995,118,NA,5,1026,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Two Mules for Sister Sara",1970,116,NA,6.8,1957,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Two Ninas",1999,88,NA,6.2,409,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,1,0,0,1,0 -"Two Nudes Bathing",1995,35,NA,8,26,4.5,0,0,4.5,4.5,0,14.5,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Two O'Clock Courage",1945,66,NA,5.8,56,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Two People",1973,100,NA,5.4,30,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Two Rode Together",1961,109,NA,6.6,416,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Two Scent's Worth",1955,7,NA,6.7,34,0,0,0,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Two Seconds",1932,67,NA,6.8,107,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Two Shades of Blue",2000,103,NA,3.6,102,14.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Two Sisters from Boston",1946,112,NA,6.7,63,0,0,0,0,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Two Small Bodies",1993,85,NA,3.4,55,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Two Smart People",1946,93,NA,6.1,29,0,0,0,4.5,34.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Two Soldiers",2003,40,NA,6.8,43,4.5,4.5,4.5,0,14.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Two Story House",2003,14,3000,8,8,14.5,0,0,0,0,0,0,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Two Tars",1928,21,NA,8.1,115,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Two Thousand Maniacs!",1964,87,65000,5,497,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Two Thousand and None",2000,94,NA,5.8,103,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Two Tickets to Broadway",1951,106,NA,5.8,65,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Two Too Young",1936,10,NA,7.6,19,0,0,0,14.5,0,14.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Two Towns of Jasper",2002,90,NA,7.4,50,4.5,0,0,4.5,0,14.5,34.5,24.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Two Way Stretch",1960,78,NA,6.7,238,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Two Weeks Notice",2002,101,60000000,5.8,15010,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Two Weeks Vacation",1952,6,NA,6.9,40,4.5,0,4.5,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Two Weeks in Another Town",1962,107,NA,6.3,206,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Two Weeks to Live",1943,76,NA,6.5,22,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Two Weeks with Love",1950,92,NA,6.2,107,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Two Women",1999,96,NA,6.7,89,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Two Years Before the Mast",1946,98,NA,7,81,4.5,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Two a Penny",1967,98,NA,5.3,8,0,0,0,14.5,14.5,0,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Two and Two Make Six",1962,89,NA,7.4,7,0,0,14.5,14.5,14.5,0,14.5,0,0,44.5,"",0,0,1,0,0,1,0 -"Two for the Road",1967,111,4000000,7.3,1251,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Two for the Seesaw",1962,119,NA,6.3,135,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Two for the Zoo",1941,7,NA,3.5,6,0,64.5,0,14.5,0,14.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Two in the Dark",1936,74,NA,5.9,10,0,0,0,0,34.5,24.5,44.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Two in the Morning",1997,16,NA,5.5,9,0,0,0,0,34.5,24.5,24.5,0,0,24.5,"",0,0,0,1,0,0,1 -"Two of Us, The",1936,76,NA,5,5,0,0,24.5,0,64.5,0,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Two of a Kind",1951,75,NA,7,12,0,4.5,0,0,0,34.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Two of a Kind",1983,88,NA,3.8,567,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Two on a Guillotine",1965,107,NA,5.6,80,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Two to Tango",1988,87,NA,3,7,24.5,24.5,0,24.5,0,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Two's a Crowd",1950,7,NA,7.6,21,0,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Two's a Mob",1998,81,NA,2.8,11,14.5,14.5,24.5,4.5,0,0,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Two-Alarm Fire, The",1934,7,NA,6.2,12,0,0,0,4.5,24.5,14.5,34.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Two-Faced Woman",1941,90,316000,5.9,148,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Two-Fisted Law",1932,64,NA,3.7,38,24.5,4.5,4.5,4.5,34.5,4.5,4.5,14.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Two-Gun Gussie",1918,11,NA,7.2,11,0,0,0,0,0,24.5,45.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Two-Gun Lady",1956,71,NA,4.6,23,0,0,14.5,34.5,24.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Two-Gun Mickey",1934,8,NA,6.2,36,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Two-Headed Spy, The",1958,93,NA,7.1,35,0,0,4.5,4.5,4.5,14.5,24.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Two-Lane Blacktop",1971,105,850000,6.7,773,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Two-Minute Warning",1976,115,NA,5.6,376,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Twogether",1994,120,NA,4,60,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Twonky, The",1953,84,NA,6.5,62,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Ty - mne, ya - tebe",1976,87,NA,6.1,10,0,0,0,0,34.5,34.5,24.5,0,24.5,0,"",0,0,1,0,0,0,0 -"Ty u menya odna",1993,92,NA,3.3,23,24.5,4.5,4.5,0,0,24.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Tycoon",1947,128,NA,5.6,140,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Tydzien z zycia mezczyzny",1999,89,NA,6,67,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Tyfla na'hei o Marlon Brando",1963,73,NA,7.8,20,0,0,0,0,4.5,0,14.5,24.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Tying the Knot",2004,81,NA,8.9,43,4.5,4.5,0,0,4.5,0,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Tykho Moon",1996,102,NA,5.6,128,4.5,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Tylko strach",1993,90,NA,6.4,5,0,0,24.5,0,0,0,44.5,44.5,0,0,"",0,0,0,1,0,0,0 -"Tylko umarly odpowie",1969,88,NA,5.3,6,0,14.5,14.5,0,0,14.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Typ, Der",2003,50,NA,7.7,16,4.5,0,0,0,0,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Type O",2000,6,NA,4.8,8,14.5,0,14.5,14.5,24.5,34.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Typewriter, the Rifle & the Movie Camera, The",1996,55,NA,7.4,89,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Typhon sur Nagasaki",1957,115,NA,5.4,25,0,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Typhoon",1940,70,NA,5.9,13,0,0,4.5,14.5,4.5,14.5,34.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Tyre, The",2000,10,NA,5.4,5,0,0,0,0,44.5,0,44.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Tyrone",1999,92,NA,5.8,12,24.5,0,0,4.5,0,34.5,4.5,0,14.5,4.5,"R",0,0,0,0,0,0,0 -"Tystnaden",1963,96,NA,7.6,1008,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Tyutyun",1962,150,NA,8.6,19,4.5,0,4.5,0,0,0,0,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Tyven, tyven",2002,95,NA,6.9,78,24.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Tza'ad Katan",2003,94,NA,8,12,0,0,0,0,0,0,24.5,34.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Tzanabetis, O",1969,94,NA,8.3,7,0,0,0,0,0,14.5,0,44.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Tzel, Shel Hachiuch Shelchah, Ha-",1998,47,NA,7.3,6,0,0,0,0,0,0,34.5,14.5,34.5,14.5,"",0,0,0,1,0,1,0 -"Tzomet volkan",1999,102,NA,6.3,29,0,4.5,0,4.5,0,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Tzur Hadassim",1999,100,NA,5.7,15,4.5,0,4.5,4.5,0,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"U Pana Boga za piecem",1998,100,NA,7.9,38,0,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"U Turn",1997,125,19000000,6.5,10306,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"U bent mijn moeder",1984,77,NA,7.9,5,0,0,0,0,0,24.5,24.5,44.5,24.5,0,"",0,0,0,0,0,0,0 -"U gori raste zelen bor",1971,94,NA,6.9,29,4.5,0,4.5,0,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"U ime naroda",1987,92,NA,7.7,6,0,0,0,14.5,14.5,0,0,34.5,0,34.5,"",0,0,0,1,0,0,0 -"U raljama zivota",1984,95,NA,6.4,59,4.5,0,4.5,0,4.5,4.5,4.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"U samogo sinyego morya",1936,71,NA,7.7,28,0,0,0,0,0,4.5,24.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"U-571",2000,116,62000000,6.5,15792,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"U-Carmen e-Khayelitsha",2005,120,NA,6.8,25,24.5,0,0,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"U-Turn",1973,99,NA,6.5,20,4.5,0,0,4.5,14.5,0,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"U.F.O.",1993,79,NA,3.2,52,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"U.S. Marshals",1998,131,60000000,6.1,10315,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"U.S. Seals",1999,90,NA,2.4,569,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"U2: PopMart Live From Mexico City",1997,127,NA,5.4,110,4.5,4.5,4.5,0,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"U2: Rattle and Hum",1988,99,NA,7,1714,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"U2: Under a Blood Red Sky",1983,85,NA,6.6,87,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"U2: Unforgettable Fire",1984,30,NA,8.4,44,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,1 -"U2: Wide Awake In Dublin",1985,55,NA,3.8,14,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"UFO Kidnapped",1983,60,NA,5.7,22,4.5,0,4.5,4.5,4.5,0,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"UFO's Are Real",1979,89,NA,4.9,21,4.5,0,4.5,14.5,4.5,0,24.5,4.5,0,34.5,"",0,0,0,0,1,0,0 -"UFO: Target Earth",1974,80,75000,3.5,13,34.5,24.5,0,0,0,14.5,4.5,24.5,0,0,"",0,0,0,0,0,0,0 -"UFOria",1980,93,NA,6.1,111,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"UHF",1989,97,5000000,6.6,6384,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"UM-PA",1933,16,NA,7.6,5,0,0,0,0,24.5,24.5,24.5,44.5,0,0,"",0,0,1,0,0,0,1 -"USS VD: Ship of Shame",1942,46,NA,2.7,26,4.5,4.5,14.5,44.5,4.5,14.5,4.5,0,0,4.5,"",1,0,0,1,0,0,0 -"UTU",1983,104,NA,6.8,131,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Uber Goober",2004,87,NA,7.1,12,0,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Ubiitsy",1958,19,NA,6.9,102,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Ubij me nezno",1979,99,NA,7.2,7,0,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Ubistvo s predumisljajem",1995,94,NA,8,78,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Ubit drakona",1990,123,NA,8.5,120,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Ubiystvo na ulitse Dante",1956,104,NA,7.3,8,0,0,0,0,24.5,14.5,14.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Ubuntu's Wounds",2002,32,NA,8.7,7,0,0,0,0,0,0,14.5,14.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Uccellacci e uccellini",1966,91,NA,7.4,295,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Uccello dalle piume di cristallo, L'",1970,96,500000,6.8,883,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Uccidete Rommel",1969,99,NA,6,7,0,0,14.5,0,0,44.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Uccidi o muori",1967,93,NA,4.8,5,0,0,0,44.5,0,44.5,0,0,24.5,0,"",1,0,0,0,0,0,0 -"Ucho",1970,94,NA,7.7,70,0,0,0,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Uchu Kaisoku-sen",1961,74,NA,1.5,404,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Uchu daisenso",1959,90,NA,4.3,93,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Uchu kara no messeji",1978,105,NA,3.3,132,24.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Uchu senkan Yamato",1977,135,NA,6.9,18,4.5,4.5,0,0,14.5,0,14.5,4.5,24.5,24.5,"",0,1,0,0,0,0,0 -"Ucieczka z kina 'Wolnosc'",1991,92,NA,6.8,40,4.5,4.5,4.5,0,0,4.5,4.5,34.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Ucitel tance",1995,100,NA,7.1,31,4.5,0,4.5,0,0,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Udachi vam, gospoda",1992,95,NA,5.4,5,0,0,24.5,24.5,24.5,0,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Udienza, L'",1971,112,NA,6,55,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Udju Azul di Yonta",1992,90,NA,4.4,25,4.5,4.5,4.5,0,0,4.5,24.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Udoli vcel",1967,97,NA,7,47,4.5,4.5,0,0,0,4.5,0,4.5,14.5,74.5,"",0,0,0,0,0,0,0 -"Udstillede, De",2000,81,NA,1.3,48,74.5,4.5,0,0,4.5,0,4.5,4.5,14.5,4.5,"",0,0,0,1,1,0,0 -"Udzinarta mze",1992,123,NA,9.2,8,0,0,0,0,0,0,14.5,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Ugetsu monogatari",1953,94,NA,7.8,1222,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Ugler i mosen",1959,94,NA,7.4,91,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Ugliest Fountain in the World (Without a Doubt), The",1999,14,NA,4.1,12,0,4.5,4.5,0,14.5,4.5,0,4.5,0,45.5,"",0,0,0,0,1,0,1 -"Ugly American, The",1963,120,NA,6.5,191,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ugly Dachshund, The",1966,93,NA,6,326,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Ugly Duckling",1939,9,NA,8.1,116,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Ugly Duckling, The",1997,81,NA,5.8,9,14.5,14.5,0,0,24.5,0,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Ugly Naked People",1999,20,NA,5.1,29,4.5,14.5,0,0,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,1 -"Ugly, The",1997,92,NA,6.3,649,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Uh Oh!",2003,92,NA,7.6,7,14.5,0,0,0,14.5,0,0,14.5,14.5,44.5,"PG",1,0,1,0,0,0,0 -"Uit elkaar",1979,92,NA,5.7,12,0,14.5,0,0,14.5,45.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Ujed andjela",1984,97,NA,4.8,5,24.5,0,24.5,0,24.5,0,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Ukamau",1966,75,NA,9.2,5,0,0,0,0,0,0,24.5,0,24.5,64.5,"",0,0,0,0,0,0,0 -"Ukigumo",1955,123,NA,8,83,4.5,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,1,0,1,0 -"Ukigusa",1959,119,NA,8.3,427,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ukigusa monogatari",1934,118,NA,8.4,144,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Ukjent, En",2001,8,NA,4,16,4.5,14.5,14.5,4.5,0,4.5,0,14.5,14.5,14.5,"",0,0,0,0,0,1,1 -"Ukkonen",2001,22,NA,6.6,158,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",1,0,0,0,0,0,1 -"Ukroshcheniye ognya",1972,166,NA,8.5,8,0,0,0,0,0,14.5,0,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Ukrotitelnitsa tigrov",1954,101,NA,8.7,11,0,0,0,0,0,0,0,34.5,34.5,24.5,"",1,0,0,0,0,1,0 -"Ulee's Gold",1997,113,2700000,7.1,2368,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Uli, der Knecht",1954,115,NA,7,27,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Ulica Graniczna",1949,110,NA,7,17,4.5,0,0,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Uliisses",1982,94,NA,6,8,0,0,0,14.5,24.5,24.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ulisse",1955,116,NA,6.1,297,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ulisse contro Ercole",1961,99,NA,3.8,9,14.5,14.5,0,24.5,14.5,24.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ulitsa polna neozhidannostey",1957,73,NA,3,11,14.5,0,4.5,0,4.5,4.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Ulterior Motives",1992,95,NA,4.7,37,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ultima batalla, La",1993,92,NA,4,6,0,0,14.5,0,14.5,14.5,0,14.5,0,34.5,"",1,0,1,0,0,0,0 -"Ultima carrozzella, L'",1943,88,NA,7.4,5,0,0,0,0,24.5,0,44.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Ultima chance, L'",1975,86,NA,5.8,12,0,0,0,4.5,44.5,34.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Ultima lezione, L'",2001,92,NA,6.9,11,0,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ultima neve di primavera, L'",1973,94,NA,6,16,0,4.5,4.5,0,0,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ultima orgia del III Reich, L'",1977,81,NA,4.2,88,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Ultima partita, L'",1990,95,NA,3.6,11,44.5,0,4.5,0,0,14.5,0,0,14.5,4.5,"",1,0,0,0,0,0,0 -"Ultima preda del vampiro, L'",1962,83,NA,4.2,39,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Ultima volta, L'",1976,97,NA,6.4,12,0,0,4.5,0,0,14.5,4.5,0,0,64.5,"",0,0,0,1,0,0,0 -"Ultimate Degenerate, The",1969,70,NA,4.5,5,24.5,0,0,0,0,24.5,0,24.5,0,44.5,"",0,0,0,0,0,0,0 -"Ultimate Desires",1992,93,NA,2.8,33,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Ultimate G's",2000,37,NA,6.1,6,0,14.5,0,0,0,34.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Ultimate Thrill, The",1974,110,NA,5.6,10,0,0,0,34.5,24.5,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Ultimate Warrior, The",1975,94,NA,5,170,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Ultimate Weapon, The",1997,110,NA,2.7,126,34.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Ultimate X: The Movie",2002,44,NA,6.7,111,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG",0,0,0,0,1,0,1 -"Ultimax Force",1986,90,NA,3,9,45.5,14.5,0,14.5,0,0,0,24.5,0,0,"",1,0,0,0,0,0,0 -"Ultime grida dalla savana: la grande caccia",1974,84,NA,5.2,23,4.5,14.5,4.5,4.5,14.5,14.5,0,4.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Ultimi giorni di Pompei, Gli",1959,103,NA,5.2,107,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Ultimi giorni di Pompeii, Gli",1913,88,NA,5.9,66,4.5,4.5,4.5,14.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ultimo bacio, L'",2001,115,NA,7,1422,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Ultimo cacciatore, L'",1980,95,NA,5.6,83,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Ultimo capodanno, L'",1998,109,NA,6.2,126,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Ultimo dei Vikinghi, L'",1961,103,NA,5.2,15,0,0,4.5,14.5,24.5,24.5,0,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Ultimo gladiatore, L'",1964,98,NA,5.7,8,0,0,14.5,14.5,24.5,34.5,14.5,0,0,0,"",1,0,0,1,0,0,0 -"Ultimo guerriero, L'",1984,95,NA,3.6,22,14.5,14.5,0,14.5,4.5,4.5,4.5,4.5,0,34.5,"",1,0,0,0,0,0,0 -"Ultimo harem, L'",1981,90,NA,5.9,18,4.5,0,0,0,14.5,0,0,0,0,74.5,"",0,0,0,1,0,1,0 -"Ultimo minuto",1987,100,NA,6.4,26,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ultimo mondo cannibale",1977,92,NA,6.1,226,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ultimo pistolero, L'",2002,8,NA,6.9,20,0,0,0,0,0,24.5,34.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Ultimo sapore dell'aria, L'",1978,98,NA,5.1,7,0,0,14.5,0,14.5,0,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Ultimo squalo, L'",1981,82,NA,4.1,103,14.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ultimo stadio",2002,96,NA,6.3,12,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Ultimo tango a Parigi",1972,250,1250000,6.9,4007,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"NC-17",0,0,0,1,0,1,0 -"Ultimo tango a Zagarol",1973,100,NA,6,21,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Ultimo treno della notte, L'",1975,94,NA,5.8,94,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Ultimo volo all'inferno, L'",1990,84,NA,1,9,64.5,0,0,0,0,0,0,24.5,0,14.5,"",1,0,0,0,0,0,0 -"Ultimul cartus",1973,100,NA,7.6,34,14.5,0,0,0,4.5,14.5,4.5,14.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Ultra Flesh",1980,90,NA,5.1,22,14.5,4.5,0,4.5,0,4.5,14.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"Ultrachrist!",2003,92,NA,4.3,89,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Ultraviolet",1992,80,NA,4.6,34,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Ulvepigen Tinke",2002,92,NA,7,47,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Ulvesommer",2003,87,NA,6.6,114,14.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ulvetid",1981,86,NA,5.3,17,0,0,4.5,14.5,14.5,34.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Ulykken",2003,28,NA,5.2,8,0,14.5,0,45.5,0,14.5,0,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Ulysse",1982,22,NA,6.2,17,14.5,0,0,0,0,4.5,24.5,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Ulysses",1967,123,NA,5.7,117,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Ulzana",1974,91,NA,5.1,11,0,4.5,0,4.5,4.5,14.5,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Ulzana's Raid",1972,105,1200000,7,422,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Um Filme Falado",2003,96,NA,7,276,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Um Null Uhr schnappt die Falle zu",1966,89,NA,5.8,15,0,0,4.5,0,24.5,24.5,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Um Sol Alaranjado",2001,17,NA,8.7,13,4.5,4.5,0,0,0,0,0,14.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Um Trem para as Estrelas",1987,103,NA,8.4,56,4.5,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Uma",1941,128,NA,7.3,19,14.5,0,0,14.5,14.5,0,14.5,0,4.5,44.5,"",0,0,0,1,0,0,0 -"Uma Abelha na Chuva",1972,75,NA,7.6,20,0,0,4.5,0,4.5,4.5,14.5,44.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Uma Aventura do Zico",1998,93,5300000,2.3,24,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Uma Escola Atrapalhada",1990,90,NA,5.9,54,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Uma Historia de Futebol",1999,20,NA,6.5,46,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Uma Onda No Ar",2002,92,NA,7.3,60,0,0,0,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Uma Pedra no Bolso",1988,91,NA,5.3,6,0,0,14.5,0,14.5,0,0,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Uma Vida Normal",1994,110,NA,6.5,47,0,0,4.5,0,14.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Uma Vida em Segredo",2001,100,NA,8.2,24,0,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Umanoide, L'",1979,100,7000000,3.1,73,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Umbartha",1982,151,NA,8.1,7,0,0,0,0,0,0,24.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Umberto D.",1952,91,NA,8.1,1320,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Umbrellas",1994,90,NA,7.7,9,0,0,0,0,14.5,0,0,34.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Umi no Triton",1979,30,NA,6.2,6,0,0,0,0,14.5,0,0,0,0,84.5,"",1,1,0,1,0,0,1 -"Umi to dokuyaku",1986,123,NA,9.3,12,0,0,0,0,0,0,0,4.5,45.5,34.5,"",0,0,0,1,0,0,0 -"Umi wa miteita",2002,119,NA,6.8,254,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Umirat legko",1999,89,NA,4.8,18,24.5,0,0,24.5,14.5,14.5,0,24.5,0,0,"",1,0,0,0,0,0,0 -"Umizaru",2004,120,NA,6.9,12,0,0,4.5,0,14.5,24.5,14.5,0,14.5,14.5,"",1,0,0,0,0,0,0 -"Umm Kulthum",1996,67,NA,7.4,27,0,0,0,0,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Umrao Jaan",1981,145,NA,8.4,56,4.5,0,0,0,4.5,14.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Umur",2002,102,NA,6,72,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Umut",1970,100,NA,7.5,59,4.5,0,0,0,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Un Nos Ola' Leuad",1991,98,NA,5,20,0,0,0,24.5,4.5,4.5,4.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Un acte d'amour",1953,108,NA,6.2,70,0,0,4.5,4.5,4.5,34.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Un air de famille",1996,110,NA,7.4,975,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Un air si pur...",1997,106,NA,6.3,24,4.5,0,4.5,4.5,4.5,14.5,44.5,4.5,14.5,0,"",0,0,1,1,0,0,0 -"Un aller simple",1971,118,NA,8.1,54,0,0,0,0,4.5,0,0,4.5,34.5,45.5,"",0,0,0,1,0,0,0 -"Un aller simple",2001,90,NA,4.5,60,4.5,14.5,4.5,24.5,24.5,24.5,14.5,4.5,0,0,"",0,0,1,1,0,0,0 -"Un ami viendra ce soir",1946,125,NA,7.2,6,0,0,14.5,0,0,34.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Un amor de Borges",2000,92,NA,9.1,37,4.5,0,0,0,4.5,4.5,14.5,4.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Un amour de Swann",1984,110,NA,5.8,220,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Un amour de pluie",1974,96,NA,5,12,14.5,0,0,0,4.5,34.5,4.5,34.5,0,0,"",0,0,0,1,0,1,0 -"Un amour de poche",1957,88,NA,5.6,5,0,0,0,24.5,0,44.5,0,44.5,0,0,"",0,0,1,0,0,0,0 -"Un amour interdit",1984,95,NA,3.3,15,24.5,0,4.5,0,4.5,0,44.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Un ange",2001,120,NA,4.5,49,4.5,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Un autre homme, une autre chance",1977,136,NA,5.2,79,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Un beau monstre",1971,125,NA,4.4,7,0,0,0,24.5,0,14.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Un bon petit diable",1983,90,NA,5.2,7,0,0,14.5,24.5,0,0,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Un bruit qui rend fou",1995,100,NA,4.9,17,0,24.5,0,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Un carnet de bal",1937,144,NA,8.3,45,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Un cave",1971,95,NA,3.8,5,0,0,24.5,0,64.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Un chapeau de paille d'Italie",1927,60,NA,7.3,72,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Un chien andalou",1929,16,NA,7.9,3294,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Un chien dans un jeu de quilles",1983,93,NA,4.3,40,14.5,4.5,4.5,24.5,34.5,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Un coeur en hiver",1992,105,NA,7.5,1904,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Un coeur qui bat",1991,95,NA,7.7,12,4.5,4.5,4.5,0,4.5,0,14.5,44.5,0,4.5,"",0,0,0,1,0,0,0 -"Un crime",1993,90,NA,6.3,101,4.5,4.5,4.5,4.5,4.5,14.5,45.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Un crime au paradis",2001,89,NA,6.4,334,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Un enfant dans la foule",1976,85,NA,5.8,5,24.5,0,0,0,0,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Un festin d'amis",2003,11,NA,9.5,8,14.5,0,0,0,0,0,0,0,45.5,34.5,"",0,0,0,0,0,0,1 -"Un film comme les autres",1968,100,NA,3,7,14.5,24.5,0,0,14.5,0,0,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Un fils",2003,58,NA,7,22,4.5,0,0,4.5,4.5,4.5,4.5,45.5,14.5,0,"",0,0,0,1,0,0,0 -"Un flic",1972,98,NA,6.8,422,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Un grand amour de Beethoven",1936,116,NA,6.7,40,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Un grand cri d'amour",1998,90,NA,6.2,50,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Un grand patron",1951,95,NA,4.5,6,0,0,34.5,0,14.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Un homme amoureux",1987,125,NA,5.7,137,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Un homme de trop",1967,90,NA,7.1,16,0,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Un homme est mort",1972,104,NA,6.1,106,4.5,4.5,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Un homme et une femme",1966,102,NA,7.5,978,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Un homme qui dort",1974,93,NA,9.4,11,0,0,0,0,0,4.5,0,0,34.5,45.5,"",0,0,0,1,0,0,0 -"Un homme sans l'Occident",2002,104,NA,6.2,61,4.5,4.5,4.5,0,24.5,14.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Un homme, un vrai",2003,121,NA,6.3,76,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Un indien dans la ville",1994,90,NA,5.4,372,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Un jeu brutal",1983,90,NA,7.9,17,0,4.5,0,0,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Un jeu d'enfants",2001,85,NA,5.3,202,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Un jour",1997,5,NA,6.8,8,0,0,0,0,24.5,0,0,34.5,14.5,24.5,"",0,1,0,1,0,0,1 -"Un jour ordinaire pas comme les autres",2004,5,NA,6.8,5,0,0,0,0,0,24.5,44.5,24.5,24.5,0,"",0,1,0,0,0,0,1 -"Un linceul n'a pas de poches",1974,125,NA,6.1,14,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Un mauvais fils",1980,110,NA,7.6,62,0,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Un meurtre est un meurtre",1972,90,NA,6.3,14,0,0,0,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Un moment de bonheur",2002,84,NA,6.3,30,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Un monde nouveau",1966,83,NA,8.3,10,0,0,0,0,14.5,0,34.5,24.5,0,44.5,"",0,0,0,1,0,0,0 -"Un monde presque paisible",2002,94,NA,6.4,73,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Un monsieur de compagnie",1965,92,NA,6.9,14,0,0,0,4.5,0,24.5,34.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Un pays sans bon sens!",1970,117,NA,2.1,8,24.5,0,0,0,0,0,14.5,0,34.5,24.5,"",0,0,0,0,1,0,0 -"Un petit cas de conscience",2002,95,NA,3.8,8,0,14.5,34.5,0,14.5,0,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Un petit vent de panique",2000,90,NA,5.8,26,4.5,0,14.5,0,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Un peu de soleil dans l'eau froide",1971,110,NA,4.2,10,0,14.5,14.5,34.5,24.5,0,24.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Un pont entre deux rives",1999,95,NA,6.3,190,4.5,0,4.5,4.5,14.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Un pur moment de rock'n roll",1999,105,NA,5.3,26,4.5,0,14.5,4.5,14.5,24.5,24.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Un reste, l'autre part, L'",2005,109,NA,5.9,35,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Un revenant",1946,90,NA,8.3,17,0,0,0,0,0,4.5,14.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Un roi sans divertissement",1963,85,NA,6.5,15,0,0,0,4.5,14.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Un sac de billes",1975,105,NA,6.2,35,0,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Un samedi sur la terre",1996,95,NA,8.6,20,0,0,0,0,0,14.5,4.5,24.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Un second souffle",1978,95,NA,5.8,5,24.5,0,24.5,0,0,24.5,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Un singe en hiver",1962,105,NA,7.4,217,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Un soir de pluie",1999,14,NA,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Un soir, un train",1968,86,NA,7.4,60,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Un taxi mauve",1977,107,NA,6,84,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Un taxi pour Tobrouk",1960,89,NA,6.9,111,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Un vivant qui passe",1997,65,NA,4.6,12,24.5,0,0,0,0,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Un vol, la nuit",2001,15,NA,4.4,10,24.5,0,0,14.5,0,44.5,14.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Un week-end sur deux",1990,100,NA,6.7,36,0,0,0,0,14.5,34.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Un zoo la nuit",1987,115,NA,6.7,178,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Un, deux, trois, soleil",1993,104,NA,6.6,177,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Un-Real",2004,28,NA,8.8,10,0,0,0,0,14.5,0,24.5,0,14.5,64.5,"",0,0,0,0,0,0,1 -"UnConventional",2004,99,50000,4.6,10,0,14.5,0,0,0,14.5,34.5,0,24.5,34.5,"",0,0,0,0,1,0,0 -"Una",1984,110,NA,8,12,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,4.5,"",0,0,0,1,0,1,0 -"Una de dos",2004,88,NA,5.5,6,14.5,0,0,0,14.5,45.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Una de zombis",2003,99,NA,4.2,54,24.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Una di quelle",1953,98,NA,7.7,10,0,0,0,14.5,0,0,34.5,34.5,0,34.5,"",0,0,0,0,0,0,0 -"Una para llevar",1997,3,NA,2.6,11,24.5,0,0,0,0,0,0,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Una sull'altra",1969,99,NA,7.1,48,4.5,0,4.5,0,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Unaccustomed As We Are",1929,21,NA,7.1,82,4.5,0,4.5,4.5,4.5,34.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Unagi",1997,117,NA,7.2,1031,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Unappreciated Joke, The",1903,1,NA,3.9,5,0,24.5,0,64.5,0,0,0,0,24.5,0,"",0,0,1,0,0,0,1 -"Unashamed",1932,76,NA,7,14,0,0,0,0,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Unbearable Bear, The",1943,8,NA,6.4,14,0,0,0,4.5,14.5,4.5,24.5,45.5,0,0,"",0,1,1,0,0,0,1 -"Unbearable Lightness of Being, The",1988,171,NA,7.4,5228,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Unbecoming Age",1992,92,NA,4.7,89,14.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Unbekannte Deserteur, Der",1992,40,NA,9.3,13,4.5,0,0,0,0,0,0,0,0,94.5,"",0,0,0,0,0,0,1 -"Unbelievable Truth, The",1989,90,NA,7.2,823,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Unbelievable Truth, The",2003,9,3300,7.4,5,24.5,0,0,0,0,0,0,44.5,0,44.5,"",0,0,0,1,0,0,1 -"Unbeliever, The",1918,80,NA,8.9,5,0,0,24.5,0,0,0,0,64.5,24.5,0,"",0,0,0,1,0,0,0 -"Unbestechliche, Der",2002,90,NA,5,6,0,0,0,34.5,0,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Unborn",2002,8,NA,9.3,6,0,0,0,0,0,0,0,14.5,34.5,45.5,"",0,0,0,1,0,0,1 -"Unborn II, The",1994,83,NA,2.7,40,44.5,4.5,14.5,14.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Unborn, The",1991,83,NA,3.8,78,14.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Unborn, The",2003,108,NA,5.8,34,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Unbowed",1999,125,NA,3.9,46,0,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Unbreakable",2000,106,75000000,7.1,35842,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Unbroken",2003,6,NA,6.9,27,4.5,0,4.5,0,0,0,14.5,14.5,4.5,45.5,"",0,0,0,1,0,0,1 -"Uncaged",1991,85,NA,3.1,33,4.5,24.5,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Uncanny, The",1977,89,NA,4.3,118,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Uncertain Glory",1944,102,NA,6.8,91,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Unchained",1955,75,NA,5.3,27,4.5,0,4.5,4.5,14.5,14.5,4.5,4.5,0,44.5,"",0,0,0,1,0,0,0 -"Unchained Memories: Readings from the Slave Narratives",2003,75,NA,8,44,4.5,4.5,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Unchangeable",2004,30,NA,7.1,17,14.5,0,0,0,0,24.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,1 -"Unchanging Sea, The",1910,14,NA,6.3,44,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Unchastened Woman, The",1925,52,NA,4.6,8,0,0,0,45.5,0,14.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Uncivil War Birds",1946,17,NA,6.3,53,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Uncivil Warriors",1935,20,NA,8,71,0,4.5,4.5,0,0,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Uncivilized",1994,91,1000000,4.8,19,14.5,0,14.5,0,14.5,14.5,4.5,4.5,0,24.5,"",1,0,0,0,0,0,0 -"Uncle",1996,6,NA,6.4,35,4.5,0,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,1,0,0,1 -"Uncle Ben",1978,27,NA,8.3,12,0,0,0,0,0,0,14.5,34.5,4.5,44.5,"",0,0,0,1,0,0,1 -"Uncle Buck",1989,100,NA,6.3,6716,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Uncle Donald's Ants",1952,6,NA,7.1,35,0,0,0,0,4.5,24.5,44.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Uncle Jim's Dairy Farm",1960,12,NA,3.4,34,24.5,14.5,14.5,14.5,14.5,4.5,4.5,0,4.5,0,"",0,0,0,0,1,0,1 -"Uncle Joe Shannon",1978,108,NA,4.2,29,4.5,14.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Uncle Josh at the Moving Picture Show",1902,2,NA,5.9,46,4.5,4.5,0,14.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Uncle Josh's Nightmare",1900,2,NA,4.8,21,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Uncle Nino",2003,104,NA,5.9,221,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"PG",0,0,1,1,0,0,0 -"Uncle Saddam",2000,63,NA,6.7,89,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,1,0,1,0,0 -"Uncle Sam",1997,89,2000000,3.3,488,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Uncle Silas",1947,98,NA,6.3,31,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Uncle Tom's Bungalow",1937,8,NA,6.3,10,0,14.5,0,0,34.5,0,14.5,44.5,14.5,0,"",0,1,1,0,0,0,1 -"Uncle Tom's Cabin",1914,54,NA,8,5,24.5,0,0,0,0,0,0,84.5,0,0,"",0,0,0,1,0,0,0 -"Uncle Tom's Cabin",1927,144,1500000,7.7,31,0,4.5,0,0,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Uncle Vanya",1963,110,NA,7,16,14.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Uncles, The",2000,93,NA,7,32,0,0,0,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Unconditional Love",1999,105,NA,3,6,14.5,14.5,34.5,0,0,0,14.5,0,0,14.5,"R",1,0,0,0,0,0,0 -"Unconditional Love",2002,120,NA,7.1,632,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"PG-13",0,0,1,1,0,0,0 -"Unconquered",1947,146,5000000,6.5,245,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Unconquered, The",1954,55,NA,9.2,10,14.5,0,0,0,14.5,0,14.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Uncovered: The War on Iraq",2004,87,NA,7.7,136,4.5,4.5,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Uncovered: The Whole Truth About the Iraq War",2003,56,50000,7.9,290,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Uncrating and Assembly of the P-47 Thunderbolt Airplane",1943,40,NA,9.2,6,0,0,0,0,14.5,0,0,0,0,84.5,"",0,0,0,0,1,0,1 -"Uncut",1997,92,NA,6.3,42,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Uncut",2003,78,NA,5.2,5,44.5,0,0,0,0,0,44.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Und keiner weint mir nach",1996,102,NA,3.5,12,4.5,4.5,4.5,4.5,4.5,0,24.5,0,0,34.5,"",0,0,0,1,0,0,0 -"Und vor mir die Sterne",1998,90,NA,8.3,6,0,0,0,0,0,0,45.5,0,14.5,34.5,"",0,0,0,0,1,0,0 -"Unde la soare e frig",1991,91,NA,6,6,0,0,14.5,0,0,0,0,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Undead",2003,100,NA,5.7,1350,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Undead, The",1957,71,70000,3.8,261,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Undefeatable",1994,90,NA,2.9,63,44.5,14.5,4.5,4.5,4.5,14.5,4.5,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Undefeated, The",1969,119,NA,6,505,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Under Age",1964,90,NA,1,6,84.5,0,0,0,14.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Under California Stars",1948,70,NA,5.4,28,4.5,0,0,14.5,14.5,45.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Under Capricorn",1949,117,NA,6.1,603,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Under Cover",1987,94,NA,4.8,49,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Under Eighteen",1932,80,NA,4.6,10,14.5,0,0,0,24.5,14.5,24.5,24.5,24.5,0,"",0,0,0,1,0,1,0 -"Under Fiesta Stars",1941,64,NA,5.2,7,0,14.5,0,0,44.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Under Fire",1957,76,NA,5.4,10,24.5,0,14.5,0,44.5,0,24.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Under Fire",1983,128,NA,7,1024,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Under Heat",1996,92,NA,5.1,12,0,0,14.5,0,4.5,14.5,0,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Under Hellgate Bridge",2000,90,NA,4.6,123,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Under Lock and Key",1995,92,NA,4.3,38,24.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Under Milk Wood",1972,87,NA,5.1,98,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,24.5,"",0,1,1,1,0,0,0 -"Under My Skin",1950,86,NA,5.9,11,0,4.5,0,0,0,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Under Nevada Skies",1946,69,NA,5.9,7,0,0,0,0,44.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Under Oath",1997,92,NA,4.8,34,4.5,0,4.5,4.5,24.5,14.5,4.5,14.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Under One Roof",2002,76,NA,6.3,85,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Under Pressure",2000,94,NA,3.8,200,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Under Siege",1992,98,12000000,6.1,9413,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Under Siege 2: Dark Territory",1995,99,60000000,4.9,5551,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Under Suspicion",1991,99,NA,6.3,447,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Under Suspicion",2000,111,25000000,6.4,3718,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Under Texas Skies",1940,57,NA,5.9,5,0,0,0,24.5,44.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Under Two Flags",1936,98,1500000,6.6,71,0,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Under Western Stars",1938,65,NA,5.8,13,0,0,4.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Under a Texas Moon",1930,82,NA,5.5,5,0,0,0,24.5,24.5,44.5,0,0,0,24.5,"",0,0,1,0,0,1,0 -"Under overfladen",1999,92,NA,4.4,45,14.5,14.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Under solen",1998,118,NA,6.9,543,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Under the Boardwalk",1989,103,NA,3.9,66,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Under the Bridge",1997,93,NA,5.3,7,14.5,0,0,14.5,24.5,14.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Under the Cherry Moon",1986,98,NA,3.9,523,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Under the Doctor",1976,84,NA,2.7,9,24.5,34.5,0,0,34.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Under the Gun",1951,83,NA,7.5,12,0,0,0,4.5,0,0,44.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Under the Gun",1988,90,NA,4.1,22,4.5,0,24.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Under the Gun",1995,90,NA,4.1,40,14.5,0,4.5,14.5,14.5,14.5,4.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Under the Hula Moon",1995,94,NA,3.7,95,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Under the Radar",2004,95,NA,4.8,31,14.5,14.5,4.5,0,4.5,4.5,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Under the Rainbow",1981,97,20000000,4.8,535,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Under the Rainbow",1999,105,NA,5,6,34.5,0,14.5,0,0,0,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Under the Red Robe",1937,80,NA,6,30,0,0,0,0,34.5,34.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Under the Skin",1997,82,1000000,6.5,367,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Under the Tonto Rim",1947,61,NA,6.6,15,0,0,0,4.5,4.5,4.5,44.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Under the Tuscan Sun",2003,113,18000000,6.7,4183,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Under the Volcano",1984,112,NA,6.5,503,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Under the Yum Yum Tree",1963,110,NA,6,185,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Under ytan",1997,103,NA,6.3,101,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Under-Pup, The",1939,88,NA,9.2,6,0,0,0,0,0,0,0,34.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Underbara kvinnor vid vatten",1998,104,NA,5.3,66,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Undercover Agent",1938,65,NA,6.8,6,0,0,0,0,14.5,14.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Undercover Angel",1999,91,NA,5.5,142,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"PG",0,0,1,1,0,0,0 -"Undercover Blues",1993,90,NA,5.4,1493,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Undercover Brother",2002,85,25000000,6,5138,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Undercover Girl",1950,83,NA,6,5,0,0,0,24.5,24.5,0,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Undercover Girl",1957,68,NA,3.1,7,14.5,14.5,24.5,0,24.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Undercover Heat",1995,93,NA,5.5,148,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"R",0,0,0,0,0,0,0 -"Undercover Kid, The",1996,80,NA,4.8,23,0,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"PG",0,0,0,0,0,0,0 -"Undercover Maisie",1947,90,NA,6.2,9,0,0,0,14.5,14.5,34.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Undercover Man",1942,68,NA,7.5,13,0,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",1,0,0,0,0,0,0 -"Undercover Man, The",1949,85,NA,7,55,4.5,0,0,0,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Undercurrent",1946,116,NA,6.1,306,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Undercurrent",1999,94,NA,4.5,54,4.5,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Underdogs, The",2002,22,NA,6,7,14.5,0,0,0,0,24.5,0,14.5,0,44.5,"",0,0,0,0,0,0,1 -"Undergraduate, The",1972,68,NA,2.1,7,45.5,0,0,0,0,0,0,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Underground",1928,84,NA,7.2,5,0,0,0,0,0,44.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Underground",1941,95,NA,6.7,25,0,0,0,0,14.5,14.5,14.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Underground",1976,87,NA,6,22,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Underground",1990,90,NA,2.1,15,44.5,34.5,4.5,0,14.5,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Underground",1995,167,NA,7.9,5330,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Underground",1998,93,NA,5,20,0,0,14.5,0,14.5,14.5,4.5,4.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Underground Aces",1981,90,NA,3,47,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Underground Comedy Movie, The",1999,88,NA,1.8,590,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Underground U.S.A.",1980,85,NA,3.9,6,34.5,45.5,0,0,0,0,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Underground World, The",1943,8,NA,6.8,26,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Underground Zero",2002,76,NA,6.2,10,0,14.5,14.5,14.5,14.5,34.5,0,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Underjordens hemlighet",1991,81,NA,6,17,0,0,4.5,0,4.5,0,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Undermind",2003,108,NA,7.3,55,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Underneath",1995,99,6500000,6.3,674,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Undersea Kingdom",1936,226,NA,3.9,56,14.5,14.5,4.5,24.5,4.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Understanding Bliss",1990,80,NA,4,10,14.5,14.5,0,44.5,0,14.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Understanding Jane",1998,97,NA,7.1,100,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Undertaker and His Pals, The",1967,63,NA,3.7,101,24.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Undertaker's Paradise",2000,91,NA,5.7,47,4.5,14.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Undertaker's Wedding, The",1997,80,NA,4.9,62,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,0,14.5,"R",0,0,1,0,0,0,0 -"Undertakings",1995,30,NA,7.4,5,24.5,0,0,0,0,24.5,0,24.5,44.5,0,"",0,0,0,0,0,0,1 -"Undertow",1949,71,NA,7.6,22,0,0,0,0,14.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Undertow",1996,93,NA,5,124,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Undertow",2004,108,NA,6.9,541,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Underwater City, The",1962,78,350000,4.9,17,4.5,14.5,4.5,14.5,24.5,0,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Underwater Warrior",1958,91,NA,5,12,14.5,0,14.5,24.5,4.5,14.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Underwater!",1955,105,3500000,5.3,80,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Underworld",1927,80,NA,7.8,75,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Underworld",1985,103,NA,3.1,95,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Underworld",1996,95,NA,4.5,216,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Underworld Story, The",1950,91,NA,6.8,31,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Underworld U.S.A.",1961,99,NA,7.5,148,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Undici giorni, undici notti",1986,89,NA,4.5,59,4.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Undine",1992,96,NA,4.3,6,14.5,14.5,14.5,0,14.5,0,14.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Undisputed",2002,96,20000000,5.6,1769,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Undo",1994,47,NA,6.1,71,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Undone",2001,15,NA,8.1,7,0,14.5,0,0,0,0,0,24.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Undying Monster, The",1942,60,NA,5.7,73,0,0,4.5,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Une affaire de femmes",1988,108,NA,7.8,343,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Une affaire qui roule",2003,90,NA,6.3,23,4.5,4.5,0,4.5,4.5,24.5,34.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Une aussi longue absence",1961,85,NA,8.2,32,0,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Une aventure de Billy le Kid",1971,100,NA,6.9,6,0,0,0,0,34.5,0,34.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Une belle fille comme moi",1972,98,NA,6.7,175,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Une chambre en ville",1982,90,NA,7.4,39,0,0,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Une chance sur deux",1998,110,32000000,5.6,472,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Une chante, l'autre pas, L'",1977,120,NA,6.2,68,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Une corde, un Colt",1969,90,NA,4.8,35,14.5,0,4.5,0,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Une dame vraiment bien",1908,4,NA,3.4,6,14.5,0,14.5,0,14.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Une femme coquette",1955,10,NA,4.9,7,24.5,14.5,0,0,0,14.5,24.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Une femme dans l'ennui",1994,33,NA,6.2,13,0,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Une femme douce",1969,88,NA,7.5,131,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Une femme en Afrique",1985,85,NA,5.4,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,0,0,0,1,0 -"Une femme est une femme",1961,84,160000,7.7,693,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,1,0 -"Une femme fatale",1975,108,NA,6.7,6,0,0,0,0,0,34.5,0,34.5,0,34.5,"",0,0,1,0,0,0,0 -"Une femme ou deux",1985,97,NA,5,67,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Une fille et des fusils",1964,93,NA,4.5,15,24.5,0,0,0,14.5,14.5,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Une flamme dans mon coeur",1987,106,NA,6.7,38,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Une hirondelle a fait le printemps",2001,103,NA,7,477,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Une histoire d'eau",1961,18,NA,6.7,89,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,1,1 -"Une histoire de vent",1989,80,NA,7.6,36,4.5,0,0,0,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Une histoire simple",1978,110,NA,7,90,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Une liaison pornographique",1999,80,NA,7.1,1493,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Une minute de silence",1998,88,NA,5,16,4.5,0,4.5,14.5,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Une nouvelle vie",1993,117,NA,5.6,44,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Une nuit sur le mont chauve",1933,8,NA,8.3,21,0,0,0,0,4.5,4.5,14.5,4.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Une nuit terrible",1896,1,NA,3.9,6,14.5,0,0,14.5,0,34.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Une parisienne",1957,86,NA,6.1,51,4.5,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Une part du ciel",2002,86,NA,5.6,34,24.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Une partie de campagne",1936,40,NA,8.5,297,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,1,1 -"Une partie de plaisir",1975,97,NA,6.9,39,4.5,0,0,0,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Une pierre dans la bouche",1983,105,NA,7.2,9,14.5,0,0,24.5,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Une place parmi les vivants",2003,110,NA,6.8,11,0,0,0,0,0,14.5,45.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Une pour toutes",1999,120,NA,4.6,130,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Une ravissante idiote",1964,110,NA,5.8,35,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Une robe noire pour un tueur",1981,102,NA,7,61,0,0,4.5,4.5,4.5,0,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Une rose entre nous",1994,27,NA,6.6,7,14.5,0,0,0,0,44.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Une sale affaire",1981,95,NA,5.2,10,14.5,0,14.5,14.5,14.5,14.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Une sale histoire",1977,50,NA,7.9,22,4.5,4.5,0,0,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Une semaine de vacances",1980,102,NA,7.1,58,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Une si jolie petite plage",1949,91,NA,7.2,21,4.5,0,0,0,0,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Une vie",1958,86,NA,6.6,16,0,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Une visite",1955,8,NA,5.1,9,24.5,0,34.5,0,14.5,0,0,0,0,34.5,"",0,0,0,0,0,0,1 -"Une vraie jeune fille",1976,89,NA,5.9,354,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Unearthed",2004,130,NA,1,17,44.5,0,0,4.5,0,0,4.5,0,4.5,44.5,"",0,0,0,0,0,0,0 -"Unearthly Stranger",1963,78,NA,5.2,23,4.5,0,4.5,4.5,0,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Unearthly, The",1957,73,NA,2,267,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Unelma karjamajalla",1940,108,NA,6.8,5,0,0,0,24.5,0,24.5,24.5,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Unendliche Geschichte, Die",1984,94,27000000,7.2,6742,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Unexpected Guest",1947,61,NA,7.4,19,0,0,0,4.5,4.5,0,44.5,14.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Unexpected Pest, The",1956,6,NA,6.3,17,0,0,4.5,0,14.5,14.5,44.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Unexpected Uncle",1941,67,NA,5.6,13,0,0,4.5,14.5,14.5,34.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Unfaithful",1931,85,NA,7,6,0,0,0,0,0,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Unfaithful",2002,125,50000000,6.6,8713,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Unfaithful, The",1947,109,NA,7.1,73,0,0,4.5,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Unfaithfully Yours",1948,105,NA,7.6,427,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Unfaithfully Yours",1984,96,NA,5.5,475,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Unfamiliar",2002,17,NA,7.1,7,0,0,0,0,14.5,14.5,44.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Unfinished Business",1941,96,NA,6.3,36,0,0,4.5,4.5,4.5,34.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Unfinished Business",1984,99,NA,5.3,7,0,0,0,44.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Unfinished Business",1985,78,NA,5.7,6,0,0,0,14.5,34.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Unfinished Dance, The",1947,101,NA,6.6,43,4.5,4.5,0,4.5,0,14.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Unfinished Journey, The",1999,21,NA,6.6,49,14.5,4.5,0,0,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Unfinished Symphony",1934,84,NA,5.3,5,0,24.5,0,0,0,0,0,44.5,44.5,0,"",0,0,0,1,0,0,0 -"Unfinished Symphony: Democracy and Dissent",2001,60,NA,7.9,15,0,0,0,0,0,0,14.5,34.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Unfisch, Der",1997,98,NA,6.2,68,4.5,0,0,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Unforgettable",1996,117,18000000,5.7,940,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Unforgivable Blackness: The Rise and Fall of Jack Johnson",2004,220,NA,8.3,83,0,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,44.5,"",0,0,0,0,1,0,0 -"Unforgiven",1992,131,NA,8.1,30868,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Unforgiven, The",1960,121,5000000,6.8,618,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Ung flukt",1959,95,NA,5.9,12,0,0,0,14.5,14.5,4.5,24.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Ung leg",1956,96,NA,4.6,8,14.5,0,0,24.5,24.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Ungeheuer von London City, Das",1964,87,NA,5.5,7,0,0,14.5,14.5,0,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Ungen",1938,100,NA,5.6,7,0,0,0,14.5,24.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Ungen",1974,121,NA,6,18,0,0,0,4.5,24.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Unglaublichen Abenteuer des Guru Jakob, Die",1983,89,NA,3.4,13,34.5,24.5,0,0,0,14.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Unguarded Hour, The",1936,87,NA,6.8,40,0,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Unguarded Moment, The",1956,95,NA,6.1,48,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Unheimliche Geschichten",1919,112,NA,7.5,57,4.5,0,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Unheimliche Geschichten",1932,89,NA,7.5,9,0,0,0,0,14.5,44.5,14.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Unhinged",1982,79,NA,4.6,67,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Unhold, Der",1996,118,NA,7.1,536,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Unholy Garden, The",1931,74,NA,5.8,21,0,4.5,0,4.5,24.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Unholy Night, The",1929,93,NA,6.1,42,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Unholy Partners",1941,94,NA,6.4,52,0,0,4.5,4.5,4.5,44.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Unholy Rollers",1972,88,NA,5,60,4.5,4.5,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,1,0,0,0 -"Unholy Three, The",1925,86,103000,7.3,117,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Unholy Three, The",1930,72,NA,6.4,118,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Unholy Wife, The",1957,94,NA,5.2,34,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Unholy, The",1988,102,NA,4.1,197,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Unhook the Stars",1996,105,NA,6.8,563,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Unico",1981,90,NA,7.9,102,0,0,0,4.5,0,4.5,4.5,4.5,14.5,64.5,"",0,1,0,0,0,0,0 -"Unidentified Flying Objects: The True Story of Flying Saucers",1956,91,NA,4.9,17,0,14.5,0,14.5,34.5,4.5,4.5,14.5,0,4.5,"",0,0,0,0,1,0,0 -"Uniform Used to Mean Something..., A",2004,5,NA,6.8,57,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Uniformes et grandes manoeuvres",1950,80,NA,3.5,5,0,0,44.5,24.5,0,44.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Uninhibited",1995,91,NA,3.4,16,0,4.5,34.5,14.5,14.5,0,14.5,0,0,14.5,"",1,0,0,0,0,0,0 -"Uninvited",1988,90,NA,2.7,60,34.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Uninvited",1993,90,NA,4.6,17,4.5,4.5,0,14.5,14.5,14.5,24.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Uninvited Pest, The",1943,7,NA,6.3,6,0,0,0,0,14.5,14.5,34.5,14.5,14.5,0,"",0,1,1,0,0,0,1 -"Uninvited, The",1944,100,NA,7.7,718,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,1,0 -"Union City",1980,90,NA,6.2,124,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Union Depot",1932,67,NA,7.1,32,4.5,0,0,0,0,14.5,34.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Union Pacific",1939,135,1000000,7,228,4.5,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Union Square",2003,90,NA,6,6,0,0,0,0,0,34.5,0,0,0,64.5,"R",0,0,0,0,1,0,0 -"Union Station",1950,80,NA,6.8,108,0,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Union in Wait, A",2001,45,15000,6.7,13,4.5,4.5,0,4.5,14.5,4.5,24.5,14.5,0,14.5,"",0,0,0,0,1,0,1 -"Unishe April",1994,138,NA,8.3,10,0,0,14.5,0,0,0,14.5,14.5,45.5,24.5,"",0,0,0,1,0,0,0 -"United States Navy Band, The",1943,10,NA,6.4,6,0,0,0,0,45.5,0,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"United States of Leland, The",2003,108,NA,7,1788,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"United Trash",1996,75,NA,5,40,24.5,14.5,4.5,4.5,0,4.5,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"United by Divine Teaching",1994,54,NA,5.5,16,14.5,0,14.5,0,0,0,0,0,4.5,64.5,"",0,0,0,0,0,0,0 -"Univers de Jacques Demy, L'",1995,90,NA,6.4,23,14.5,0,4.5,0,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Universal Clock: The Resistance of Peter Watkins, The",2001,77,NA,5.4,9,0,0,14.5,0,14.5,0,34.5,0,0,44.5,"",0,0,0,0,1,0,0 -"Universal Groove",2004,92,NA,8.9,8,0,0,0,14.5,0,0,0,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Universal Soldier",1971,94,NA,5.6,33,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",1,0,0,1,0,0,0 -"Universal Soldier",1992,99,23000000,5.2,5709,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Universal Soldier: The Return",1999,89,NA,3.2,3486,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Universe",1960,29,NA,7.5,17,4.5,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,1 -"University Heights",2004,95,10000,7.9,30,14.5,4.5,0,4.5,0,4.5,14.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"University, Inc.",1999,54,NA,2.9,8,0,34.5,0,0,0,0,24.5,14.5,24.5,0,"",0,0,0,0,1,0,0 -"Unizhennye i oskorblyonnye",1991,106,NA,6,8,0,0,0,0,14.5,14.5,0,14.5,0,64.5,"",0,0,0,1,0,1,0 -"Unkissed Bride, The",1966,82,NA,3.8,7,24.5,14.5,0,0,0,14.5,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Unknown Cyclist, The",1998,96,NA,5.2,64,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Unknown Guest, The",1943,61,NA,5.4,5,24.5,24.5,0,0,24.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Unknown Island",1948,75,NA,3.7,37,14.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Unknown Powers",1978,97,NA,5.4,8,0,0,14.5,14.5,24.5,24.5,14.5,14.5,0,0,"",0,0,0,1,1,0,0 -"Unknown Soldier",2004,78,NA,7.3,31,0,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,1,0,0,0 -"Unknown Terror, The",1957,76,NA,4,23,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Unknown World",1951,74,NA,3.6,54,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Unknown, The",1927,49,NA,7.9,539,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Unknown, The",1946,70,NA,6,11,0,0,0,14.5,4.5,34.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Unknown, The",2005,85,NA,9,24,4.5,4.5,0,0,0,0,0,4.5,14.5,74.5,"",1,0,0,1,0,0,0 -"Unlawful Entry",1992,117,NA,5.9,2297,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Unleashed",1997,84,NA,6.4,40,0,0,4.5,4.5,14.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Unlikely Heroes",2003,120,NA,7.9,12,0,0,0,0,0,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Unloved",2001,117,NA,6.9,39,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Unmade Beds",1980,77,NA,3.5,13,14.5,0,24.5,14.5,24.5,0,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Unmade Beds",1997,95,1000000,6.7,148,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Unman, Wittering and Zigo",1971,102,NA,7,78,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Unmarried Woman, An",1978,130,NA,7,522,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Unmasked Part 25",1988,90,NA,4.1,40,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Unmasking the Idol",1986,90,NA,3.8,14,24.5,0,14.5,14.5,0,0,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Unmentionables, The",1963,7,NA,6.4,38,0,4.5,14.5,4.5,0,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Unnamable II: The Statement of Randolph Carter, The",1993,104,NA,3.8,137,4.5,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Unnamable, The",1988,87,NA,4.2,185,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Unnatural History",1959,6,NA,6.4,18,0,0,0,14.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Unnatural Pursuits",1991,60,NA,6.3,11,0,0,4.5,0,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Uno",2004,103,NA,7.1,469,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Uno que ha sido marino",1951,85,NA,4.3,6,0,14.5,0,0,0,0,14.5,0,45.5,14.5,"",0,0,0,0,0,0,0 -"Unprecedented: The 2000 Presidential Election",2002,50,NA,8.5,224,14.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Unpublished Story",1942,92,NA,5,14,4.5,0,0,14.5,34.5,4.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Unruly Hare, The",1945,7,NA,6.9,38,4.5,0,4.5,0,14.5,4.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Uns et les autres, Les",1981,173,NA,7,464,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Unsafe and Seine",1966,6,NA,5.3,5,0,0,24.5,0,24.5,44.5,0,24.5,0,0,"",0,1,0,0,0,0,1 -"Unsaid, The",2001,108,22000000,6.5,1084,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Unscarred, The",1999,92,NA,6.1,39,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Unseen Enemy, An",1912,17,NA,7.2,55,4.5,4.5,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Unseen Forces",2004,40,NA,8.5,8,14.5,0,0,0,0,0,14.5,0,0,74.5,"",0,0,0,0,0,0,1 -"Unseen Guardians",1939,11,NA,6.1,5,0,0,0,0,44.5,44.5,0,24.5,0,0,"",0,0,0,0,1,0,1 -"Unseen, The",1945,80,NA,6.6,24,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Unseen, The",1981,83,NA,3.5,65,14.5,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Unser Doktor ist der Beste",1969,85,NA,3.7,12,4.5,24.5,14.5,4.5,4.5,14.5,0,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Unser Willi ist der Beste",1971,90,NA,5.1,41,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Unser fremdes Kind",1997,88,NA,4.9,7,0,0,0,14.5,44.5,0,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Unsere Afrikareise",1966,13,NA,7,11,0,0,0,4.5,0,0,4.5,24.5,4.5,44.5,"",0,0,0,0,0,0,1 -"Unsere Leichen leben noch",1981,90,NA,5.6,6,0,0,0,0,34.5,0,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Unsere Pauker gehen in die Luft",1970,96,NA,3.7,24,24.5,4.5,4.5,24.5,4.5,0,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Unshrinkable Jerry Mouse, The",1964,7,NA,5.3,21,4.5,4.5,4.5,14.5,14.5,14.5,0,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Unsichtbare Gegner",1977,112,NA,3.1,15,34.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Unsichtbaren Krallen des Dr. Mabuse, Die",1962,89,NA,3.1,58,24.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Unsinkable Molly Brown, The",1964,128,NA,6.6,497,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Unspeakable",2002,108,NA,3.6,260,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Unsteady Chough, The",2004,5,NA,8.6,9,14.5,0,0,0,0,0,0,24.5,0,64.5,"",0,1,0,0,0,0,1 -"Unsterbliche Herz, Das",1939,107,NA,6.8,5,0,0,24.5,0,24.5,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Unstoppable",2004,96,15000000,4.8,579,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,1,1,0,0,0 -"Unstrung Heroes",1995,93,NA,6.7,1008,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Unsuitable Job for a Woman, An",1982,94,NA,5.7,34,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Unsuspected, The",1947,103,NA,7.2,200,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Untama giru",1989,120,NA,7.1,12,0,0,0,4.5,4.5,0,0,44.5,0,44.5,"",0,0,0,0,0,0,0 -"Untamed",1929,86,NA,4.9,47,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Untamed",1955,111,NA,6.2,66,0,0,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Untamed Breed, The",1948,79,NA,5.2,13,0,0,4.5,4.5,45.5,4.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Untamed Frontier",1952,78,NA,4,18,14.5,4.5,0,24.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Untamed Heart",1993,102,NA,6.5,2691,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Untamed Mistress",1956,70,NA,3.5,6,64.5,0,0,0,0,0,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Untamed Women",1952,70,NA,1,8,64.5,0,0,14.5,14.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Untamed Youth",1957,80,NA,3.5,65,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Unter Geiern",1964,98,NA,5.5,117,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Unter den Palmen",1999,82,NA,4.9,69,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Unter den tausend Laternen",1952,94,NA,8.5,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,0,0,0,0,0 -"Untergang, Der",2004,156,NA,8.4,8039,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Unterm Birnbaum",1973,90,NA,6.7,6,0,0,0,14.5,0,45.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Untertage",2003,25,NA,6.6,6,0,0,0,0,14.5,14.5,14.5,34.5,14.5,0,"",0,0,0,0,1,0,1 -"Untertan, Der",1951,97,NA,7.9,105,0,4.5,0,0,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Unterwegs",2004,80,NA,5.9,37,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Until Death",2002,80,NA,3.7,11,14.5,0,4.5,4.5,24.5,0,4.5,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Until I Hear from You",1998,42,NA,6.3,6,45.5,0,0,0,0,0,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Until September",1984,95,NA,5.4,144,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Until They Sail",1957,94,NA,6.3,117,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Until the Night",2004,87,NA,3.9,29,24.5,4.5,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Untold, The",2002,92,3000000,3.8,400,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Untouchables, The",1987,119,25000000,7.9,31587,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Unveiled",1994,103,NA,4.1,34,14.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Unwelcome",2004,15,NA,7.2,8,14.5,0,0,0,14.5,24.5,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Unzipped",1995,73,NA,6,348,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Uomini contro",1970,100,NA,7.4,70,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Uomini dal passo pesante, Gli",1966,105,NA,6,14,4.5,0,0,14.5,14.5,24.5,24.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Uomini duri",1974,92,NA,4.7,27,0,4.5,14.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Uomini e lupi",1956,94,NA,4.4,11,14.5,0,0,0,14.5,4.5,44.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Uomini senza donne",1996,100,NA,5.7,14,14.5,0,0,14.5,0,44.5,24.5,4.5,0,0,"",0,0,1,1,0,0,0 -"Uomini si nasce poliziotti si muore",1976,100,NA,5.5,51,4.5,4.5,0,4.5,24.5,4.5,24.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Uomini sul fondo",1941,94,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,1,1,0,0 -"Uomini, che mascalzoni!, Gli",1932,67,NA,7.9,13,0,0,0,0,0,0,14.5,34.5,44.5,4.5,"",0,0,1,0,0,0,0 -"Uomo che guarda, L'",1994,97,NA,6.1,136,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Uomo che ride, L'",1966,98,NA,4.4,23,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Uomo chiamato Apocalisse Joe, Un",1971,96,NA,6.2,8,14.5,0,24.5,0,14.5,0,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Uomo d'acqua dolce",1996,90,NA,6.4,60,14.5,0,4.5,0,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Uomo da rispettare, Un",1972,112,NA,5.4,46,4.5,0,0,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Uomo dalla croce, L'",1943,72,NA,5.4,13,0,4.5,0,14.5,34.5,14.5,4.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Uomo dalla pelle dura, L'",1971,83,NA,2.8,15,14.5,4.5,4.5,14.5,24.5,24.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Uomo dei cinque palloni, L'",1965,85,NA,6.3,11,0,0,0,0,0,44.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Uomo delle stelle, L'",1995,113,NA,7.1,662,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Uomo di paglia, L'",1957,120,NA,6.5,7,0,0,0,14.5,0,0,0,45.5,0,24.5,"",0,0,0,1,0,0,0 -"Uomo mascherato",1965,105,NA,2.6,8,24.5,14.5,0,24.5,0,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Uomo perbene, Un",1999,119,NA,5.6,39,4.5,4.5,4.5,4.5,4.5,14.5,45.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Uomo puma, L'",1980,90,NA,2.1,886,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,1,0 -"Uomo venuto per uccidere, L'",1968,87,NA,4.3,11,0,0,24.5,4.5,0,4.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Uomo, l'orgoglio, la vendetta, L'",1968,91,NA,5.4,30,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Uomo, un cavallo, una pistola, Un",1967,96,NA,4.5,15,0,0,4.5,14.5,24.5,4.5,4.5,4.5,0,44.5,"",0,0,0,0,0,0,0 -"Uot, Zoo!",1986,23,NA,5.1,10,34.5,0,0,0,24.5,24.5,0,14.5,24.5,0,"",0,0,0,0,1,0,1 -"Up 'n Coming",1983,83,NA,6.7,48,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Up 'n' Under",1998,99,1000000,5.2,262,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Up Against Amanda",2000,102,NA,4.3,113,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Up Close & Personal",1996,124,60000000,5.7,3201,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Up Front",1951,92,NA,7.5,17,0,0,0,0,4.5,4.5,34.5,4.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Up Goes Maisie",1946,89,NA,5.9,13,0,0,0,34.5,0,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Up Periscope",1959,112,NA,6.6,208,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Up Pompeii",1971,90,NA,4.9,138,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Up Pops the Devil",1931,85,NA,7.3,5,0,0,0,0,24.5,0,44.5,0,24.5,24.5,"",0,0,1,0,0,0,0 -"Up Syndrome",2000,82,NA,3.2,20,14.5,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Up Tight!",1968,104,NA,6.4,21,4.5,0,0,4.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Up Up and Away",1984,86,NA,4.5,7,0,0,14.5,14.5,0,24.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Up Uranus!",1971,86,NA,9.4,19,4.5,0,0,0,0,0,0,4.5,0,84.5,"",0,0,0,0,0,0,0 -"Up Your Alley",1988,88,NA,4.6,29,4.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Up a Tree",1955,7,NA,7.5,29,0,0,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Up at the Villa",2000,115,NA,5.9,740,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"Up for Grabs",2003,7,NA,9.3,10,0,0,0,0,14.5,0,14.5,0,14.5,74.5,"",0,0,1,0,0,0,1 -"Up for Grabs",2005,90,NA,7.8,20,0,0,4.5,0,0,0,24.5,24.5,14.5,44.5,"",0,0,1,0,1,0,0 -"Up from the Beach",1965,99,NA,6.5,13,0,0,4.5,0,14.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Up from the Depths",1979,75,NA,2.2,44,45.5,14.5,14.5,4.5,4.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Up in Arms",1944,106,2000000,6.5,137,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Up in Central Park",1948,84,NA,6.6,23,14.5,4.5,4.5,0,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Up in Daisy's Penthouse",1953,16,NA,6.6,32,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Up in Mabel's Room",1944,76,NA,6.7,24,0,0,0,0,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Up in Smoke",1957,61,NA,5.8,14,14.5,0,4.5,14.5,0,4.5,44.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Up in Smoke",1978,86,NA,6.5,4459,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Up in Smoke",2001,2,NA,8.6,7,0,0,0,0,14.5,0,14.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Up in the Air",1940,62,NA,6.2,13,0,0,0,4.5,4.5,24.5,0,34.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Up in the Cellar",1970,94,NA,5.3,37,14.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Up in the World",1956,87,NA,5.4,47,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Up the Academy",1980,87,NA,3.6,288,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Up the Chastity Belt",1971,94,NA,4.7,77,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Up the Creek",1958,83,NA,6.1,29,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Up the Creek",1984,95,NA,4.7,480,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Up the Down Staircase",1967,124,NA,6.8,255,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Up the Front",1972,89,NA,4.6,37,4.5,14.5,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Up the Junction",1968,119,NA,6.5,54,4.5,0,0,4.5,4.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Up the River",1930,92,NA,4.7,54,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Up the Sandbox",1972,97,NA,5.2,196,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Up to His Neck",1954,90,NA,4.8,7,0,0,0,24.5,44.5,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Up!",1976,80,NA,5.9,311,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Up-Standing Sitter, The",1948,7,NA,6.6,37,4.5,0,0,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Upal",1964,85,NA,4.1,9,14.5,0,0,0,14.5,24.5,0,0,24.5,34.5,"",0,0,0,0,0,0,0 -"Upast vverh",2002,90,NA,7.9,11,0,0,0,4.5,14.5,4.5,0,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Upgrade, The",2000,17,NA,5,17,4.5,0,4.5,4.5,24.5,24.5,0,14.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Upheaval",2001,15,NA,6.1,30,0,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Uphill All the Way",1986,86,NA,3.3,33,14.5,24.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Upir z Feratu",1981,90,NA,6.5,34,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Upkar",1967,175,NA,8.9,38,0,0,0,0,0,4.5,14.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Uppdraget",1977,95,NA,6.1,24,4.5,0,4.5,0,14.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Upperworld",1934,73,NA,5.9,27,0,0,0,4.5,14.5,45.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Uppo-Nalle",1991,66,NA,5.4,5,24.5,0,0,0,24.5,0,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Uprowadzenie Agaty",1993,76,NA,5.7,32,4.5,4.5,4.5,4.5,4.5,24.5,14.5,0,4.5,14.5,"",0,0,1,1,0,0,0 -"Ups & Downs",1981,97,NA,6.5,9,0,0,14.5,14.5,14.5,0,14.5,24.5,0,34.5,"",0,0,1,0,0,0,0 -"Ups and Downs",1937,21,NA,5.9,11,0,0,0,0,14.5,34.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,1 -"Upside Down",2002,14,NA,7,11,0,0,0,14.5,0,4.5,34.5,24.5,4.5,0,"",0,0,0,1,0,0,1 -"Upside of Anger, The",2005,118,13200000,7.2,1160,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,1,0,1,0 -"Upstairs Neighbour, The",1994,90,100000,6.1,12,4.5,0,0,14.5,0,4.5,14.5,34.5,14.5,0,"",0,0,0,0,0,0,0 -"Upstairs and Downstairs",1959,89,NA,6.5,34,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Upswept Hare",1953,8,NA,6.6,23,0,0,0,0,0,34.5,44.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Uptown Girls",2003,93,NA,5.4,2417,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Uptown New York",1932,80,NA,5.8,10,0,0,0,0,14.5,74.5,14.5,14.5,0,0,"",0,0,0,0,0,1,0 -"Uptown Saturday Night",1974,104,3000000,5.9,278,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ur-Musig",1993,107,NA,8.7,7,0,0,0,0,0,0,0,45.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Uramisten",1985,93,NA,9.2,13,0,0,0,0,0,0,0,4.5,34.5,64.5,"",0,0,0,1,0,0,0 -"Uranus",1990,100,NA,6.8,256,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Urban Chaos Theory",2000,21,NA,5.5,26,44.5,4.5,0,0,0,4.5,0,4.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Urban Cowboy",1980,132,NA,5.8,2178,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Urban Cowgirls",1980,84,NA,4.2,12,0,24.5,0,14.5,0,34.5,0,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Urban Ghost Story",1998,82,300000,5.3,167,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Urban Guerillas",2004,81,NA,8.1,7,0,0,0,0,14.5,0,24.5,14.5,0,44.5,"",0,0,1,1,0,0,0 -"Urban Legend",1994,25,NA,5,22,4.5,4.5,4.5,14.5,4.5,44.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,1 -"Urban Legend",1998,99,14000000,5.1,8245,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Urban Legends: Final Cut",2000,97,15000000,3.8,3280,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Urban Massacre",2002,90,NA,1.6,23,44.5,4.5,4.5,0,4.5,0,0,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Urban Mythology",2000,109,NA,8,14,4.5,0,0,0,0,4.5,4.5,14.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Urban Relics",1998,96,500000,8.3,6,0,0,0,0,0,0,45.5,0,14.5,34.5,"",0,0,1,0,0,0,0 -"Urban Safari",1996,92,NA,4.8,21,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,0,0,0,0 -"Urban Warriors",1987,90,NA,2.2,12,24.5,44.5,0,0,4.5,0,14.5,4.5,0,0,"",1,0,0,0,0,0,0 -"Urbania",2000,106,225000,6.9,1089,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Urbania",2001,70,NA,8.5,29,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,1,0,0 -"Urga",1991,106,NA,7.7,592,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Urgence",1985,96,NA,5.6,17,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Urgences",1988,105,NA,6.4,9,0,0,0,0,14.5,34.5,0,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Urgh! A Music War",1981,96,NA,7.1,155,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Urine",1999,4,NA,8.8,8,0,0,0,0,0,0,0,34.5,45.5,14.5,"",0,0,0,0,0,0,1 -"Urine: Good Health",1999,56,NA,4.4,14,14.5,4.5,4.5,4.5,14.5,0,4.5,4.5,0,34.5,"",0,0,0,0,1,0,0 -"Urlatori alla sbarra",1960,83,NA,6.7,10,0,0,0,0,0,24.5,45.5,24.5,0,14.5,"",0,0,1,1,0,0,0 -"Urlo dei giganti, L'",1969,104,NA,4.6,14,14.5,14.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Urlo nelle tenebre, Un",1975,88,NA,4,26,24.5,14.5,4.5,14.5,14.5,14.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Urlo, L'",1970,93,NA,6.5,6,0,0,14.5,0,0,0,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Urnebesna tragedija",1994,95,NA,6.9,24,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Uroki v kontse vesnoy",1989,75,NA,6.5,10,0,0,0,0,34.5,0,34.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Urotoruman - kaiju daikessen",1979,100,NA,7.3,5,0,0,0,0,0,0,44.5,44.5,24.5,0,"",1,0,0,0,0,0,0 -"Urs al-jalil",1987,113,NA,7.4,83,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ursus",1961,90,NA,3.1,15,14.5,24.5,14.5,14.5,0,4.5,14.5,14.5,4.5,0,"",1,0,0,0,0,0,0 -"Ursus e la ragazza tartara",1962,85,NA,6.2,5,0,0,24.5,24.5,0,44.5,0,24.5,0,0,"",1,0,0,1,0,0,0 -"Ursus nella terra di fuoco",1963,87,NA,3.8,15,14.5,0,14.5,4.5,14.5,4.5,4.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Ursus nella valle dei leoni",1961,85,NA,6.2,14,4.5,0,14.5,0,4.5,14.5,0,34.5,0,24.5,"",1,0,0,1,0,0,0 -"Ursus, il gladiatore ribelle",1963,90,NA,3.8,8,0,24.5,14.5,14.5,24.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Ursus, il terrore dei kirghisi",1964,90,NA,4.1,7,14.5,0,0,44.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Urusei Yatsura 5: Kanketsuhen",1988,85,NA,7.7,38,0,0,0,0,4.5,4.5,14.5,24.5,4.5,44.5,"",0,1,1,0,0,0,0 -"Urusei Yatsura 6: Itsudatte My Darling",1991,77,NA,6.1,28,0,0,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Urutoraman",1967,79,NA,7.9,17,0,0,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Urutoraman Teiga & Urutoraman Daina & Urutoraman Gaia: Choujikuu no daiketsugeki",1998,74,NA,6.7,9,0,0,0,0,24.5,0,44.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Urzad",1966,5,NA,5.7,42,4.5,4.5,0,14.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Usatyy nyan",1977,75,NA,5.7,9,0,0,0,24.5,0,0,34.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Used Cars",1980,113,NA,6.5,2135,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Used People",1992,115,NA,5.4,371,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Usher",2002,40,NA,3.2,10,14.5,14.5,24.5,0,0,0,24.5,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Usher",2004,91,55000,7.3,11,0,4.5,0,0,4.5,4.5,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Ushi Says: Hi!",2001,81,NA,3.8,12,14.5,0,0,0,0,14.5,4.5,14.5,0,44.5,"",0,0,1,0,0,0,0 -"Ushpizin, Ha-",2004,90,NA,8.2,31,0,4.5,0,0,0,0,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Usmiech zebiczny",1957,2,NA,6.2,112,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Uspekh",1984,93,NA,9,6,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Usted puede ser un asesino",1961,96,NA,5.3,6,0,0,0,14.5,14.5,14.5,34.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Ustedes los ricos",1948,130,NA,8.6,39,0,0,0,0,0,4.5,4.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Usual Suspects, The",1995,106,6000000,8.7,103854,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"R",0,0,0,0,0,0,0 -"Usugesho",1985,124,NA,7.8,12,4.5,0,0,0,0,0,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Usurer, The",1910,17,NA,5.4,13,4.5,4.5,0,4.5,14.5,24.5,4.5,14.5,14.5,0,"",0,0,0,1,0,0,1 -"Usynlige pattebarn, Det",1982,18,NA,6.5,6,0,0,0,0,0,84.5,0,0,14.5,0,"",0,0,0,0,0,0,1 -"Uta andon",1943,93,NA,8,7,0,0,0,0,0,0,24.5,45.5,0,14.5,"",0,0,0,0,0,0,0 -"Utah",1945,77,NA,5.7,14,0,0,0,24.5,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Utah Kid, The",1930,57,NA,6,5,0,0,24.5,24.5,0,0,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Utah Trail, The",1938,56,NA,4.7,6,0,0,14.5,14.5,45.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Utamaro o meguru gonin no onna",1946,106,NA,7.4,56,0,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Utamaro: Yume to shiriseba",1977,140,NA,7.2,5,0,0,0,0,24.5,0,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Utan dig",2003,29,NA,6.4,5,0,0,0,24.5,0,44.5,24.5,0,24.5,0,"",0,0,0,1,0,0,1 -"Ute av drift!",1992,110,NA,6.4,26,14.5,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Utekajme, uz ide",1987,81,NA,7,11,0,4.5,0,0,0,24.5,14.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Utharipookal",1979,143,NA,8.8,5,0,0,0,0,0,24.5,0,0,44.5,44.5,"",0,0,0,0,0,0,0 -"Utilities",1981,94,NA,4.3,17,0,0,14.5,24.5,24.5,14.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Utomlyonnye solntsem",1994,132,2800000,7.6,2173,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"R",0,0,0,1,0,0,0 -"Utopia",1978,92,NA,6.2,15,4.5,0,0,0,0,0,34.5,44.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Utopia",1983,198,NA,6.6,10,0,0,0,0,14.5,24.5,34.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Utopia Blues",2001,97,NA,3.6,114,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Utopia of Death",1940,10,NA,5.4,17,14.5,0,0,14.5,24.5,14.5,4.5,4.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Utopian Society, The",2003,93,NA,5.1,16,4.5,0,0,0,24.5,4.5,4.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Utsav",1984,145,NA,7.4,19,0,4.5,0,0,0,4.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Utsukushii natsu kirishima",2002,118,NA,5.2,8,0,0,0,34.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Utsukushisa to kanashimi to",1965,106,NA,7.4,7,0,0,0,0,0,0,24.5,44.5,0,24.5,"",0,0,0,0,0,0,0 -"Uttara",2000,99,NA,6.3,52,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Uttoran",1994,90,NA,9.2,6,0,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,0,1,0,0,0 -"Utvandrarna",1971,191,NA,8,415,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Utz",1992,98,NA,7,68,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Uuno Epsanjassa",1985,99,NA,5.5,188,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Uuno Turhapuro",1973,87,NA,5.8,122,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Uuno Turhapuro - This Is My Life",2004,104,NA,5.2,128,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Uuno Turhapuro, Suomen tasavallan herra presidentti",1992,84,NA,3.9,112,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Uuno Turhapuron aviokriisi",1981,91,NA,5.1,73,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Uuno Turhapuron poika",1993,91,NA,3.7,68,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Uunon huikeat poikamiesvuodet maaseudulla",1990,94,NA,4.5,85,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Uvidet Parizh i umeret",1992,120,NA,4,9,24.5,0,0,0,24.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Uwasa no onna",1954,83,NA,7.4,27,0,0,0,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Uzak",2002,110,NA,7.7,1003,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Uzel",1999,91,NA,4.9,18,4.5,4.5,4.5,14.5,14.5,0,0,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Uzicka republika",1974,170,NA,5.3,18,4.5,14.5,0,4.5,24.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"V",2003,18,NA,7.2,10,14.5,24.5,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"V boy idut odni stariki",1973,92,NA,7.5,73,4.5,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,1,0,0,0 -"V chetverg i bolshe nikogda",1977,93,NA,9.4,20,14.5,0,4.5,0,0,0,4.5,0,24.5,64.5,"",0,0,0,1,0,1,0 -"V dvizhenii",2002,89,NA,5.4,32,14.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"V gorode S.",1966,106,NA,8.8,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"V gorode Sochi tyomnye nochi",1989,115,NA,7.3,9,0,0,0,14.5,0,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"V kocke",1999,6,NA,4.9,15,0,0,4.5,0,4.5,14.5,14.5,0,4.5,45.5,"",0,1,0,0,0,0,1 -"V leru",1999,92,250000,7,114,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"V lyudyakh",1939,100,NA,6.7,13,0,0,0,0,14.5,14.5,4.5,4.5,34.5,14.5,"",0,0,0,1,0,0,0 -"V moey smerti proshu vinit Klavu K.",1979,76,NA,8.3,11,0,0,0,0,4.5,0,0,45.5,14.5,14.5,"",0,0,0,1,0,1,0 -"V nachale slavnykh del",1981,134,NA,6.9,6,0,0,0,0,14.5,0,45.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"V ogne broda net",1967,110,NA,9.4,20,0,0,0,0,0,0,14.5,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"V petek zvecer",2000,89,NA,4.5,42,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,"",0,0,1,0,0,1,0 -"V poiskakh zolotogo fallosa",1992,90,NA,3.2,5,84.5,0,0,24.5,0,0,0,0,0,0,"",0,0,1,0,0,0,0 -"V shest chasov vechera posle voyny",1944,65,NA,8.2,10,0,0,0,14.5,0,24.5,24.5,0,44.5,14.5,"",0,0,0,0,0,1,0 -"V temnote",2004,41,NA,8.2,5,0,0,0,0,24.5,0,0,24.5,44.5,24.5,"",0,0,0,0,1,0,1 -"V toy strane...",1997,87,NA,7,42,0,0,0,0,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,1,0,0 -"V zone osobogo vnimaniya",1978,98,NA,6.4,19,4.5,0,0,4.5,14.5,4.5,34.5,24.5,0,14.5,"",1,0,0,0,0,0,0 -"V.D.",1961,91,1000,3.5,17,14.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"V.I. Warshawski",1991,89,NA,4.4,1221,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"V.I.P.",1991,110,NA,6.5,10,14.5,0,14.5,0,14.5,24.5,34.5,24.5,0,0,"",1,0,0,0,0,0,0 -"V.I.P.s, The",1963,120,4000000,6.2,366,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"V.O.",2001,17,NA,5.9,12,0,0,4.5,0,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,1 -"V: The Hot One",1978,97,NA,6.7,23,0,4.5,0,4.5,4.5,4.5,24.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"VI olympiske vinterleker Oslo 1952, De",1952,103,NA,5.4,5,0,0,24.5,0,0,64.5,0,24.5,0,0,"",0,0,0,0,1,0,0 -"VIP: Very Important Pinoys",2003,48,NA,3,6,14.5,34.5,14.5,14.5,0,14.5,0,0,0,0,"",0,0,0,0,1,0,0 -"Va Banque",1986,95,NA,6.5,13,14.5,0,0,4.5,24.5,0,0,4.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Va savoir",2001,157,NA,7.1,789,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Va' dove ti porta il cuore",1996,110,NA,4.9,44,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Va, petite!",2002,105,NA,6,6,0,14.5,0,0,0,64.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Va, vis, et deviens",2005,140,NA,7.9,69,0,0,0,0,4.5,4.5,4.5,24.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Vaada",2005,135,NA,5.5,37,4.5,4.5,4.5,4.5,4.5,14.5,24.5,0,4.5,34.5,"",0,0,0,1,0,1,0 -"Vaanaprastham",1999,120,NA,5.6,52,4.5,0,0,4.5,14.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Vaarallista vapautta",1962,100,NA,5.8,5,0,0,0,0,64.5,24.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Vabank",1981,108,NA,8.6,219,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Vabank II, czyli riposta",1985,101,NA,7.5,114,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Vacaciones de terror",1988,90,NA,5.3,8,14.5,0,14.5,14.5,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vacances au pays",2000,75,NA,5.9,9,0,0,0,0,14.5,44.5,14.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Vacances de M. Hulot, Les",1953,85,NA,7.6,1815,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Vacances portugaises",1963,95,NA,8.5,8,0,0,0,0,0,14.5,24.5,0,24.5,34.5,"",0,0,0,1,0,0,0 -"Vacances, Les",1997,18,NA,3.1,15,24.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Vacancy",1999,14,NA,7.6,8,0,14.5,0,0,24.5,0,14.5,14.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Vacant Lot",2000,108,75000,6.1,12,0,0,4.5,0,0,14.5,14.5,4.5,44.5,4.5,"",0,0,0,1,0,1,0 -"Vacant Lot, The",1989,90,NA,4.8,6,0,0,14.5,0,45.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Vacant Possession",1995,95,NA,6.2,20,0,0,0,14.5,14.5,0,14.5,44.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Vacant Possession",2003,7,NA,9.2,6,0,0,0,0,0,0,0,14.5,45.5,34.5,"",0,0,0,0,0,0,1 -"Vacanza bestiale, Una",1980,92,NA,5.2,12,0,0,0,14.5,4.5,0,34.5,34.5,4.5,0,"",0,0,1,0,0,0,0 -"Vacanza, La",1971,101,NA,1.2,6,34.5,0,0,0,0,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Vacanze d'inverno",1959,100,NA,6.5,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Vacanze del signor Rossi, Le",1976,80,NA,7.7,9,0,14.5,0,0,0,0,34.5,14.5,14.5,34.5,"",0,1,0,0,0,0,0 -"Vacanze di Natale",1983,97,NA,5.3,57,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Vacanze di Natale '95",1995,92,NA,2.1,48,45.5,14.5,4.5,4.5,0,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Vacas",1992,92,NA,7,628,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Vacation",1983,98,NA,7.1,8559,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vacation from Love",1938,66,NA,5.5,5,0,0,0,44.5,0,44.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Vacation in Reno",1946,60,NA,5,10,0,14.5,34.5,14.5,0,24.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Vacation with Play",1951,7,NA,4.1,5,0,0,24.5,0,24.5,24.5,0,0,0,44.5,"",0,1,1,0,0,0,1 -"Vache et le prisonnier, La",1959,119,NA,7.3,140,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Vacheries",1990,26,NA,8.5,10,0,0,0,0,0,0,34.5,24.5,45.5,0,"",0,0,0,0,0,0,1 -"Vacuum",2002,10,NA,4.2,6,0,0,0,64.5,0,14.5,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Vacuuming Completely Nude in Paradise",2001,76,NA,6.2,247,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vado a vivere da solo",1982,98,NA,5.4,18,4.5,14.5,0,14.5,14.5,24.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Vado... l'ammazzo e torno",1967,98,NA,5.7,50,4.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vagabond",2003,99,NA,5.1,21,14.5,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vagabond King, The",1930,104,NA,4.3,11,14.5,0,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Vagabond King, The",1956,86,NA,5.5,29,4.5,4.5,0,4.5,24.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Vagabond Lady",1935,71,NA,6.1,25,4.5,0,0,0,14.5,44.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Vagabond Loafers",1949,16,NA,7.4,42,0,0,4.5,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Vagabond Lover, The",1929,65,NA,5.5,23,4.5,0,14.5,14.5,24.5,4.5,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Vagabond, The",1916,34,NA,7,238,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Vagabundo, El",1953,95,NA,8.1,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,1,1,0,0,0 -"Vaghe stelle dell'Orsa...",1965,95,NA,7.7,98,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vagrant, The",1992,91,NA,4.7,106,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vai Trabalhar Vagabundo",1973,100,NA,6.2,18,14.5,0,4.5,0,14.5,0,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Vai viegli but jaunam?",1987,83,NA,7.1,10,0,0,0,14.5,14.5,0,14.5,24.5,14.5,44.5,"",0,0,0,1,1,0,0 -"Vaikai is America viesbucio",1990,88,NA,7.6,19,14.5,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Vaimoke",1936,82,NA,6.7,20,4.5,0,0,4.5,14.5,24.5,14.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Vajont - La diga del disonore",2001,116,NA,6.5,173,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vakantiefilm BV",2002,25,NA,5.3,11,14.5,0,0,4.5,4.5,24.5,4.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Vakonesh panjom",2003,106,NA,6,24,14.5,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vakvagany",2002,86,20000,6.3,30,14.5,0,0,14.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Valachi Papers, The",1972,125,NA,6.1,230,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Valami Amerika",2002,115,NA,7.9,350,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Valdez Is Coming",1971,90,NA,6.6,317,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Valdez, il mezzosangue",1973,97,NA,5.3,168,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Valehtelija",1981,53,NA,8.1,50,0,0,0,0,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Valence Theory",2004,94,100000,5.3,20,14.5,14.5,14.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Valentin de las Sierras",1971,10,NA,5.1,5,0,24.5,24.5,0,0,24.5,0,0,44.5,0,"",0,0,0,0,0,0,1 -"Valentina",1981,100,NA,7.3,8,0,0,0,0,0,0,24.5,45.5,0,24.5,"",0,0,0,1,0,0,0 -"Valentina",1982,85,NA,6.9,37,4.5,0,4.5,4.5,0,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Valentina",1988,30,NA,4.3,13,0,14.5,4.5,24.5,4.5,4.5,4.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Valentine",2001,96,10000000,4.2,4779,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Valentino",1951,102,NA,5.4,30,0,14.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Valentino",1977,128,NA,5.8,161,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Valentino Returns",1989,102,NA,5,22,4.5,0,4.5,4.5,24.5,4.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Valerie",1957,84,NA,6.4,7,0,0,0,0,24.5,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Valerie Flake",1999,90,NA,5,63,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Valgaften",1998,11,NA,7.6,195,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Valhalla",1986,89,NA,7.5,231,0,0,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,0 -"Valhalla",2003,19,NA,5,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,0,1,0,0,1 -"Valiant",2005,75,NA,6.3,224,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,0 -"Valiant Is the Word for Carrie",1936,110,NA,5.5,9,0,14.5,0,0,14.5,0,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Valiant, The",1929,66,NA,6.4,6,0,0,0,0,0,64.5,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Valiant, The",1962,80,NA,6.6,6,0,0,0,0,0,45.5,34.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Valigia dei sogni, La",1953,100,NA,7.7,9,0,0,0,0,0,0,14.5,44.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Valise, La",1973,100,NA,5.3,41,4.5,4.5,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Valkanisateur",1998,97,NA,7.6,100,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Valkoinen peura",1952,74,NA,7.6,92,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Valkoiset ruusut",1943,102,NA,9.1,9,0,0,0,0,14.5,14.5,0,24.5,0,45.5,"",0,0,0,0,0,1,0 -"Valle de las espadas, El",1963,128,NA,5.7,18,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Vallen",2001,105,NA,6,78,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Valley Centro, El",2000,90,NA,6.1,15,24.5,0,0,0,4.5,0,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Valley Girl",1983,99,350000,5.9,2039,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Valley of Decision, The",1945,119,2160000,7.4,200,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Valley of Eagles",1951,82,NA,5.8,23,0,0,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Valley of Fire",1951,70,NA,5.2,11,0,0,4.5,14.5,24.5,4.5,24.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Valley of Gwangi, The",1969,96,NA,5.5,384,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Valley of Head Hunters",1953,67,NA,4.6,23,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Valley of Hunted Men",1942,60,NA,5.7,7,14.5,0,0,24.5,14.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Valley of Terror",1937,59,NA,5.9,7,0,0,0,24.5,0,24.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Valley of the Dolls",1967,123,5000000,5.5,967,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Valley of the Dragons",1961,79,NA,4.4,13,14.5,4.5,24.5,0,4.5,24.5,14.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Valley of the Giants",1938,79,NA,6.7,14,0,4.5,0,0,4.5,34.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Valley of the Kings",1954,86,NA,5.4,115,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Valley of the Stereos",1992,15,NA,6.2,37,14.5,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,1,0,0,1 -"Valley of the Sun",1942,78,NA,5.6,33,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Valley of the Zombies",1946,56,NA,3.8,13,14.5,14.5,4.5,24.5,24.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Valley, The",1976,20,NA,4,40,24.5,0,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Valmont",1989,137,NA,6.7,2156,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Vals licht",1993,90,NA,4.6,21,0,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vals, The",1982,99,NA,3.7,29,14.5,14.5,34.5,14.5,0,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Valse Triste",1977,5,NA,6,18,4.5,4.5,4.5,0,14.5,24.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Valse brillante de Chopin",1936,6,NA,7,7,0,14.5,0,0,0,44.5,14.5,0,24.5,0,"",0,0,0,0,0,0,1 -"Valse noot, De",1963,10,NA,7.1,6,0,0,0,0,0,14.5,14.5,45.5,14.5,0,"",0,1,0,0,0,0,1 -"Valse, La",1951,6,NA,4.6,7,24.5,0,0,0,14.5,45.5,0,0,0,0,"",0,0,0,0,1,0,1 -"Valseuses, Les",1974,117,NA,7.3,1019,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Valter brani Sarajevo",1972,133,NA,8.5,91,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Value for Money",1955,90,NA,6.1,25,0,0,0,14.5,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Vam i ne snilos...",1980,90,NA,8.7,39,4.5,0,0,0,4.5,0,4.5,14.5,14.5,64.5,"",0,0,0,1,0,1,0 -"Vamos a dejarlo",1999,15,NA,5.2,6,64.5,0,0,0,0,0,34.5,0,0,0,"",0,0,1,0,0,0,1 -"Vamping",1984,108,NA,5.7,16,4.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vampira",1974,88,NA,3.6,95,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Vampira - About Sex, Death and Taxes",1995,64,NA,4.3,10,0,0,14.5,14.5,0,24.5,0,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Vampire Bat, The",1933,71,NA,5.2,111,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vampire Blues",1999,91,NA,3.8,37,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Vampire Blvd.",2004,90,NA,1.1,10,24.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,0,0,0 -"Vampire Circus",1972,84,NA,6,305,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vampire Clan",2002,87,NA,4,173,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Vampire Cop",1990,89,NA,1.7,19,64.5,14.5,0,0,4.5,0,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vampire Holocaust",1997,72,NA,7.8,26,4.5,4.5,0,0,4.5,4.5,4.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Vampire Hookers",1979,88,NA,2,58,24.5,34.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vampire Hunter D",2000,103,NA,7.6,2606,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",1,1,0,1,0,1,0 -"Vampire Journals",1997,92,NA,4.6,235,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Vampire Junction",2001,94,NA,2,17,44.5,14.5,0,0,0,4.5,4.5,0,4.5,24.5,"",0,0,0,0,0,0,0 -"Vampire Knights",1987,90,NA,1.7,10,45.5,14.5,0,0,0,14.5,0,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Vampire Lesbian Kickboxers",2004,85,NA,3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",1,0,0,0,0,0,0 -"Vampire Lovers, The",1970,91,NA,6.1,453,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vampire Night",2000,76,NA,1.4,5,44.5,0,0,0,0,0,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Vampire Vixens from Venus",1995,90,NA,3.1,35,24.5,14.5,14.5,4.5,14.5,0,4.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Vampire Vs. Sorcerer",1990,91,NA,1.9,13,45.5,24.5,0,0,4.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Vampire at Midnight",1988,93,NA,3.3,36,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vampire in Brooklyn",1995,100,14000000,4.4,2716,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Vampire's Ghost, The",1945,59,NA,6.7,11,0,0,0,0,24.5,24.5,0,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vampire's Kiss",1989,103,NA,5.3,1022,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Vampire's Kiss",1993,89,NA,4.8,15,0,4.5,14.5,24.5,14.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vampires",1986,61,NA,7.6,5,0,0,24.5,0,0,24.5,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Vampires",1998,106,20000000,5.6,7908,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Vampires Anonymous",2003,88,NA,4.4,85,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"R",0,0,1,0,0,0,0 -"Vampires, Les",1915,399,NA,8.1,177,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Vampires: Los Muertos",2002,93,NA,4.4,1010,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Vampires: The Turning",2005,84,NA,3.4,59,14.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Vampiresas 1930",1962,105,NA,4.2,6,14.5,0,0,0,0,34.5,0,0,34.5,14.5,"",0,0,1,0,0,0,0 -"Vampiri, I",1957,78,NA,6.4,80,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vampiri, talasami",1992,105,NA,7,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Vampiro de la autopista, El",1970,90,NA,4.8,9,14.5,0,24.5,34.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Vampiro sangriento, El",1962,110,NA,4.1,19,4.5,24.5,14.5,14.5,14.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Vampiro, El",1957,84,NA,6.1,39,0,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Vampiros los prefieren gorditos, Los",1974,90,NA,2.1,12,24.5,14.5,0,4.5,4.5,0,0,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Vampyr - Der Traum des Allan Grey",1932,75,NA,7.5,840,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Vampyres",1974,84,NA,5.5,327,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vampyres, Les",2000,70,NA,5.3,22,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Vampyros lesbos",1971,91,NA,5.3,529,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Van God Los",2003,83,NA,7.4,939,4.5,4.5,4.5,4.5,4.5,4.5,24.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Van Gogh",1948,20,NA,6.2,10,0,14.5,0,0,14.5,14.5,34.5,0,34.5,14.5,"",0,0,0,0,0,0,1 -"Van Gogh",1991,158,NA,7.6,236,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Van Gogh: Darkness Into Light",1956,21,NA,5.8,24,4.5,0,0,4.5,4.5,24.5,44.5,4.5,0,4.5,"",0,0,0,0,1,0,1 -"Van Helsing",2004,132,160000000,5.4,19787,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Van Morrison in Ireland",1980,56,NA,1.9,9,24.5,24.5,14.5,0,0,0,14.5,14.5,24.5,0,"",0,0,0,0,1,0,0 -"Van Nuys Blvd.",1979,93,NA,3.8,37,24.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Van Wilder",2002,94,6000000,5.8,7799,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Van de koele meren des doods",1982,120,NA,6.1,100,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Van geluk gesproken",1987,100,NA,4.3,29,14.5,14.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Van, The",1977,92,NA,3.6,115,14.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Van, The",1996,100,NA,6.5,884,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Vana espuma",1998,28,NA,7.9,210,45.5,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Vana mees tahab koju",1991,133,NA,8,6,0,0,14.5,0,14.5,0,0,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vanad ja kobedad saavad jalad alla",2003,100,NA,6.9,102,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Vandring i solen, En",1978,100,NA,7.4,26,0,0,4.5,0,0,14.5,34.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vanessa",1977,91,NA,3.9,30,14.5,14.5,0,0,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Vanessa: Her Love Story",1935,74,NA,4.7,7,0,0,14.5,0,24.5,44.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Vangelo secondo Matteo, Il",1964,136,NA,7.5,918,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Vaniglia e cioccolato",2004,110,NA,6.3,26,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Vanilla Sky",2001,136,68000000,6.9,31250,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Vanille fraise",1989,110,NA,4.9,40,14.5,0,4.5,14.5,24.5,4.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Vanished",1998,55,NA,2.1,19,45.5,4.5,0,4.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vanishing American, The",1925,110,NA,8.1,38,0,0,0,4.5,14.5,4.5,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Vanishing American, The",1955,90,NA,5.5,16,0,0,4.5,0,24.5,34.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Vanishing Duck, The",1958,7,NA,5.8,23,0,0,0,14.5,14.5,24.5,34.5,0,4.5,4.5,"",0,1,1,0,0,0,1 -"Vanishing Legion, The",1931,220,NA,6.3,8,0,0,0,0,24.5,24.5,24.5,24.5,0,0,"",1,0,0,0,0,0,0 -"Vanishing Point",1971,106,NA,7,1607,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,0,1,0,0,0 -"Vanishing Point, The",1998,14,2000,9,6,0,0,0,14.5,0,0,0,0,0,84.5,"",0,0,0,0,0,0,1 -"Vanishing Prairie, The",1954,71,NA,8.1,42,0,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Vanishing Private, The",1942,7,NA,7.1,59,4.5,4.5,0,4.5,0,14.5,24.5,24.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Vanishing Shadow, The",1934,242,NA,6.6,9,0,0,0,0,24.5,14.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Vanishing Virginian, The",1942,97,NA,7.1,34,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Vanishing Wilderness",1974,93,NA,5.8,8,24.5,0,0,0,34.5,0,14.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Vanishing, The",1993,109,NA,5.9,3329,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vanity Fair",2004,141,23000000,6.1,2151,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Vanya on 42nd Street",1994,119,NA,7.3,970,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vapors",1963,32,NA,6.9,15,4.5,4.5,0,0,0,0,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Vaquilla, La",1985,122,NA,7.1,141,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Var paa Rundetaarn, Det",1955,105,NA,5,20,0,0,14.5,14.5,24.5,24.5,0,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"Varan the Unbelievable",1962,70,NA,3.9,40,14.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Varastettu kuolema",1938,101,NA,7.9,13,4.5,0,0,0,4.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vargens tid",1988,90,NA,3.3,33,24.5,4.5,4.5,34.5,14.5,4.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Vargtimmen",1968,90,NA,7.7,715,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Variations on a Cellophane Wrapper",1970,9,NA,6.4,16,0,0,4.5,14.5,4.5,4.5,14.5,34.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Varietease",1954,65,NA,4.6,25,14.5,0,4.5,4.5,14.5,4.5,34.5,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Variety",1983,100,NA,2.9,31,24.5,24.5,14.5,4.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Variety Girl",1947,93,NA,5.9,53,4.5,0,0,4.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Variety Time",1948,59,NA,6.8,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Variola vera",1981,110,NA,9,66,0,0,4.5,0,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Various Positions",2002,81,NA,6.6,13,0,4.5,0,4.5,0,4.5,24.5,14.5,0,34.5,"",0,0,1,1,0,0,0 -"Varis",2004,36,NA,5.3,10,24.5,14.5,0,0,14.5,0,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,1 -"Varjoja paratiisissa",1986,76,NA,7.2,226,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"Varljivo leto '68",1984,91,NA,8.9,92,4.5,0,4.5,0,0,4.5,4.5,4.5,24.5,64.5,"",0,0,1,0,0,0,0 -"Varsity Blues",1999,100,16000000,6,7974,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Varsity Show",1937,80,NA,6.6,37,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Varuh meje",2002,98,NA,5.6,108,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Varvara-krasa, dlinnaya kosa",1969,85,NA,6.2,27,0,0,0,4.5,4.5,34.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Vas ozhidayet grazhdanka Nikanorova",1978,87,NA,6.5,5,0,0,0,24.5,0,24.5,24.5,44.5,0,0,"",0,0,0,0,0,1,0 -"Vase de noces",1974,82,NA,5,29,14.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Vasectomy: A Delicate Matter",1986,92,NA,2.3,29,44.5,14.5,4.5,4.5,0,4.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Vash syn i brat",1965,92,NA,8.8,5,0,0,0,0,0,0,24.5,44.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Vashi paltsy pakhnut ladanom!",1993,111,NA,4.4,8,0,0,74.5,0,0,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Vasika kalispera sas",1982,90,NA,7.7,38,4.5,0,4.5,4.5,4.5,4.5,0,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Vasilias, O",2003,130,NA,7.5,47,4.5,0,4.5,4.5,0,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vasilisa",2001,103,NA,7.6,5,24.5,0,0,0,0,0,24.5,0,0,64.5,"",0,0,0,0,0,0,0 -"Vasilisa prekrasnaya",1939,72,NA,7.3,9,0,0,0,0,0,24.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Vassa",1983,140,NA,8,13,0,4.5,0,0,0,4.5,0,44.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Vassiliki",1997,135,NA,7.1,9,14.5,0,0,0,0,0,74.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Vasthuhara",1991,103,NA,9,5,0,0,0,0,0,0,0,24.5,64.5,24.5,"",0,0,0,0,0,0,0 -"Vatel",2000,125,36000000,6.4,1322,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Vater braucht eine Frau",1952,98,NA,4.9,8,0,14.5,14.5,14.5,14.5,14.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Vater sein dagegen sehr",1957,95,NA,5.3,27,4.5,0,0,24.5,14.5,14.5,4.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vater, Mutter und neun Kinder",1958,95,NA,5.8,29,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vault of Horror, The",1973,86,NA,5.8,184,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vault, The",2005,87,100000,2.4,64,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Vautours, Les",1975,91,NA,6,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Vavilon XX",1979,100,NA,7.8,5,0,0,0,0,24.5,0,0,64.5,0,24.5,"",0,0,0,1,0,0,0 -"Vaxdockan",1962,96,NA,5,14,0,0,4.5,24.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vaya con Dios",2002,106,NA,7.3,244,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Vaya par de gemelos",1978,101,NA,3,23,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Vchera",1988,84,NA,8.2,148,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,74.5,"",0,0,0,1,0,0,0 -"Vdovstvo Karoline Zasler",1976,109,NA,6.7,8,0,0,14.5,0,0,24.5,24.5,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Ve'Lakhta Lehe Isha",2004,97,NA,7.4,29,0,0,4.5,0,4.5,24.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Veau d'or, Le",2001,30,NA,4.4,6,0,0,34.5,0,0,0,45.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Vec vidjeno",1987,102,NA,8.4,43,0,0,0,4.5,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Vecchio testamento, Il",1962,88,NA,1.6,7,24.5,14.5,0,14.5,44.5,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Vecher nakanune Ivana Kupala",1968,71,NA,7.1,16,0,0,0,0,4.5,24.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vechera na khutore bliz Dikanki",1961,69,NA,8.2,21,0,0,0,0,0,4.5,14.5,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Ved vejen",1988,95,NA,5.6,34,14.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Ved verdens ende",2000,47,NA,4.3,5,0,0,44.5,0,44.5,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Vedenalainen Islanti",1997,52,NA,3.6,7,0,14.5,0,0,14.5,14.5,14.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Vedi Napoli e poi muori",1951,80,NA,4.8,7,0,0,14.5,24.5,14.5,44.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Vedo nudo",1969,105,NA,5.8,20,0,0,4.5,14.5,14.5,24.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Veer-Zaara",2004,192,7000000,7.2,446,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Vegas Vacation",1997,93,NA,5,4543,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG",0,0,1,0,0,0,0 -"Vegas in Space",1991,85,NA,3.4,77,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Vegas, City of Dreams",2001,93,NA,2.6,16,24.5,4.5,0,0,14.5,4.5,0,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Veil",1990,87,NA,6.7,6,14.5,0,0,14.5,0,14.5,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Veils of Bagdad, The",1953,82,NA,4.6,16,0,4.5,14.5,14.5,24.5,24.5,14.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Vejrhanen",1952,99,NA,6.7,10,0,0,14.5,0,0,24.5,64.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Vela para el diablo, Una",1973,83,NA,3.7,32,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Veld",1987,78,NA,8,5,0,0,0,24.5,0,0,24.5,0,24.5,44.5,"",0,0,0,0,0,0,0 -"Velho, o Mar e o Lago, O",2000,20,NA,6.5,9,14.5,0,0,0,24.5,0,34.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Velichieto na hana",1984,92,NA,9.4,7,0,0,0,0,0,0,14.5,0,14.5,74.5,"",0,0,0,1,0,0,0 -"Velika frka",1992,92,NA,4.9,7,24.5,0,0,0,24.5,14.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Veliki transport",1983,134,NA,5.7,6,34.5,0,34.5,0,0,0,14.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Velikiy uteshitel",1933,95,NA,6.3,5,0,0,24.5,0,0,0,0,64.5,24.5,0,"",0,0,0,1,0,0,0 -"Velikiy voin Albanii Skanderbeg",1953,90,NA,7.8,8,24.5,0,0,0,0,0,0,0,0,74.5,"",0,0,0,1,0,0,0 -"Velinhas",1998,11,NA,7.6,5,0,0,0,0,0,24.5,44.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Vella kalpi",1970,90,NA,8.8,14,0,0,0,0,0,0,4.5,14.5,24.5,45.5,"",0,0,0,0,0,0,0 -"Vella kalpi vella dzirnavas",1972,92,NA,8.7,10,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Velluto nero",1977,85,NA,3.7,23,4.5,14.5,4.5,24.5,4.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Velnio nuotaka",1973,78,NA,8.7,92,4.5,4.5,4.5,0,0,4.5,4.5,0,4.5,84.5,"",0,0,0,0,0,0,0 -"Velocity Rules",2001,18,NA,1.8,14,34.5,34.5,0,0,4.5,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Velocity Trap",1997,86,NA,3.8,233,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Velocity of Gary, The",1998,100,4000000,4.7,570,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"Veloma",2001,100,NA,6.7,10,0,14.5,0,14.5,14.5,14.5,44.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Velvet Dreams",1988,78,NA,2.4,7,24.5,14.5,0,14.5,0,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Velvet Goldmine",1998,124,NA,6.6,5041,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Velvet Smooth",1976,93,NA,2.1,22,34.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Velvet Touch, The",1948,100,NA,6.6,64,0,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Velvet Underground and Nico, The",1966,70,NA,7,94,4.5,0,0,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,0,1,0,0 -"Velvet Vampire, The",1971,80,NA,4.3,36,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Velvet and Rat Skins",2003,6,2000,9.4,5,0,0,0,0,0,0,0,0,64.5,44.5,"",0,1,0,0,0,0,1 -"Vem var Dracula?",1975,81,NA,5.7,22,4.5,0,0,14.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vendedora de rosas, La",1998,118,NA,7.8,115,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vendetta",1942,11,NA,5.4,6,0,0,0,14.5,14.5,0,14.5,14.5,0,34.5,"",0,0,0,1,0,0,1 -"Vendetta",1950,83,4000000,6,8,0,0,0,0,34.5,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Vendetta",1986,89,NA,5.1,37,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Vendetta dal futuro",1986,94,NA,4.4,66,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Vendetta dei barbari, La",1960,104,NA,5.1,5,0,0,0,0,64.5,0,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Vendetta di Ercole, La",1960,98,NA,3.2,30,4.5,14.5,14.5,14.5,34.5,14.5,4.5,14.5,0,0,"",1,0,0,0,0,0,0 -"Vendetta di Spartacus, La",1965,98,NA,3.4,6,45.5,14.5,0,0,14.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Vendetta di Ursus, La",1961,98,NA,5.2,5,0,0,0,0,44.5,64.5,0,0,0,0,"",1,0,0,1,0,0,0 -"Vendetta for the Saint",1969,94,NA,5.7,59,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vendetta: A Christmas Story",1997,21,NA,1.4,47,24.5,4.5,4.5,0,0,4.5,4.5,4.5,4.5,64.5,"",1,0,1,0,0,0,1 -"Venditore di morte, Il",1971,91,NA,6.6,8,0,0,14.5,0,14.5,34.5,0,24.5,0,14.5,"",0,0,0,0,0,0,0 -"Vendo cara la pelle",1968,90,NA,5.5,6,0,0,0,0,34.5,34.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Vendredi soir",2002,90,NA,6.5,373,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vendus",2004,91,NA,3.5,42,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Veneno para las hadas",1984,90,NA,8.8,16,0,4.5,0,0,0,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Venere imperiale",1963,140,NA,5.7,12,0,4.5,0,4.5,24.5,4.5,0,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Venetian Affair, The",1967,89,NA,4.9,60,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Venetian Bird",1952,90,NA,5.5,15,0,0,0,4.5,24.5,44.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Venexiana, La",1986,100,NA,3.8,40,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Venezia, la luna e tu",1958,106,NA,6.2,26,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Venganza de Don Mendo, La",1961,87,NA,6.5,24,0,0,4.5,4.5,0,4.5,34.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Venganza de la llorona, La",1974,87,NA,6.3,8,0,14.5,0,0,24.5,14.5,0,0,0,45.5,"",1,0,0,0,0,0,0 -"Venganza de la momia, La",1971,87,NA,5.3,15,4.5,0,4.5,44.5,4.5,0,4.5,0,0,34.5,"",1,0,0,0,0,0,0 -"Venganza de la momia, La",1973,91,NA,5,12,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Venganza de las mujeres vampiro, La",1970,90,NA,2.5,12,14.5,4.5,0,0,0,14.5,0,0,24.5,34.5,"",1,0,0,0,0,0,0 -"Venganza del doctor Mabuse, La",1972,100,NA,3.1,44,24.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Venganza del sexo, La",1971,85,NA,3.5,82,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Venganza, La",1959,122,NA,6.1,15,0,0,0,4.5,14.5,24.5,4.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Venganza, La",1999,90,NA,3.5,20,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Vengeance",1980,91,NA,3.3,7,14.5,14.5,0,0,0,0,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Vengeance Is Mine",1974,93,NA,5.2,34,0,4.5,4.5,4.5,24.5,14.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Vengeance Valley",1951,83,NA,5.7,159,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vengeance d'une femme, La",1990,133,NA,6,30,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vengeance de la femme en noir, La",1997,109,NA,4,22,4.5,0,14.5,4.5,14.5,24.5,4.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Vengeance of Fu Manchu, The",1967,91,NA,4.8,82,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Vengeance of She, The",1968,101,NA,4.6,78,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vengeance of a Soldier",1984,88,NA,3.4,11,14.5,4.5,24.5,14.5,4.5,4.5,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Vengo",2000,90,NA,6.2,350,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Venice Project, The",1999,86,NA,6.1,26,0,4.5,4.5,0,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Venice Showing Gondolas",1896,1,NA,5.1,5,24.5,0,0,0,24.5,24.5,0,44.5,0,0,"",0,0,0,0,0,0,1 -"Venice/Venice",1992,110,NA,5.4,83,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Venner",1960,90,NA,6.4,7,0,0,0,0,0,74.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Venner for altid",1987,95,NA,6.8,58,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Venom",1971,91,NA,2.5,12,45.5,0,24.5,0,4.5,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Venom",1982,92,NA,4.7,207,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Venomous",2001,97,NA,3.5,146,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,0,0,0,0 -"Vent d'est, Le",1970,100,NA,5.5,25,14.5,0,4.5,4.5,4.5,14.5,4.5,4.5,0,44.5,"",0,0,0,1,0,0,0 -"Vent de la nuit, Le",1999,95,NA,6.1,68,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vent de panique",1987,90,NA,4.4,14,0,0,24.5,24.5,24.5,24.5,4.5,0,0,0,"",0,0,0,0,0,0,0 -"Vent du Wyoming, Le",1994,99,NA,5.9,62,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vente a Alemania, Pepe",1971,95,NA,3.9,30,24.5,4.5,14.5,14.5,24.5,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vente a ligar al Oeste",1972,90,NA,1,5,84.5,0,0,0,24.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Vento di terra",2004,91,NA,6.5,26,4.5,4.5,0,14.5,0,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vento, di sera, Il",2004,97,NA,7.3,22,0,4.5,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ventre de Juliette, Le",2003,92,NA,6.4,16,0,0,0,4.5,14.5,24.5,14.5,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Ventriloquist Cat",1950,7,NA,7.9,46,4.5,4.5,4.5,0,0,4.5,24.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"Venus Blue",1998,11,NA,4.5,25,14.5,4.5,14.5,4.5,4.5,24.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,1 -"Venus Boyz",2002,102,NA,7.7,74,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Venus Descending",1997,97,NA,6.9,24,14.5,0,4.5,0,0,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Venus Factory, The",1998,83,NA,8,10,14.5,0,0,0,0,0,0,44.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Venus Peter",1989,94,NA,8.8,21,4.5,0,4.5,0,4.5,0,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Venus Rising",1995,91,NA,2.3,225,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Venus Talking",2001,95,NA,5.5,22,4.5,4.5,0,4.5,14.5,44.5,4.5,0,4.5,4.5,"",0,0,1,1,0,1,0 -"Venus and Mars",2001,94,NA,5.3,50,24.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,24.5,"R",0,0,1,0,0,1,0 -"Venus de Milo",2002,88,NA,3.1,11,4.5,0,14.5,0,14.5,0,0,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Venus in Furs",1967,65,8500,2.1,8,14.5,14.5,14.5,0,14.5,24.5,0,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Venus in Furs",1994,70,NA,3.5,39,14.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Venusfalle, Die",1988,107,NA,5.9,136,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vera",1986,92,NA,6.9,7,0,0,0,0,0,14.5,74.5,0,14.5,0,"",0,0,0,1,0,0,0 -"Vera",1987,85,NA,8,40,4.5,0,4.5,4.5,0,4.5,4.5,24.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Vera",2003,86,NA,6.8,12,0,14.5,4.5,0,4.5,0,0,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Vera Cruz",1954,95,3000000,7,779,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Vera Drake",2004,125,NA,7.9,2562,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"Vera storia della monaca di Monza, La",1981,79,NA,5,5,24.5,0,0,44.5,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Verano del potro, El",1991,100,NA,4.3,20,0,14.5,4.5,14.5,14.5,14.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Verano para matar, Un",1972,110,NA,5.5,29,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,0,4.5,"",1,0,0,0,0,0,0 -"Verbena de la Paloma, La",1934,78,NA,6.2,11,0,0,0,4.5,0,4.5,14.5,45.5,0,4.5,"",0,0,0,0,0,0,0 -"Verbena de la Paloma, La",1963,98,NA,2.8,12,14.5,4.5,4.5,14.5,4.5,0,0,4.5,0,34.5,"",0,0,1,0,0,0,0 -"Verboden bacchanaal, Het",1981,91,NA,3.8,6,14.5,14.5,14.5,14.5,14.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Verboden ogen",2002,16,NA,7.4,6,0,0,0,0,0,0,45.5,34.5,14.5,0,"",0,0,0,0,0,0,1 -"Verboden te zuchten",2001,98,NA,6.1,49,14.5,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Verborgen gebreken",2004,92,NA,6.3,21,0,4.5,0,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Verboten!",1959,87,NA,6.6,83,0,0,4.5,0,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Verbrande brug",1975,85,NA,6.3,13,0,0,34.5,4.5,0,14.5,4.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Verdad sobre el caso Savolta, La",1979,120,NA,5,13,0,4.5,0,0,34.5,14.5,14.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Verden til forskel, En",1989,96,NA,1.5,47,74.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Verdes Anos",1984,91,NA,8.5,9,14.5,0,0,14.5,0,14.5,0,45.5,14.5,0,"",0,0,0,0,0,0,0 -"Verdes Anos, Os",1963,91,NA,7.2,24,0,0,0,0,0,4.5,14.5,34.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Verdes praderas, Las",1979,100,NA,6.7,22,14.5,0,0,0,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Verdi",1999,16,NA,5.3,13,0,24.5,0,0,14.5,4.5,4.5,4.5,24.5,14.5,"",0,0,0,1,0,0,1 -"Verdi bandiere di Allah, Le",1964,100,NA,4.6,5,0,0,0,24.5,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"Verdict, The",1946,86,NA,7,166,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Verdict, The",1982,129,NA,7.6,3619,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Verdugo, El",1963,90,NA,9.1,387,4.5,4.5,4.5,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,1,1,0,0,0 -"Vereda tropical",2004,106,NA,7.8,22,0,0,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Veredas",1978,120,NA,5.4,5,0,24.5,0,0,24.5,44.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Verfehlung, Die",1992,105,NA,5.1,5,0,0,0,0,64.5,0,0,0,44.5,0,"",0,0,0,1,0,0,0 -"Verflixt verliebt",2004,92,NA,8.1,15,0,0,0,0,4.5,0,14.5,24.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Verfolger",1994,7,NA,5.9,13,0,0,0,0,14.5,34.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Vergeef me",2001,83,NA,3.8,14,14.5,14.5,0,0,4.5,14.5,24.5,4.5,24.5,0,"",0,0,0,0,0,0,0 -"Vergine di Norimberga, La",1963,84,NA,5.9,77,4.5,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vergine per il principe, Una",1966,92,NA,6.2,8,0,0,0,0,0,64.5,14.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Vergine, il toro e il capricorno, La",1977,92,NA,3.9,18,24.5,0,0,14.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Vergiss Amerika",2000,90,NA,7.7,166,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Verhexte Scheinwerfer, Der",1934,18,NA,8.6,6,0,0,0,14.5,0,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Verificatore, Il",1995,80,NA,5.2,8,0,0,14.5,14.5,0,14.5,14.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Verisimilitude",2000,25,NA,1.8,9,84.5,14.5,0,0,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Verj",1994,10,NA,3.9,5,0,24.5,0,0,24.5,0,0,0,24.5,44.5,"",0,0,0,0,1,0,1 -"Verkaufte Braut, Die",1932,77,NA,6.8,12,0,0,0,0,14.5,14.5,24.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Verkehrsinsel",2001,28,NA,6.5,8,0,0,0,0,24.5,34.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Verlangen, Das",2002,94,NA,6.8,30,0,14.5,4.5,0,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Verliebte Firma, Die",1931,73,NA,6.6,11,0,0,0,4.5,24.5,4.5,14.5,24.5,4.5,0,"",0,0,1,0,0,0,0 -"Verlobte, Die",1980,83,NA,7.7,9,0,0,0,14.5,0,24.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Verlorene Landschaft",1992,95,NA,8.4,24,0,0,0,0,0,4.5,4.5,44.5,44.5,4.5,"",0,0,0,0,0,0,0 -"Verlorene Sohn, Der",1934,102,NA,6.4,19,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Verlorene, Der",1951,98,NA,6.9,73,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vermont Is for Lovers",1992,88,NA,8.3,10,0,0,0,0,14.5,14.5,0,44.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Verne Miller Story, The",1987,95,NA,4.7,68,44.5,4.5,4.5,4.5,14.5,4.5,4.5,0,4.5,4.5,"",0,0,0,1,0,0,0 -"Vernon, Florida",1981,72,NA,7.8,239,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Vernyye druz'ya",1954,102,NA,8.5,15,0,0,0,0,0,0,4.5,24.5,34.5,34.5,"",0,0,1,0,0,1,0 -"Vero e il falso, Il",1972,99,NA,5.6,15,4.5,0,4.5,4.5,4.5,44.5,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Veronica",1972,90,NA,6.4,33,4.5,4.5,0,0,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Veronica 2030",1999,70,NA,2.8,61,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Veronica Guerin",2003,92,17000000,6.8,2688,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Veronika's Birthday",2004,39,15000,9.2,6,0,0,0,0,0,0,14.5,14.5,0,64.5,"",0,0,1,1,0,0,1 -"Veronique",2002,5,NA,6.5,13,0,0,0,4.5,4.5,24.5,34.5,14.5,4.5,0,"",0,0,0,0,0,1,1 -"Verrohung des Franz Blum, Die",1974,104,NA,6.8,28,0,4.5,0,0,4.5,14.5,34.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vers l'Inde",2000,23,NA,9.1,6,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Versace Murder, The",1998,91,4000000,3.6,71,34.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Versailles Rive-Gauche",1992,45,NA,6.9,54,4.5,0,4.5,0,4.5,4.5,24.5,34.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Verschleierte Maja, Die",1951,96,NA,6.8,7,0,0,0,0,0,24.5,45.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Verschwende deine Jugend",2003,97,NA,6.6,176,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Verses",1999,81,NA,3.4,13,4.5,4.5,14.5,24.5,0,0,0,0,4.5,34.5,"",0,0,0,1,0,0,0 -"Verso sera",1991,99,NA,6.9,33,0,4.5,4.5,4.5,14.5,4.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Verso, El",1996,95,NA,5,11,4.5,0,4.5,14.5,0,0,14.5,24.5,14.5,0,"",0,0,1,1,0,0,0 -"Versprechen, Das",1995,116,NA,7,176,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Versteck, Das",1977,98,NA,5.5,10,0,24.5,14.5,0,0,0,44.5,14.5,0,24.5,"",0,0,1,1,0,1,0 -"Verstekeling, De",1997,90,NA,6.1,26,0,0,4.5,0,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vert",1999,15,NA,4.7,25,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Vert paradis",2003,88,NA,6.3,24,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,14.5,0,"",0,0,0,1,0,1,0 -"Vertical Features Remake",1978,45,NA,7.9,57,0,0,4.5,4.5,0,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Vertical Limit",2000,124,75000000,5.6,10273,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Vertical Reality",1994,92,NA,9,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,0,0,1,0,0 -"Vertiges de l'amour",2001,84,NA,6.1,56,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Vertigo",1958,129,2479000,8.5,33875,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Vertikal",1966,77,NA,7.2,31,0,0,0,0,4.5,14.5,14.5,4.5,24.5,34.5,"",1,0,0,0,0,0,0 -"Veruntreute Himmel, Der",1958,91,NA,6.5,11,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Veruschka",1971,92,NA,4.3,6,0,14.5,0,34.5,0,0,0,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Very Annie Mary",2001,104,NA,6.2,247,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Very Bad Things",1998,100,10000000,5.8,10001,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Very Brady Sequel, A",1996,90,15000000,5.3,2183,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Very Eye of Night, The",1958,15,NA,5.4,50,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Very Honorable Guy, A",1934,62,NA,6.4,14,0,0,0,14.5,34.5,14.5,14.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Very Important Person",1961,98,NA,5.7,66,0,4.5,0,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Very Mean Men",2000,93,NA,6.7,54,4.5,4.5,0,4.5,0,14.5,24.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Very Merry Cricket, A",1973,30,NA,8.1,20,0,0,0,14.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Very Natural Thing, A",1974,80,NA,6.9,95,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Very Nice, Very Nice",1961,7,NA,7.4,19,0,0,0,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Very Special Favor, A",1965,105,NA,5.8,32,0,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Very Thought of You, The",1944,99,NA,6.3,55,0,0,0,4.5,14.5,14.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Verzaubert",2000,9,NA,5.7,16,4.5,0,4.5,0,24.5,34.5,4.5,0,14.5,4.5,"",0,0,0,0,0,0,1 -"Verzweiflung",2000,75,NA,6.3,14,4.5,4.5,4.5,0,4.5,24.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Vesna",1947,104,NA,7.5,30,0,0,0,0,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Vesna na Zarechnoy ulitse",1956,96,NA,6.7,23,0,0,0,0,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,1,0 -"Vesna va veloce",1996,92,NA,5.4,55,14.5,4.5,0,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vespa e la regina, La",1999,93,NA,4.7,18,14.5,4.5,0,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vessel Wrestling",2002,13,NA,8.1,28,0,0,4.5,0,0,4.5,14.5,14.5,34.5,24.5,"",0,1,0,0,0,0,1 -"Vessel of Wrath",1938,92,NA,6.8,33,0,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vest, The",2003,10,NA,6.9,42,4.5,0,4.5,4.5,4.5,4.5,4.5,0,4.5,45.5,"",0,0,0,0,0,0,1 -"Vestiaire obligatoire",2000,11,NA,7,6,14.5,0,0,0,0,0,34.5,0,45.5,0,"",0,0,0,0,0,0,1 -"Vestido, O",2003,117,NA,9.4,31,4.5,4.5,0,0,4.5,4.5,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Vestito da sposa, Il",2003,105,NA,7.2,24,4.5,24.5,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vesuviani, I",1997,125,NA,3.1,15,24.5,0,0,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Vesyolyye rebyata",1934,96,NA,8.4,55,0,0,0,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Vet hard",2005,90,NA,6.9,229,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Vet!",2003,10,NA,6.8,9,0,14.5,0,14.5,0,14.5,45.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Veuve Couderc, La",1971,90,NA,6.7,164,4.5,0,4.5,4.5,4.5,14.5,44.5,24.5,14.5,4.5,"",1,0,0,1,0,1,0 -"Veuve de Saint-Pierre, La",2000,112,NA,7.1,1572,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Veuve joyeuse, La",1934,105,NA,7.6,6,0,0,0,0,14.5,0,0,34.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Vi er allesammen tossede",1959,83,NA,7.6,24,0,0,0,0,14.5,4.5,4.5,14.5,44.5,14.5,"",0,0,1,0,0,0,0 -"Vi gifter oss",1951,103,NA,7,79,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Vi har det jo dejligt",1963,86,NA,4,5,0,0,44.5,0,0,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Vi hemslavinnor",1942,90,NA,7,9,0,0,0,0,0,34.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Via Appia",1990,90,NA,5.8,22,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Via Dolorosa",2000,99,NA,5.5,15,4.5,4.5,4.5,0,0,0,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Via Mala",1961,93,NA,6.3,13,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Via Satellite",1998,90,NA,5.8,52,4.5,4.5,0,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Via degli angeli, La",1999,121,NA,5.6,46,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Via della prostituzione, La",1978,87,NA,4.6,31,4.5,4.5,4.5,24.5,24.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Via dura, La",1987,86,NA,4.8,12,14.5,4.5,0,4.5,14.5,4.5,14.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Viaccia, La",1961,100,NA,7.8,31,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Viadukt",1983,105,NA,4.4,12,0,0,14.5,14.5,24.5,0,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Viager, Le",1972,101,NA,6.8,132,4.5,0,0,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Viaggi di nozze",1995,103,NA,5.9,141,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Viaggiatori della sera, I",1979,108,NA,5.5,8,0,0,0,14.5,0,24.5,0,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Viaggio chiamato amore, Un",2002,96,NA,5.8,108,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Viaggio con Anita",1979,120,NA,4.5,40,14.5,4.5,14.5,24.5,24.5,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Viaggio della sposa, Il",1997,102,NA,6.7,39,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Viaggio di Capitan Fracassa, Il",1991,132,NA,7.2,136,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Viaggio in Italia",1953,97,NA,7.4,341,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Viaggio, Il",1974,102,NA,5.1,35,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Viajante, O",1999,100,NA,7.9,48,4.5,0,0,4.5,4.5,4.5,4.5,4.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Viaje a la luna",1958,80,NA,8.6,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,1,0,0,0,0 -"Viaje a ninguna parte, El",1986,135,NA,7.8,93,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Viaje al centro de la Tierra",1976,87,NA,4.2,33,4.5,24.5,4.5,14.5,14.5,14.5,4.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Viaje de Carol, El",2002,103,NA,7,108,0,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Viaje por el cuerpo",2001,85,NA,4.9,6,14.5,0,0,34.5,14.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Viaje sin destino",1942,73,NA,9.2,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,0,1,0,0,0,0 -"Viaje, El",1992,150,NA,6.7,130,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Viaje, El",2002,9,NA,7,6,0,0,0,0,14.5,0,14.5,14.5,0,45.5,"",0,0,0,1,0,0,1 -"Vibes",1988,99,NA,4.4,685,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Vibrations",1995,104,NA,3.5,89,24.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Vibrations sexuelles",1977,75,NA,1.9,9,24.5,14.5,24.5,14.5,14.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Vibrator",2003,95,NA,6.8,103,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vibroboy",1994,28,NA,6.5,77,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Vic",1999,30,NA,5.7,10,24.5,0,14.5,0,14.5,14.5,0,0,24.5,34.5,"",0,0,0,1,0,0,1 -"Vicari d'Olot, El",1980,101,NA,5.4,5,0,24.5,0,0,24.5,24.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Vice",2000,87,NA,6.5,10,24.5,0,0,0,14.5,0,14.5,34.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Vice Academy",1988,90,NA,3.4,111,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Vice Academy Part 2",1990,93,NA,3.1,74,14.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Vice Girls",2000,83,NA,3.3,33,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Vice Raid",1960,71,NA,4.5,21,4.5,4.5,14.5,24.5,14.5,4.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Vice Squad",1953,87,NA,6.4,67,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Vice Squad",1982,97,NA,4.8,131,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Vice Squad, The",1931,81,NA,6.3,8,0,0,0,14.5,14.5,14.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Vice Versa",1948,111,NA,6.5,36,0,0,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vice Versa",1988,98,NA,5.3,1390,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Vice et la vertu, Le",1963,108,NA,3.9,18,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Vicious Circle",1996,90,NA,2,9,34.5,14.5,14.5,14.5,0,0,14.5,0,14.5,14.5,"R",0,0,0,0,0,0,0 -"Vicious Circle, The",1957,84,NA,6.7,25,0,0,0,0,14.5,24.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Vicious Lips",1987,84,NA,6.2,26,4.5,4.5,0,14.5,4.5,0,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Vicious Sweet, The",1997,90,3000,3.2,23,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vicious Years, The",1950,81,NA,1,5,64.5,0,24.5,0,0,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Vicki",1953,85,NA,7.4,20,0,0,0,4.5,0,24.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Victim",1961,95,NA,7.7,303,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Victim Five",1964,89,NA,5.9,19,0,0,4.5,4.5,34.5,24.5,4.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Victim of Desire",1995,85,NA,4,93,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Victim, The",2004,16,15000,9.8,5,0,0,0,0,0,0,0,0,24.5,84.5,"",0,0,0,0,0,0,1 -"Victimes, Les",1996,94,NA,5.2,18,0,4.5,14.5,14.5,4.5,14.5,24.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Victoire",2004,84,NA,5.4,8,24.5,0,14.5,0,0,0,34.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Victor",1993,14,NA,6.2,9,14.5,0,0,24.5,0,14.5,24.5,14.5,24.5,0,"",0,0,0,0,0,0,1 -"Victor",1998,18,NA,7,21,0,0,0,4.5,14.5,4.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Victor Frankenstein",1977,92,NA,4.7,28,4.5,14.5,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Victor... pendant qu'il est trop tard",1998,88,NA,6.2,53,0,0,0,0,14.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Victor/Victoria",1982,132,NA,7.3,3487,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Victoria",1979,89,NA,6.3,10,34.5,0,0,0,14.5,14.5,0,0,0,45.5,"",0,0,0,1,0,0,0 -"Victoria para chino",2004,13,12000,6.8,19,4.5,4.5,0,0,0,0,4.5,0,24.5,64.5,"",0,0,0,1,0,0,1 -"Victoria the Great",1937,112,NA,7.1,16,0,0,0,14.5,4.5,4.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Victors, The",1963,175,NA,6.8,203,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Victory",1940,79,NA,5.1,11,0,0,0,0,44.5,4.5,4.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Victory",1995,99,NA,5.8,104,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Victory Kiss",1992,12,NA,6.1,14,0,0,4.5,4.5,24.5,14.5,14.5,24.5,0,4.5,"",0,0,0,1,0,0,1 -"Victory Quiz",1942,9,NA,6.1,7,0,0,0,0,24.5,44.5,14.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Victory Through Air Power",1943,65,788000,7.4,68,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,1,0,0,1,0,0 -"Victory Vehicles",1943,8,NA,6.7,53,0,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Vida alrededor, La",1959,102,NA,6.9,8,0,0,0,0,0,24.5,34.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vida conyugal, La",1993,95,NA,5.8,16,4.5,14.5,4.5,0,4.5,24.5,14.5,14.5,14.5,0,"",0,0,1,1,0,0,0 -"Vida de Menina",2003,101,NA,8.7,10,0,0,0,0,14.5,0,14.5,24.5,34.5,34.5,"",0,0,0,1,0,0,0 -"Vida de nadie, La",2002,103,NA,7.1,91,0,0,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vida em Cana, A",2001,68,NA,7.3,10,0,0,0,14.5,0,14.5,24.5,34.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Vida en sombras",1952,90,NA,6.5,15,0,0,0,4.5,14.5,4.5,4.5,34.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Vida en un hilo, La",1945,92,NA,7.8,29,0,0,0,0,14.5,4.5,14.5,14.5,44.5,24.5,"",0,0,1,0,0,0,0 -"Vida es silbar, La",1998,106,NA,6.8,270,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vida es una sola, La",1992,85,NA,2.8,9,24.5,0,0,0,0,24.5,0,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Vida mancha, La",2003,128,NA,7.2,57,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vida no vale nada, La",1955,100,NA,7.7,7,0,0,0,0,0,0,45.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Vida por delante, La",1958,90,NA,6.5,12,4.5,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Vida que te espera, La",2004,100,NA,6.3,57,0,4.5,0,4.5,4.5,14.5,44.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vida sigue igual, La",1969,91,NA,1.6,13,44.5,14.5,0,4.5,4.5,4.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Vidange",1998,95,NA,4.8,12,0,0,4.5,4.5,34.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Vidangeur, Le",1996,30,NA,1.6,5,44.5,64.5,0,0,0,0,0,0,0,0,"",0,0,0,1,0,0,1 -"Vidas Secas",1963,103,NA,7.8,103,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Vidas privadas",2001,97,NA,6.8,129,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Video Blues",1992,93,NA,5.3,17,0,0,4.5,4.5,14.5,0,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Video Vixens",1975,83,NA,3.1,27,24.5,0,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Videodrome",1983,89,5952000,7,4877,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Videogramme einer Revolution",1992,106,NA,6.9,9,14.5,0,0,0,34.5,0,0,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Videoreul boneun namja",2003,100,NA,5.5,14,0,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Vidheyan",1994,112,NA,4.6,13,14.5,0,0,4.5,0,4.5,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Vidita negra",1973,100,NA,3.5,6,0,14.5,14.5,0,0,0,14.5,0,45.5,0,"",0,0,1,0,0,0,0 -"Vidocq",2001,98,NA,6.5,3122,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Vie amoureuse de l'homme invisible, La",1971,91,NA,3.5,39,34.5,14.5,14.5,4.5,14.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Vie commune, La",2000,27,NA,6.4,8,0,0,0,0,14.5,14.5,0,14.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Vie conjugale (Jean Marc), La",1963,112,NA,6.1,11,0,0,0,0,24.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vie continue, La",1981,93,NA,6.1,11,0,4.5,0,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vie d'ange",1979,84,NA,7.6,5,0,0,0,0,0,0,64.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Vie de famille, La",1985,95,NA,5.7,22,4.5,0,0,4.5,24.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vie del Signore sono finite, Le",1987,84,NA,6.6,51,4.5,0,0,4.5,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vie des morts, La",1991,54,NA,6.8,35,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Vie devant soi, La",1977,105,NA,7.5,123,0,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Vie du Christ, La",1906,20,NA,4.8,5,24.5,0,0,0,0,24.5,24.5,0,44.5,0,"",0,0,0,1,0,0,1 -"Vie est belle, La",1987,80,NA,5.6,35,0,0,4.5,4.5,14.5,24.5,24.5,0,4.5,24.5,"",0,0,1,1,0,0,0 -"Vie est un long fleuve tranquille, La",1988,90,NA,6.6,428,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vie est un roman, La",1983,111,NA,7.2,100,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Vie et mort d'un instant d'ennui",2003,5,NA,6.5,10,0,14.5,0,0,0,44.5,0,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Vie et rien d'autre, La",1989,135,NA,7.7,228,4.5,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vie moderne, La",2000,123,NA,6.1,58,4.5,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vie ne me fait pas peur, La",1999,111,NA,6.4,84,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vie nouvelle, La",2002,102,NA,5.5,114,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vie parisienne, La",1936,95,NA,5,5,0,0,24.5,0,24.5,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Vie promise, La",2002,93,NA,6.3,131,14.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vie sexuelle des Belges 1950-1978, La",1994,85,NA,5.6,168,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Vie sur terre, La",1998,66,NA,6.6,61,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Vie, l'amour, la mort, La",1969,115,NA,6.8,20,4.5,0,0,4.5,0,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vie, la mort & le foot, La",2000,6,NA,6.4,14,4.5,44.5,4.5,0,0,4.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Viehjud Levi",1999,95,NA,6.9,61,0,4.5,0,4.5,14.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vieil homme et l'enfant, Le",1967,86,NA,7.8,79,4.5,0,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Vieille canaille",1992,100,NA,6.6,33,0,0,0,0,14.5,24.5,24.5,34.5,4.5,0,"",0,0,1,0,0,0,0 -"Vieille dame et les pigeons, La",1998,21,NA,7.6,80,4.5,0,0,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Vieille dame indigne, La",1965,94,NA,6.8,23,4.5,0,0,4.5,0,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vieille fille, La",1972,85,NA,6,35,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Vieille qui marchait dans la mer, La",1991,95,NA,7.1,74,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Viel passiert - Der BAP-Film",2002,101,NA,4.3,34,24.5,14.5,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Viena",2001,16,NA,9.4,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,0,0,1,0,0 -"Vieni avanti cretino",1982,98,NA,8.2,106,0,0,0,0,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,0 -"Vienna",1968,8,NA,6.7,21,0,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Vienna",2002,104,NA,5.2,7,24.5,0,0,0,44.5,0,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Vienna: The Years Remembered",1968,9,NA,5.6,5,0,0,0,0,44.5,24.5,0,0,0,44.5,"",0,0,0,0,0,0,1 -"Viennese Nights",1930,92,NA,7,14,0,14.5,0,0,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Viens chez moi, j'habite chez une copine",1981,85,NA,6.5,144,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Viento negro",1965,127,NA,9,9,0,0,0,0,14.5,0,0,0,44.5,44.5,"",0,0,0,1,0,0,0 -"Vier im Jeep, Die",1951,80,NA,6.5,15,0,0,0,4.5,0,4.5,34.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vier um die Frau",1921,52,NA,7.3,5,0,0,0,0,0,44.5,24.5,0,44.5,0,"",0,0,0,0,0,0,0 -"Vieraalla maalla",2003,91,NA,6,182,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Vierde man, De",1983,105,NA,7.1,965,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vierge du Rhin, La",1953,82,NA,8.4,5,0,0,0,0,24.5,0,0,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Vierges et vampires",1971,83,NA,5.4,143,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Viergeteilt im Morgengrauen",1999,14,NA,5.3,117,14.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Viertelliterklasse, Die",2005,91,NA,6.8,12,0,0,0,0,0,14.5,24.5,44.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Vies",2000,87,NA,6.4,9,0,0,0,0,0,44.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Vietnam War Story: The Last Days",1989,90,NA,6.2,20,0,0,4.5,4.5,14.5,14.5,45.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Vietnam, Texas",1990,92,NA,3.8,21,4.5,0,14.5,14.5,4.5,14.5,4.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Vieuphoria",1994,90,NA,8.5,188,4.5,0,0,4.5,4.5,4.5,4.5,14.5,4.5,74.5,"",0,0,0,0,1,0,0 -"Vieux de la vieille, Les",1960,90,NA,6,49,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Vieux fusil, Le",1975,102,NA,7.8,374,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"View from Pompey's Head, The",1955,97,NA,5.5,35,4.5,0,0,14.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"View from the Top",2003,87,NA,5.1,3485,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"View to a Kill, A",1985,131,30000000,5.9,8478,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Viewer Discretion Advised",1998,105,NA,1.7,14,24.5,24.5,0,14.5,0,0,4.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Vigil",1984,90,NA,6,83,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vigil in the Night",1940,102,NA,6.3,100,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Vigil, The",1999,86,NA,5.2,34,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Vigilante",1983,90,NA,5.7,158,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Vigilante Force",1976,89,NA,4,58,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vigilante Hideout",1950,60,NA,4.4,6,0,0,0,34.5,45.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Vigilante, The",1947,285,NA,7.4,8,0,0,0,0,0,14.5,0,14.5,24.5,45.5,"",1,0,0,0,0,0,0 -"Vigilantes Are Coming, The",1936,229,NA,7.1,10,0,0,0,0,14.5,14.5,44.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vigilantes Return, The",1947,67,NA,5.6,5,0,0,0,0,64.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Vigilantes of Dodge City",1944,54,NA,6.5,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Vigile, Il",1960,100,NA,7.1,65,0,0,0,4.5,4.5,4.5,34.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Vigile, Le",2002,14,NA,5.5,7,0,0,0,0,44.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Vigliacchi non pregano, I",1969,82,NA,4.1,5,0,0,0,44.5,0,44.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Vignette: Para Sight",1990,2,NA,7.5,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Vigo",1998,106,NA,5.7,72,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vihaan sinua - rakas",1951,73,NA,7,5,0,0,0,0,24.5,24.5,44.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Vihtori ja Klaara",1939,99,NA,4.6,6,0,0,14.5,34.5,34.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Viimeinen savotta",1977,128,NA,6.7,12,0,0,0,4.5,4.5,24.5,4.5,44.5,4.5,0,"",0,0,0,0,0,0,0 -"Viimeinen vieras",1941,95,NA,6.6,5,0,0,0,0,0,44.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Viimne reliikvia",1969,86,NA,8.6,197,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,0,0,0,0 -"Viking Queen, The",1967,80,NA,4.4,82,4.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Viking Sagas, The",1995,80,NA,4.6,109,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"R",1,0,0,0,0,0,0 -"Viking, The",1928,90,NA,7.8,17,0,0,0,0,0,44.5,14.5,14.5,24.5,4.5,"",1,0,0,0,0,0,0 -"Viking, The",1931,70,NA,5.2,12,0,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Vikings",2004,40,NA,7.7,5,0,0,0,0,24.5,24.5,0,64.5,0,0,"",0,0,0,0,1,0,1 -"Vikings, The",1958,114,5000000,6.9,1417,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Viktor Vogel - Commercial Man",2001,112,NA,5.6,244,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Viktor og Viktoria",1993,80,NA,3.3,9,24.5,0,14.5,34.5,24.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Viktor und Viktoria",1933,100,NA,7.9,34,0,0,0,0,4.5,4.5,14.5,45.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vil du se min smukke navle?",1978,103,NA,6.4,59,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vildanden",1963,105,NA,4.3,12,4.5,4.5,14.5,0,4.5,24.5,0,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Vildbassen",1994,85,NA,3.9,21,4.5,14.5,4.5,14.5,24.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Vildspor",1998,95,NA,6.4,112,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Villa Borghese",1953,98,NA,5.6,9,0,0,14.5,0,24.5,14.5,24.5,0,14.5,24.5,"",0,0,1,1,0,0,0 -"Villa Rides",1968,125,NA,5.8,160,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Villa Santo-Sospir, La",1952,36,NA,6.2,26,0,4.5,0,0,14.5,44.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Villa des roses",2002,120,NA,5.6,111,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Villa paranoia",2004,106,NA,7.1,105,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Villa ton orgion, I",1964,70,NA,7.2,16,0,4.5,0,4.5,0,0,4.5,44.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Villa!!",1958,72,NA,4.8,6,0,0,0,14.5,64.5,14.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Villa, The",2002,125,NA,5.8,16,0,0,0,24.5,14.5,0,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Village Affair, A",1994,137,NA,6.1,75,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Village Smithy, The",1936,8,NA,8.3,13,0,0,0,0,0,4.5,34.5,24.5,0,34.5,"",0,1,1,0,0,0,1 -"Village Smithy, The",1942,7,NA,6,11,0,0,4.5,4.5,14.5,14.5,14.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Village Squire, The",1935,66,NA,8.2,13,0,0,0,0,0,0,4.5,14.5,4.5,64.5,"",0,0,1,0,0,0,0 -"Village Tale",1935,80,NA,3.5,11,24.5,0,24.5,24.5,0,0,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Village of Daughters",1962,86,NA,4.9,23,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Village of Idiots",1999,13,NA,7.3,26,0,0,0,4.5,4.5,14.5,4.5,24.5,34.5,14.5,"",0,1,0,0,0,0,1 -"Village of the Damned",1960,77,200000,7.3,1434,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Village of the Damned",1995,99,7000000,5.1,2585,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Village of the Giants",1965,81,NA,3,287,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Village, The",1993,14,NA,7.9,18,14.5,0,0,0,4.5,0,14.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Village, The",2004,108,60000000,6.6,25729,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Villain",1971,98,NA,5.4,72,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Villain Still Pursued Her, The",1940,66,NA,5.7,13,0,0,4.5,0,34.5,14.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Villain, The",1979,89,NA,4.5,838,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Villains Anthology, The",1999,96,NA,5.5,18,14.5,0,4.5,4.5,0,0,4.5,0,0,74.5,"",1,0,1,0,0,0,0 -"Ville Louvre, La",1990,84,NA,7.1,24,0,0,4.5,0,4.5,14.5,34.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Ville des pirates, La",1984,111,NA,6.4,27,0,14.5,0,0,4.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Ville est tranquille, La",2000,136,NA,7.6,346,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Villeggiatura, La",1973,112,NA,6.4,7,0,0,0,0,14.5,44.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Villeneuve",1998,15,NA,6.1,7,0,0,0,14.5,0,45.5,14.5,0,14.5,0,"",0,0,0,0,0,0,1 -"Villhesten",1994,106,NA,5.1,10,0,0,0,24.5,34.5,14.5,0,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Villin Pohjolan kulta",1963,85,NA,6.2,5,0,0,0,24.5,44.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Villmark",2003,85,NA,7.1,647,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Vim, Vigor and Vitaliky",1936,6,NA,5.4,20,0,0,4.5,24.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Vinasu senki",1989,102,NA,6.9,175,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,1,0,0,0,0,0 -"Vincent",1982,6,NA,8.2,2076,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,1,0,0,0,0,1 -"Vincent",1987,105,NA,6.3,67,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,24.5,"",0,1,0,1,0,0,0 -"Vincent",2001,4,NA,6.7,22,4.5,14.5,4.5,0,4.5,4.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,0,1 -"Vincent & Theo",1990,138,NA,7.2,473,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vincent Lopez and His Orchestra",1939,10,NA,6,19,0,0,0,4.5,4.5,14.5,14.5,0,14.5,45.5,"",0,0,0,0,0,0,1 -"Vincent Price: The Sinister Image",1988,192,NA,8.9,15,0,0,0,0,0,0,0,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Vincent et moi",1991,100,NA,6.6,84,4.5,0,4.5,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Vincent: The Junkie Chronicles",2000,9,NA,7.5,15,0,0,0,0,4.5,0,44.5,24.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Vinci",2004,108,NA,6.8,116,4.5,4.5,0,4.5,4.5,14.5,44.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Vindicator, The",1986,93,4210000,4.3,74,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Vineyard, The",1989,95,NA,2.6,48,34.5,14.5,24.5,14.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Vingar av glas",2000,105,NA,6.5,302,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Vingar kring fyren",1938,94,NA,3.9,8,0,14.5,24.5,0,24.5,24.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Vingarne",1916,69,NA,6.2,10,0,14.5,0,24.5,24.5,0,24.5,14.5,24.5,0,"",0,0,0,1,0,0,0 -"Vingt-quatre heures de la vie d'un clown",1945,18,NA,6.6,13,0,0,0,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Vintage - Families of Value",1995,72,NA,3,13,64.5,0,0,0,14.5,0,0,0,0,14.5,"",0,0,0,0,1,0,0 -"Vintage, The",1957,92,NA,5.2,19,0,14.5,0,0,34.5,14.5,34.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Vinterkyss",2005,84,NA,5.9,36,14.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vinterviken",1996,98,NA,4.9,277,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vinti, I",1953,110,NA,5.9,38,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vinyl",1965,70,NA,6.5,46,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vinyl",2000,110,NA,7.2,36,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Vinzent",2004,93,NA,8.5,6,0,0,0,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Viol d'une jeune fille douce, Le",1968,82,NA,6.1,22,4.5,4.5,0,14.5,4.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Viol, Le",1968,90,NA,7.3,12,0,0,0,0,4.5,4.5,4.5,34.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Viola bacia tutti",1998,93,NA,5.1,71,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Violanta",1977,95,NA,5.9,9,14.5,14.5,0,0,14.5,14.5,24.5,0,34.5,0,"",0,0,0,1,0,0,0 -"Violated",1984,88,NA,4.4,14,14.5,4.5,4.5,0,24.5,0,24.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Violence",1947,72,NA,6.3,6,0,0,0,34.5,34.5,0,34.5,0,0,0,"",0,0,0,1,0,0,0 -"Violences du silence, Les",1997,26,NA,9,5,0,0,0,0,0,0,0,0,100,0,"",0,0,0,0,1,0,1 -"Violent Days - Dry",2004,95,NA,2.2,5,24.5,44.5,44.5,0,0,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Violent Is the Word for Curly",1938,18,NA,7.8,119,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Violent Men, The",1955,95,NA,6.6,136,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Violent Ones, The",1967,84,NA,4.9,10,0,14.5,0,14.5,45.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Violent Playground",1958,108,NA,6.1,24,0,0,0,0,14.5,4.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Violent Road",1958,86,NA,5,20,0,0,4.5,24.5,14.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Violent Saturday",1955,90,NA,6.7,135,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Violent Shit",1987,75,NA,2.4,189,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Violent Shit 3 - Infantry of Doom",1999,85,NA,4.5,139,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Violent Shit II",1992,82,NA,3.5,103,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Violent Years, The",1956,65,NA,3.2,213,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Violenti di Roma bene, I",1975,88,NA,6,5,0,0,24.5,0,44.5,0,24.5,0,0,24.5,"",1,0,0,0,0,0,0 -"Violents, Les",1958,92,NA,7.8,7,0,0,0,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Violenza in un carcere femminile",1982,90,NA,4.2,54,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Violet Lives Upstairs",2003,18,NA,8.1,11,14.5,0,0,0,0,0,0,0,24.5,45.5,"",0,0,0,0,0,0,1 -"Violetas imperiales",1952,94,NA,6.5,13,0,0,4.5,0,14.5,24.5,34.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Violetera, La",1958,108,NA,6,48,4.5,0,4.5,4.5,4.5,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Violetero, El",1960,83,NA,6,5,0,0,0,0,0,64.5,24.5,24.5,0,0,"",0,0,1,0,0,0,0 -"Violets Are Blue...",1986,88,NA,5.5,186,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Violets in Spring",1936,21,NA,6.6,7,0,0,0,0,0,24.5,45.5,14.5,0,0,"",0,0,1,0,0,1,1 -"Violin Lesson",2002,18,NA,7.6,5,0,0,0,0,0,0,64.5,44.5,0,0,"",0,0,0,0,0,0,1 -"Violin Maker of Cremona, The",1909,10,NA,4.9,7,14.5,0,0,0,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Violin, The",1974,30,NA,7.3,7,14.5,14.5,0,0,0,0,0,0,24.5,44.5,"",0,0,0,0,0,0,1 -"Violon de Rothschild, Le",1996,101,NA,6,13,0,0,0,0,0,34.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Violon rouge, Le",1998,140,10000000,7.8,6995,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,1,0 -"Violons du bal, Les",1974,110,NA,7,22,0,0,0,0,14.5,4.5,34.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Vios kai politia",1987,105,NA,8.4,61,4.5,0,0,4.5,0,14.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Vip, mio fratello superuomo",1968,79,NA,7,54,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,1,1,0,0,0,0 -"Viper",1994,88,NA,3.6,62,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Vipers",1999,92,NA,4.6,52,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Virasat",1997,165,NA,7.4,50,0,0,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,1,0 -"Virdzina",1991,101,NA,7.6,23,0,4.5,0,0,0,14.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Virgen de la lujuria, La",2002,140,NA,6,60,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Virgen de los sicarios, La",2000,98,NA,7,902,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Virgil Bliss",2001,93,NA,7.3,94,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Virgin",2002,20,NA,6.8,5,0,0,24.5,0,24.5,0,24.5,0,24.5,24.5,"",0,0,0,1,0,0,1 -"Virgin",2003,114,NA,6,118,4.5,4.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Virgin Island",1958,84,NA,5.2,17,14.5,0,4.5,14.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Virgin Queen of St. Francis High, The",1987,89,NA,2.4,26,34.5,4.5,4.5,4.5,14.5,4.5,0,0,0,24.5,"",0,0,1,0,0,0,0 -"Virgin Queen, The",1955,92,NA,6.6,292,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Virgin Soldiers, The",1969,95,NA,5.6,41,0,0,0,24.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Virgin Suicides, The",1999,90,6000000,7.2,17524,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Virgin Witch",1972,88,NA,4.3,44,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Virgin and the Gypsy, The",1970,95,NA,5.2,60,0,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Virgin in Hollywood, A",1948,63,NA,4.9,9,0,0,14.5,0,34.5,24.5,24.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Virgin of Liverpool, The",2003,91,NA,5.4,11,14.5,0,4.5,0,14.5,34.5,0,0,0,14.5,"",0,0,1,0,0,0,0 -"Virginia",1941,110,NA,6.8,14,0,0,0,0,0,14.5,24.5,34.5,0,24.5,"",0,0,0,1,0,1,0 -"Virginia",1983,85,NA,4.8,9,0,14.5,0,24.5,0,34.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Virginia City",1940,121,NA,6.6,238,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Virginia's Run",2002,101,NA,5.8,122,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"PG",0,0,0,1,0,0,0 -"Virginian, The",1914,50,NA,5.8,14,0,0,4.5,14.5,34.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Virginian, The",1923,84,NA,6.3,6,0,0,14.5,0,14.5,34.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Virginian, The",1929,91,425000,6.8,89,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Virginian, The",1946,90,NA,6.8,91,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Virginity",1996,17,NA,7.7,7,14.5,0,0,0,0,0,14.5,24.5,0,44.5,"",0,0,0,0,0,0,1 -"Viridiana",1961,90,NA,7.8,1463,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Virile Man, The",2004,8,NA,7.5,8,0,14.5,0,0,0,0,0,64.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Virtual Combat",1996,97,NA,3,92,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Virtual Desire",1995,92,NA,2.7,65,14.5,34.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Virtual Encounters",1996,84,NA,3.2,57,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Virtual Encounters 2",1998,83,NA,4.3,47,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Virtual Reality 69",1995,83,NA,7.5,16,0,0,0,0,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Virtual Sexuality",1999,92,NA,5,891,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Virtual Terror",1996,90,NA,4,6,45.5,0,0,0,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Virtualna stvarnost",2001,93,NA,5.3,13,0,14.5,4.5,0,14.5,14.5,0,34.5,0,4.5,"",1,0,0,1,0,0,0 -"Virtue",1932,68,NA,5.2,13,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Virtuosity",1995,106,30000000,5.3,4183,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Virtuous Sin",1930,80,NA,4.3,8,0,0,14.5,34.5,14.5,24.5,0,0,14.5,0,"",0,0,0,1,0,1,0 -"Virumandi",2004,175,NA,6.5,49,4.5,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Virus",1980,101,NA,4.1,410,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Virus kennt keine Moral, Ein",1986,84,NA,7.8,37,4.5,0,0,0,0,4.5,14.5,44.5,24.5,4.5,"",0,0,1,1,0,0,0 -"Vis, La",1993,20,NA,7.1,26,0,4.5,0,4.5,0,0,4.5,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Visa USA",1986,90,NA,8,11,0,4.5,0,0,0,0,24.5,24.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Visa to Canton",1961,75,NA,3.3,5,0,44.5,0,0,24.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Visage, The",2003,40,60000,7.2,8,0,0,0,14.5,0,0,0,24.5,14.5,45.5,"",0,0,0,0,0,0,1 -"Visages d'enfants",1925,114,NA,6.1,18,0,0,0,4.5,14.5,4.5,14.5,0,34.5,34.5,"",0,0,0,1,0,0,0 -"Visages de femmes",1985,105,NA,5.8,19,0,0,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Visas and Virtue",1997,26,NA,3.7,19,14.5,0,4.5,0,14.5,4.5,0,4.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Visceral Matter",1997,48,60000,7,24,24.5,4.5,0,0,0,0,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Visconte di Bragelonne, Il",1954,94,NA,3.5,11,0,24.5,24.5,0,24.5,0,0,4.5,4.5,0,"",0,0,0,1,0,1,0 -"Visiblement je vous aime",1995,100,NA,4.6,7,24.5,0,0,24.5,0,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Vision Quest",1985,105,NA,5.8,1322,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Vision Test",2002,6,NA,7.8,8,0,0,0,0,0,0,14.5,24.5,24.5,34.5,"",0,1,0,0,0,0,1 -"Visionarios",2001,108,NA,5.2,43,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Visions",1996,92,NA,2.2,27,44.5,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Visions of Ecstasy",1989,18,NA,6,10,34.5,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Visions of Eight",1973,109,NA,6.2,26,4.5,0,4.5,0,4.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Visions of Europe",2004,139,NA,5.9,54,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Visions of Light",1992,92,NA,7.7,515,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Visions of Sugarplums",2001,78,NA,2.1,36,64.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Visit from the Incubus, A",2001,26,NA,9.2,8,0,0,0,0,0,14.5,0,14.5,0,74.5,"",0,0,0,0,0,0,1 -"Visit to Peek Frean and Co.'s Biscuit Works, A",1906,12,NA,6.5,25,0,0,0,0,34.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Visit to a Chief's Son",1974,85,NA,5.4,18,0,0,0,0,24.5,14.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Visit to a Small Planet",1960,85,NA,5.5,193,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Visit with Truman Capote, A",1966,29,NA,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,0,1,0,1 -"Visit, The",1956,30,NA,7.9,13,0,0,0,0,4.5,0,14.5,0,24.5,45.5,"",0,0,0,0,0,0,1 -"Visit, The",1964,100,NA,6.6,143,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Visita del vicio, La",1977,91,NA,3.6,26,4.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Visitant, The",1981,22,0,7.1,30,24.5,0,0,4.5,0,4.5,14.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Visitante, El",1999,91,NA,5.4,12,4.5,0,0,24.5,0,4.5,0,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Visitants, The",1987,92,NA,3.4,11,64.5,0,0,0,0,0,0,34.5,0,0,"",0,0,1,0,0,0,0 -"Visite",1994,7,NA,6,5,0,0,0,0,0,64.5,44.5,0,0,0,"",0,0,0,0,0,0,1 -"Visiteurs du soir, Les",1942,115,NA,7.9,170,0,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Visiteurs, Les",1993,107,NA,6.4,2514,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Visiting Desire",1996,70,NA,4.8,8,0,0,14.5,0,14.5,14.5,45.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Visiting Hours",1982,103,NA,4,152,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Visiting Italy",1951,8,NA,4.9,12,14.5,0,0,4.5,24.5,34.5,4.5,0,0,4.5,"",0,0,0,0,1,0,1 -"Visitor, The",1979,100,NA,3.2,96,24.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Visitors",2003,100,NA,5.1,185,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Visitors, The",1972,88,NA,6.1,100,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Visits: Hungry Ghost Anthology",2004,107,NA,6.8,6,0,0,0,0,0,45.5,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Viskningar och rop",1972,91,NA,7.8,2164,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Vispa Teresa, La",1943,85,NA,5.5,21,0,0,0,0,44.5,45.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Vita agra, La",1966,112,NA,7.3,7,0,0,0,0,0,14.5,44.5,44.5,0,0,"",0,0,1,0,0,0,0 -"Vita altrui, La",2000,85,NA,4.3,9,24.5,0,0,14.5,34.5,0,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Vita da cani",1950,108,NA,7.9,6,0,0,0,0,0,14.5,34.5,0,14.5,34.5,"",0,0,1,1,0,0,0 -"Vita difficile, Una",1961,118,NA,9.2,79,0,0,0,0,0,4.5,4.5,24.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Vita frun",1962,109,NA,6,21,0,4.5,0,0,24.5,14.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Vita lejoninnan, Den",1996,103,NA,4.9,84,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vita scellerata, Una",1990,118,NA,6.9,12,0,0,0,0,4.5,4.5,14.5,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Vita sporten, Den",1968,102,NA,8.4,8,14.5,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Vital",2004,86,NA,6.7,81,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Vital Parts",2001,87,NA,3.4,23,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,0,"R",1,0,0,0,0,0,0 -"Vital Signs",1990,103,NA,4.9,167,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vitamin Hay",1941,7,NA,4.3,6,0,0,64.5,14.5,0,14.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Vitamin Pink",1966,7,NA,5.4,8,0,0,0,0,45.5,45.5,0,0,0,0,"",0,1,0,0,0,0,1 -"Vite strozzate",1996,108,NA,4.8,29,14.5,4.5,4.5,24.5,14.5,24.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Vitelloni, I",1953,104,NA,7.8,808,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Vito e gli altri",1991,83,NA,6.7,14,0,0,0,0,0,24.5,14.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vittima designata, La",1971,105,NA,6,12,0,0,0,0,24.5,14.5,4.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Viu-hah hah-taja",1974,83,NA,5.8,44,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Viuda de Montiel, La",1979,105,NA,4.4,14,4.5,4.5,14.5,4.5,14.5,4.5,0,4.5,0,34.5,"",0,0,0,1,0,0,0 -"Viuda negra, La",1977,78,NA,6.3,10,14.5,0,0,14.5,14.5,34.5,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Viuuulentemente mia",1982,90,NA,5.7,41,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Viva Castro!",1994,86,NA,5.8,10,34.5,0,0,0,14.5,0,14.5,14.5,44.5,0,"",0,0,0,1,0,0,0 -"Viva Cisco Kid",1940,65,NA,1.8,7,44.5,0,0,0,14.5,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Viva Eu!",1989,18,NA,8.6,9,0,0,0,0,0,0,0,64.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Viva Knievel!",1977,106,NA,2.6,123,34.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Viva Las Nowhere",2001,97,NA,6,83,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"R",0,0,1,1,0,0,0 -"Viva Las Vegas",1964,85,NA,5.7,803,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Viva Max!",1969,93,NA,6.1,119,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Viva Rena",1967,82,NA,7.5,9,0,0,0,14.5,14.5,14.5,24.5,34.5,14.5,0,"",0,0,1,0,0,0,0 -"Viva Sapato!",2002,94,1000000,6.8,15,0,24.5,24.5,14.5,4.5,4.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Viva Villa!",1934,110,1022000,6.8,146,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Viva Villaveien!",1989,105,NA,5,22,4.5,14.5,0,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Viva Voz",2003,87,NA,7,49,4.5,4.5,0,0,14.5,24.5,34.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Viva Zapata!",1952,115,NA,7.5,863,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Viva l'Italia!",1961,138,NA,5.7,23,0,0,4.5,4.5,14.5,44.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Viva la muerte",1970,90,NA,7,97,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vivacious Lady",1938,90,703000,7,211,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Vivancos 3",2002,89,NA,2.9,75,24.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Vivante",2002,95,NA,6.4,48,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vivat, gardemariny!",1991,140,NA,6.9,18,4.5,0,4.5,0,4.5,14.5,24.5,14.5,0,24.5,"",0,0,0,0,0,1,0 -"Vive Elle",1998,75,NA,5.9,43,4.5,4.5,0,0,4.5,4.5,0,0,24.5,64.5,"",0,0,0,0,0,0,0 -"Vive la sociale!",1983,95,NA,6.3,5,0,0,0,0,24.5,0,44.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Vive le tour",1962,18,NA,6.4,6,0,0,0,0,34.5,0,0,45.5,14.5,0,"",0,0,0,0,1,0,1 -"Vive les femmes!",1984,87,NA,4.7,14,4.5,4.5,4.5,4.5,14.5,34.5,24.5,0,0,0,"",0,0,1,0,0,0,0 -"Vive nous!",2000,96,NA,5.9,21,0,4.5,0,4.5,4.5,34.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Vivement dimanche!",1983,110,NA,7.4,686,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Vivere in pace",1947,90,NA,7,14,0,0,0,0,4.5,14.5,4.5,24.5,44.5,4.5,"",0,0,1,1,0,0,0 -"Vivero Letter, The",1998,95,NA,4.3,97,4.5,14.5,24.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"R",1,0,0,0,0,0,0 -"Vivi o, preferibilmente, morti",1969,103,NA,6.2,9,14.5,0,0,0,14.5,44.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Vivid",1997,84,NA,3.5,159,14.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Vivir intentando",2003,95,NA,4.1,29,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"Vivir mata",1991,91,NA,4.7,7,24.5,14.5,0,0,0,44.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Vivir mata",2002,92,NA,5,65,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Vivo per la tua morte",1968,94,NA,6,12,4.5,0,14.5,0,4.5,24.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Vivre au paradis",1998,105,NA,6.8,54,14.5,24.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vivre ensemble",1973,92,NA,5.2,5,24.5,0,0,0,64.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Vivre me tue",2002,89,NA,6.7,47,4.5,0,4.5,4.5,4.5,4.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vivre pour survivre",1984,98,NA,3.3,36,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Vivre pour vivre",1967,130,NA,6.2,59,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Vivre sa vie: Film en douze tableaux",1962,85,64000,7.4,1082,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Vixen!",1968,70,76000,5.4,371,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Viy",1967,80,NA,6.9,132,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Vizantijsko plavo",1993,88,NA,7.2,18,14.5,0,4.5,0,4.5,4.5,4.5,34.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Vizi morbosi di una governante, I",1977,85,NA,4,8,0,14.5,14.5,14.5,14.5,34.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Vizinha do Lado, A",1945,115,NA,7.4,12,4.5,0,0,0,4.5,4.5,24.5,14.5,0,34.5,"",0,0,1,0,0,0,0 -"Vizontele",2001,110,2500000,7.8,644,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Vizontele Tuuba",2004,111,3000000,5.6,239,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Vlad",2003,98,NA,3.9,162,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Vlad Tepes",1979,114,NA,6.2,23,4.5,0,4.5,4.5,4.5,4.5,24.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Vladimir Horowitz: The Last Romantic",1986,88,NA,7.9,16,0,0,0,0,0,0,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Vladimir en Buenos Aires",2002,100,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Vladimir et Rosa",1970,106,NA,3.8,14,24.5,4.5,0,0,4.5,4.5,0,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Vlak u snijegu",1976,84,NA,7.7,17,0,0,0,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Vlakom prema jugu",1981,97,NA,6.3,5,0,0,0,0,0,44.5,0,44.5,0,24.5,"",0,0,1,0,0,0,0 -"Vlaschaard, De",1983,90,NA,6.1,16,0,0,4.5,0,14.5,4.5,24.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vlast' Solovetskaya. Svidetel'stva i dokumenty",1988,93,NA,7,5,0,0,0,0,0,0,84.5,24.5,0,0,"",0,0,0,0,1,0,0 -"Vlci bouda",1985,92,NA,6.4,23,4.5,0,0,4.5,4.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Vlemma tou Odyssea, To",1995,176,NA,7,987,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Vlieg, De",1985,20,NA,6.9,5,0,0,44.5,0,0,0,44.5,0,0,24.5,"",0,0,0,0,0,0,1 -"Vliegende Hollander, De",1995,140,NA,7.2,112,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Vlucht der verbeelding",2003,15,NA,6.1,12,0,0,0,4.5,4.5,45.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,1 -"Vlucht regenwulpen, Een",1981,94,NA,6.4,119,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vlyublyon po sobstvennomu zhelaniyu",1983,89,NA,6.5,24,0,0,0,4.5,4.5,0,14.5,34.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Vnimaniye, cherepakha!",1970,86,NA,7.7,16,4.5,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Voce della luna, La",1990,120,NA,6,221,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Voces inocentes",2004,120,NA,8.2,201,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Voci bianche, Le",1964,93,NA,6.3,10,0,0,0,0,0,34.5,0,44.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Voci dal profondo",1991,91,NA,4.8,97,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Voditel dlya Very",2004,105,3300000,7.7,182,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Vodka Lemon",2003,90,NA,6.5,182,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Vodkaa, komisario Palmu",1969,96,NA,5.7,111,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Voenno-polevoy roman",1983,92,NA,6.4,45,0,4.5,4.5,0,4.5,14.5,0,24.5,4.5,44.5,"",0,0,0,1,0,1,0 -"Voglia di guardare",1986,89,NA,4.2,14,14.5,0,4.5,0,24.5,24.5,14.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Voglia matta, La",1962,110,NA,6.3,28,0,0,0,4.5,14.5,14.5,34.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Vogliamo i colonnelli",1973,105,NA,5.9,39,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Voglio stare sotto al letto",1999,90,NA,5.2,5,24.5,0,24.5,24.5,0,0,0,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Voglio una donnaaa!",1997,90,NA,2.8,12,24.5,4.5,0,0,4.5,4.5,44.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Vogues of 1938",1937,109,NA,5.6,45,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Voice Inside, The",2001,13,1000,8.9,8,0,0,0,0,0,0,14.5,34.5,0,45.5,"",0,0,0,0,0,0,1 -"Voice That Thrilled the World, The",1943,18,NA,5.9,7,0,14.5,0,14.5,0,14.5,44.5,14.5,0,0,"",0,0,0,0,1,0,1 -"Voice in the Mirror",1958,103,NA,6.1,24,0,0,0,14.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Voice in the Wind, A",1944,85,50000,5.4,9,14.5,0,0,14.5,24.5,14.5,0,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Voice of Bugle Ann, The",1936,72,NA,6.4,26,0,0,0,0,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Voice of Hollywood No. 13, The",1932,12,NA,2.8,9,34.5,14.5,14.5,24.5,0,0,14.5,0,0,14.5,"",0,0,1,0,0,0,1 -"Voice of the Prophet",2002,7,NA,7,13,4.5,0,0,0,0,44.5,4.5,14.5,0,24.5,"",0,0,0,0,1,0,1 -"Voice of the Turtle, The",1947,103,NA,5.8,121,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Voice of the Violin, The",1915,20,NA,4.4,5,0,24.5,24.5,24.5,44.5,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Voice of the Whistler",1945,60,NA,6.8,12,0,0,0,0,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Voices",1973,91,NA,5.7,16,0,4.5,4.5,4.5,4.5,0,4.5,14.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Voices",1979,106,NA,5.8,76,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Voices",1995,91,NA,5.5,103,4.5,4.5,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Voices of Iraq",2004,80,NA,7.2,120,14.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Voices of Sarafina!",1988,85,NA,5.2,23,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Voici le temps des assassins",1956,113,NA,7.7,105,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Voie est libre, La",1998,88,NA,5.9,22,4.5,0,4.5,14.5,4.5,24.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Voitheia!... O Vengos faneros praktor 000",1967,95,NA,9,84,0,4.5,0,0,0,4.5,4.5,4.5,14.5,74.5,"",0,0,1,0,0,0,0 -"Voix du rossignol, La",1923,13,NA,8.3,31,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Voix, La",1992,86,NA,6.2,7,0,0,0,14.5,0,24.5,0,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Vojnici",1984,105,NA,7,9,0,0,0,0,0,34.5,14.5,24.5,0,34.5,"",0,0,1,0,0,0,0 -"Vojnikova ljubav",1976,103,NA,6.6,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,0,0,1,0,1,0 -"Vokzal dlya dvoikh",1982,141,NA,7.8,162,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,0,1,0 -"Vol du Sphinx, Le",1984,93,NA,5.2,6,0,0,14.5,0,0,64.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Vol-au-vent",1996,88,NA,5.6,20,0,0,0,24.5,14.5,24.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Volcano",1942,8,NA,7,42,0,4.5,0,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Volcano",1997,104,90000000,5.2,8627,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Volcano: An Inquiry Into the Life and Death of Malcolm Lowry",1976,100,NA,6.7,14,4.5,0,0,0,4.5,24.5,14.5,4.5,0,34.5,"",0,0,0,0,1,0,0 -"Volcanoes of the Deep Sea",2003,40,NA,6.2,33,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,1,0,1 -"Voldtekt",1971,96,NA,5.8,8,0,0,0,0,14.5,14.5,45.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Volere volare",1991,92,NA,6.7,209,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Voleur d'enfants, Le",1991,110,NA,7.7,27,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Voleur de vie",1998,105,NA,6.3,64,4.5,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Voleur, Le",1967,120,NA,6.4,136,4.5,0,4.5,4.5,14.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Voleurs de la nuit, Les",1984,98,NA,6.3,17,0,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Voleurs, Les",1996,117,NA,7.1,606,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Voleuse de Saint-Lubin, La",1999,78,NA,6,40,4.5,0,0,4.5,14.5,14.5,34.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Voleuse, La",1966,88,NA,5.9,7,14.5,0,0,0,14.5,0,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Volevo i pantaloni",1990,97,NA,3.2,11,24.5,4.5,4.5,0,0,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Volevo solo dormirle addosso",2004,96,NA,6,29,0,0,4.5,4.5,4.5,34.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Volga - Volga",1938,108,NA,7.8,44,0,0,4.5,0,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Volga Boatman, The",1926,120,NA,5.8,7,0,0,0,0,14.5,24.5,44.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Voll normaaal",1994,91,NA,3.7,299,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Vollgas",2002,96,NA,5.1,27,14.5,0,4.5,4.5,4.5,14.5,4.5,34.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vollmond",1998,124,NA,6.4,59,14.5,4.5,0,4.5,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Volpone",1941,94,NA,7,38,0,4.5,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Volpone, Il",1988,115,NA,5.1,22,4.5,14.5,0,0,14.5,14.5,14.5,24.5,4.5,0,"",0,0,0,0,0,0,0 -"Volshebnaya lampa Aladdina",1966,84,NA,5.9,33,0,4.5,4.5,0,14.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Volshebnoye koltso",1979,68,NA,9.3,8,0,0,0,0,0,0,0,14.5,45.5,34.5,"",0,1,0,0,0,0,0 -"Volta",2004,108,NA,4.5,7,14.5,0,14.5,24.5,24.5,0,14.5,0,0,0,"",1,0,1,0,0,1,0 -"Voltaire",1933,72,NA,6.4,21,0,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Voltati Eugenio",1980,105,NA,7.2,16,0,0,0,0,0,34.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Volte sempre, Abbas!",1999,6,NA,6.4,14,4.5,4.5,4.5,4.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Volunteer, The",1943,24,NA,8.6,12,0,0,0,0,0,0,14.5,24.5,34.5,24.5,"",0,0,0,0,0,0,1 -"Volunteers",1985,107,NA,4.9,1553,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Volver a empezar",1982,93,NA,6.8,184,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Vom Suchen und Finden der Liebe",2005,107,NA,5.9,154,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,1,0,1,0 -"Von Ryan's Express",1965,117,NA,7,1269,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Von der Liebe besiegt",1956,91,NA,5.1,9,0,0,14.5,0,34.5,14.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Von heute auf morgen",1997,62,NA,4.4,22,14.5,0,4.5,0,14.5,0,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Von morgens bis Mitternacht",1920,65,NA,8.4,19,0,0,4.5,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,0,0,0,0 -"Voodoo",1995,91,NA,4.4,111,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Voodoo",1999,6,NA,5.6,35,0,4.5,0,4.5,0,14.5,4.5,4.5,4.5,45.5,"",0,0,1,0,0,0,1 -"Voodoo Dawn",1990,84,NA,2.1,56,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Voodoo Island",1957,76,NA,4.2,76,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Voodoo Man",1944,62,NA,4.4,35,14.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Voodoo Tiger",1952,67,NA,5.1,21,4.5,0,4.5,4.5,14.5,4.5,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Voodoo Woman",1957,75,65000,3.3,51,14.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Voor een verloren soldaat",1992,92,NA,7.4,512,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,0,1,0 -"Vooruzhyon i ochen opasen",1977,99,NA,5.3,12,24.5,0,0,24.5,4.5,0,0,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Vor",1997,110,2000000,7.2,841,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,0,1,0,0,0 -"Vor Sonnenuntergang",1956,103,NA,5.4,5,0,0,0,24.5,24.5,0,24.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Vormittagsspuk",1928,6,NA,7.5,35,0,4.5,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Voroshilovskiy strelok",1999,95,NA,6.8,85,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vortex",1983,90,80000,4,11,4.5,0,4.5,0,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Vortex",1999,15,NA,5.5,11,34.5,24.5,4.5,4.5,0,4.5,0,0,0,4.5,"",0,0,0,1,0,0,1 -"Vortex",2001,50,NA,7,92,4.5,4.5,4.5,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Vortice mortale",1993,90,NA,5.1,50,14.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Voruntersuchung",1931,95,NA,6.2,10,0,14.5,0,14.5,0,34.5,24.5,14.5,24.5,0,"",0,0,0,0,0,0,0 -"Vory v zakone",1988,95,NA,4.6,23,14.5,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Vos gueules les mouettes!",1974,82,NA,3.7,13,4.5,4.5,24.5,0,14.5,0,14.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Voskhozhdeniye",1976,111,NA,7.7,79,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Voskreseniye",1960,152,NA,8.1,6,0,0,0,0,0,0,45.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vosstaniye rybakov",1934,97,NA,7,5,0,0,0,0,0,0,84.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Vostochnaya elegiya",1996,43,NA,5.3,21,4.5,0,0,4.5,14.5,0,0,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Vote for Huggett",1949,84,NA,5.2,11,4.5,0,0,0,44.5,0,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Vote for Me",2002,90,NA,8.7,6,0,0,0,0,14.5,0,14.5,0,0,64.5,"",0,0,1,0,0,0,0 -"Voulez-vous danser avec moi?",1959,91,NA,6.1,45,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vous n'aurez pas l'Alsace et la Lorraine",1977,92,NA,4.4,59,4.5,4.5,14.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Voyage dans la lune, Le",1902,14,NA,8.2,1262,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Voyage en ballon, Le",1960,85,NA,6.5,18,4.5,0,4.5,4.5,4.5,14.5,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Voyage en douce, Le",1980,98,NA,6.9,48,0,0,4.5,4.5,14.5,4.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Voyage imaginaire, Le",1926,80,NA,6.3,13,0,0,0,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Voyage of the Damned",1976,155,NA,5.9,293,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Voyage of the Kitty Ku Ku",2002,8,NA,8.8,5,0,0,0,0,0,24.5,0,0,44.5,44.5,"",0,0,0,0,0,0,1 -"Voyage of the Rock Aliens",1988,97,NA,3.1,76,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Voyage surprise",1947,85,NA,6.2,14,0,0,0,4.5,4.5,14.5,24.5,4.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Voyage to Next",1974,102,NA,7.6,6,0,0,0,0,14.5,0,34.5,14.5,0,34.5,"",0,1,0,0,0,0,0 -"Voyage to the Bottom of the Sea",1961,105,NA,5.9,598,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"PG",0,0,0,0,0,0,0 -"Voyage to the Planet of Prehistoric Women",1968,78,NA,2,69,44.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Voyage to the Prehistoric Planet",1965,74,NA,3.3,114,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Voyager From the Unknown",1982,91,NA,3.6,17,14.5,14.5,0,4.5,14.5,14.5,0,4.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Voyages",1999,111,NA,7.4,117,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Voyance et manigance",2001,90,NA,4.6,48,0,4.5,14.5,14.5,24.5,14.5,14.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Voyeur.com",2000,95,NA,1.8,72,45.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Voyna",2002,120,NA,7.1,235,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Voyna i mir",1968,390,100000000,8.5,416,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Voyna i mir I: Andrey Bolkonskiy",1965,147,NA,7.9,81,4.5,0,4.5,0,4.5,4.5,14.5,14.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Voyna i mir II: Natasha Rostova",1966,100,NA,7.9,57,0,0,0,0,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Voyna i mir III: 1812 god",1967,84,NA,8,91,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Voyna i mir IV: Pierre Bezukhov",1967,96,NA,7.8,55,0,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Voynata na taralezhite",1979,99,NA,8.4,31,4.5,0,0,0,0,0,0,4.5,4.5,84.5,"",0,0,1,0,0,0,0 -"Voyou, Le",1970,120,NA,7.1,75,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Voyous voyelles",2000,95,NA,5.9,97,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Voz de su amo, La",2001,105,NA,6.2,47,0,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Vozdushnyy izvozchik",1943,74,NA,9,5,0,0,0,0,0,0,0,24.5,64.5,24.5,"",0,0,1,0,0,0,0 -"Vozmezdiye",1967,119,NA,8.2,5,0,0,0,0,0,0,24.5,64.5,0,24.5,"",0,0,0,1,0,0,0 -"Vozvrashcheniye",2003,105,NA,8.2,2121,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Vozvrashcheniye Maksima",1937,114,NA,6.1,9,0,0,0,0,24.5,0,24.5,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Vozvrashcheniye bronenostsa",1996,160,NA,7,14,4.5,0,14.5,0,0,4.5,0,44.5,24.5,4.5,"",0,0,1,0,0,0,0 -"Vraie nature de Bernadette, La",1972,115,NA,7,62,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vrais perdants, Les",1978,92,NA,7.2,7,0,0,0,0,0,0,24.5,44.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Vratar",1936,75,NA,9,5,0,0,0,0,0,0,24.5,24.5,0,64.5,"",0,0,1,0,0,0,0 -"Vrazda po cesku",1967,90,NA,4.5,8,0,0,0,24.5,0,0,45.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Vrazda v hotelu Excelsior",1971,89,NA,7.6,8,0,0,0,0,0,0,45.5,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Vredens dag",1943,94,NA,7.9,781,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Vreme cuda",1989,98,NA,7.2,24,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Vreme na nasile",1988,288,NA,8.3,126,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,0,0,1,0,0,0 -"Vremya tantsora",1998,158,NA,6.7,31,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Vremya zhatvy",2004,67,NA,6.4,21,0,4.5,0,4.5,4.5,4.5,14.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Vremya, vperyod!",1965,158,NA,8.5,6,0,0,0,0,14.5,0,14.5,0,64.5,0,"",0,0,0,1,0,0,0 -"Vrhovi Zelengore",1976,101,NA,5.6,5,0,0,0,0,64.5,0,0,24.5,24.5,0,"",0,0,0,1,0,0,0 -"Vriendschap, De",2001,120,NA,4.9,34,44.5,0,4.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Vrijdag",1981,90,NA,5.8,32,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Vrijeme za...",1993,99,NA,7.3,14,24.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vroeger is dood",1987,90,NA,4.9,10,0,0,14.5,0,0,14.5,24.5,14.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Vroeger kon je lachen",1983,110,NA,7,16,0,0,0,0,0,34.5,4.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Vrooom Vroom Vrooom",1995,29,NA,2.3,45,74.5,14.5,4.5,4.5,0,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,1 -"Vrouw als Eva, Een",1979,113,NA,6,52,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Vrouw tussen hond en wolf, Een",1979,111,NA,6.1,30,4.5,0,0,4.5,0,24.5,34.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Vrouwen willen trouwen",1992,10,NA,5.5,6,0,0,0,0,34.5,14.5,14.5,0,34.5,0,"",0,0,1,1,0,0,1 -"Vsadnik bez golovy",1972,100,NA,6.6,13,0,4.5,0,0,4.5,14.5,14.5,4.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Vsadnik po imeni smert'",2004,106,NA,6.4,28,0,0,4.5,0,14.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Vsetko co mam rad",1992,99,NA,5.7,38,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Vsichko e lyubov",1979,102,NA,7.6,26,0,0,0,0,0,4.5,0,24.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Vstrechnyy",1932,118,NA,5.2,6,0,0,0,0,45.5,0,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Vsyo budet khorosho",1995,100,NA,6.1,20,14.5,0,4.5,0,4.5,14.5,34.5,24.5,14.5,0,"",0,0,1,0,0,0,0 -"Vsyo reshayet mgnoveniye",1978,97,NA,6.2,5,0,0,0,64.5,0,0,0,0,24.5,24.5,"",0,0,0,1,0,0,0 -"Vsyo to, o chyom my tak dolgo mechtali",1997,135,NA,2.5,5,44.5,0,44.5,0,0,0,24.5,0,0,0,"",1,0,0,0,0,1,0 -"Vtackovia, siroty a blazni",1969,78,NA,7.3,26,4.5,0,4.5,0,0,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Vtorostepennyye lyudi",2001,105,NA,6.1,11,0,0,4.5,14.5,4.5,0,0,14.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Vu du pont",1961,110,NA,7.6,36,4.5,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Vu khuc con co",2001,111,NA,5.2,19,4.5,24.5,14.5,4.5,0,14.5,4.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Vua bai rac",2002,97,NA,6.2,6,14.5,0,0,0,14.5,34.5,0,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Vuelo de la paloma, El",1989,88,NA,5.9,9,14.5,0,0,24.5,0,44.5,14.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Vuelta de El Coyote, La",1998,100,NA,2.4,13,34.5,24.5,14.5,0,4.5,0,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Vuk",1981,76,NA,8,188,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,1,0,0,0,0,0 -"Vuk samotnjak",1972,90,NA,7.1,20,0,0,0,0,0,14.5,24.5,4.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Vukovar poste restante",1994,96,NA,7.1,95,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Vukovar se vraca kuci",1994,99,NA,3.6,34,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Vulcano",1950,106,NA,6.3,38,0,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Vulcano, figlio di Giove",1961,76,NA,6.5,5,0,0,24.5,24.5,0,24.5,0,0,44.5,0,"",1,0,0,0,0,0,0 -"Vulgar",2000,85,NA,4.7,1003,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Vulkan, Der",1999,103,NA,5.5,36,0,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Vulkanmannen",1997,77,NA,2.8,10,24.5,0,24.5,14.5,14.5,0,14.5,24.5,0,14.5,"",0,0,0,0,1,0,0 -"Vulture, The",1967,91,NA,4,27,14.5,24.5,14.5,14.5,14.5,14.5,14.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Vultures",1983,101,NA,2.2,16,34.5,14.5,14.5,14.5,0,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Vuoti a perdere",1999,90,NA,4.3,10,0,24.5,0,34.5,34.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Vyrotonin Decision, The",2000,7,NA,6.4,6,0,0,0,14.5,0,34.5,34.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Vysota",1957,94,NA,6.9,7,0,0,0,0,0,24.5,0,14.5,24.5,24.5,"",0,0,0,0,0,1,0 -"Vystrel",1966,77,NA,7.9,5,0,0,0,0,0,0,44.5,64.5,0,0,"",0,0,0,1,0,0,0 -"Vyyti zamuzh za kapitana",1985,90,NA,6.1,13,0,0,4.5,0,24.5,4.5,34.5,0,14.5,4.5,"",0,0,0,0,0,1,0 -"Vzlomshchik",1986,90,NA,5.3,9,0,14.5,14.5,0,14.5,0,0,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Vzlyot",1979,139,NA,5.3,7,0,0,0,0,14.5,0,0,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"W",1974,95,NA,4.2,15,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"W Django!",1972,90,NA,5.4,19,0,4.5,4.5,4.5,14.5,14.5,24.5,0,0,34.5,"",0,0,0,0,0,0,0 -"W Is War",1986,93,NA,5.4,11,24.5,4.5,0,4.5,0,24.5,0,0,0,24.5,"",1,0,0,0,0,0,0 -"W la Foca!",1982,92,NA,7.5,23,14.5,4.5,0,0,4.5,0,0,0,4.5,64.5,"",0,0,1,0,0,0,0 -"W no higeki",1984,108,NA,7.1,13,0,0,0,0,4.5,4.5,34.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"W pustyni i w puszczy",1973,195,NA,6.8,28,0,4.5,0,0,0,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"W pustyni i w puszczy",2001,111,4200000,5.9,37,4.5,0,0,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"W zawieszeniu",1987,93,NA,7.1,6,0,0,0,0,0,0,34.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"W.A.R.: Women Against Rape",1987,90,NA,2.9,5,24.5,0,44.5,24.5,0,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"W.C. Fields and Me",1976,111,NA,5.8,77,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"W.E.B. DuBois: A Biography in Four Voices",1996,114,NA,7.2,6,14.5,0,0,0,0,14.5,14.5,0,14.5,34.5,"",0,0,0,0,1,0,0 -"W.I.A. Wounded In Action",1966,80,NA,5.4,9,14.5,0,0,0,14.5,0,0,0,0,74.5,"",0,0,0,1,0,0,0 -"W.I.S.O.R.",2001,75,NA,5.9,7,14.5,14.5,0,24.5,0,14.5,14.5,0,14.5,0,"",0,0,0,0,1,0,0 -"W.R. - Misterije organizma",1971,85,NA,6.8,238,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"W.S.S. Thriftettes",1918,1,NA,3.6,14,4.5,4.5,24.5,24.5,4.5,14.5,4.5,0,4.5,0,"",0,1,0,0,0,0,1 -"W.W. and the Dixie Dancekings",1975,91,NA,5.3,181,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"WMD: Weapon of Mass Destruction",2004,92,NA,7.1,12,44.5,0,0,0,0,0,0,0,14.5,44.5,"",0,0,0,0,1,0,0 -"WTC the First 24 Hours",2002,40,NA,6.3,45,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,0,1,0,1 -"WUSA",1970,115,NA,4.9,141,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"WXIII: Patlabor the Movie 3",2002,100,NA,6.6,123,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"R",1,1,0,0,0,0,0 -"Wa dong ren",2002,103,NA,4.3,11,0,0,14.5,4.5,14.5,14.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Waan ying dak gung",1998,89,NA,5.8,112,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Waati",1995,140,NA,7.4,10,0,0,0,0,0,24.5,44.5,14.5,34.5,0,"",0,0,0,0,0,0,0 -"Wabash Avenue",1950,92,NA,6.5,45,0,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Wabbit Twouble",1941,8,NA,7.7,95,4.5,0,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Wabbit Who Came to Supper, The",1942,8,NA,7,73,0,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Wachsexperimente",1927,6,NA,9.3,6,0,0,0,0,0,0,0,0,64.5,34.5,"",0,1,0,0,0,0,1 -"Wachsfigurenkabinett, Das",1924,83,NA,7.5,88,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wachtkamer, De",1995,29,NA,7.6,55,0,0,4.5,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,1,1 -"Wachtmeister Studer",1939,90,NA,6.6,18,0,0,0,0,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wackiest Ship in the Army, The",1960,99,NA,6,285,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wackiest Wagon Train in the West, The",1976,86,NA,1.5,17,44.5,4.5,14.5,0,14.5,0,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Wackiki Wabbit",1943,7,NA,7.3,79,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Wacko",1981,90,NA,4,78,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Wacky Taxi",1972,79,NA,6.4,5,0,0,0,24.5,0,0,84.5,0,0,0,"",0,0,1,0,0,0,0 -"Wacky Wabbit, The",1942,7,NA,7.3,56,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Wacky Wildlife",1940,8,NA,6.6,13,0,0,0,0,4.5,34.5,34.5,4.5,14.5,0,"",0,1,1,0,0,0,1 -"Wacky World of Dr. Morgus, The",1962,83,NA,1.1,5,24.5,24.5,0,0,24.5,0,0,0,0,44.5,"",0,0,1,0,0,0,0 -"Wacky World of Mother Goose",1967,81,NA,5,11,14.5,0,0,4.5,14.5,0,24.5,4.5,0,14.5,"",0,1,0,0,0,0,0 -"Wacky Worm, The",1941,7,NA,6.5,24,4.5,4.5,0,0,4.5,14.5,44.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Waco",1966,85,NA,5.3,22,4.5,0,0,4.5,24.5,4.5,4.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Waco: The Rules of Engagement",1997,165,NA,8.4,538,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Wadd: The Life and Times of John C. Holmes",1998,105,NA,6.4,181,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",0,0,0,0,1,0,0 -"Wag the Dog",1997,97,15000000,7,16434,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,0,0,0,0 -"Wag the Dogma",2001,30,NA,6.3,6,14.5,0,0,0,14.5,14.5,14.5,0,14.5,14.5,"",0,0,0,0,1,0,1 -"Waga jinsei saiaku no toki",1994,92,NA,6.8,82,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Waga koi wa moenu",1949,96,NA,7.3,24,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Waga seishun ni kuinashi",1946,110,NA,7.3,156,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Waga seishun no Arcadia",1982,130,NA,6.6,90,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,44.5,"",0,1,0,1,0,0,0 -"Wager of Love",1993,80,NA,3.5,14,64.5,0,4.5,0,14.5,0,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Wager, The",1998,19,NA,6.5,15,0,0,0,0,0,24.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Wager, The",2002,88,NA,3.8,16,14.5,0,0,0,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Waggily Tale, A",1958,6,NA,5.9,13,0,0,0,0,24.5,34.5,24.5,4.5,4.5,0,"",0,1,1,0,0,0,1 -"Wagner",1998,110,NA,7.5,12,4.5,0,0,0,4.5,0,4.5,0,24.5,45.5,"",0,0,0,0,0,0,0 -"Wagon Heels",1945,7,NA,6.9,22,0,14.5,4.5,4.5,4.5,4.5,14.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Wagon Master",1950,86,NA,7.1,327,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wagon Team",1952,61,NA,5.4,7,14.5,0,0,0,44.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Wagon Train",1940,59,NA,6.4,17,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Wagon Wheels",1934,56,NA,4.8,14,4.5,4.5,4.5,14.5,14.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Wagon Wheels West",1943,18,NA,5.2,13,0,0,14.5,0,44.5,34.5,0,0,0,4.5,"",0,0,0,0,0,0,1 -"Wagons East",1994,107,NA,4,733,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wagons Roll at Night, The",1941,84,NA,6,85,0,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wagons West",1952,70,NA,6.4,9,0,0,0,0,0,74.5,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Wags to Riches",1949,7,NA,7.3,26,0,0,0,0,0,24.5,14.5,24.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Wahadelko",1981,57,NA,8.3,7,0,0,0,0,0,0,24.5,0,45.5,14.5,"",0,0,0,0,0,0,0 -"Wai Si-Lei chuen kei",1985,90,NA,5.8,32,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Waikiki Wedding",1937,89,NA,5.2,21,4.5,4.5,0,4.5,24.5,24.5,14.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Wait Till the Sun Shines, Nellie",1952,108,NA,6.9,53,4.5,0,0,4.5,4.5,14.5,4.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Wait Until Dark",1967,107,4000000,7.7,3453,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Wait Until Spring, Bandini",1989,100,NA,5.6,138,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Waiter, The",1997,92,NA,6.3,7,14.5,14.5,14.5,0,14.5,0,24.5,0,0,14.5,"",0,0,0,1,0,1,0 -"Waiters' Ball, The",1916,20,NA,7.7,7,0,0,0,0,0,0,45.5,14.5,0,24.5,"",0,0,1,0,0,0,1 -"Waitin' to Live",2002,95,NA,5.6,9,0,0,0,0,34.5,44.5,0,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Waiting",2003,25,NA,7,7,0,0,0,0,14.5,24.5,14.5,44.5,0,0,"",0,0,0,0,0,0,1 -"Waiting Game, The",1999,85,NA,4.2,28,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Waiting for Fidel",1974,58,NA,6.3,25,4.5,0,0,0,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Waiting for Godot",2001,120,NA,7.7,75,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Waiting for Guffman",1996,84,4000000,7.6,7337,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Waiting for Harvey: A Beginner's Guide to Cannes",1999,60,NA,8.9,8,0,0,14.5,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Waiting for Michelangelo",1996,93,NA,5.6,44,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Waiting for Woody",1998,30,NA,5.6,107,4.5,4.5,4.5,4.5,34.5,4.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,1 -"Waiting for the Clouds",2004,90,NA,6.7,19,14.5,0,0,4.5,4.5,14.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Waiting for the Light",1990,94,NA,5.7,89,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Waiting for the Moon",1987,88,NA,6.4,51,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Waiting for the Wind",1990,30,NA,6.1,5,0,0,0,0,24.5,24.5,0,44.5,0,24.5,"",0,0,0,0,0,0,1 -"Waiting to Exhale",1995,127,15000000,5.1,1611,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Waitress!",1981,88,NA,3.2,59,24.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Wake",2003,90,NA,5.5,49,14.5,0,4.5,0,14.5,0,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"Wake In Providence, A",1999,94,NA,6.9,27,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,4.5,34.5,"R",0,0,1,0,0,0,0 -"Wake Island",1942,87,NA,7.1,204,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wake Me When It's Over",1960,126,NA,6.5,57,4.5,0,0,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wake Up and Dream",1934,77,NA,8.7,8,0,0,0,0,0,14.5,45.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wake Up and Dream",1946,92,NA,5.9,18,0,14.5,0,0,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Wake Up and Live",1937,91,NA,7.2,14,0,0,0,0,0,24.5,14.5,4.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Wake Up and Smell the Coffee",2001,76,NA,3.1,64,34.5,4.5,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Wake Up the Gypsy in Me",1933,7,NA,6.9,7,14.5,0,0,0,0,24.5,14.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Wake in Fright",1971,114,NA,6.8,46,4.5,0,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Wake of the Red Witch",1948,106,1200343,6.1,273,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Waking",1999,9,NA,5.4,11,0,0,0,4.5,24.5,4.5,0,14.5,24.5,4.5,"",0,0,0,0,0,0,1 -"Waking Life",2001,101,NA,7.5,6999,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,1,0,1,0,0,0 -"Waking Ned",1998,92,3000000,7.3,7232,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG",0,0,1,0,0,0,0 -"Waking Up Horton",1998,90,NA,2.5,42,45.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,0,4.5,"PG",0,0,0,0,0,0,0 -"Waking Up in Reno",2002,91,NA,5.3,862,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Waking, The",2001,97,NA,2.5,44,45.5,14.5,4.5,4.5,0,4.5,0,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wakusei daisenso",1977,87,NA,5.5,19,4.5,0,24.5,4.5,4.5,24.5,14.5,4.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Waldrausch",1962,89,NA,5.8,6,0,0,14.5,0,0,34.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Walk Backwards",2001,95,NA,3.5,19,14.5,14.5,0,0,14.5,0,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Walk Don't Run",1966,114,NA,6.4,465,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Walk Don't Walk",2001,60,5000000,7.6,11,0,0,0,0,0,4.5,34.5,24.5,14.5,4.5,"",0,0,0,0,1,0,1 -"Walk East on Beacon!",1952,98,NA,5.9,22,4.5,0,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Walk Like a Dragon",1960,95,NA,5.5,18,0,0,4.5,4.5,24.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Walk Like a Man",1987,86,NA,3.9,256,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Walk On Water",2004,104,NA,7.5,533,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Walk Proud",1979,102,NA,4,42,4.5,0,4.5,14.5,4.5,4.5,4.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Walk Safe, Young America",1975,30,NA,7.8,17,0,4.5,0,0,14.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Walk Softly, Stranger",1950,81,NA,6.5,60,0,0,0,4.5,14.5,34.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Walk Through H: The Reincarnation of an Ornithologist, A",1978,41,NA,8.4,75,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Walk a Crooked Mile",1948,91,NA,5,21,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Walk in the Clouds, A",1995,102,20000000,6.2,4085,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Walk in the Park, A",1999,85,NA,4.9,29,14.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,0,4.5,"",0,0,1,0,0,1,0 -"Walk in the Spring Rain",1970,98,NA,5.4,47,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Walk in the Sun, A",1945,117,800000,7.8,482,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Walk on the Moon, A",1987,95,NA,6,8,0,0,0,14.5,14.5,34.5,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Walk on the Moon, A",1999,105,14000000,6.6,1815,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Walk on the Wild Side",1962,114,NA,6.4,221,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Walk the Proud Land",1956,89,NA,6.5,58,4.5,4.5,4.5,0,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Walk the Talk",2000,111,NA,5.7,52,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Walk the Walk",1996,115,NA,5.7,9,0,24.5,14.5,24.5,0,0,14.5,0,14.5,24.5,"",0,0,0,0,0,0,0 -"Walk to Remember, A",2002,101,11000000,6.8,7124,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"PG",0,0,0,1,0,1,0 -"Walk with Love and Death, A",1969,90,NA,5.2,75,4.5,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Walkabout",1971,95,NA,7.6,2765,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Walkabout",1996,132,NA,7.9,13,14.5,0,0,4.5,0,0,0,0,24.5,45.5,"",0,0,1,0,0,0,0 -"Walkentalk",2003,10,NA,8,23,4.5,4.5,0,0,4.5,0,0,14.5,24.5,44.5,"",0,0,1,0,0,0,1 -"Walker",1987,95,5800000,5.2,296,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Walker Texas Ranger 3: Deadly Reunion",1994,87,NA,2.8,71,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Walking Across Egypt",1999,100,4500000,6.9,247,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Walking After Midnight",1988,92,NA,4.6,14,14.5,0,4.5,4.5,14.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,1,0,0 -"Walking Back",1928,62,NA,4.7,6,0,0,14.5,14.5,0,0,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Walking Dead, The",1936,66,217000,6.7,157,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Walking Dead, The",1995,88,NA,4.7,131,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Walking Hills, The",1949,78,NA,6,37,0,0,0,4.5,14.5,44.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Walking My Baby Back Home",1953,95,NA,6.2,7,0,0,0,14.5,0,45.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Walking Stick, The",1970,96,NA,6.3,73,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Walking Tall",1973,125,500000,6.3,612,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Walking Tall",2004,87,56000000,5.9,4839,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Walking Tall Part II",1975,109,NA,5.3,141,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Walking Target, The",1960,75,NA,5.1,15,0,4.5,0,4.5,24.5,24.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Walking Thunder",1997,95,NA,5.2,37,4.5,4.5,0,4.5,14.5,4.5,4.5,14.5,4.5,34.5,"PG",0,0,0,0,0,0,0 -"Walking and Talking",1996,86,1000000,6.6,888,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,1,0 -"Walking on Air",1936,70,NA,6.5,15,0,0,0,14.5,4.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Walking on Water",2002,90,NA,6.8,150,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Walking on the Wild Side",2000,13,NA,5.6,13,0,0,14.5,0,24.5,0,34.5,0,14.5,14.5,"",0,0,1,1,0,1,1 -"Walking the Baby",1932,10,NA,8.1,6,0,0,0,0,0,14.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Walking the Dog",1991,30,NA,5.8,11,14.5,0,0,0,14.5,14.5,14.5,4.5,0,14.5,"",0,0,0,0,0,0,1 -"Walking the Edge",1983,93,NA,5.6,40,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Walking to the Waterline",1998,100,NA,5.4,75,14.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Walking with Walken",2001,10,NA,3.3,9,0,0,24.5,0,0,14.5,24.5,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Walkower",1965,77,NA,6.8,20,0,0,0,4.5,14.5,0,4.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Walky Talky Hawky",1946,7,NA,7.7,60,0,4.5,0,4.5,0,4.5,24.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Wall Street",1987,125,15000000,7.2,11269,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Wall of Noise",1963,112,NA,6.5,11,0,4.5,0,0,4.5,4.5,4.5,14.5,0,44.5,"",0,0,0,1,0,0,0 -"Wall, The",1962,9,NA,7.3,10,0,0,0,14.5,14.5,14.5,14.5,34.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Wallace & Gromit: A Close Shave",1995,30,NA,8.2,9261,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Wallace & Gromit: A Grand Day Out",1991,23,NA,7.7,5134,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Wallace & Gromit: Cracking Contraptions",2002,20,NA,8.5,139,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Wallace & Gromit: The Wrong Trousers",1993,30,NA,8.4,14976,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Wallander - Innan frosten",2005,93,NA,5.7,62,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wallers letzter Gang",1989,95,NA,6.7,36,0,0,0,4.5,0,4.5,24.5,4.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Wallflower",1948,77,NA,6.9,23,0,4.5,0,0,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Walls of Glass",1985,86,NA,5.6,17,0,0,0,4.5,14.5,24.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Walls of Jericho, The",1948,106,NA,6.1,17,0,0,14.5,4.5,4.5,24.5,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Walnut Creek",1996,103,NA,4,35,4.5,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Wals voor de storm",2002,14,NA,6.7,14,0,0,0,4.5,24.5,0,0,24.5,24.5,24.5,"",0,1,0,0,0,0,1 -"Walt Disney Story, The",1973,25,NA,7.1,29,4.5,0,0,4.5,0,4.5,4.5,24.5,4.5,44.5,"",0,0,0,0,1,0,1 -"Walter & Carlo i Amerika",1989,80,NA,2.3,65,34.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Walter Ego, The",1991,28,NA,2.5,10,14.5,34.5,24.5,0,0,0,14.5,14.5,0,24.5,"",0,0,1,0,0,0,1 -"Walter og Carlo - yes, det er far",1986,81,NA,3.2,79,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Waltz Across Texas",1982,99,NA,5.1,67,4.5,0,0,14.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Waltz of the Toreadors",1962,105,NA,5.7,111,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Waltzes from Vienna",1933,80,NA,6.4,38,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,1,0 -"Wan Pipel",1976,111,NA,6.3,21,0,0,0,4.5,0,14.5,34.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Wan gu liu fang",1965,116,NA,8.4,5,0,0,0,0,0,24.5,0,24.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Wan zhong",1988,90,NA,6.2,8,0,0,0,24.5,0,0,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Wan zhu",1988,110,NA,8.1,23,0,0,0,0,0,0,14.5,34.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Wana",1996,106,NA,9.3,11,0,0,0,0,0,0,0,24.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Wanda",1971,102,NA,6.7,113,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wanda Nevada",1979,107,NA,4.4,92,14.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Wanda Whips Wall Street",1981,83,NA,4.9,21,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wandafuru raifu",1998,118,NA,7.5,1631,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Wanderer of the Wasteland",1945,67,NA,6.4,6,0,0,0,14.5,0,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Wanderers, The",1979,117,NA,6.9,1136,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Wandering Papas",1926,8,NA,4.5,30,0,4.5,24.5,14.5,34.5,14.5,4.5,4.5,0,0,"",0,0,1,0,0,0,1 -"Wandering Willies",1926,20,NA,5.9,16,0,0,0,0,34.5,34.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Wanderlust",2001,95,NA,4.5,11,14.5,0,44.5,4.5,0,4.5,4.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Wanee wa Junah",2001,115,NA,7.3,72,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Wang Jiao de tian kong",1995,92,NA,6.2,23,0,0,14.5,4.5,14.5,4.5,24.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Wanjia denghuo",1948,124,NA,7.4,6,0,0,0,0,0,34.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Wannabes",2000,110,NA,4.8,69,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,24.5,"R",0,0,0,1,0,0,0 -"Want",2003,98,NA,6.9,19,4.5,4.5,4.5,14.5,14.5,0,0,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Wanted",1997,87,NA,4,65,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",1,0,1,0,0,0,0 -"Wanted -- A Master",1936,10,NA,7.7,9,0,0,0,0,14.5,0,44.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Wanted for Murder",1946,91,NA,7.5,34,4.5,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Wanted: Dead or Alive",1987,104,NA,5.3,516,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Wanted: Jane Turner",1936,66,NA,6.2,13,0,0,0,4.5,14.5,34.5,34.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Wanwan chushingura",1963,82,NA,8.6,8,24.5,14.5,0,0,0,0,14.5,0,0,45.5,"",0,1,0,0,0,0,0 -"Waqt",1965,206,NA,7.4,36,0,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Waqt",2005,153,NA,7.1,40,4.5,4.5,0,4.5,0,14.5,14.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"War",2004,84,NA,5,29,14.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"War Against Mrs. Hadley, The",1942,86,NA,6,18,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"War Arrow",1953,78,NA,5.4,56,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"War Between Men and Women, The",1972,110,NA,5.7,100,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"War Between Us, The",1995,93,NA,5.8,34,4.5,4.5,0,0,14.5,24.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"War Boy, The",1985,86,NA,4.4,9,24.5,0,24.5,0,14.5,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"War Bride, The",2001,107,NA,7,178,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"War Cat",1987,90,NA,1.9,11,34.5,0,14.5,24.5,0,0,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"War Comes to America",1945,70,NA,7.9,59,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"War Dog",1986,95,NA,6.1,43,24.5,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"War Dogs",1942,64,NA,8.4,5,0,24.5,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"War Drums",1957,75,NA,5.3,19,4.5,0,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"War Effort, The",2003,106,15000,8.7,12,0,4.5,0,0,0,0,0,4.5,4.5,74.5,"",0,0,1,0,0,0,0 -"War Game",2001,29,NA,6.8,22,0,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,1,0,0,0,0,1 -"War Game, The",1965,48,NA,8.5,212,4.5,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"War Hunt",1962,83,300000,6.3,95,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"War Is Hell",1963,81,47000,5.3,6,34.5,0,0,14.5,14.5,0,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"War Lord, The",1965,123,3500000,6.8,393,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"War Lover, The",1962,105,NA,6.3,150,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"War Nurse",1930,81,NA,4.9,24,4.5,0,4.5,14.5,14.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"War Paint",1953,89,NA,6,25,0,0,0,14.5,24.5,34.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"War Party",1988,99,NA,5.6,119,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"War Photographer",2001,96,NA,7.7,344,0,4.5,0,4.5,4.5,4.5,14.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"War Requiem",1989,92,NA,5.8,57,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,24.5,"",0,0,0,1,0,0,0 -"War Room, The",1993,96,NA,7.5,471,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"War Stories",1995,95,NA,6.8,27,0,0,0,0,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"War Story",1989,5,NA,6.5,54,0,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,1,0,0,1,0,1 -"War Story",2001,30,NA,9.1,24,0,0,0,0,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,0,0,0,0,1 -"War Story, A",1981,82,NA,7.2,14,0,0,0,0,0,14.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"War Wagon, The",1967,101,NA,6.5,838,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"War Zone, The",1999,98,NA,7.3,1986,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"War and Peace",1956,208,6000000,6.6,795,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG",0,0,0,1,0,1,0 -"War and Pieces",1964,6,NA,6.4,24,4.5,0,0,14.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"War at Home, The",1979,100,NA,7.2,34,4.5,0,0,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,0,1,0,0 -"War at Home, The",1996,119,NA,6.6,443,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"War of the Buttons",1994,94,NA,7,588,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"War of the Colossal Beast",1958,69,NA,2.7,197,24.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"War of the Roses, The",1989,116,NA,6.5,7714,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"War of the Satellites",1958,72,NA,3.6,41,4.5,4.5,14.5,14.5,4.5,24.5,4.5,4.5,0,14.5,"",0,0,0,0,0,0,0 -"War of the Worlds, The",1953,85,2000000,7.2,3502,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"War, The",1994,127,NA,6.3,1928,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"WarGames",1983,114,12000000,6.9,11474,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Warai no daigaku",2004,121,NA,9,14,0,0,0,0,0,4.5,0,24.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Warau kaeru",2002,96,NA,6.5,10,0,0,0,14.5,24.5,34.5,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Ward 13",2003,15,NA,8.2,69,4.5,0,0,0,4.5,0,4.5,24.5,24.5,34.5,"",1,1,1,0,0,0,1 -"Warhead",1977,90,NA,5.8,15,0,4.5,24.5,4.5,24.5,4.5,34.5,0,4.5,0,"",1,0,0,0,0,0,0 -"Warhead",1996,90,NA,2.4,59,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,0,14.5,"R",1,0,0,0,0,0,0 -"Warheads",1993,179,NA,7.2,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,0,0,0,1,0,0 -"Warkill",1968,100,NA,6,13,0,4.5,0,4.5,14.5,24.5,24.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Warlock",1959,122,NA,7.1,402,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Warlock",1989,90,7000000,5.7,1839,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Warlock: The Armageddon",1993,98,3000000,4.6,692,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Warlords",1989,87,NA,4.3,21,0,14.5,34.5,4.5,24.5,4.5,0,0,4.5,4.5,"",1,0,0,0,0,0,0 -"Warlords of Atlantis",1978,96,NA,4.7,169,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Warlords of Hell",1987,76,NA,2.5,6,0,34.5,0,14.5,0,14.5,0,0,0,34.5,"",1,0,0,0,0,0,0 -"Warlords of the 21st Century",1982,91,NA,3.8,91,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Warm Bodies, Hot Nights",1988,71,NA,8.1,5,0,0,0,0,24.5,0,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Warm Corner, A",1930,104,NA,6.6,6,0,0,0,0,0,45.5,14.5,14.5,14.5,0,"",0,0,1,0,0,1,0 -"Warm December, A",1973,99,3000000,4.4,46,0,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Warm Nights on a Slow Moving Train",1988,91,NA,4.6,38,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Warm Summer Rain",1989,82,NA,4.7,77,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Warming Up",1985,94,NA,5.2,15,0,0,0,14.5,14.5,4.5,14.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Warning Shot",1967,100,NA,6.5,102,0,0,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Warning Sign",1985,99,NA,5.6,197,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Warning, The",2004,9,6500,7,9,0,0,0,0,14.5,0,24.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Warnung vor einer heiligen Nutte",1971,103,NA,6.4,178,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Warpath",1951,95,NA,5.9,45,4.5,0,0,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Warpath",2000,90,NA,8,20,14.5,4.5,0,14.5,14.5,0,4.5,24.5,24.5,14.5,"",1,0,0,0,0,0,0 -"Warrendale",1967,100,NA,7.7,18,0,0,0,0,0,4.5,14.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Warrior",2002,97,NA,1.7,16,64.5,14.5,0,0,0,0,0,0,14.5,14.5,"R",1,0,0,0,0,1,0 -"Warrior Queen",1987,79,NA,3.3,87,34.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Warrior and the Sorceress, The",1984,81,NA,4.2,131,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Warrior of Justice",1996,89,NA,2.4,5,64.5,0,44.5,0,0,0,0,0,0,0,"",1,0,0,0,0,0,0 -"Warrior of the Lost World",1983,87,NA,1.9,165,44.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Warrior, The",2001,86,NA,6.8,266,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"Warriors",1994,101,NA,3.4,65,34.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Warriors of Virtue",1997,101,35000000,3.6,389,14.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,14.5,"PG",1,0,0,0,0,0,0 -"Warriors of Virtue: The Return to Tao",2002,93,NA,4.6,41,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,34.5,"PG",0,0,0,0,0,0,0 -"Warriors of the Net",1999,13,NA,8.2,15,4.5,0,0,0,14.5,0,4.5,24.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Warriors, The",1979,93,NA,7.2,4742,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Wars, The",1983,120,NA,5.2,11,14.5,0,0,4.5,4.5,4.5,24.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Warszawa",2003,104,NA,6.5,86,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Warter, Der",2001,15,NA,6.7,14,0,0,0,4.5,0,14.5,34.5,24.5,14.5,0,"",0,0,0,0,0,0,1 -"Wartezimmer zum Jenseits",1964,90,NA,5.8,14,0,4.5,4.5,0,14.5,34.5,4.5,0,14.5,14.5,"",1,0,0,0,0,0,0 -"Warui yatsu hodo yoku nemuru",1960,132,NA,7.8,455,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Warum die UFOs unseren Salat klauen",1980,91,NA,5.9,8,14.5,0,0,14.5,0,24.5,0,34.5,0,14.5,"",0,0,1,0,0,0,0 -"Was geht - Die fantastischen Vier",2001,84,NA,6.7,26,4.5,0,0,4.5,14.5,14.5,24.5,14.5,0,24.5,"",0,0,0,0,1,0,0 -"Was geht Euch mein Leben an: Marieluise",1997,141,NA,7,5,0,0,0,44.5,0,0,24.5,0,0,44.5,"",0,0,0,0,1,0,0 -"Was geschah wirklich zwischen den Bildern?",1986,83,NA,7.5,13,4.5,0,0,0,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Was ich bin, sind meine Filme",1979,93,NA,6.4,6,0,0,0,0,0,64.5,0,14.5,0,14.5,"",0,0,0,0,1,0,0 -"Was nicht passt, wird passend gemacht",2002,101,NA,7.2,479,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Was tun, wenn's brennt?",2001,101,NA,7.1,772,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Wasabi",2001,94,NA,6.4,3057,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,1,1,0,0,0 -"Waschen, schneiden, legen",1999,90,NA,2.5,47,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Wash Dry and Spin Out",2003,85,NA,2,5,0,64.5,0,0,0,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Wash, The",1988,94,NA,7.2,23,0,0,0,0,4.5,4.5,24.5,4.5,24.5,34.5,"R",0,0,0,1,0,1,0 -"Wash, The",2001,93,4000000,3.7,902,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Washed Up",2000,107,NA,6.1,8,24.5,0,0,14.5,0,0,14.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Washington Heights",2002,89,NA,5.9,144,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,0,1,0,1,0 -"Washington Melodrama",1941,80,NA,6,30,0,4.5,0,4.5,14.5,24.5,24.5,34.5,4.5,0,"",0,0,0,1,0,0,0 -"Washington Merry-Go-Round",1932,75,NA,4.8,14,4.5,0,4.5,4.5,24.5,4.5,24.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Washington Square",1997,115,NA,6.7,864,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG",0,0,0,1,0,1,0 -"Washington Story",1952,81,NA,6.2,22,0,0,4.5,0,14.5,24.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Wasp",2003,26,NA,7.6,86,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,1 -"Wasp Woman, The",1960,73,50000,4.2,297,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Waste Land, The",1995,40,NA,6.1,7,44.5,0,0,0,0,0,0,0,0,45.5,"",0,0,0,0,0,0,1 -"Wasurerarenu hitobito",2000,121,NA,7.3,17,0,0,4.5,0,4.5,4.5,24.5,44.5,14.5,0,"",0,0,0,1,0,0,0 -"Wat zien ik?",1971,90,NA,5.2,136,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wat's Pig",1996,11,NA,7.1,133,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Watashi no guranpa",2003,113,NA,6.9,9,0,0,0,24.5,0,0,44.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Watashi o ski ni tsurete itte",1987,98,NA,6.6,8,0,0,14.5,14.5,0,14.5,0,34.5,0,24.5,"",0,0,1,0,0,1,0 -"Watashi wa nisai",1962,88,NA,7.2,25,0,0,0,0,4.5,24.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Watch It",1993,103,NA,6.3,195,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Watch Me",1996,90,NA,4.6,75,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,1,0 -"Watch Your Stern",1960,90,NA,4.9,35,4.5,4.5,0,4.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Watch on the Rhine",1943,114,NA,7.5,378,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Watch the Birdie",1950,71,NA,5.8,44,0,0,4.5,14.5,14.5,24.5,4.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Watch the K Foundation Burn a Million Quid",1995,63,NA,7.2,10,0,0,14.5,0,0,0,14.5,24.5,44.5,24.5,"",0,0,0,0,1,0,0 -"Watch the Shadows Dance",1987,87,NA,3.6,88,14.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"WatchUsDie.com",2001,101,NA,4.2,13,34.5,4.5,14.5,14.5,0,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Watched!",1974,93,NA,4.1,7,14.5,14.5,14.5,14.5,24.5,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Watcher in the Woods, The",1980,84,NA,6,657,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Watcher, The",1999,36,NA,5.6,7,14.5,0,0,24.5,0,24.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Watcher, The",2000,97,33000000,5.2,5774,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Watchers",1988,91,NA,4.3,399,14.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Watchers II",1990,101,NA,3.8,102,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Watchers III",1994,80,NA,2.7,60,34.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Watchers Reborn",1998,90,NA,3,73,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Watchers, The",2003,12,NA,7.2,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,0,0,0,0,1 -"Watching TV",1994,5,NA,7,8,0,0,0,0,0,24.5,64.5,0,0,14.5,"",0,1,0,0,0,0,1 -"Watchtower",2001,97,NA,4.5,207,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Watchtower Over Tomorrow",1945,15,NA,7.8,13,0,0,4.5,4.5,0,0,4.5,4.5,24.5,44.5,"",0,0,0,0,1,0,1 -"Water",1975,5,NA,6.5,18,0,4.5,0,0,4.5,14.5,24.5,4.5,0,45.5,"",0,0,0,0,0,0,1 -"Water Babies",1935,8,NA,7.2,41,0,0,4.5,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Water Babies, The",1978,103,NA,5,150,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Water Birds",1952,30,NA,7.2,15,0,0,0,24.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Water Damage",1999,98,NA,3.9,74,14.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Water Game, The",2002,106,NA,6,11,14.5,0,14.5,0,0,14.5,4.5,0,0,34.5,"",1,0,0,1,0,0,0 -"Water Ghost, The",1998,30,NA,6.6,23,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Water Power",1977,76,NA,5.5,31,14.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Water Sports",1935,8,NA,5.9,5,0,0,0,0,24.5,64.5,24.5,0,0,0,"",0,0,0,0,1,0,1 -"Water Trix",1949,9,NA,6.2,10,0,0,0,14.5,0,45.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Water Wagons",1925,17,NA,5.3,7,0,0,0,24.5,14.5,24.5,14.5,14.5,0,0,"",0,0,1,0,0,0,1 -"Water Wrackets",1975,12,NA,6.7,57,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Water and Power",1999,19,NA,4.4,16,4.5,14.5,4.5,4.5,34.5,4.5,0,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Water for Maya",2000,5,NA,7.3,6,0,0,0,0,0,34.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Water with Food Coloring",2001,16,NA,6.5,9,14.5,0,0,0,0,14.5,24.5,0,34.5,24.5,"",0,0,1,0,0,0,1 -"Water, Water Every Hare",1952,7,NA,8,138,0,4.5,0,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"Water-Logged",1962,83,NA,5.7,6,0,0,0,14.5,0,14.5,14.5,34.5,0,14.5,"",0,0,0,0,1,0,0 -"Waterborne",2005,120,198000,7.6,11,0,0,0,4.5,4.5,0,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Waterboy, The",1998,90,23000000,5.5,15539,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Waterboys",2001,90,NA,7.5,338,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Waterdance, The",1992,106,NA,7,928,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Waterfall, The",2001,120,NA,7.2,32,4.5,0,0,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Waterfront",1939,59,NA,5.9,17,4.5,0,0,0,24.5,24.5,4.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Waterfront",1944,68,NA,5.4,20,0,0,4.5,14.5,44.5,14.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Waterfront",1950,74,NA,5.7,23,0,0,4.5,4.5,44.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Waterhole #3",1967,95,NA,6.4,161,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Waterland",1992,95,NA,6.6,490,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Waterloo Bridge",1931,81,251289,8.3,132,4.5,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Waterloo Bridge",1940,108,NA,7.3,865,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Waterloo Road",1945,73,NA,7.1,57,0,4.5,0,4.5,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Watermark",2003,76,NA,4,41,4.5,4.5,4.5,4.5,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Watermarks",2004,80,NA,6.6,59,0,0,0,0,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Watermelon Man",1970,97,NA,5.9,277,24.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Watermelon Woman, The",1996,90,NA,6.3,130,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,1,0,0 -"Waterproof",1999,95,NA,6.2,103,4.5,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Watershed, The",2004,78,NA,8.7,8,0,0,0,0,0,0,14.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Watership Down",1978,92,NA,7.4,2931,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,0,1,0,0,0 -"Waterwalker",1984,87,NA,4.7,11,0,0,0,14.5,0,0,14.5,0,44.5,14.5,"",0,0,0,0,1,0,0 -"Waterworld",1995,176,175000000,5.4,19325,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Wattstax",1973,98,NA,7,90,4.5,4.5,0,0,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,1,0,1,0,0 -"Watusi",1959,85,NA,5.6,30,0,0,14.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wave Twisters",2001,46,NA,6.7,132,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,1,0,0,0,0,0 -"Wavelength",1967,45,NA,6.8,101,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Wavelength",1983,87,NA,5.3,92,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wax, or the Discovery of Television Among the Bees",1991,85,NA,4.7,59,14.5,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Waxwing",1998,15,NA,4.9,8,0,0,24.5,24.5,0,14.5,14.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Waxwork",1988,97,NA,5.7,763,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Waxwork II: Lost in Time",1992,104,NA,5.5,411,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Way Ahead, The",1944,91,NA,7.3,153,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Way Back Home",1932,81,NA,6.1,95,4.5,4.5,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Way Down East",1920,145,700000,7.9,293,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Way Down East",1935,80,NA,4.9,13,4.5,4.5,4.5,4.5,4.5,24.5,24.5,0,4.5,4.5,"",0,0,0,1,0,1,0 -"Way Down South",1939,61,NA,7.4,9,0,0,0,0,14.5,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Way It All Went Down, The",1999,93,NA,4.6,19,24.5,4.5,24.5,0,4.5,0,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Way Off Broadway",2001,87,NA,5.6,70,4.5,4.5,0,0,4.5,0,4.5,14.5,4.5,74.5,"",0,0,0,0,0,0,0 -"Way Out Topless",1967,66,NA,2.1,6,45.5,14.5,14.5,0,0,14.5,0,0,0,0,"",0,0,0,0,1,0,0 -"Way Out West",1930,71,20000,4.8,19,14.5,14.5,14.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Way Out West",1937,65,NA,7.7,946,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Way We Live Now, The",1970,110,NA,4.3,9,0,0,24.5,0,14.5,0,0,14.5,0,45.5,"",0,0,0,1,0,0,0 -"Way We Live, The",1946,64,NA,5.7,7,0,0,0,14.5,24.5,45.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Way We Were, The",1973,118,NA,6.7,2298,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Way West, The",1967,122,NA,5.8,184,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Way for a Sailor",1930,83,NA,5.1,13,0,0,14.5,4.5,34.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,1,0 -"Way in the Wilderness, A",1940,11,NA,7.2,9,0,0,0,0,14.5,24.5,14.5,34.5,0,24.5,"",0,0,0,0,0,0,1 -"Way of All Flesh, The",1927,94,NA,6.7,10,24.5,0,0,0,14.5,24.5,14.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Way of All Flesh, The",1940,86,NA,6,15,0,0,0,4.5,4.5,0,0,14.5,34.5,44.5,"",0,0,0,1,0,0,0 -"Way of Life, A",2004,93,NA,7.4,35,4.5,4.5,0,0,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Way of Lost Souls, The",1929,94,NA,7.8,6,0,0,0,0,0,0,14.5,34.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Way of a Gaucho",1952,88,NA,5.7,36,0,0,0,4.5,24.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Way of the Gun, The",2000,120,9000000,6.5,7750,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,0,0,0 -"Way of the Vampire",2005,90,1000000,3,16,44.5,14.5,4.5,14.5,14.5,4.5,0,0,0,0,"R",0,0,0,0,0,0,0 -"Way to Shadow Garden, The",1954,10,NA,8.2,5,0,0,0,0,0,0,24.5,44.5,44.5,0,"",0,0,0,0,0,0,1 -"Way to the Gold, The",1957,94,NA,5.8,6,0,0,0,14.5,0,34.5,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Way to the Stars, The",1945,109,NA,8.1,148,0,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Way... Way Out",1966,101,NA,4.4,140,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Waydowntown",2000,87,NA,7.1,646,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"R",0,0,1,0,0,0,0 -"Wayne's World",1992,95,NA,6.8,16677,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wayne's World 2",1993,95,NA,5.6,9584,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wayward Bus, The",1957,87,NA,5.2,32,0,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wayward Canary, The",1932,8,NA,6,17,0,0,24.5,14.5,4.5,24.5,14.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"Wayward Pups, The",1937,8,NA,7.7,5,0,0,0,0,44.5,24.5,0,0,0,44.5,"",0,1,1,0,0,0,1 -"Wayward Son",1999,96,7700000,5.1,19,4.5,0,4.5,14.5,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"We Aim to Please",1934,7,NA,7.7,12,0,0,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"We All Fall Down",2000,92,NA,5.2,46,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"We Are Not Alone",1939,112,NA,7,72,4.5,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"We Are Winning Don't Forget",2004,7,NA,6.5,6,0,0,0,0,14.5,0,64.5,14.5,0,0,"",0,0,0,0,0,0,1 -"We Are the Champions",1985,80,NA,9.1,11,0,0,0,0,0,0,24.5,0,4.5,64.5,"",0,0,0,0,0,0,0 -"We Can't Go Home Again",1976,120,NA,4.3,12,0,14.5,4.5,4.5,4.5,4.5,0,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"We Did It",1936,6,NA,5.7,5,0,0,0,0,24.5,44.5,44.5,0,0,0,"",0,1,0,0,0,0,1 -"We Dive at Dawn",1943,98,NA,6.7,121,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"We Don't Live Here Anymore",2004,101,3000000,6.1,1387,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"We Give Pink Stamps",1965,6,NA,5.8,9,0,0,0,0,24.5,64.5,0,0,0,14.5,"",0,1,0,0,0,0,1 -"We Have Decided Not to Die",2004,11,NA,7,11,24.5,0,0,0,4.5,14.5,0,14.5,14.5,4.5,"",0,0,0,1,0,0,1 -"We Joined the Navy",1962,109,NA,4.9,13,0,14.5,0,34.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"We Live Again",1934,85,NA,5.9,41,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"We Married Margo",2000,90,NA,5.8,90,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"We Served with Pride: The Chinese American Experience in WWII",1999,56,NA,6.3,5,0,0,0,0,0,24.5,0,0,0,84.5,"",0,0,0,0,1,0,0 -"We Sold Our Souls for Rock 'n Roll",2001,90,NA,3.3,37,24.5,0,4.5,0,4.5,0,4.5,24.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"We Think the World of You",1988,92,NA,5.6,75,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"We Three Kings",2001,79,NA,5.9,9,14.5,14.5,24.5,0,0,0,0,34.5,0,24.5,"",0,0,0,0,0,0,0 -"We Were Dancing",1942,95,NA,5.9,30,4.5,0,4.5,4.5,24.5,24.5,34.5,4.5,0,0,"",0,0,1,0,0,0,0 -"We Were Soldiers",2002,143,75000000,7.1,14939,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",1,0,0,1,0,0,0 -"We Were Strangers",1949,106,900000,6.2,65,0,0,0,14.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"We Who Are About to Die",1937,81,NA,6.9,17,0,0,4.5,0,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"We Who Are Young",1940,80,NA,5.4,19,0,4.5,0,14.5,24.5,34.5,14.5,0,4.5,14.5,"",0,0,0,1,0,1,0 -"We Work Again",1937,15,NA,6.4,15,0,0,0,24.5,4.5,24.5,24.5,24.5,14.5,0,"",0,0,0,0,1,0,1 -"We of the Never Never",1982,134,NA,6.4,45,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"We the People",1994,90,NA,5.4,15,24.5,4.5,0,4.5,4.5,4.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"We the People",2002,60,NA,3.5,7,24.5,14.5,0,0,14.5,14.5,0,0,14.5,14.5,"",0,0,1,1,0,0,0 -"We'll Meet Again",1943,84,NA,7,5,0,24.5,0,0,0,24.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"We're Back! A Dinosaur's Story",1993,64,NA,4.6,475,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,1,0,0,0,0,0 -"We're Funny That Way",1998,86,NA,6.3,12,0,4.5,4.5,0,24.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,1,0,0 -"We're Going to Scare You to Death",1975,75,NA,7.2,5,0,0,0,0,44.5,24.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"We're No Angels",1955,106,1685000,7.3,1137,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"We're No Angels",1989,106,20000000,5.4,2694,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"We're Not Dressing",1934,77,NA,6.8,49,4.5,0,4.5,4.5,4.5,14.5,44.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"We're Not Married!",1952,86,NA,6.3,155,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"We're Only Human",1935,69,NA,4.9,18,14.5,0,0,4.5,14.5,14.5,34.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"We're Rich Again",1934,71,NA,6.7,30,0,0,4.5,4.5,4.5,24.5,4.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"We're Talking Serious Money",1992,91,NA,5.6,45,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"We're in the Money",1933,7,NA,3.3,8,0,14.5,34.5,14.5,14.5,24.5,0,0,0,0,"",0,1,1,0,0,0,1 -"We're in the Money",1935,66,NA,5.8,15,0,0,0,24.5,14.5,34.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"We're on the Jury",1937,70,NA,5.6,13,0,0,0,24.5,14.5,24.5,24.5,0,0,14.5,"",0,0,1,0,0,0,0 -"We've Never Been Licked",1943,103,NA,5.9,44,14.5,4.5,0,0,14.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"We, the Animals - Squeak!",1941,9,NA,6.3,19,0,0,4.5,0,14.5,44.5,14.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Weak and the Wicked, The",1953,72,NA,5.2,25,4.5,0,4.5,14.5,4.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Weak at Denise",2001,88,NA,6.1,20,14.5,0,0,0,14.5,24.5,14.5,0,24.5,14.5,"",0,0,1,0,0,0,0 -"Weaker Sex, The",1948,84,NA,4.9,11,0,0,0,4.5,45.5,14.5,0,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Weakly Reporter, The",1944,7,NA,6.2,23,0,0,14.5,0,14.5,24.5,34.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Weapon of Mass Destruction",2004,81,25000,8.2,21,14.5,0,0,0,0,0,0,0,4.5,74.5,"",1,0,1,0,0,0,0 -"Weapon, The",1957,77,NA,5.9,7,0,0,0,14.5,14.5,14.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Weapons of Death, The",1981,90,NA,4.2,9,44.5,24.5,14.5,0,14.5,0,0,14.5,0,0,"",1,0,0,1,0,0,0 -"Weapons of the Spirit",1987,90,NA,7.4,23,0,0,0,0,0,4.5,14.5,34.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Wearing of the Grin, The",1951,7,NA,6.8,72,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Weary River",1929,86,NA,5.7,35,0,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Weasel Stop",1956,6,NA,6.9,18,0,4.5,0,14.5,4.5,14.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Weasel While You Work",1958,6,NA,6.6,31,0,0,0,4.5,0,24.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Weasels Rip My Flesh",1979,67,NA,3.1,33,34.5,4.5,4.5,4.5,14.5,14.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Weather Underground, The",2002,92,NA,7.7,566,4.5,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Weather Wizards",1939,10,NA,6.2,6,0,0,0,0,14.5,34.5,45.5,0,0,0,"",0,0,0,0,0,0,1 -"Weatherman '69",1989,120,NA,7.6,14,0,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Weavers: Wasn't That a Time, The",1982,78,NA,8.1,58,4.5,0,4.5,0,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Web of Seduction",1999,87,NA,4.5,38,4.5,4.5,4.5,24.5,4.5,4.5,14.5,14.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Web, The",1947,87,NA,6.8,70,0,0,0,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Webbers, The",1993,118,NA,5,70,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Wedding Advice: Speak Now or Forever Hold Your Peace",2002,57,150000,9.1,36,4.5,4.5,0,0,4.5,0,4.5,0,14.5,64.5,"",0,0,0,0,1,0,0 -"Wedding Band",1990,82,NA,3,20,34.5,14.5,14.5,0,24.5,4.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Wedding Bell Blues",1996,102,NA,4.9,193,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Wedding Date, The",2005,90,15000000,5,953,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,1,0 -"Wedding Knives",1998,14,NA,5.3,5,0,24.5,0,0,0,0,44.5,24.5,0,24.5,"",0,0,0,0,0,0,1 -"Wedding March, The",1928,113,1000000,8.5,134,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Wedding Night, The",1935,84,NA,6.2,61,4.5,4.5,0,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Wedding Party, The",1969,92,43000,5.2,94,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Wedding Planner, The",2001,103,35000000,4.9,7393,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Wedding Present",1936,81,NA,4.5,16,0,4.5,4.5,4.5,0,4.5,34.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Wedding Rehearsal",1933,84,NA,6.3,12,0,0,0,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Wedding Singer, The",1998,95,NA,6.8,19487,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Wedding Tackle, The",2000,94,NA,2.9,36,24.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Wedding Toast, The",2003,30,22000,8.8,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,1,1,0,0,1 -"Wedding Video, The",2003,84,NA,6.2,39,4.5,4.5,4.5,4.5,0,24.5,0,14.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Wedding in Monaco, The",1956,31,NA,6.9,26,4.5,0,0,4.5,14.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,1,1,1 -"Wedding in Ramallah, A",2002,90,NA,7.7,19,4.5,0,0,0,4.5,4.5,4.5,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Wedding in White",1972,103,NA,5.9,35,4.5,0,4.5,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Wedding, A",1978,125,NA,6.7,477,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Weddings and Babies",1958,81,NA,8.4,7,0,0,0,14.5,0,0,0,14.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Wedle wyrokow twoich",1984,95,NA,6.9,13,0,0,0,0,24.5,24.5,4.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Wedlock",1991,101,NA,5.5,862,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Wedlock House: An Intercourse",1959,11,NA,6.8,64,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Wednesday",1975,17,NA,8.3,11,0,4.5,0,4.5,0,0,0,0,44.5,34.5,"",0,0,0,0,0,0,1 -"Wednesday Afternoon",2004,24,40000,8.3,17,4.5,4.5,0,0,0,4.5,4.5,14.5,4.5,45.5,"",0,0,0,1,0,0,1 -"Wednesday's Child",1934,69,NA,5.5,7,14.5,0,14.5,0,24.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Wee Wee",2000,1,NA,5.9,9,0,14.5,0,24.5,0,34.5,14.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"Wee Wee Monsieur",1938,18,NA,7.3,52,0,4.5,0,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Wee Willie Winkie",1937,100,NA,6.9,138,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wee-Willie Wildcat",1953,6,NA,5.9,5,0,0,0,24.5,0,44.5,24.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Weed: Or, A Cancer in the Community",2003,15,4750,8.2,5,24.5,0,0,0,0,0,0,0,0,84.5,"",0,0,1,0,0,0,1 -"Weeds",1987,115,NA,5.8,281,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Week Before, The",1998,23,NA,8.6,13,0,0,0,0,0,0,4.5,4.5,34.5,44.5,"",0,0,0,0,0,0,1 -"Week End",1967,105,250000,7.2,1064,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Week That Girl Died, The",1998,90,NA,5.6,21,0,0,0,4.5,0,0,14.5,4.5,14.5,44.5,"",0,0,1,1,0,0,0 -"Week-End at the Waldorf",1945,130,NA,6.5,98,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Week-End in Havana",1941,81,NA,6.3,73,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Week-End with Father",1951,83,NA,6,21,0,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Week-end Marriage",1932,66,NA,6.7,11,0,0,0,0,4.5,44.5,24.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"Weekend",1962,84,NA,6.1,15,0,0,14.5,0,4.5,14.5,34.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Weekend Getaway",1998,15,NA,7,8,0,0,0,0,14.5,0,45.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Weekend Pass",1984,88,NA,2.3,89,44.5,14.5,4.5,4.5,4.5,4.5,0,0,0,34.5,"",0,0,1,0,0,0,0 -"Weekend at Bernie's",1989,97,NA,5.6,4267,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Weekend at Bernie's II",1993,97,NA,3.5,2190,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Weekend for Three",1941,65,NA,5.4,11,4.5,0,0,24.5,4.5,4.5,14.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Weekend of Shadows",1978,95,500000,6.6,11,0,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Weekend with Kate",1990,92,NA,5.1,25,4.5,4.5,0,14.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Weekend with Lulu, A",1962,89,NA,8.4,7,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,1,0,0,0,0 -"Weekend with the Babysitter",1971,93,NA,4.1,15,24.5,0,0,14.5,14.5,0,0,0,4.5,44.5,"",0,0,0,1,0,0,0 -"Weekend, The",1999,97,NA,5.7,76,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Weeki Wachee Girls",2000,22,NA,7.4,8,14.5,0,0,0,14.5,0,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Weg ist das Spiel, Der",2005,3,NA,9.8,8,0,0,0,0,0,0,0,0,24.5,74.5,"",0,0,0,0,0,0,1 -"Weg naar Bresson, De",1984,54,NA,7.4,9,0,0,0,0,14.5,14.5,0,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"Weg nach Eden, Der",1995,80,NA,6.4,22,0,0,0,4.5,4.5,14.5,4.5,4.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Weg!",2002,83,NA,5.8,12,0,0,4.5,0,4.5,34.5,24.5,24.5,0,0,"",0,0,0,1,0,1,0 -"Wege in die Nacht",1999,98,NA,7.3,73,4.5,0,4.5,4.5,14.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Weh dem, der liebt!",1951,86,NA,6.6,6,0,14.5,0,0,0,14.5,34.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Wehe, wenn sie losgelassen",1958,82,NA,3.5,5,0,24.5,0,44.5,24.5,24.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Wei qing",1995,90,NA,4.8,14,0,4.5,0,24.5,34.5,14.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Weibsteufel, Der",1966,91,NA,5.7,7,0,0,0,0,24.5,0,24.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Weight of Water, The",2000,113,16000000,6,1742,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Weight of the World, The",1994,17,NA,6.2,8,0,0,0,0,34.5,0,0,0,24.5,34.5,"",0,0,0,0,0,0,1 -"Weihnachtsbaum, Der",1983,20,NA,8.3,6,14.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,1 -"Weihnachtsfieber",1997,90,NA,5.7,21,14.5,0,0,0,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Weiningers Nacht",1989,105,NA,5.3,7,0,0,0,14.5,24.5,0,0,44.5,0,14.5,"",0,0,0,1,0,0,0 -"Weird Science",1985,94,NA,6.1,7867,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Weird Woman",1944,63,NA,6.2,40,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Weird World of LSD, The",1967,75,NA,2.7,21,24.5,24.5,4.5,0,14.5,4.5,0,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Weirdo, The",1989,91,NA,3,18,34.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Weiser",2001,95,NA,6.2,54,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Weisse Spinne, Die",1963,103,NA,5.7,25,0,0,0,14.5,14.5,44.5,24.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Weit ist der Weg",1960,85,NA,3.7,8,0,14.5,24.5,34.5,24.5,0,0,0,0,0,"",0,0,0,0,0,0,0 -"Wekande Walauwa",2003,106,NA,3,14,24.5,14.5,24.5,4.5,0,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Welcome 2 Ibiza",2002,95,NA,5.4,5,24.5,0,0,24.5,24.5,0,0,24.5,24.5,0,"",1,0,1,0,0,1,0 -"Welcome Danger",1929,115,979828,6.8,54,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Welcome Home",1989,96,NA,5.2,64,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Welcome Home Brother Charles",1975,91,NA,4.5,52,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Welcome Home, Roxy Carmichael",1990,95,NA,5.5,1108,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Welcome Home, Soldier Boys",1972,91,NA,5,14,4.5,0,14.5,14.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Welcome II the Terrordome",1995,90,NA,2.9,25,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,24.5,"R",0,0,0,1,0,0,0 -"Welcome Stranger",1947,107,NA,6,32,4.5,0,0,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Welcome to 18",1986,91,NA,4.5,44,4.5,4.5,14.5,14.5,34.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Welcome to Alaska",1999,81,NA,5.2,16,14.5,0,4.5,14.5,24.5,4.5,14.5,14.5,0,0,"",1,0,1,0,0,0,0 -"Welcome to Arrow Beach",1974,85,NA,4.7,42,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Welcome to Blood City",1977,96,NA,4.7,56,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Welcome to Canada",1989,89,NA,5.3,7,24.5,0,0,0,24.5,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Welcome to Collinwood",2002,86,12000000,6.1,2831,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Welcome to Hard Times",1967,103,NA,6,206,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Welcome to Hollywood",2000,89,NA,4.8,238,14.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,1,0,0 -"Welcome to L.A.",1976,106,NA,5.4,218,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Welcome to Life",2004,15,NA,6,5,0,0,0,44.5,0,0,44.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Welcome to Mooseport",2004,117,26000000,5.3,2356,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Welcome to Sarajevo",1997,103,9000000,6.8,1465,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Welcome to Woop Woop",1997,97,NA,5.1,504,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Welcome to the Club",1971,88,NA,4.9,8,0,14.5,14.5,24.5,14.5,0,34.5,0,0,0,"",0,0,1,0,0,0,0 -"Welcome to the Discworld",1996,8,NA,7.3,23,0,0,0,0,14.5,14.5,14.5,0,4.5,44.5,"",0,1,0,0,0,0,1 -"Welcome to the Dollhouse",1995,88,800000,7.4,5851,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Welcome to the Neighborhood",2003,89,NA,6.7,12,0,14.5,4.5,0,0,4.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Welcome to the Show/Intermission in the Third Dimension/The End of the Show",2003,8,NA,8.2,49,0,0,4.5,0,4.5,4.5,4.5,14.5,14.5,64.5,"",0,1,1,0,0,0,1 -"Welding the Big Ring",1904,6,NA,3.5,6,14.5,0,14.5,64.5,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Welfare",1975,167,NA,7.7,24,0,0,0,0,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Well Done",1994,73,NA,5.8,11,0,0,4.5,0,4.5,4.5,24.5,4.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Well Spent Life, A",1972,44,NA,7,10,0,0,0,0,0,0,45.5,24.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Well Worn Daffy",1965,7,NA,6.7,21,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Well, The",1951,86,NA,7.8,50,0,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Well, The",1997,101,3000000,6.2,118,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Well-Groomed Bride, The",1946,75,NA,6,8,0,0,0,14.5,24.5,24.5,14.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Wells Fargo",1937,97,1500000,7,41,4.5,0,0,4.5,0,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wells Fargo Days",1944,20,NA,5.3,5,0,0,0,0,64.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,1 -"Wend Kuuni",1982,75,NA,7,22,4.5,0,0,0,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wendigo",2001,91,NA,4.9,941,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Wenn am Sonntag abend die Dorfmusik spielt",1953,87,NA,3.3,7,14.5,0,44.5,14.5,24.5,0,0,0,0,0,"",0,0,0,1,0,1,0 -"Wenn der Richtige kommt",2003,78,NA,5.9,16,14.5,4.5,4.5,4.5,0,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wenn der Vater mit dem Sohne",1955,95,NA,5.8,68,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Wenn die Conny mit dem Peter",1958,106,NA,4.7,6,0,0,34.5,14.5,14.5,34.5,0,0,0,0,"",0,0,1,0,0,0,0 -"Wenn die Dinge durcheinander geraten",2004,5,NA,7.5,16,14.5,0,4.5,0,0,0,4.5,14.5,24.5,34.5,"",0,1,1,1,0,0,1 -"Wenn die Glocken hell erklingen",1959,90,NA,3.5,7,0,14.5,0,44.5,24.5,14.5,0,0,0,0,"",0,0,1,1,0,0,0 -"Wenn du bei mir bist",1970,101,NA,3,14,4.5,24.5,24.5,4.5,14.5,0,0,14.5,0,0,"",0,0,1,0,0,1,0 -"Wenn man baden geht auf Teneriffa",1964,94,NA,4.5,6,34.5,0,0,34.5,34.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Went the Day Well?",1942,92,NA,7.9,167,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Went to Coney Island on a Mission From God... Be Back by Five",1998,94,NA,6.7,120,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Wer hat Angst vorm Weihnachtsmann?",1996,14,NA,5.6,9,14.5,0,14.5,0,34.5,0,14.5,24.5,14.5,0,"",0,0,0,0,0,0,1 -"Wer kennt Jonny R.?",1966,91,NA,4.2,7,0,14.5,0,24.5,14.5,0,14.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Wer spinnt denn da, Herr Doktor?",1981,81,NA,4.5,5,0,0,0,24.5,24.5,0,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Wer zuletzt lacht, lacht am besten",1971,85,NA,1.8,19,44.5,24.5,14.5,14.5,0,0,0,4.5,4.5,0,"",0,0,1,0,0,0,0 -"WerAngstWolf",2000,85,NA,4.4,7,0,0,0,14.5,24.5,14.5,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Werewolf",1996,99,350000,2,1032,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Werewolf Reborn!, The",1998,70,NA,3.2,34,34.5,24.5,14.5,14.5,0,0,4.5,4.5,0,4.5,"PG",0,0,0,0,0,0,0 -"Werewolf of London",1935,75,NA,6.3,353,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Werewolf of Washington, The",1973,90,NA,3.8,51,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"Werewolf, The",1956,79,NA,5.5,134,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Werewolves on Wheels",1971,77,NA,2.4,57,34.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Werner - Beinhart!",1990,93,NA,6.2,425,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,1,1,0,0,0,0 -"Werner Herzog Eats His Shoe",1980,20,NA,8,56,0,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,"",0,0,0,0,1,0,1 -"Wernher von Braun",1960,107,NA,5.1,22,14.5,4.5,0,14.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Werther",1938,85,NA,6.9,24,4.5,0,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Werther",1986,105,NA,4.6,7,0,0,44.5,0,0,0,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Werther",1990,92,NA,6.3,6,0,0,0,0,0,64.5,14.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Wesele",1973,105,NA,6.8,73,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Wesele",2004,109,NA,7.6,100,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Wesh wesh, qu'est-ce qui se passe?",2001,83,NA,6.5,24,0,0,0,0,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wesland",2002,7,NA,8.5,19,0,0,14.5,0,0,0,0,14.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Wesley Cash",2004,73,20000,8.2,31,4.5,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,"",1,0,0,0,0,0,0 -"West 11",1963,93,NA,4.8,6,0,0,14.5,0,14.5,14.5,14.5,0,0,34.5,"",0,0,0,1,0,0,0 -"West 47th Street",2001,104,NA,6.7,10,24.5,0,0,0,0,14.5,0,14.5,0,64.5,"",0,0,0,0,1,0,0 -"West Bank Brooklyn",2002,82,NA,8.2,10,14.5,0,0,0,0,0,14.5,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"West Bank Story",2005,20,74000,7.6,31,4.5,4.5,0,4.5,4.5,0,4.5,0,14.5,64.5,"",0,0,0,0,0,0,1 -"West Beyrouth",1998,105,800000,7.3,462,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"West From North Goes South",2004,96,NA,8.2,12,4.5,0,0,4.5,0,4.5,0,0,14.5,45.5,"",0,0,1,0,0,0,0 -"West Point Story, The",1950,107,NA,5.7,165,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"West Point of the Air",1935,89,NA,6.2,33,4.5,4.5,0,4.5,4.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"West Side Story",1961,151,6000000,7.8,12931,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"West Virginia, the State Beautiful",1929,75,NA,6,9,0,0,0,14.5,34.5,24.5,14.5,24.5,0,0,"",0,0,0,0,1,0,0 -"West and soda",1965,86,NA,7,43,0,0,4.5,4.5,0,4.5,4.5,44.5,14.5,14.5,"",0,1,1,0,0,0,0 -"West of Broadway",1931,68,NA,6.4,6,14.5,0,0,0,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"West of Here",2002,79,NA,7.4,31,14.5,4.5,4.5,4.5,0,4.5,4.5,14.5,4.5,44.5,"",0,0,0,1,0,0,0 -"West of Hot Dog",1924,30,NA,4.7,27,4.5,4.5,14.5,4.5,14.5,14.5,24.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"West of Shanghai",1937,64,NA,6.3,54,4.5,0,4.5,4.5,4.5,24.5,34.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"West of Zanzibar",1928,65,NA,7.4,138,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"West of the Divide",1934,54,NA,4.9,62,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"West of the Law",1942,60,NA,4.9,6,0,0,14.5,0,34.5,34.5,0,0,14.5,0,"",0,0,0,0,0,0,0 -"West of the Pecos",1945,66,NA,5.5,24,4.5,4.5,0,0,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"West to Glory",1947,56,NA,5.2,6,14.5,0,0,14.5,14.5,0,34.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Westbound",1959,72,NA,6.4,60,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Westen leuchtet, Der",1982,104,NA,7.7,8,0,0,0,0,0,14.5,24.5,34.5,0,24.5,"",0,0,0,0,0,1,0 -"Westend",2001,89,NA,5.7,10,0,14.5,0,0,14.5,44.5,14.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Westender",2003,105,NA,6.3,46,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Western",1989,2,NA,9.6,6,0,0,0,0,14.5,14.5,0,0,14.5,45.5,"",0,1,0,0,0,0,1 -"Western",1997,124,NA,6.8,429,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Western Approaches",1944,83,NA,7.1,8,0,0,0,14.5,0,0,24.5,24.5,14.5,24.5,"",0,0,0,1,1,0,0 -"Western Avenue",1993,118,NA,4.3,9,45.5,14.5,0,24.5,0,0,0,14.5,0,0,"",1,0,0,1,0,0,0 -"Western Code, The",1932,58,NA,4.6,10,0,14.5,24.5,24.5,14.5,34.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Western Heritage",1948,61,NA,4.8,10,0,0,0,14.5,14.5,0,0,45.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Western Jamboree",1938,60,NA,7,6,0,14.5,0,0,0,14.5,0,34.5,34.5,0,"",0,0,0,0,0,0,0 -"Western Pacific Agent",1950,65,NA,5,6,0,0,34.5,14.5,0,0,14.5,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Western Union",1941,95,NA,6.6,190,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Westerner, The",1934,58,NA,4.8,12,0,0,4.5,4.5,24.5,24.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Westerner, The",1940,100,2000000,7.8,418,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Westerplatte",1967,96,NA,6.2,17,0,0,0,0,14.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Westfront 1918",1930,75,NA,7,69,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Westinghouse Air Brake Co.",1904,3,NA,2.8,6,14.5,14.5,34.5,14.5,0,0,14.5,0,0,0,"",0,0,0,0,0,0,1 -"Westinghouse Air Brake Co. (Casting Scene)",1904,3,NA,2.7,5,24.5,24.5,24.5,24.5,0,0,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Westinghouse Air Brake Co. (Moulding Scene)",1904,4,NA,2.7,5,24.5,24.5,44.5,24.5,0,0,0,0,0,0,"",0,0,0,0,0,0,1 -"Westler",1985,94,NA,7.4,75,4.5,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Westray",2001,80,NA,6.6,13,0,0,0,0,4.5,34.5,0,4.5,34.5,14.5,"",0,0,0,0,1,0,0 -"Westward Ho",1935,61,35000,4,36,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Westward Ho the Wagons!",1956,90,NA,5.5,38,0,4.5,0,14.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Westward Passage",1932,73,NA,5.3,28,0,0,4.5,24.5,14.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Westward the Women",1951,118,NA,7.2,297,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Westworld",1973,88,NA,6.9,3764,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Wet",1995,29,NA,5.2,30,4.5,0,4.5,4.5,14.5,14.5,4.5,14.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Wet Blanket Policy",1948,6,NA,6.4,11,0,0,0,4.5,14.5,44.5,0,0,24.5,0,"",0,1,1,0,0,0,1 -"Wet Dreams",1975,89,NA,3.4,15,14.5,0,0,4.5,24.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Wet Hare",1962,7,NA,6.9,25,0,0,4.5,4.5,4.5,4.5,44.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Wet Hot American Summer",2001,97,NA,6.2,3227,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,1,0,0,0,0 -"Wet Paint",1946,7,NA,6.8,28,0,0,4.5,4.5,4.5,14.5,34.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Wet Parade, The",1932,118,NA,6,34,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Wetbacks",1956,89,NA,6.8,7,14.5,0,0,0,0,14.5,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Wetherby",1985,102,NA,7,164,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Whacked",2002,12,NA,7,8,0,0,0,0,0,0,24.5,14.5,14.5,45.5,"",0,0,0,1,0,0,1 -"Whacked!",2002,91,NA,4.4,72,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,1,0,0,0,0 -"Whale Music",1994,107,NA,6.7,194,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",0,0,1,1,0,0,0 -"Whale Rider",2002,101,NA,8,10252,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Whale of a Tale, A",1977,90,NA,5.3,10,0,0,24.5,0,34.5,14.5,14.5,0,0,34.5,"",0,0,1,1,0,0,0 -"Whale of a Tale, A",2004,90,NA,7,8,0,0,14.5,0,14.5,14.5,0,45.5,0,14.5,"",0,0,0,0,1,0,0 -"Whalers, The",1938,8,NA,7,46,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Whales of August, The",1987,90,NA,7.2,591,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Whales: An Unforgettable Journey",1997,44,NA,7.8,50,0,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Wham Bam Slam",1955,16,NA,5.4,26,14.5,14.5,24.5,14.5,4.5,14.5,14.5,0,4.5,0,"",0,0,1,0,0,0,1 -"Wham Bam Thank You Spaceman",1975,75,NA,3.1,37,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Whasango",2001,95,NA,6.2,825,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"What -- No Spinach?",1936,6,NA,6.3,11,0,0,4.5,14.5,0,4.5,34.5,4.5,0,14.5,"",0,1,1,0,0,0,1 -"What About Bob?",1991,99,NA,6.6,8831,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"What About Juvenile Delinquency?",1955,12,NA,3.5,23,34.5,24.5,14.5,14.5,0,0,4.5,0,4.5,0,"",0,0,0,1,0,0,1 -"What About Me",1993,87,NA,5.6,9,0,0,0,0,14.5,14.5,0,24.5,14.5,44.5,"",0,0,0,1,0,0,0 -"What Alice Found",2003,96,NA,6.6,187,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"What Are You Having?",2003,11,NA,5.2,15,0,0,0,14.5,0,14.5,14.5,0,0,64.5,"",0,0,0,0,0,0,1 -"What Became of Jack and Jill?",1972,85,NA,6.8,5,0,0,0,0,24.5,24.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"What Becomes of the Broken Hearted?",1999,108,NA,6.1,463,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"What Can I Do?",1994,80,NA,3.8,5,64.5,0,0,0,0,24.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"What Changed Charley Farthing?",1974,109,NA,3,25,14.5,14.5,34.5,4.5,14.5,4.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"What Comes Around",1986,92,NA,3.6,10,14.5,0,24.5,24.5,44.5,14.5,0,0,0,0,"",0,0,1,0,0,0,0 -"What Did You Do in the War, Daddy?",1966,116,7000000,6.1,204,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"What Do Women Want",1996,97,NA,8,14,4.5,0,0,0,0,4.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"What Do You Say to a Naked Lady?",1970,85,NA,5.6,130,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,1,0,0 -"What Dreams May Come",1998,113,85000000,6.3,11706,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"What Drink Did",1909,12,NA,5.2,5,24.5,0,0,0,0,0,64.5,0,24.5,0,"",0,0,0,1,0,0,1 -"What Ever Happened to Baby Jane?",1962,135,980000,7.7,3981,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"What Every Woman Knows",1934,89,NA,6.3,29,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"What Farocki Taught",1998,30,NA,6.7,7,0,0,0,0,24.5,14.5,24.5,0,24.5,0,"",0,0,0,0,0,0,1 -"What Grown-Ups Know",2004,30,NA,7.8,8,0,0,0,0,0,24.5,0,34.5,14.5,24.5,"",0,0,0,1,0,0,1 -"What Happened Was...",1994,91,120000,7,386,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,1,0 -"What Happened on Twenty-third Street, New York City",1901,1,NA,5.8,18,0,0,4.5,14.5,24.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,1,0,1 -"What Happened to Jones",1926,70,NA,7.7,7,0,0,0,0,0,0,45.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"What Happened to Kerouac?",1985,96,NA,5.9,26,0,14.5,0,4.5,0,14.5,24.5,34.5,4.5,4.5,"",0,0,0,0,1,0,0 -"What Happened to Pete",1992,14,NA,4.6,50,4.5,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"What Happened to Rosa",1920,54,NA,7.3,6,0,0,0,0,0,14.5,34.5,34.5,0,14.5,"",0,0,1,0,0,0,0 -"What I Like About You",2000,90,NA,6.5,12,34.5,0,0,0,0,0,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"What I Want My Words to Do to You: Voices From Inside a Women's Maximum Security Prison",2003,78,NA,7.2,21,4.5,0,0,0,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"What Is Funny?",2004,10,30000,9.5,20,0,0,0,0,0,0,4.5,4.5,24.5,64.5,"",0,0,0,0,0,0,1 -"What Is It?",2005,72,NA,5.1,57,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,0,1,0,0,0 -"What Kind of Mother Are You?",1996,120,NA,5,32,4.5,0,0,24.5,24.5,14.5,4.5,0,0,24.5,"",0,0,0,1,0,0,0 -"What Lies Beneath",2000,130,90000000,6.6,20584,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,0,1,0,0,0 -"What Makes Daffy Duck",1948,7,NA,6.9,41,4.5,0,4.5,0,14.5,4.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"What Matters Most",2001,105,NA,6.5,38,0,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"What My Mother Told Me",1995,57,NA,8,5,0,0,0,0,0,0,0,44.5,0,64.5,"",0,0,0,1,0,0,0 -"What Next, Corporal Hargrove?",1945,95,NA,5.9,23,4.5,0,0,24.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"What Planet Are You From?",2000,104,50000000,5.6,2574,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"What Price Fleadom",1948,7,NA,7,22,0,4.5,0,0,4.5,24.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"What Price Glory",1926,116,360000,7.6,34,0,0,4.5,0,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,1,1,0,0,0 -"What Price Glory",1952,111,NA,5.9,142,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"What Price Hollywood?",1932,88,411676,7.2,123,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"What Price Pants?",1931,18,NA,7.1,5,0,24.5,0,0,0,24.5,44.5,0,0,24.5,"",0,0,1,0,0,0,1 -"What Price Porky",1938,7,NA,7.1,13,0,0,0,0,4.5,0,45.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"What Rats Won't Do",1998,88,NA,6.2,162,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"R",0,0,1,0,0,1,0 -"What Sex Am I?",1985,60,NA,8.3,10,0,0,0,0,0,0,0,24.5,34.5,45.5,"",0,0,0,0,0,0,0 -"What Shall We Do with Our Old?",1911,17,NA,7.3,25,4.5,0,0,0,14.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"What They Wanted, What They Got",2001,13,NA,4.7,16,0,4.5,0,0,74.5,4.5,0,0,4.5,4.5,"",0,0,1,1,0,0,1 -"What Waits Below",1984,88,NA,3.3,44,14.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"What Where",2000,13,NA,7.6,27,0,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,0,1,0,0,1 -"What Women Want",2000,127,65000000,6.4,20138,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"What a Blonde",1945,71,NA,6.1,24,0,0,4.5,4.5,0,34.5,24.5,14.5,14.5,0,"",0,0,1,0,0,0,0 -"What a Carve Up",1962,87,NA,5.1,70,4.5,0,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,1,0,0,0,0 -"What a Crazy World",1963,88,NA,7.2,6,0,0,0,0,45.5,0,0,14.5,0,34.5,"",0,0,0,0,0,0,0 -"What a Flash!",1972,95,NA,3.3,6,0,14.5,14.5,0,14.5,14.5,0,0,14.5,14.5,"",0,0,0,0,0,0,0 -"What a Girl Wants",2003,105,20000000,5.7,3533,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG",0,0,1,1,0,1,0 -"What a Life",1939,75,NA,7.7,8,0,0,14.5,0,14.5,14.5,14.5,0,14.5,34.5,"",0,0,1,1,0,0,0 -"What a Lion!",1938,9,NA,5.7,5,0,0,0,24.5,0,44.5,44.5,0,0,0,"",0,1,1,0,0,0,1 -"What a Way to Go!",1964,111,NA,6.3,493,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"What a Whopper!",1961,90,NA,3.7,20,24.5,14.5,4.5,0,14.5,14.5,14.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"What a Woman!",1943,94,NA,5.5,12,0,4.5,14.5,0,4.5,34.5,34.5,0,0,0,"",0,0,1,0,0,1,0 -"What on Earth!",1967,10,NA,7.9,21,0,0,4.5,0,0,4.5,14.5,34.5,24.5,14.5,"",0,1,1,0,0,0,1 -"What the #$*! Do We Know!?",2004,108,NA,5.5,1474,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"What the Daisy Said",1910,16,NA,5.3,32,14.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,1,1 -"What the Moon Saw",1990,97,NA,5.2,17,0,14.5,0,4.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"What to Do On a Date",1951,11,NA,3.1,51,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,1 -"What! No Beer?",1933,70,NA,4.6,64,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"What's Brewin', Bruin?",1948,7,NA,6.5,30,4.5,4.5,0,4.5,0,34.5,34.5,4.5,4.5,4.5,"",0,1,1,0,0,0,1 -"What's Buzzin' Buzzard?",1943,8,NA,7.4,27,0,0,0,4.5,4.5,4.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"What's Cookin' Doc?",1944,9,NA,7.3,50,0,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"What's Cooking?",2000,109,NA,7,744,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"What's Eating Gilbert Grape",1993,118,11000000,7.6,16345,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"What's Going On, Frank?",1994,10,NA,2.5,17,14.5,4.5,0,0,0,0,14.5,24.5,0,44.5,"",0,0,1,0,0,0,1 -"What's Good for the Goose",1969,105,NA,4.2,26,14.5,4.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"What's Love Got to Do with It",1993,118,NA,7,1816,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"What's My Lion?",1961,6,NA,6.4,17,0,0,0,4.5,14.5,14.5,44.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"What's New, Pussycat",1965,108,NA,6.1,1414,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"What's Opera, Doc?",1957,7,NA,8.3,2781,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,1,1,0,0,0,1 -"What's So Bad About Feeling Good?",1968,94,NA,5.9,86,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"What's Up Doc?",1950,7,NA,7.8,128,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"What's Up Front!",1964,83,NA,1,6,64.5,0,0,14.5,0,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"What's Up Superdoc!",1978,89,NA,2.4,21,24.5,14.5,4.5,4.5,4.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"What's Up, Doc?",1972,94,NA,7.3,2661,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"What's Up, Hideous Sun Demon",1983,71,NA,2.3,20,34.5,14.5,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"What's Up, Tiger Lily?",1966,80,NA,6.3,1786,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"What's Wrong with This Picture?",2002,2,NA,6.6,18,0,0,0,0,4.5,34.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"What's a Nice Girl Like You Doing in a Place Like This?",1963,9,NA,6.1,75,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,1 -"What's the Matador",1942,17,NA,7.6,45,0,0,4.5,0,4.5,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,1 -"What's the Matter with Helen?",1971,101,NA,5.5,150,4.5,4.5,4.5,14.5,4.5,24.5,24.5,4.5,14.5,4.5,"",0,0,0,1,0,0,0 -"What's the Worst That Could Happen?",2001,97,45000000,5,2531,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"What's to Do?",1932,17,NA,5.8,12,0,0,0,0,44.5,24.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,1 -"What?",1972,112,NA,5.6,342,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"What?",2002,30,NA,3.3,5,44.5,0,0,0,24.5,0,44.5,0,0,0,"",0,0,1,1,0,0,1 -"Whatever",1998,112,NA,6,464,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Whatever Happened to Aunt Alice?",1969,101,NA,6.9,183,0,4.5,0,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Whatever Happened to Harold Smith?",1999,95,NA,6.3,268,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Whatever Happened to Mason Reese",1990,12,NA,2.9,155,44.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Whatever Happened to Susan Jane?",1982,60,NA,6.9,11,0,0,0,4.5,4.5,14.5,14.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Whatever It Takes",1999,101,NA,3,89,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Whatever It Takes",2000,94,15000000,5.2,1771,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Whatever We Do",2003,25,NA,3.7,46,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Wheel of Fate",1953,72,NA,4.9,7,0,0,14.5,0,45.5,0,0,24.5,0,0,"",0,0,0,0,0,0,0 -"Wheel of Time",2003,81,NA,7.5,57,4.5,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Wheeler Dealers, The",1963,107,NA,6.6,166,4.5,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wheelmen",2002,93,NA,4.7,13,34.5,4.5,4.5,14.5,0,4.5,0,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Wheels",2002,86,NA,5.3,7,14.5,0,14.5,0,14.5,14.5,24.5,14.5,0,0,"",0,0,1,1,0,1,0 -"Wheels Locked",2001,17,NA,8.8,6,0,0,0,0,0,14.5,0,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Wheels of Fire",1984,81,NA,3.6,38,14.5,24.5,14.5,14.5,4.5,14.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"Wheels of Fortune",2001,70,NA,7.1,5,0,0,0,0,0,44.5,44.5,24.5,0,0,"",0,0,0,0,1,0,0 -"When Billy Broke His Head... and Other Tales of Wonder",1995,60,NA,6.2,13,0,0,4.5,0,0,0,14.5,4.5,44.5,24.5,"",0,0,0,0,1,0,0 -"When Boys Fly",2002,62,NA,6.4,63,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,1,0,0 -"When Brendan Met Trudy",2000,95,NA,6.8,495,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,1,0 -"When Comedy Was King",1960,81,NA,8.2,50,0,0,4.5,4.5,0,14.5,14.5,34.5,14.5,24.5,"",0,0,1,0,1,0,0 -"When Dinosaurs Ruled the Earth",1970,96,NA,4.2,296,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"When Eight Bells Toll",1971,94,NA,5.3,142,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"When Harry Met Sally...",1989,96,16000000,7.7,24492,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"When Hell Broke Loose",1958,78,NA,5,16,4.5,0,4.5,14.5,34.5,4.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"When I Grow Up",1951,90,NA,6.1,19,0,0,0,4.5,14.5,4.5,0,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"When I Was a Boy",1993,17,NA,7.5,13,0,0,0,0,14.5,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,1 -"When I Was a Boy",1998,18,NA,6.4,6,0,14.5,0,0,0,0,64.5,0,14.5,0,"",0,0,0,0,0,0,1 -"When I Yoo Hoo",1936,7,NA,6,6,0,0,0,14.5,0,45.5,34.5,0,0,0,"",0,1,1,0,0,0,1 -"When It Rains",1995,13,NA,7.2,10,0,0,0,0,0,24.5,24.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"When It's Over",1998,89,NA,5.6,11,14.5,0,0,0,14.5,44.5,4.5,4.5,0,0,"",0,0,0,1,0,0,0 -"When Justice Fails",1998,91,NA,4,88,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"When Ladies Meet",1933,85,NA,7.1,69,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"When Ladies Meet",1941,105,NA,6,81,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"When Love Comes",1998,94,NA,5.8,110,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"When My Baby Smiles at Me",1948,98,NA,7.2,19,4.5,0,0,4.5,0,14.5,24.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"When My Ship Comes In",1934,7,NA,4.5,5,0,24.5,0,0,44.5,24.5,24.5,0,0,0,"",0,1,0,0,0,0,1 -"When Night Is Falling",1995,93,NA,6.7,1158,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,1,0,1,0 -"When Ocean Meets Sky",2003,99,NA,8.8,14,0,0,0,0,0,4.5,4.5,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"When Passions Collide",1997,92,NA,4,34,14.5,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"When Pigs Fly",1993,94,NA,4.1,43,14.5,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"When Ponds Freeze Over",1998,23,NA,6.7,12,0,0,0,0,4.5,14.5,44.5,0,24.5,4.5,"",0,1,0,0,0,0,1 -"When Saturday Comes",1996,98,NA,6,387,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"When Strangers Appear",2001,96,NA,6.5,433,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"When Strangers Marry",1944,67,50000,7,76,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"When Time Ran Out...",1980,143,20000000,3.5,366,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"When Tomorrow Comes",1939,90,NA,6.3,34,0,0,4.5,0,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"When Tomorrow Dies",1965,88,NA,6.1,7,0,0,0,14.5,0,44.5,0,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"When Two Won't Do",2002,90,NA,7.7,14,0,0,0,4.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"When Tyrants Kiss",2004,93,4000,8.1,7,0,0,0,0,14.5,0,0,44.5,24.5,14.5,"",0,0,0,0,0,0,0 -"When We Were Kings",1996,89,NA,7.7,3227,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,"PG",0,0,0,0,1,0,0 -"When Were You Born",1938,65,NA,6.9,13,0,0,0,4.5,0,14.5,44.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"When Will I Be Loved",2004,81,NA,5.2,488,14.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"When Willie Comes Marching Home",1950,82,NA,5.9,51,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"When Worlds Collide",1951,83,936000,6.6,820,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"When You Comin' Back, Red Ryder?",1979,118,NA,5.7,102,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,45.5,"",0,0,0,1,0,0,0 -"When You're Smiling",1950,75,NA,8,5,0,0,0,0,24.5,0,24.5,24.5,0,44.5,"",0,0,0,0,0,0,0 -"When You're in Love",1937,110,NA,5.5,30,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"When Zachary Beaver Came to Town",2003,85,3000000,7.9,35,4.5,4.5,0,4.5,0,4.5,4.5,24.5,24.5,34.5,"PG",0,0,0,1,0,0,0 -"When a Fellow Needs a Friend",1932,74,NA,4.1,8,14.5,0,14.5,24.5,14.5,24.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"When a Man Loves a Woman",1994,126,NA,6.3,3563,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"When a Stranger Calls",1979,97,740000,6.1,620,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"When in Rome",1952,78,NA,7.7,21,0,0,0,4.5,0,14.5,4.5,44.5,4.5,24.5,"",0,0,1,0,0,0,0 -"When the Bough Breaks",1947,78,NA,5.3,12,0,0,0,0,24.5,45.5,14.5,0,4.5,0,"",0,0,0,1,0,0,0 -"When the Bough Breaks",1993,105,NA,5.9,312,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"When the Boys Meet the Girls",1965,97,NA,5.5,25,0,4.5,4.5,34.5,4.5,14.5,4.5,4.5,14.5,4.5,"",0,0,0,0,0,0,0 -"When the Bullet Hits the Bone",1995,76,NA,4.5,41,14.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,0,4.5,"R",1,0,0,0,0,0,0 -"When the Cat's Away",1929,7,NA,5.7,10,0,0,0,14.5,14.5,44.5,24.5,0,0,24.5,"",0,1,0,0,0,0,1 -"When the Clouds Roll by",1919,50,NA,8,17,0,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,1,0,0,1,0 -"When the Daltons Rode",1940,81,NA,6.4,39,0,0,4.5,4.5,14.5,24.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"When the Day Breaks",1999,10,NA,7.2,70,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,"",0,1,0,1,0,0,1 -"When the Legends Die",1972,107,NA,6.3,63,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"When the Light Comes",1998,115,NA,6.4,155,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,1,0 -"When the Line Goes Through",1973,85,NA,4,11,0,14.5,4.5,4.5,24.5,14.5,0,4.5,0,4.5,"",0,0,0,0,0,0,0 -"When the North Wind Blows",1974,113,NA,5.1,26,0,0,0,4.5,14.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,1,0,0,0 -"When the Party's Over",1992,114,NA,4.3,217,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"When the Redskins Rode",1951,78,NA,5.5,7,0,0,24.5,14.5,14.5,14.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"When the Sky Falls",2000,107,NA,6.8,231,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"When the Storm Came",2004,24,NA,8.9,8,0,0,0,0,14.5,0,0,14.5,24.5,45.5,"",0,0,0,0,1,0,1 -"When the Whales Came",1989,100,NA,6.6,72,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"When the Wind Blows",1986,80,NA,7.6,421,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,0,1,0,0,0 -"When's Your Birthday?",1937,77,NA,6.4,6,0,0,14.5,0,0,45.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Where Angels Fear to Tread",1991,116,NA,6.9,415,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Where Angels Go, Trouble Follows",1968,93,NA,5.8,193,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Where Are My Children?",1916,62,NA,6.2,47,4.5,0,4.5,0,14.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Where Are We? Our Trip Through America",1992,73,NA,6.4,12,4.5,4.5,0,0,0,34.5,14.5,0,14.5,14.5,"",0,0,0,0,1,0,0 -"Where Are the Children?",1986,97,NA,4.8,59,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Where Danger Lives",1950,82,NA,6.2,123,4.5,4.5,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Where Do We Go from Here?",1945,74,NA,5.9,41,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Where Does It Hurt?",1972,87,NA,4.9,75,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Where Eagles Dare",1968,158,NA,7.6,5415,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Where East Is East",1929,65,NA,6.7,17,0,0,0,0,14.5,14.5,24.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Where Eskimos Live",2002,95,NA,7.1,61,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Where Is Jane Doe?",1956,8,NA,5.8,9,0,0,0,24.5,14.5,64.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Where It's at",1969,106,NA,5.1,12,0,0,0,14.5,24.5,4.5,14.5,0,24.5,4.5,"",0,0,0,1,0,0,0 -"Where Love Has Gone",1964,111,NA,5.5,155,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Where No Vultures Fly",1951,107,NA,6.6,14,0,0,0,0,4.5,24.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Where Sinners Meet",1934,72,NA,4.8,27,4.5,4.5,4.5,14.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Where Sleeping Dogs Lie",1992,95,NA,4.1,202,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Where There's Life",1947,75,NA,6.9,48,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Where There's Smoke, There's Fire",1987,89,NA,3.8,5,64.5,0,0,0,0,0,0,44.5,0,0,"",0,0,0,0,0,0,0 -"Where There's a Will",1936,80,NA,6.7,32,0,0,0,0,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Where Truth Lies",1996,97,NA,2.8,54,24.5,14.5,4.5,4.5,24.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Where Were You When the Lights Went Out?",1968,89,NA,5.2,154,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Where the Boys Are",1960,99,NA,6.1,358,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Where the Boys Are '84",1984,94,NA,2.5,148,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Where the Breakers Roar",1908,9,NA,4.6,6,14.5,0,0,14.5,0,34.5,0,34.5,0,0,"",0,0,0,1,0,0,1 -"Where the Buffalo Roam",1938,61,NA,6,5,0,24.5,0,0,0,24.5,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Where the Buffalo Roam",1980,96,NA,5.9,1120,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Where the Bullets Fly",1966,88,NA,3.7,6,14.5,0,0,0,34.5,14.5,0,34.5,0,0,"",0,0,1,0,0,0,0 -"Where the Day Takes You",1992,105,NA,6.7,644,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Where the Girls Are",2003,30,NA,3.6,6,0,14.5,0,0,0,0,0,45.5,0,34.5,"",0,0,0,0,1,0,1 -"Where the Heart Is",1990,107,NA,5.8,383,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Where the Heart Is",2000,120,15000000,6.4,5042,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,1,1,0,1,0 -"Where the Lilies Bloom",1974,98,NA,6.6,122,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Where the Money Is",2000,89,18000000,6.2,1461,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,0,0 -"Where the Red Fern Grows",1974,97,NA,6.4,332,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Where the River Runs Black",1986,100,NA,5.3,98,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Where the Sidewalk Ends",1950,95,NA,7.8,214,0,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Where the Spies Are",1965,110,NA,5.4,118,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Where the Spirit Lives",1989,96,NA,7.1,46,0,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Where the Toys Come From",1984,58,NA,4.3,12,0,0,14.5,4.5,4.5,0,24.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Where's Angelo?",2003,20,NA,5,6,0,0,0,0,34.5,0,14.5,34.5,0,14.5,"",0,0,0,0,0,0,1 -"Where's Bingo Betty?",1999,10,NA,5.6,7,0,0,0,0,14.5,44.5,0,14.5,24.5,0,"",0,0,1,0,0,0,1 -"Where's Charley",1952,97,NA,6.7,39,0,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Where's Jack?",1969,120,NA,5.1,38,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Where's Marlowe?",1998,97,3500000,6.2,188,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Where's Poppa?",1970,82,NA,6.5,385,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Where's Willie?",1978,97,NA,4.9,9,14.5,14.5,14.5,14.5,14.5,14.5,0,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Where's the Money, Ronnie?",1996,12,NA,6,34,0,4.5,0,0,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Where's the Party Yaar?",2003,110,NA,6.2,129,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Wherever She Goes",1953,80,NA,5.7,9,0,0,0,0,14.5,34.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wherever You Are...",1988,106,NA,6.1,26,4.5,0,4.5,0,14.5,4.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Which Is Witch?",1949,7,NA,5.9,31,0,0,4.5,4.5,14.5,34.5,4.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Which Way Is Up?",1977,94,3200000,5.7,135,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Which Way to the Front?",1970,96,NA,3.9,184,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Whiffs",1975,91,NA,4,37,4.5,4.5,14.5,14.5,24.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"While I Live",1947,85,NA,6.6,10,14.5,0,14.5,0,14.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"While Supplies Last",2002,120,NA,6,13,4.5,0,0,0,4.5,24.5,4.5,0,4.5,44.5,"",0,0,1,0,0,0,0 -"While You Were Sleeping",1995,103,17000000,6.5,13035,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG",0,0,1,0,0,1,0 -"While the City Sleeps",1956,100,NA,6.9,413,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"While the Patient Slept",1935,66,NA,6.6,22,0,0,0,0,14.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Whip Hand, The",1951,82,NA,5.1,44,0,14.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Whiplash",1948,91,NA,6.3,27,0,0,4.5,4.5,4.5,34.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Whipped",2000,82,3000000,4.4,1562,14.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Whipping Boy",1996,93,NA,5.9,30,4.5,0,0,14.5,4.5,34.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Whipsaw",1935,82,NA,6.6,49,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Whirlpool",1934,80,NA,6.4,9,0,0,0,14.5,24.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Whirlpool",1949,98,NA,6.7,114,4.5,0,0,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Whirlpool",1959,95,NA,4.5,9,0,14.5,0,14.5,24.5,34.5,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Whirlpool",1970,92,NA,3.3,17,14.5,0,0,4.5,14.5,14.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Whirlpool, The",2003,27,NA,6.3,126,4.5,4.5,0,0,0,0,0,4.5,4.5,94.5,"",0,0,1,0,0,0,1 -"Whirlwind",1951,70,NA,5.8,13,0,0,0,0,24.5,14.5,44.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Whirlwind Raiders",1948,54,NA,7.7,6,0,0,0,0,14.5,34.5,0,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Whiskey Mountain",1977,95,NA,2.6,8,24.5,14.5,0,34.5,0,0,0,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Whisky",2004,99,500000,8,368,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Whisky Galore!",1949,82,NA,7.4,477,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Whisky, Romeo, Zulu",2004,105,NA,7,50,0,0,4.5,0,0,4.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Whisper to a Scream, A",1989,96,NA,3.2,10,14.5,14.5,34.5,34.5,14.5,0,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Whisperers, The",1967,105,NA,6.7,51,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Whisperin' Bill",1933,10,NA,5.4,14,0,4.5,14.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Whispering Chorus, The",1918,86,72500,6.3,12,0,0,4.5,4.5,0,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Whispering City",1947,98,NA,6.4,8,0,0,0,0,0,24.5,34.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Whispering Ghosts",1942,57,NA,5.4,12,0,0,14.5,0,4.5,44.5,0,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Whispering Shadow, The",1933,225,NA,5,23,0,14.5,4.5,24.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Whispering Skull, The",1944,56,NA,6.3,6,0,0,0,0,34.5,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Whispering Smith",1948,88,NA,6.5,80,0,0,4.5,0,14.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Whispering Smith Hits London",1951,77,NA,6.8,9,0,0,0,14.5,14.5,24.5,14.5,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Whispering Whoopee",1930,20,NA,7.4,12,0,0,0,0,0,4.5,44.5,34.5,14.5,0,"",0,0,1,0,0,0,1 -"Whispering, The",1996,88,NA,3.3,32,24.5,4.5,14.5,14.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Whispers in the Dark",1992,103,NA,5.4,385,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Whispers: An Elephant's Tale",2000,72,NA,5.1,40,14.5,14.5,4.5,4.5,14.5,14.5,14.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Whistle Blower, The",1986,100,NA,6.3,308,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Whistle Down the Wind",1961,99,NA,7.8,381,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Whistle Stop",1946,85,NA,5.6,48,0,0,0,24.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Whistle at Eaton Falls, The",1951,96,NA,6.6,16,0,4.5,0,0,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Whistler, The",1944,59,NA,5.9,27,4.5,0,4.5,14.5,4.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Whistlin' Dixie",2004,19,5000,9.6,5,0,0,0,0,0,0,0,24.5,0,84.5,"",0,0,1,0,0,0,1 -"Whistling in Brooklyn",1943,87,NA,7.1,61,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Whistling in Dixie",1942,74,NA,7,60,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Whistling in the Dark",1941,78,NA,7.2,77,0,0,4.5,0,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"White Angel",1993,96,NA,4.2,39,24.5,4.5,4.5,0,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"White Angel, The",1936,92,NA,6.1,28,0,0,0,0,14.5,34.5,24.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"White Badge",1992,122,NA,7.4,47,0,0,4.5,0,4.5,14.5,24.5,34.5,4.5,24.5,"",0,0,0,0,0,0,0 -"White Banners",1938,92,NA,6.8,63,4.5,0,0,4.5,14.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"White Bits",2002,4,NA,8.6,37,0,0,0,0,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"White Boy",2002,90,NA,2.5,113,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"White Buffalo, The",1977,97,NA,4.9,320,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"White Bus, The",1967,41,NA,6.2,26,0,0,4.5,4.5,4.5,4.5,24.5,4.5,24.5,34.5,"",0,0,0,1,0,0,1 -"White Cargo",1942,88,NA,5.5,60,4.5,4.5,14.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"White Cargo",1973,62,NA,2.6,11,14.5,24.5,4.5,4.5,24.5,4.5,0,0,0,0,"",0,0,1,0,0,0,0 -"White Cargo",1995,92,NA,2.3,21,24.5,14.5,4.5,14.5,14.5,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"White Chicks",2004,109,NA,4.8,4782,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"White Christmas",1954,115,NA,7.1,2857,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"White City",1985,60,NA,5.9,17,4.5,0,0,0,14.5,24.5,14.5,4.5,0,34.5,"",0,0,0,1,0,0,0 -"White Cliffs of Dover, The",1944,126,NA,7,176,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,1,0 -"White Cockatoo, The",1935,73,NA,6.9,5,0,0,0,0,0,24.5,44.5,44.5,0,0,"",0,0,0,0,0,0,0 -"White Corridors",1951,102,NA,6.1,9,0,0,0,0,0,24.5,34.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"White Cradle Inn",1947,71,NA,5.5,6,0,0,0,0,45.5,14.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"White Darkness, The",2002,52,NA,7.4,7,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,0,0,1,0,0 -"White Dawn, The",1974,110,NA,6.4,80,4.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"White Diamond, The",2004,88,NA,7.5,14,4.5,0,0,0,0,4.5,0,14.5,45.5,24.5,"",0,0,0,0,1,0,0 -"White Dog",1982,84,NA,6.7,359,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"White Face",2001,14,NA,6.9,69,0,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,64.5,"",0,0,1,0,0,0,1 -"White Fang 2: Myth of the White Wolf",1994,106,NA,5.1,226,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"White Fawn's Devotion: A Play Acted by a Tribe of Red Indians in America",1910,11,NA,6,19,0,0,4.5,0,34.5,34.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,1 -"White Feather",1955,102,NA,6,65,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"White Fury",1990,89,NA,4.5,6,34.5,14.5,34.5,0,0,0,0,14.5,0,0,"",1,0,0,1,0,0,0 -"White Ghost",1988,88,NA,2.8,19,24.5,14.5,14.5,4.5,14.5,14.5,4.5,0,0,14.5,"",1,0,0,0,0,0,0 -"White Gold",2003,91,NA,3.3,33,14.5,14.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"White Gorilla, The",1945,62,NA,3.4,11,44.5,0,24.5,4.5,0,4.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"White Heat",1934,62,NA,5.8,16,4.5,0,0,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"White Heat",1949,114,NA,8.2,2626,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"White Hot",1989,95,NA,3.8,28,14.5,4.5,14.5,24.5,14.5,14.5,4.5,0,0,14.5,"",0,0,0,1,0,0,0 -"White Hunter Black Heart",1990,110,NA,6.6,1148,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"White Lies",1996,94,NA,6.3,21,0,4.5,4.5,0,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"White Light",1991,90,NA,4.2,20,0,14.5,34.5,24.5,4.5,24.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"White Lightning",1953,61,NA,6.3,5,0,0,0,24.5,0,0,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"White Lightning",1973,101,NA,5.7,338,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"White Like Me",2004,15,40000,8.9,14,4.5,0,0,0,0,0,4.5,4.5,14.5,64.5,"",0,0,0,1,0,0,1 -"White Line Fever",1975,90,NA,5.7,151,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"White Lions, The",1981,79,NA,4.2,16,14.5,0,0,24.5,14.5,14.5,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"White Man's Burden",1995,89,NA,5,1247,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"White Men Can't Jump",1992,118,NA,6.2,7861,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,1,0,0,0 -"White Mischief",1987,107,5300000,6,568,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"White Nights",1985,136,NA,5.9,1243,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"White Oak",1921,64,NA,6.5,5,0,0,0,0,64.5,0,44.5,0,0,0,"",0,0,0,0,0,0,0 -"White Oleander",2002,109,16000000,6.9,4545,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"White Orchid, The",1954,81,NA,4.7,11,14.5,4.5,4.5,14.5,4.5,4.5,0,4.5,0,14.5,"",0,0,0,0,0,1,0 -"White Palace",1990,103,NA,6.4,1193,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"White Pongo",1945,10,NA,2.5,24,14.5,14.5,24.5,14.5,4.5,4.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"White Pony, The",1999,93,NA,5.8,45,4.5,4.5,0,14.5,24.5,14.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"White Raven, The",1998,113,NA,4.8,113,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"White River Kid, The",1999,99,NA,4.2,230,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"White Room",1990,90,NA,6.1,74,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"White Room, The",1989,47,NA,6.4,27,0,0,0,4.5,4.5,0,14.5,24.5,4.5,45.5,"",0,0,0,0,0,0,0 -"White Rose, The",1923,100,650000,7.5,16,0,0,0,4.5,14.5,14.5,4.5,0,24.5,34.5,"",0,0,0,1,0,0,0 -"White Rose, The",1967,7,NA,6.2,9,0,0,0,0,34.5,0,44.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"White Sands",1992,101,NA,5.8,1315,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"White Savage",1943,76,NA,5.9,21,0,4.5,0,4.5,4.5,14.5,4.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"White Shadows in the South Seas",1928,88,NA,7.3,60,0,0,4.5,4.5,4.5,4.5,34.5,24.5,24.5,14.5,"",0,0,0,1,0,1,0 -"White Sister, The",1923,143,NA,6,17,0,0,0,24.5,14.5,4.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,1,0 -"White Sister, The",1933,110,NA,6,38,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"White Slaves of Chinatown",1964,72,NA,4.3,17,14.5,14.5,4.5,4.5,14.5,4.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"White Squall",1996,129,38000000,6.4,3445,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"White Star",1983,92,100000,4,26,24.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"White Tie and Tails",1946,81,NA,7.2,5,0,0,0,0,24.5,0,44.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"White Tiger",1923,86,NA,5.5,12,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"White Tiger",1996,93,NA,4.7,66,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"White Tower, The",1950,98,NA,5.7,84,0,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"White Water Summer",1987,90,NA,5.4,564,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"White Wilderness",1958,72,NA,7.1,34,14.5,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"White Wings on Review",1903,3,NA,3.2,5,0,0,84.5,24.5,0,0,0,0,0,0,"",0,0,0,0,1,0,1 -"White Witch Doctor",1953,96,NA,5.9,66,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"White Wolves III: Cry of the White Wolf",2000,87,NA,6.4,38,14.5,4.5,0,4.5,4.5,24.5,14.5,4.5,4.5,24.5,"PG",1,0,0,0,0,0,0 -"White Wolves: A Cry in the Wild II",1993,90,NA,5.2,116,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"White Woman",1933,68,NA,6.2,9,0,0,14.5,0,14.5,14.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"White Zombie",1932,67,50000,6.5,627,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"White of the Eye",1987,110,NA,6.2,151,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"White to Be Angry, The",1999,18,NA,6.2,6,34.5,0,0,0,0,0,14.5,0,34.5,14.5,"",0,0,0,0,0,0,1 -"Whiteboys",1999,92,NA,4.8,397,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Whiteforce",1988,90,NA,5.5,6,0,0,0,14.5,34.5,14.5,0,14.5,14.5,0,"",1,0,0,1,0,0,0 -"Whiteout",2000,129,NA,5.7,96,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Whites, The",1996,11,NA,5.3,17,4.5,14.5,4.5,4.5,14.5,0,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Whity",1971,95,NA,5.9,107,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Whizzard of Ow, The",2003,7,NA,6,18,0,4.5,0,14.5,14.5,14.5,24.5,24.5,0,4.5,"",0,1,1,0,0,0,1 -"Who Are the DeBolts? And Where Did They Get Nineteen Kids?",1977,72,NA,6.4,14,24.5,0,0,0,0,4.5,14.5,0,4.5,44.5,"",0,0,0,0,1,0,0 -"Who Dares Wins",1982,125,NA,5.5,399,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Who Do You Think You're Fooling?",1994,11,NA,4.6,37,14.5,4.5,4.5,14.5,0,4.5,4.5,4.5,4.5,34.5,"",0,0,0,0,1,0,1 -"Who Done It?",1942,75,NA,7.1,207,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Who Done It?",1949,16,NA,8.3,66,0,4.5,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Who Done It?",1956,85,NA,5.6,18,0,4.5,14.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Who Framed Roger Rabbit",1988,99,70000000,7.4,21433,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Who Gets the House?",1999,98,NA,4,50,14.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Who Has Seen the Wind",1977,100,NA,6.4,46,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Who Is Bernard Tapie?",2001,56,NA,5.9,30,14.5,4.5,4.5,0,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Who Is Cletis Tout?",2001,92,NA,6.4,958,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Who Is Harry Kellerman and Why Is He Saying Those Terrible Things About Me?",1971,108,NA,4.6,149,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"Who Is Killing the Great Chefs of Europe?",1978,112,NA,6.1,407,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Who Killed Aunt Maggie?",1940,70,NA,8,6,0,0,0,14.5,0,0,34.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Who Killed Buddy Blue?",1996,90,NA,2.8,37,24.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"R",0,0,0,0,0,0,0 -"Who Killed Cock Robin?",1935,8,NA,7.6,67,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Who Killed Cock Robin?",2005,88,NA,2,28,24.5,34.5,14.5,4.5,0,0,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Who Killed Doc Robbin?",1948,55,NA,4,22,4.5,4.5,14.5,24.5,14.5,24.5,0,4.5,0,0,"",0,0,1,0,0,0,0 -"Who Killed Gail Preston?",1938,61,NA,7.6,5,0,0,0,0,24.5,24.5,24.5,0,0,44.5,"",0,0,0,0,0,0,0 -"Who Killed Mary What's 'Er Name?",1971,90,NA,6.3,29,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Who Killed Rover?",1930,15,NA,2.2,15,24.5,14.5,4.5,14.5,4.5,14.5,0,4.5,0,14.5,"",0,0,1,0,0,0,1 -"Who Killed Teddy Bear",1965,91,NA,6.4,72,0,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Who Killed Vincent Chin?",1987,87,NA,7,39,0,0,0,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Who Killed Who?",1943,8,NA,8,63,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,1,1,0,0,0,1 -"Who Rocks America 1982, The",1982,118,NA,7.4,20,0,0,14.5,0,0,4.5,4.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Who Says I Can't Ride a Rainbow?",1971,85,NA,4.2,13,34.5,4.5,4.5,14.5,24.5,0,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Who Scent You?",1960,6,NA,6.3,39,0,0,4.5,14.5,14.5,14.5,44.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Who Shall Live and Who Shall Die?",1982,90,NA,8,5,0,0,0,0,44.5,0,0,0,0,64.5,"",0,0,0,0,1,0,0 -"Who Shot Patakango?",1989,102,NA,4,88,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Who Was That Lady?",1960,115,NA,5.9,86,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Who the Hell Is Bobby Roos?",2002,93,NA,8.2,9,0,0,0,0,0,14.5,24.5,14.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Who'll Stop the Rain",1978,126,NA,6.8,387,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Who's Afraid of Virginia Woolf?",1966,131,7000000,8.1,7060,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Who's Been Sleeping in My Bed?",1963,103,NA,5.6,61,4.5,4.5,0,4.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Who's Counting? Marilyn Waring on Sex, Lies and Global Economics",1995,94,NA,8.8,11,4.5,0,4.5,0,0,0,4.5,0,44.5,24.5,"",0,0,0,0,1,0,0 -"Who's Got the Action?",1962,93,NA,5.1,51,4.5,4.5,4.5,14.5,24.5,24.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"Who's Harry Crumb?",1989,98,NA,5.2,2283,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Who's Kitten Who?",1952,7,NA,7,18,0,0,0,0,14.5,24.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Who's Looney Now",1936,19,NA,4.9,7,0,0,14.5,0,14.5,24.5,44.5,0,0,0,"",0,0,1,0,0,0,1 -"Who's Minding the Mint?",1967,97,NA,6.9,204,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Who's Minding the Store?",1963,90,NA,6.3,246,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Who's My Favourite Girl?",1999,16,NA,5.9,18,14.5,0,0,14.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Who's Out There?",1975,35,NA,5,15,0,0,4.5,0,24.5,0,14.5,4.5,0,44.5,"",0,0,0,0,1,0,1 -"Who's That Girl?",1987,92,NA,4,1768,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Who's That Knocking at My Door",1967,90,75000,6.5,650,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Who's Tommy, the Amazing Journey, The",1993,59,NA,5.7,22,0,4.5,4.5,0,14.5,4.5,14.5,4.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Who's Who in the Zoo",1942,7,NA,7.2,10,0,0,0,0,14.5,14.5,14.5,64.5,0,14.5,"",0,1,1,0,0,0,1 -"Who's the Caboose?",1997,94,NA,5,38,4.5,4.5,0,4.5,0,4.5,14.5,34.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Who's the Man?",1993,85,NA,4.5,272,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Who, Me?",1999,5,NA,5.9,7,0,0,0,0,14.5,0,0,24.5,0,45.5,"",0,0,0,0,0,0,1 -"Who: Who's Better Who's Best, The",1988,60,NA,7.4,15,0,0,0,0,0,24.5,24.5,4.5,4.5,44.5,"",0,0,0,0,1,0,0 -"Who?",1973,93,NA,5.3,64,4.5,4.5,0,4.5,14.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Whoa",2001,7,NA,6.2,14,0,14.5,0,0,24.5,14.5,4.5,14.5,0,24.5,"",1,0,0,1,0,0,1 -"Whoa, Be-Gone!",1958,6,NA,6.4,47,0,0,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Whoever Slew Auntie Roo?",1971,91,NA,5.3,134,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Whole",2003,55,50000,7.5,12,0,0,0,0,4.5,24.5,34.5,4.5,24.5,0,"",0,0,0,0,1,0,0 -"Whole New Day, A",1999,18,NA,5.4,35,4.5,0,14.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Whole Nine Yards, The",2000,98,24000000,6.6,17678,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Whole Shebang, The",2001,97,NA,4.7,67,4.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Whole Ten Yards, The",2004,98,40000000,4.8,4133,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Whole Town's Talking, The",1935,93,NA,7.1,182,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Whole Truth, The",1958,84,NA,6,10,14.5,0,0,24.5,24.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Whole Wide World, The",1996,111,1300000,7.4,956,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"PG",0,0,0,1,0,0,0 -"Whole of the Moon, The",1997,96,NA,6.8,48,4.5,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Wholey Moses",2003,22,67000,4.2,44,24.5,4.5,0,4.5,0,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,1 -"Wholly Moses",1980,103,NA,4.3,408,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wholly Smoke",1938,7,NA,7,14,0,0,0,0,4.5,14.5,24.5,14.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Whom the Gods Destroy",1934,75,NA,4.1,5,0,0,0,24.5,0,0,0,24.5,0,64.5,"",0,0,0,1,0,0,0 -"Whoopee Boys, The",1986,88,NA,4.7,154,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Whoopee Party, The",1932,8,NA,6.1,32,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Whoopee!",1930,94,NA,6.8,83,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Whoops Apocalypse",1986,93,NA,5.4,207,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Whoops! I'm a Cowboy",1937,7,NA,5.1,6,0,0,0,14.5,34.5,34.5,14.5,0,0,0,"",0,1,1,0,0,0,1 -"Whoops, I'm an Indian!",1936,17,NA,7.1,56,0,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,1 -"Whoosh",2002,10,NA,4,5,0,0,0,64.5,0,0,24.5,0,0,24.5,"",0,0,1,0,0,0,1 -"Whore",1991,85,NA,4.8,612,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Whoregasm",1988,12,NA,5.2,20,24.5,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Whose Life Is It Anyway?",1981,118,NA,7.2,530,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Whose University Is It?",2003,60,NA,7.3,18,0,0,0,0,4.5,14.5,14.5,34.5,24.5,14.5,"",0,0,0,0,1,0,0 -"Why Can't I Be a Movie Star?",2001,87,NA,7.2,11,4.5,0,0,0,4.5,14.5,0,14.5,44.5,0,"",0,0,1,0,0,0,0 -"Why Can't We Be a Family Again?",2002,27,NA,7.2,24,0,0,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Why Daddy?",1944,10,NA,6,7,0,0,0,24.5,0,44.5,14.5,0,14.5,0,"",0,0,1,0,0,0,1 -"Why Do Fools Fall In Love",1998,116,NA,5.6,608,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Why Elvis?",1994,76,NA,1.2,15,44.5,4.5,0,4.5,4.5,14.5,4.5,4.5,0,14.5,"",0,0,0,0,1,0,0 -"Why Girls Love Sailors",1927,20,NA,6.2,31,0,4.5,14.5,4.5,4.5,14.5,34.5,4.5,4.5,0,"",0,0,1,0,0,0,1 -"Why Man Creates",1968,29,NA,5.9,80,4.5,4.5,4.5,0,14.5,4.5,4.5,4.5,4.5,64.5,"",0,1,1,0,1,0,1 -"Why Me?",1990,87,NA,5.4,189,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Why Must I Die?",1960,86,NA,4.1,11,4.5,4.5,24.5,14.5,4.5,4.5,0,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Why Pay Two Rents",2001,28,NA,7,5,0,0,0,0,0,0,84.5,24.5,0,0,"",0,0,0,0,1,0,1 -"Why Shoot the Teacher?",1977,100,NA,6.7,69,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Why Study Home Economics?",1955,10,NA,5.5,11,34.5,4.5,0,0,14.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,1 -"Why Study Industrial Arts?",1956,10,NA,2.3,49,34.5,24.5,24.5,4.5,4.5,4.5,4.5,0,4.5,0,"",0,0,0,0,1,0,1 -"Why We Had to Kill Bitch",2003,82,15000,5.8,79,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,64.5,"",0,0,1,0,0,1,0 -"Why Worry?",1923,63,NA,7.6,141,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,1,0 -"Why Would I Lie?",1980,105,NA,5.9,71,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Why the Anderson Children Didn't Come to Dinner",2003,16,NA,6.6,25,14.5,4.5,0,4.5,4.5,4.5,0,24.5,4.5,34.5,"",0,0,1,0,0,0,1 -"Wichita",1955,81,NA,6.5,80,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wichtig is' auf'm Platz",2002,14,NA,7.1,9,0,0,0,0,24.5,14.5,0,14.5,44.5,14.5,"",0,0,0,0,0,0,1 -"Wicked",1998,88,NA,5.3,617,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Wicked Dreams of Paula Schultz, The",1968,113,NA,4.4,44,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Wicked Game",2002,95,NA,5.2,20,14.5,14.5,4.5,14.5,24.5,4.5,0,14.5,4.5,24.5,"PG-13",1,0,0,0,0,0,0 -"Wicked Lady, The",1945,104,NA,6,106,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wicked Lady, The",1983,98,NA,4.5,175,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wicked Sensations",1981,80,NA,6.3,7,0,0,0,0,24.5,24.5,0,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Wicked Spring",2002,102,500000,5.6,158,4.5,34.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,"PG-13",0,0,0,1,0,0,0 -"Wicked Stepmother",1989,90,NA,2.9,266,24.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wicked Woman",1953,77,NA,6.3,28,4.5,0,4.5,0,4.5,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wicked Woman, A",1934,72,NA,7,19,4.5,4.5,0,0,0,24.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Wicked as They Come",1956,94,NA,6.5,7,14.5,0,0,0,0,24.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Wicked, Wicked",1973,95,NA,4.1,22,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wicker Man, The",1973,88,NA,7.5,4863,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Wicker Park",2004,114,30000000,6.4,3143,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"PG-13",0,0,0,1,0,1,0 -"Wide Asleep",2002,19,6000,9.5,13,0,0,0,0,0,0,0,14.5,24.5,64.5,"",0,0,0,0,0,0,1 -"Wide Awake",1998,88,7000000,6,655,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"PG",0,0,1,1,0,0,0 -"Wide Awake in Nothing",2004,25,NA,8.4,7,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,0,0,0,1 -"Wide Open Faces",1938,67,NA,7.1,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,1,0,0,0,0 -"Wide Open Spaces",1947,7,NA,6.9,15,0,4.5,0,0,4.5,24.5,24.5,4.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Wide Open Town",1941,79,NA,7.1,17,0,0,0,0,4.5,14.5,24.5,14.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Wide Sargasso Sea",1993,100,NA,5.4,435,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wideo Wabbit",1956,7,NA,6.9,30,4.5,0,0,0,14.5,14.5,34.5,34.5,0,14.5,"",0,1,1,0,0,0,1 -"Widow from Chicago, The",1930,62,NA,5.5,28,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Widow from Monte Carlo, The",1935,60,NA,5.4,15,0,0,24.5,0,44.5,0,24.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Widower, The",2004,60,NA,5.3,6,0,0,34.5,14.5,0,34.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Widows' Peak",1994,102,NA,6.7,394,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Wie Feuer und Flamme",2001,94,NA,7.1,143,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Wie de Waarheid Zegt Moet Dood",1981,60,NA,7.3,22,0,4.5,0,4.5,4.5,4.5,24.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Wie die Karnickel",2002,84,NA,6.5,153,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wie ich ein Neger wurde",1971,104,NA,8.9,14,4.5,0,0,4.5,0,0,0,0,0,84.5,"",0,0,0,0,0,0,0 -"Wieczne pretensje",1975,70,NA,5.3,5,0,0,0,0,44.5,0,0,0,0,64.5,"",0,0,0,0,0,0,0 -"Wiedzmin",2001,130,NA,3,206,34.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wiegands Befreiung",1998,10,NA,8.4,5,0,0,0,0,0,0,0,84.5,0,24.5,"",0,0,0,0,0,0,1 -"Wielka podroz Bolka i Lolka",1977,80,NA,8.8,8,0,0,0,0,14.5,0,0,14.5,34.5,34.5,"",0,1,0,0,0,0,0 -"Wielka, wieksza i najwieksza",1963,97,NA,6.6,6,0,0,0,0,14.5,0,34.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Wielki bieg",1981,81,NA,7.2,7,0,0,0,0,0,24.5,0,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Wielki szu",1983,96,NA,7.2,42,0,0,4.5,0,4.5,0,24.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Wielki tydzien",1995,97,NA,6.1,35,4.5,4.5,0,14.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Wiener Blut",1942,106,NA,7.6,17,0,0,0,4.5,0,4.5,24.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Wiener G'schichten",1940,100,NA,6.4,8,0,0,0,14.5,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wierna rzeka",1983,140,NA,7,6,0,0,0,0,0,14.5,45.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Wife Decoy",1945,17,NA,7,18,0,0,0,0,0,0,100,0,0,0,"",0,0,1,0,0,0,1 -"Wife Swappers, The",1970,81,NA,1.8,6,45.5,0,0,14.5,0,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Wife of Monte Cristo, The",1946,83,NA,6.4,9,0,0,0,0,24.5,34.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Wife vs. Secretary",1936,88,NA,6.8,288,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Wife, Husband and Friend",1939,75,NA,6.3,12,0,0,0,0,4.5,34.5,24.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Wife, The",1995,101,NA,6.4,104,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Wiggles Movie, The",1997,83,NA,5.8,80,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Wigstock: The Movie",1995,85,NA,6.4,145,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"R",0,0,0,0,1,0,0 -"Wilbur Falls",1998,95,NA,5.1,55,14.5,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Wilbur Wants to Kill Himself",2002,105,NA,6.8,1563,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Wilby Conspiracy, The",1975,102,NA,6.4,182,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wilby Wonderful",2004,99,NA,6.5,66,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Wilcze echa",1968,97,NA,5,9,14.5,0,14.5,24.5,0,0,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Wilczyca",1983,98,NA,5.5,8,14.5,0,0,14.5,0,14.5,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Wild About Harry",2000,91,NA,5.7,154,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Wild About Hurry",1959,7,NA,6.9,33,0,0,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Wild America",1997,106,NA,5.7,1186,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Wild Angels, The",1966,93,360000,4.7,212,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Wild Australia: The Edge",1996,40,NA,7.1,6,0,0,0,0,14.5,0,45.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Wild Bill",1995,98,NA,5.7,715,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Wild Bill Hickok Rides",1942,82,NA,6.3,13,0,0,0,4.5,0,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Wild Bill: Hollywood Maverick",1996,95,NA,7.5,59,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,0,1,0,0 -"Wild Blade",1991,53,NA,5.2,9,0,0,14.5,14.5,0,14.5,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Wild Blue Yonder, The",1951,98,NA,6.1,24,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wild Boy",1934,85,NA,3.3,8,34.5,0,0,24.5,0,0,24.5,0,0,14.5,"",0,0,1,1,0,0,0 -"Wild Boys of the Road",1933,53,NA,7.1,128,0,0,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wild Bunch, The",1969,179,6000000,8.2,10550,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",1,0,0,0,0,0,0 -"Wild Bunch: An Album in Montage, The",1996,34,NA,7.2,68,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Wild Cactus",1993,95,NA,3.8,91,14.5,4.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wild Chase, The",1965,6,NA,5.7,22,0,0,14.5,4.5,14.5,34.5,14.5,4.5,0,4.5,"",0,1,1,0,0,0,1 -"Wild Company",1930,71,NA,3.8,7,14.5,14.5,24.5,24.5,0,14.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Wild Country",1947,55,NA,5.7,9,14.5,14.5,14.5,14.5,14.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Wild Country, The",1971,100,NA,5.8,28,14.5,4.5,0,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Wild Dogs, The",2002,97,NA,6.5,69,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Wild Duck, The",1983,95,NA,4.8,30,14.5,0,4.5,4.5,14.5,34.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Wild Elephinks",1933,6,NA,7,6,0,14.5,0,0,0,0,14.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Wild Gals of the Naked West",1962,65,26000,2.7,74,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wild Geese Calling",1941,77,NA,6,8,0,0,0,14.5,14.5,24.5,24.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Wild Geese II",1985,125,NA,4.1,178,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Wild Geese, The",1978,134,10000000,6.4,1072,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Wild Girl",1932,78,NA,4.4,5,0,24.5,44.5,0,0,0,44.5,0,0,0,"",0,0,0,1,0,0,0 -"Wild Girls Gone",2005,93,NA,9.6,7,0,0,0,0,0,0,0,14.5,14.5,74.5,"",0,0,1,0,0,0,0 -"Wild Goose Chase",1991,137,NA,4.4,16,0,0,14.5,4.5,14.5,0,0,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Wild Guitar",1962,92,30000,3.1,60,24.5,4.5,4.5,4.5,4.5,24.5,4.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Wild Hare, A",1940,8,NA,8.2,100,4.5,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,1,1,0,0,0,1 -"Wild Harvest",1947,92,NA,6.2,24,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wild Heart, The",1952,82,NA,5.8,34,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Wild Hearts Can't Be Broken",1991,88,NA,6.6,752,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Wild Heritage",1958,78,NA,5.7,16,4.5,0,14.5,14.5,14.5,14.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Wild Honey",1942,8,NA,5.3,5,0,0,0,24.5,44.5,0,24.5,0,0,24.5,"",0,1,1,0,0,0,1 -"Wild Horse",1931,77,60000,5.7,10,0,0,0,24.5,14.5,34.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wild Horse Hank",1979,94,NA,4.2,37,14.5,0,14.5,14.5,24.5,4.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Wild Horse Mesa",1947,61,NA,6.5,10,0,0,0,0,0,34.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wild Is the Wind",1957,114,NA,6.1,54,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wild Justice",1994,97,NA,4.9,13,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Wild Life",1997,102,NA,6.5,8,0,14.5,14.5,0,0,14.5,0,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Wild Life, The",1984,96,NA,5,358,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Wild Malibu Weekend!",1995,80,NA,3,25,44.5,14.5,14.5,4.5,4.5,4.5,0,0,0,14.5,"R",0,0,1,0,0,0,0 -"Wild Man Blues",1997,105,NA,6.8,645,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG",0,0,0,0,1,0,0 -"Wild Man of Borneo, The",1941,78,NA,5.9,13,0,0,4.5,4.5,24.5,34.5,4.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Wild McCullochs, The",1975,93,NA,4.4,29,24.5,4.5,14.5,0,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wild Night in El Reno",1977,6,NA,6.3,5,0,0,44.5,0,0,44.5,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Wild North, The",1952,97,NA,5.8,74,0,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wild One, The",1953,79,NA,6.9,1462,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wild Ones on Wheels",1962,92,NA,1,8,34.5,0,0,0,0,24.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Wild Orchid",1990,111,NA,3.9,1443,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Wild Orchid II: Two Shades of Blue",1992,111,NA,3.4,290,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wild Orchids",1929,100,322000,6.5,54,4.5,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Wild Over You",1953,7,NA,6.9,26,0,0,0,4.5,4.5,24.5,24.5,34.5,4.5,0,"",0,1,1,0,0,0,1 -"Wild Oysters",1941,10,NA,7.3,6,0,0,0,0,34.5,0,0,45.5,14.5,0,"",0,1,1,0,0,0,1 -"Wild Pair, The",1987,88,NA,4.4,30,4.5,4.5,14.5,34.5,14.5,14.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Wild Parrots of Telegraph Hill, The",2003,83,NA,8.2,154,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,0,1,0,0 -"Wild Party, The",1929,77,NA,6,80,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Wild Party, The",1956,91,NA,6.1,11,0,0,0,0,34.5,0,4.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wild Party, The",1975,88,NA,4.9,94,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Wild Pony, The",1983,87,NA,5.3,12,0,0,0,14.5,0,4.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wild Poses",1933,20,NA,8,23,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Wild Racers, The",1968,83,NA,4.1,12,4.5,0,34.5,0,24.5,4.5,4.5,4.5,0,4.5,"",1,0,0,1,0,0,0 -"Wild Rebels",1967,90,NA,2,97,45.5,24.5,14.5,4.5,4.5,4.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Wild Ride, The",1960,88,30000,3.8,56,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Wild Riders",1971,91,NA,4.8,11,14.5,4.5,0,14.5,0,4.5,4.5,14.5,0,14.5,"",1,0,0,1,0,0,0 -"Wild River",1960,112,NA,7.5,403,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Wild Roomer, A",1927,20,NA,8.3,8,0,0,0,0,0,0,24.5,34.5,34.5,0,"",0,0,1,0,0,0,1 -"Wild Rovers",1971,136,NA,6.6,206,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wild Seed",1965,99,NA,6.1,31,0,0,4.5,0,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Wild Side",1995,111,NA,5.3,635,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wild Style",1982,82,NA,7.3,211,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,1,0,0 -"Wild Thing",1987,92,NA,5,106,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wild Things",1998,115,20000000,6.6,17672,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Wild Thornberrys Movie, The",2002,85,35000000,4.7,4008,24.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG",0,1,1,0,0,0,0 -"Wild Waves",1929,8,NA,5.8,11,0,0,4.5,0,4.5,44.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Wild West",1946,57,NA,5.6,8,0,0,24.5,14.5,24.5,24.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Wild West",1992,85,NA,5.5,43,4.5,0,0,0,24.5,14.5,4.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wild Westerners, The",1962,70,NA,4.8,18,0,0,24.5,14.5,14.5,0,14.5,0,4.5,34.5,"",0,0,0,0,0,0,0 -"Wild Wheels",1969,81,NA,4.5,9,14.5,14.5,14.5,34.5,14.5,0,14.5,0,0,14.5,"",1,0,0,1,0,0,0 -"Wild Wife",1954,7,NA,6.6,15,0,0,14.5,0,14.5,24.5,14.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Wild Wild West",1999,107,170000000,4,19078,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Wild Wild World",1960,6,NA,6,16,0,0,0,0,34.5,24.5,34.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Wild Women",1951,62,NA,6.6,14,0,24.5,0,0,14.5,4.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wild Women of Wongo, The",1958,71,NA,3.2,69,34.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Wild World of Batwoman, The",1966,70,NA,1.9,1144,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,"",1,0,1,0,0,0,0 -"Wild Zero",2000,98,NA,6.6,529,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,24.5,"",1,0,1,0,0,1,0 -"Wild and Wonderful",1964,88,NA,4.9,24,0,4.5,0,24.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Wild and Woolfy",1945,8,NA,7.4,42,4.5,0,0,0,14.5,4.5,14.5,34.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Wild and Woolly",1917,47,NA,7.4,10,0,0,0,0,0,24.5,14.5,24.5,34.5,24.5,"",0,0,1,0,0,1,0 -"Wild and Woolly",1931,9,NA,5.9,11,0,4.5,0,14.5,24.5,4.5,24.5,4.5,0,0,"",0,0,0,0,1,0,1 -"Wild and Woolly Hare",1959,7,NA,7.3,32,4.5,0,0,4.5,0,4.5,34.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Wild and the Innocent, The",1959,84,NA,7,31,0,0,0,0,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Wild and the Naked, The",1962,68,NA,3.7,11,14.5,24.5,4.5,4.5,4.5,0,0,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wild and the Willing, The",1962,110,NA,5,21,4.5,0,4.5,14.5,24.5,4.5,24.5,0,0,14.5,"",0,0,0,1,0,1,0 -"Wild at Heart",1990,124,9500000,7,9549,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Wild beasts - Belve feroci",1984,92,NA,4.5,31,14.5,14.5,14.5,14.5,0,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wild in the Country",1961,114,NA,5.5,201,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wild in the Sky",1972,87,NA,4.9,13,4.5,4.5,4.5,24.5,4.5,4.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Wild in the Streets",1968,94,1000000,5.9,329,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Wild on the Beach",1965,77,NA,3.3,30,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wild, The",2002,87,NA,6.5,13,0,0,0,4.5,14.5,34.5,34.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Wild, Wild Winter",1966,80,NA,4.2,17,0,0,14.5,24.5,14.5,0,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wild, Wild World of Jayne Mansfield, The",1968,99,NA,4.8,50,14.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,1,0,1,0,0 -"Wildcats",1986,106,NA,5.5,1772,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wildcats of St. Trinian's, The",1980,91,NA,3.3,30,24.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Wilde",1997,118,10000000,6.9,2545,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Wilde Wasser",1962,98,NA,2.5,5,44.5,24.5,0,0,24.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Wilde mossels",2000,115,NA,7.2,283,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wilden Kerle - Alles ist gut, solange du wild bist!, Die",2003,94,NA,5.9,39,4.5,14.5,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wilden Kerle II, Die",2005,95,NA,5.9,21,14.5,0,4.5,4.5,4.5,14.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wildente, Die",1976,100,NA,6.2,13,0,0,0,14.5,0,24.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wilder Napalm",1993,109,NA,4.6,355,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wilder Reiter GmbH",1967,107,NA,2.1,9,34.5,0,14.5,0,0,14.5,0,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Wildfeuer",1991,104,NA,3.7,13,14.5,0,0,14.5,4.5,4.5,4.5,14.5,0,34.5,"",0,0,0,1,0,0,0 -"Wildflower",1999,92,NA,3.3,45,14.5,14.5,14.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wildflowers",1999,93,NA,5.6,118,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Wildflowers",2003,10,NA,6.1,12,0,0,0,0,0,14.5,4.5,4.5,44.5,24.5,"",0,0,0,1,0,0,1 -"Wildgroei",1994,94,NA,6,16,0,0,0,4.5,24.5,14.5,34.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Wildly Available",1999,98,NA,4.1,56,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Wildnis, Die",1993,98,NA,6.9,6,0,0,0,0,0,14.5,14.5,0,14.5,45.5,"",0,0,0,0,0,0,0 -"Wildrose",1984,95,NA,5.2,22,0,0,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wildschut",1985,100,NA,6.9,64,0,0,4.5,0,14.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wilfred",2002,7,NA,6.7,22,4.5,0,0,0,24.5,4.5,14.5,44.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Wilful Peggy",1910,17,NA,4.4,16,14.5,4.5,14.5,0,14.5,14.5,34.5,0,0,0,"",0,0,1,0,0,1,1 -"Wilhelm Cuceritorul",1982,180,NA,7.7,6,14.5,0,0,0,0,0,14.5,14.5,0,45.5,"",1,0,0,0,0,0,0 -"Wilhelm Tell",1923,85,NA,7.4,5,0,0,0,0,0,24.5,24.5,44.5,24.5,0,"",0,0,0,1,0,0,0 -"Wilhelmsburger Freitag",1964,90,NA,8.8,7,14.5,0,0,0,0,0,0,24.5,45.5,0,"",0,0,0,0,0,0,0 -"Will Any Gentleman...?",1953,84,NA,5.5,6,0,0,0,34.5,0,34.5,0,14.5,14.5,0,"",0,0,1,0,0,0,0 -"Will Penny",1968,108,NA,7.1,479,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Will Power",1936,16,NA,6.1,5,0,0,0,44.5,0,24.5,24.5,24.5,0,0,"",0,0,1,0,0,0,1 -"Will Success Spoil Rock Hunter?",1957,93,NA,7.2,409,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Will Unplugged",2004,93,NA,8.9,7,0,14.5,0,0,0,0,0,0,0,84.5,"",0,0,0,1,0,0,0 -"WillFull",2001,95,NA,6.3,24,14.5,0,4.5,0,14.5,4.5,34.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"Willard",1971,95,NA,5.7,373,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Willard",2003,100,22000000,6.2,2913,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Willenbrock",2005,105,NA,7.2,44,0,0,0,4.5,4.5,14.5,24.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Willi-Busch-Report, Der",1979,120,NA,5.8,14,0,0,4.5,0,14.5,24.5,24.5,14.5,0,14.5,"",0,0,1,1,0,0,0 -"William S. Burroughs: Commissioner of Sewers",1991,60,NA,7.2,22,0,0,0,4.5,4.5,4.5,34.5,24.5,4.5,14.5,"",0,0,0,0,1,0,0 -"William Sexspeare's 'Much Ado About Puberty'",1997,6,NA,2.9,16,14.5,0,14.5,24.5,0,14.5,0,0,4.5,24.5,"",0,0,0,0,0,0,1 -"William Tell",1953,30,NA,6.5,10,14.5,0,14.5,0,0,44.5,0,14.5,0,34.5,"",0,0,0,0,0,0,1 -"Williamsburg: The Story of a Patriot",1957,34,NA,5.5,43,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Willie Dynamite",1974,102,NA,5.4,66,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Willie and Phil",1980,115,NA,5.5,101,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Willie the Operatic Whale",1946,15,NA,7.7,54,0,0,0,4.5,4.5,4.5,24.5,14.5,14.5,34.5,"",0,1,0,1,0,0,1 -"Willies, The",1991,92,NA,4.1,172,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Willkommen im Paradies",1991,85,NA,5.2,75,0,0,0,0,74.5,24.5,0,0,4.5,0,"",0,0,0,0,0,0,0 -"Willow",1988,126,35000000,6.8,10529,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Wills & Burke",1985,100,NA,4.4,35,14.5,4.5,4.5,4.5,34.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Willy Nilly",1998,12,NA,5.8,5,0,24.5,0,0,0,24.5,64.5,0,0,0,"",0,0,0,0,0,0,1 -"Willy Wonka & the Chocolate Factory",1971,100,3000000,7.6,16487,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Willy/Milly",1986,86,NA,5.5,64,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wilna Zona",1975,79,NA,9.4,9,0,0,0,0,0,0,14.5,24.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Wilson",1944,154,4000000,6.8,158,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wilt",1989,92,NA,5.7,183,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wimbledon",2004,98,31000000,6.3,4297,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,1,0,1,0 -"Wimmen Is a Myskery",1940,6,NA,6.4,11,0,0,0,4.5,0,4.5,44.5,14.5,14.5,0,"",0,1,1,0,0,0,1 -"Wimmin Hadn't Oughta Drive",1940,6,NA,7,7,0,0,0,14.5,0,14.5,0,0,44.5,24.5,"",0,1,1,0,0,0,1 -"Win a Date with Tad Hamilton!",2004,95,24000000,5.8,2933,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,1,0 -"Winchester '73",1950,92,NA,7.9,1582,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Winchester, uno entre mil",1968,102,NA,6.3,5,0,0,0,0,0,64.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Winckelmanns Reisen",1990,80,NA,5.6,7,0,0,0,0,14.5,44.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Wind",1992,126,NA,5.7,590,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Wind Across the Everglades",1958,93,NA,6.5,92,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wind Cannot Read, The",1958,115,NA,6.2,45,0,0,4.5,0,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Wind Dancer",1993,90,NA,4.4,27,14.5,0,0,14.5,14.5,14.5,4.5,4.5,0,24.5,"PG",0,0,0,1,0,0,0 -"Wind Effect, The",2003,20,NA,9.2,8,14.5,0,0,0,0,0,0,14.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Wind River",1998,97,5500000,5.4,97,14.5,4.5,0,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"PG-13",0,0,0,1,0,0,0 -"Wind and the Lion, The",1975,119,4000000,7,1171,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,0,0,0,0 -"Wind in the Willows, The",1949,30,NA,6.9,127,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Wind of Changes, The",1996,15,NA,6.6,9,0,0,0,0,0,44.5,14.5,0,14.5,34.5,"",0,0,0,0,0,0,1 -"Wind, The",1998,1,NA,7.3,6,0,0,0,0,0,14.5,14.5,45.5,14.5,0,"",0,0,0,0,1,0,1 -"Windbag the Sailor",1936,87,NA,6.6,37,0,0,0,4.5,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Windblown Hare, The",1949,7,NA,7.2,30,0,0,0,0,4.5,14.5,44.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Windfall",2001,102,NA,3.6,84,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Windhorse",1998,97,NA,6.7,69,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Windigo",1994,97,NA,5.5,15,4.5,0,4.5,24.5,4.5,4.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Windjammer: The Voyage of the Christian Radich",1958,127,NA,6.3,45,4.5,0,0,4.5,4.5,4.5,14.5,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Windom's Way",1957,108,NA,6.6,40,0,0,0,0,24.5,24.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Window Cleaners",1940,8,NA,6.8,42,0,0,0,4.5,0,24.5,34.5,14.5,4.5,14.5,"",0,1,0,0,0,0,1 -"Window Water Baby Moving",1962,13,NA,7.8,151,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Window in London, A",1940,59,NA,6.1,8,0,0,0,14.5,0,45.5,24.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Window, The",1949,73,NA,7.5,252,0,0,0,0,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Window, The",2000,15,NA,5.5,12,4.5,0,0,4.5,4.5,4.5,34.5,4.5,0,24.5,"",0,0,1,1,0,0,1 -"Windows",1975,4,NA,7,72,0,0,4.5,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Windows",1980,96,NA,3.8,45,34.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Windows of Heaven",1963,50,NA,6.9,10,0,0,0,0,14.5,0,14.5,34.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Windprints",1990,100,NA,7.1,17,4.5,0,0,0,4.5,14.5,24.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Windrider",1986,92,NA,4.6,75,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Windrunner",1995,108,NA,5.7,50,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,14.5,"PG",0,0,0,0,0,0,0 -"Winds of Autumn, The",1976,100,NA,5.1,18,4.5,0,0,14.5,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Winds of Change",1978,80,NA,5,25,14.5,0,0,4.5,4.5,14.5,4.5,14.5,24.5,24.5,"",0,1,0,0,0,0,0 -"Winds of Jarrah, The",1983,80,NA,3.2,5,0,24.5,0,44.5,0,0,24.5,0,0,24.5,"",0,0,0,1,0,1,0 -"Winds of the Wasteland",1936,54,NA,4.9,77,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Windsplitter, The",1971,100,NA,1,10,34.5,0,0,14.5,0,0,0,14.5,0,45.5,"",0,0,0,0,0,0,0 -"Windsurf - Il vento nelle mani",1984,88,NA,3.4,7,24.5,14.5,0,0,24.5,14.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Windtalkers",2002,153,115000000,5.9,9081,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Windwalker",1980,108,NA,6.4,145,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Windy City",1984,104,NA,5.6,72,4.5,4.5,4.5,4.5,14.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Windy Day",1968,8,NA,8.4,9,0,0,0,0,0,14.5,0,14.5,34.5,44.5,"",0,1,0,0,0,0,1 -"Windy Riley Goes Hollywood",1931,18,NA,5.3,25,0,14.5,14.5,24.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,1 -"Wing Commander",1999,96,30000000,3.7,4854,24.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"Wing and a Prayer",1944,97,NA,7,205,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Winged Victory",1944,130,NA,7.4,24,0,0,0,0,14.5,0,24.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Wings",1927,141,800000,7.4,803,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,1,0 -"Wings for the Eagle",1942,84,NA,6.2,21,4.5,0,4.5,0,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Wings in the Dark",1935,75,NA,5.6,20,0,0,0,14.5,24.5,24.5,24.5,14.5,14.5,0,"",0,0,0,0,0,1,0 -"Wings of Adventure",1930,53,NA,4.3,5,24.5,44.5,0,0,0,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Wings of Courage",1995,40,NA,6.4,154,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,1,1 -"Wings of Death",1985,21,NA,1.3,8,34.5,0,0,0,0,0,24.5,14.5,0,24.5,"",0,0,0,1,0,0,1 -"Wings of Eagles, The",1957,110,NA,6.2,419,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wings of Fame",1990,116,NA,6.3,141,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Wings of the Dove, The",1997,102,NA,6.9,2663,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,1,0 -"Wings of the Hawk",1953,81,NA,5.6,16,0,0,0,14.5,14.5,34.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Wings of the Morning",1937,87,NA,6.6,20,0,0,4.5,0,14.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Wings of the Navy",1939,89,NA,5.8,31,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Winifred Wagner und die Geschichte des Hauses Wahnfried von 1914-1975",1975,104,NA,6.8,11,4.5,0,0,0,4.5,4.5,4.5,34.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Winnah!, The",1934,20,NA,6.1,10,0,0,0,14.5,14.5,24.5,44.5,14.5,14.5,0,"",0,0,1,0,0,0,1 -"Winner Take All",1932,66,NA,6.4,27,0,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Winner Takes All",2004,6,NA,7.7,22,4.5,0,0,0,0,0,0,4.5,4.5,84.5,"",0,0,1,0,0,0,1 -"Winner, The",1969,92,NA,5.9,55,4.5,4.5,0,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Winner, The",1996,92,NA,4.5,206,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,0,0 -"Winners Take All",1986,102,NA,6,33,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,4.5,44.5,"",1,0,0,0,0,0,0 -"Winners of the West",1940,247,NA,5,7,0,0,14.5,0,44.5,14.5,14.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Winnetou - 1. Teil",1963,91,NA,6.5,330,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Winnetou - 2. Teil",1964,94,NA,6.1,238,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Winnetou - 3. Teil",1965,93,NA,6.1,213,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Winnetou und Shatterhand im Tal der Toten",1968,89,NA,5.5,118,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Winnetou und das Halbblut Apanatschi",1966,90,NA,4.8,134,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Winnetou und sein Freund Old Firehand",1966,98,NA,4.1,73,4.5,14.5,4.5,34.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Winnie the Pooh and Tigger Too!",1974,25,NA,7.4,209,4.5,0,0,4.5,4.5,4.5,24.5,24.5,4.5,24.5,"",0,1,0,0,0,0,1 -"Winnie the Pooh and a Day for Eeyore",1983,25,NA,7.2,76,0,0,0,0,4.5,24.5,14.5,14.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Winnie the Pooh and the Blustery Day",1968,25,NA,7.6,713,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Winnie the Pooh and the Honey Tree",1966,25,NA,7.5,372,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",0,1,0,0,0,0,1 -"Winning",1969,123,NA,5.9,217,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Winning New Hampshire",2004,45,15000,8.1,10,24.5,0,0,0,0,0,0,0,14.5,74.5,"",0,0,0,0,1,0,1 -"Winning Team, The",1952,98,NA,5,122,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Winning Your Wings",1942,18,NA,6.8,24,0,0,14.5,0,4.5,24.5,34.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Winning of Barbara Worth, The",1926,89,NA,7,17,0,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Winning of the West",1953,57,NA,6,9,0,0,14.5,14.5,14.5,14.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Winslow Boy, The",1948,117,NA,7.9,166,0,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Winslow Boy, The",1999,104,NA,7.2,2495,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Winsor McCay, the Famous Cartoonist of the N.Y. Herald and His Moving Comics",1911,7,NA,8,53,0,0,0,0,4.5,14.5,34.5,24.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Winstanley",1975,95,NA,6.8,28,0,4.5,0,4.5,14.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Winston",1987,12,NA,5.7,9,14.5,0,0,0,34.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Winter",1930,7,NA,5.6,7,0,14.5,0,0,0,14.5,24.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Winter",1988,3,NA,9.2,12,4.5,0,0,0,0,0,4.5,4.5,34.5,44.5,"",0,1,0,0,0,0,1 -"Winter '89",1998,100,NA,6.7,27,4.5,0,4.5,4.5,0,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Winter A-Go-Go",1965,88,NA,3.5,22,4.5,4.5,14.5,0,14.5,4.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Winter Break",2002,13,NA,5.4,7,14.5,0,0,0,14.5,0,0,0,44.5,24.5,"",0,0,1,0,0,0,1 -"Winter Break",2003,92,NA,5.2,257,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Winter Carnival",1939,105,NA,7,9,0,0,0,14.5,24.5,14.5,44.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Winter Guest, The",1997,108,NA,6.6,977,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Winter Heat",1976,70,NA,6.1,5,0,0,0,24.5,0,44.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Winter Kept Us Warm",1965,81,NA,4.8,18,0,0,0,14.5,14.5,14.5,24.5,14.5,14.5,0,"",0,0,0,1,0,1,0 -"Winter Kills",1979,97,6500000,6.2,288,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Winter Lily",1998,86,NA,6.6,36,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Winter Meeting",1948,104,NA,6,142,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Winter People",1989,110,NA,5.9,202,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Winter Sea",2004,25,NA,9,5,0,0,0,0,0,0,0,44.5,24.5,44.5,"",0,0,0,1,0,0,1 -"Winter Soldier",1972,96,NA,6.8,11,4.5,0,0,0,4.5,0,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Winter Solstice",2000,30,25000,8,5,0,0,0,0,0,0,44.5,44.5,0,24.5,"",0,0,0,1,0,0,1 -"Winter Solstice",2004,95,NA,7.2,75,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Winter Storage",1949,7,NA,7.5,30,0,0,0,4.5,0,14.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Winter Straw Ride, A",1906,7,NA,5,31,4.5,4.5,4.5,0,34.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Winter Tan, A",1987,91,NA,4.8,21,4.5,0,4.5,4.5,4.5,4.5,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Winter ade",1987,116,NA,7,7,0,0,0,14.5,0,24.5,14.5,24.5,0,14.5,"",0,0,0,0,1,0,0 -"Winter of Our Dreams",1981,89,NA,5.4,28,4.5,0,14.5,14.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Winterbeast",1991,80,NA,2.9,15,24.5,24.5,24.5,0,14.5,4.5,0,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Winterblume",1997,107,NA,6,7,0,0,0,0,14.5,24.5,0,24.5,24.5,0,"",0,0,0,0,0,0,0 -"Winterhawk",1975,98,NA,5.3,69,4.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Winterlude",2005,95,35000,7.6,7,0,0,0,0,0,24.5,44.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Winterset",1936,77,NA,5.8,48,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Wintertime",1943,82,NA,6.6,16,0,0,0,4.5,14.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wiosna, panie sierzancie",1974,98,NA,5.8,5,0,0,0,24.5,24.5,0,24.5,24.5,0,24.5,"",0,0,1,0,0,0,0 -"Wir",2003,100,NA,6.9,86,4.5,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wir Enkelkinder",1992,91,NA,5.9,9,14.5,0,14.5,0,14.5,14.5,24.5,0,0,34.5,"",0,0,1,0,0,0,0 -"Wir Kellerkinder",1960,86,NA,8.2,20,0,0,0,0,0,14.5,14.5,24.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Wir Wunderkinder",1958,108,NA,7.3,60,0,0,4.5,4.5,4.5,4.5,4.5,4.5,44.5,34.5,"",0,0,1,0,0,0,0 -"Wir hau'n die Pauker in die Pfanne",1970,84,NA,3.6,52,24.5,14.5,14.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wir machen Musik",1942,95,NA,7,21,0,0,0,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Wired",1989,112,NA,3.6,155,34.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Wired 03:36",2001,4,NA,9.3,12,14.5,0,0,0,0,0,0,4.5,34.5,44.5,"",0,0,0,0,0,0,1 -"Wirey Spindell",2000,101,NA,4.1,256,45.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wirtshaus im Spessart, Das",1958,99,NA,6.7,97,0,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Wirtshaus von Dartmoor, Das",1964,90,NA,5.7,9,0,14.5,0,0,14.5,64.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Wirus",1996,90,NA,4,13,44.5,14.5,14.5,4.5,4.5,4.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Wisconsin Death Trip",1999,76,NA,6.8,226,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wisdom",1986,109,NA,4.7,598,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wisdom of Crocodiles, The",1998,98,NA,6.3,1238,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,"R",0,0,0,0,0,1,0 -"Wise Blood",1979,105,NA,7,365,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Wise Girl",1937,70,NA,6,35,0,0,0,4.5,14.5,24.5,24.5,4.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Wise Guys",1986,100,13000000,5.1,790,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Wise Little Hen, The",1934,8,NA,7.2,112,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",0,1,1,0,0,0,1 -"Wise Ones, The",2001,79,NA,7.8,5,0,0,0,0,24.5,0,0,44.5,44.5,0,"",0,0,1,0,0,0,0 -"Wise Quackers",1949,7,NA,6.7,21,4.5,0,0,4.5,4.5,14.5,44.5,14.5,0,0,"",0,1,1,0,0,0,1 -"Wise Quacking Duck, The",1943,7,NA,7.2,33,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Wise Quacks",1939,7,NA,6.8,19,4.5,0,4.5,0,0,14.5,34.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Wisecracks",1991,90,NA,5.5,36,14.5,0,0,4.5,14.5,4.5,14.5,24.5,0,24.5,"",0,0,1,0,1,0,0 -"Wisegirls",2002,96,11000000,5.7,792,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"R",0,0,0,1,0,0,0 -"Wiseman, The",1990,5,NA,5.8,20,4.5,14.5,0,0,4.5,0,44.5,24.5,14.5,0,"",0,1,1,0,0,0,1 -"Wish",2001,17,NA,8.4,8,0,0,0,0,0,14.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,1 -"Wish Me Luck",1995,91,NA,7.4,19,14.5,0,14.5,0,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Wish Upon a Star",1996,90,NA,6.4,526,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"PG",0,0,1,0,0,0,0 -"Wish You Were Dead",2002,100,NA,4.7,93,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Wish You Were Here",1987,92,NA,6.7,545,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Wishbone",1997,80,NA,7.1,8,0,0,0,0,24.5,14.5,24.5,0,24.5,14.5,"",0,0,0,0,0,0,0 -"Wishcraft",2002,97,5000000,5,314,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Wished on Mabel",1915,11,NA,5.4,5,0,0,0,0,44.5,44.5,0,24.5,0,0,"",0,0,1,0,0,0,1 -"Wisher, The",2002,90,NA,4.1,251,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Wishful Thinking",1997,93,NA,4.9,387,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"Wishing Ring: An Idyll of Old England, The",1914,54,NA,7.9,17,0,0,0,0,4.5,14.5,14.5,34.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Wishing Tree, The",1999,105,NA,5.4,52,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wishman",1991,90,NA,3.5,24,34.5,0,4.5,14.5,14.5,4.5,14.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Wishmaster",1997,90,5000000,5,2577,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Wisselwachter, De",1986,97,NA,6.7,100,4.5,0,0,4.5,14.5,4.5,14.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Wissen vom Heilen, Das",1996,93,NA,7.9,14,0,4.5,0,0,0,14.5,14.5,4.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Wistful Widow of Wagon Gap, The",1947,78,NA,5.5,91,4.5,0,4.5,4.5,14.5,14.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Witch Academy",1993,83,NA,2.4,33,34.5,14.5,14.5,4.5,4.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Witch Who Came from the Sea, The",1976,83,NA,3.9,54,14.5,4.5,14.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Witch's Tangled Hare, A",1959,6,NA,6.7,35,0,0,0,4.5,4.5,24.5,14.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Witchboard",1986,98,2000000,5,543,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Witchboard 2: The Devil's Doorway",1993,94,NA,3.8,187,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Witchboard III: The Possession",1995,93,2000000,3.4,114,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"R",0,0,0,0,0,0,0 -"Witchcraft",1964,79,NA,5.1,11,0,0,14.5,0,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Witchcraft 7: Judgement Hour",1995,90,NA,2.9,38,34.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,14.5,"R",0,0,0,0,0,0,0 -"Witchcraft 8: Salem's Ghost",1996,90,NA,1.8,19,44.5,14.5,4.5,4.5,14.5,0,0,0,0,24.5,"",0,0,0,0,0,0,0 -"Witchcraft II: The Temptress",1992,88,NA,2.6,57,24.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Witchcraft III: The Kiss of Death",1991,85,NA,2.9,32,34.5,14.5,14.5,14.5,4.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Witchcraft IV: The Virgin Heart",1992,92,NA,2.6,31,44.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Witchcraft IX: Bitter Flesh",1997,92,NA,2.5,20,24.5,24.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,"R",0,0,0,0,0,0,0 -"Witchcraft V: Dance with the Devil",1993,94,1000000,2.4,49,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Witchcraft VI",1994,88,NA,2.3,21,34.5,24.5,4.5,14.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Witchery",1988,96,NA,2.5,181,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Witches of Eastwick, The",1987,118,NA,6.3,8896,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Witches of Salem: The Horror and the Hope, The",1972,35,NA,6.3,6,45.5,14.5,0,0,14.5,0,0,14.5,0,0,"",0,0,0,0,0,0,1 -"Witches' Brew",1980,98,NA,4.2,24,4.5,14.5,4.5,24.5,14.5,14.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Witches, The",1966,90,NA,5.7,124,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Witches, The",1990,91,NA,6.4,2210,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Witchfinder General",1968,86,NA,6.9,754,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Witching Time",1980,60,NA,5,22,4.5,0,4.5,4.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Witchmaker, The",1969,97,NA,4.8,18,4.5,14.5,0,4.5,4.5,14.5,4.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Witchtrap",1989,92,NA,3.7,62,24.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"",1,0,0,0,0,0,0 -"With Byrd at the South Pole",1930,82,NA,7.2,25,4.5,0,14.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"With Friends Like These...",1998,105,NA,5.6,174,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"With Honors",1994,103,NA,6.1,2884,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"With It",2004,11,NA,7.7,6,0,0,0,14.5,0,14.5,14.5,0,14.5,34.5,"",0,0,0,0,0,0,1 -"With Love and Hisses",1927,21,NA,7.3,38,0,0,4.5,14.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"With Love to the Person Next to Me",1987,98,NA,5.2,11,4.5,0,0,14.5,14.5,14.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"With Love, Annette",1985,72,NA,5.3,5,0,0,24.5,0,24.5,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"With a Song in My Heart",1952,117,NA,7.2,221,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"With or Without You",1998,104,NA,6.5,21,0,0,4.5,0,0,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"With or Without You",1999,93,NA,6.3,244,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"With or Without You",2003,91,NA,4,12,14.5,4.5,4.5,4.5,4.5,4.5,0,4.5,4.5,24.5,"R",0,0,1,1,0,0,0 -"With the Marines at Tarawa",1944,18,NA,8.4,5,0,0,0,0,0,44.5,0,0,0,64.5,"",0,0,0,0,1,0,1 -"Within Our Gates",1920,79,NA,6.2,125,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Within the Law",1939,65,NA,5.4,16,0,4.5,0,4.5,34.5,14.5,24.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Within the Woods",1978,32,1600,6.5,336,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Withnail & I",1987,107,NA,7.6,4554,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Without Air",1995,88,NA,4.8,8,0,24.5,0,14.5,0,0,14.5,0,14.5,34.5,"",0,0,0,0,0,0,0 -"Without Evidence",1995,92,NA,4.4,123,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Without Honor",1932,66,NA,4.2,5,24.5,0,24.5,0,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Without Honor",1949,69,NA,5.8,8,0,0,0,14.5,14.5,64.5,0,0,14.5,0,"",0,0,0,1,0,0,0 -"Without Limits",1998,117,25000000,6.8,1249,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Without Love",1945,111,NA,6.8,236,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Without Memory",1996,75,NA,6.7,7,0,0,0,0,0,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Without Mercy",1995,90,NA,2.2,16,24.5,14.5,24.5,4.5,4.5,4.5,0,0,0,14.5,"R",1,0,0,0,0,0,0 -"Without Orders",1936,64,NA,5.8,8,0,0,0,14.5,14.5,64.5,0,14.5,0,0,"",0,0,0,1,0,0,0 -"Without Reservations",1946,107,NA,6.2,185,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Without Rockets",1994,12,NA,6.2,10,24.5,14.5,14.5,0,0,0,14.5,14.5,0,44.5,"",0,0,0,0,0,0,1 -"Without Warning",1980,89,NA,4.1,206,14.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Without You I'm Nothing",1990,89,NA,6.1,119,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,1,0,0,0,0 -"Without a Clue",1988,107,NA,6.6,1191,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Without a Paddle",2004,95,19000000,5.4,3605,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Without a Trace",1983,116,NA,6.6,308,0,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Witness",1985,112,12000000,7.6,14479,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Witness Files, The",1999,95,NA,3.8,308,4.5,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Witness for the Prosecution",1957,118,3000000,8.3,5112,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Witness to Murder",1954,83,NA,6.9,119,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Witte waan, De",1984,96,NA,6.2,32,0,0,4.5,0,4.5,0,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Witte, De",1934,100,NA,7.3,41,4.5,4.5,4.5,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Witte, De",1980,106,NA,6.4,79,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wittgenstein",1993,75,NA,6.3,199,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wittstock, Wittstock",1997,117,NA,3.5,11,14.5,4.5,4.5,0,0,4.5,0,14.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Wives Under Suspicion",1938,69,NA,5.8,36,0,4.5,4.5,4.5,24.5,34.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Wives and Lovers",1963,103,NA,5.6,32,0,0,0,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wixxer, Der",2004,85,NA,6.4,835,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Wiz on Down the Road",1978,13,NA,4.8,18,24.5,0,4.5,4.5,4.5,0,4.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Wizard of Baghdad, The",1960,92,NA,4.3,12,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Wizard of Gore, The",1970,95,60000,3.7,167,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wizard of Loneliness, The",1988,111,NA,5.8,67,4.5,0,4.5,14.5,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wizard of Mars, The",1965,85,33000,3,58,34.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wizard of Oz",1925,83,NA,5.2,181,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Wizard of Oz, The",1933,9,NA,5.7,26,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,34.5,"",0,1,1,0,0,0,1 -"Wizard of Oz, The",1939,112,2777000,8.3,38386,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Wizard of Speed and Time, The",1989,95,NA,6.2,706,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Wizard, The",1989,100,NA,5.4,1360,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Wizards",1977,80,1200000,6.2,1059,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,1,0,0,0,0,0 -"Wizards of the Demon Sword",1991,90,NA,3.2,37,14.5,4.5,24.5,4.5,4.5,4.5,4.5,14.5,0,14.5,"R",0,0,0,0,0,0,0 -"Wizards of the Lost Kingdom",1985,72,NA,2.6,118,44.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Wizja lokalna 1901",1980,98,NA,6.4,7,14.5,0,0,0,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Wo Che-yang Kuo-le Yi-sheng",1986,152,NA,7.9,9,0,0,0,0,0,24.5,14.5,34.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Wo ai chou wen chai",1992,97,NA,6.4,25,4.5,0,0,0,4.5,14.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Wo ai chu fang",1997,120,NA,6.7,79,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Wo ai ni",2003,97,NA,7.1,43,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Wo de fu qin mu qin",1999,89,NA,7.6,2472,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Wo de mei li yu ai chou",1995,100,NA,5.5,9,0,0,0,0,14.5,14.5,24.5,34.5,0,24.5,"",0,0,0,1,0,0,0 -"Wo de shenjinbing",1997,114,NA,3.8,12,14.5,0,0,4.5,4.5,14.5,0,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wo de xiong di jie mei",2001,95,NA,6.6,38,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wo der Himmel die Erde trifft",2000,85,NA,8,9,0,0,0,0,0,0,0,64.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Wo he ba ba",2003,100,NA,7.3,21,0,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wo hu cang long",2000,120,15000000,8.2,52198,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"PG-13",1,0,0,0,0,1,0 -"Wo ist mein Schatz?",1916,35,NA,6.9,12,0,0,0,14.5,14.5,4.5,24.5,14.5,14.5,0,"",0,0,0,0,0,0,1 -"Wo men hai pa",2001,89,NA,6,26,14.5,0,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wo yao huo xia qu",1995,100,NA,5.9,5,0,0,24.5,0,0,44.5,0,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Wo zai hei she hui de ri zi",1989,94,NA,5.9,35,4.5,0,0,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wo zhe yi bei zi",1950,120,NA,8.6,9,0,0,0,0,0,0,14.5,24.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Wodzirej",1978,115,NA,7.3,38,0,0,4.5,0,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Wog Boy, The",2000,92,NA,5.3,394,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Woh Kaun Thi",1964,140,NA,6.5,15,0,0,0,0,0,14.5,0,44.5,44.5,0,"",0,0,0,1,0,0,0 -"Wojaczek",1999,90,NA,6.4,33,4.5,0,0,4.5,4.5,4.5,14.5,14.5,34.5,24.5,"",0,0,0,1,0,0,0 -"Wold Shadow, The",1972,3,NA,7,38,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,0,0,0,1 -"Wolf",1994,125,70000000,5.9,7192,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Wolf Blood",1925,68,NA,6.2,8,0,0,14.5,0,0,34.5,34.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Wolf Creek",2005,95,1000000,4.8,33,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Wolf Dog",1958,61,NA,2.7,6,45.5,0,0,14.5,0,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Wolf Lake",1978,88,NA,4.3,16,0,0,14.5,24.5,14.5,14.5,14.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Wolf Larsen",1958,83,NA,5.6,6,0,14.5,0,0,14.5,34.5,34.5,0,0,0,"",0,0,0,0,0,0,0 -"Wolf Man, The",1941,70,180000,7.4,1582,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wolf Man, The",1999,6,NA,6.3,18,0,0,0,14.5,0,14.5,24.5,4.5,14.5,34.5,"",0,1,0,0,0,0,1 -"Wolf! Wolf!",1944,6,NA,4.9,16,0,4.5,0,14.5,34.5,34.5,14.5,0,0,0,"",0,1,0,0,0,0,1 -"Wolfen",1981,115,NA,6.2,1224,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wolfgang",1997,14,NA,7,39,4.5,0,0,4.5,0,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Wolfman",1979,102,NA,2.2,53,34.5,24.5,14.5,14.5,0,0,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Wolfman, The",1966,8,NA,7.8,29,4.5,0,0,4.5,0,0,34.5,24.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Wolfsburg",2003,90,NA,7.5,118,0,0,4.5,4.5,4.5,14.5,24.5,24.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Wolny strzelec",1981,69,NA,8.4,5,0,0,0,0,0,24.5,0,0,84.5,0,"",0,0,0,0,0,0,0 -"Wolves",1999,40,NA,6,26,0,0,0,14.5,14.5,14.5,14.5,14.5,4.5,24.5,"",0,0,0,0,1,0,1 -"Wolves of Kromer, The",1998,82,NA,6.5,116,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Wolves of Wall Street",2002,85,NA,2.8,77,24.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,0,14.5,"R",1,0,0,0,0,0,0 -"Wolves of Willoughby Chase, The",1988,92,NA,4.2,55,4.5,4.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Wolves, The",1995,88,NA,4.6,12,4.5,4.5,14.5,0,34.5,0,14.5,0,4.5,4.5,"PG-13",1,0,0,1,0,0,0 -"Woman Accused",1933,70,NA,5.1,19,14.5,0,0,4.5,14.5,24.5,34.5,4.5,4.5,0,"",0,0,0,1,0,0,0 -"Woman Chaser, The",1999,88,NA,6.4,224,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Woman Chases Man",1937,71,NA,6.7,17,0,0,4.5,0,0,34.5,14.5,4.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Woman Condemned, The",1934,66,NA,6.7,6,0,0,0,14.5,14.5,34.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Woman Every Man Wants, The",2001,92,NA,4.2,36,24.5,14.5,4.5,4.5,0,4.5,0,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Woman Hater",1949,105,NA,5.3,17,0,0,4.5,4.5,14.5,4.5,34.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Woman Haters",1934,21,NA,6.9,126,0,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Woman Hunt",1975,81,NA,4,15,14.5,4.5,24.5,0,14.5,14.5,0,0,14.5,14.5,"",1,0,0,1,0,0,0 -"Woman Hunted, A",2003,94,NA,4.9,60,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"Woman I Love, The",1937,85,NA,6.1,7,0,0,0,0,24.5,14.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Woman Inside, The",1981,94,NA,6.1,8,14.5,0,14.5,0,14.5,14.5,14.5,0,14.5,24.5,"",0,0,0,1,0,0,0 -"Woman Obsessed",1959,103,NA,5.8,39,4.5,0,0,0,24.5,24.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Woman Racket, The",1930,70,NA,4.7,7,0,0,14.5,44.5,14.5,0,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Woman Rebels, A",1936,88,NA,6.4,83,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Woman Reported, A",2004,5,NA,5.8,8,14.5,0,14.5,14.5,14.5,0,0,14.5,24.5,14.5,"",0,0,0,0,0,0,1 -"Woman Scorned, A",1999,8,NA,5.4,17,4.5,14.5,14.5,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,0,0,0,1 -"Woman They Almost Lynched",1953,90,NA,5.2,23,0,0,4.5,4.5,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Woman Thou Art Loosed",2004,94,NA,6.3,180,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Woman Times Seven",1967,100,NA,5.5,86,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Woman Under the Influence, A",1974,155,NA,7.6,1221,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Woman Wanted",1935,67,NA,5.8,27,4.5,0,4.5,0,24.5,24.5,24.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Woman Who Came Back, The",1945,68,NA,5.7,26,4.5,4.5,4.5,0,4.5,24.5,34.5,14.5,4.5,0,"",0,0,0,0,0,0,0 -"Woman X",2002,15,NA,7,19,0,0,4.5,0,4.5,0,0,24.5,14.5,44.5,"",0,0,0,1,0,0,1 -"Woman for Joe, The",1955,91,NA,5.3,17,0,4.5,14.5,14.5,4.5,44.5,4.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Woman in Green, The",1945,67,NA,6.6,479,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woman in Grey, A",1920,235,NA,7.6,9,0,0,14.5,14.5,0,0,44.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Woman in Hiding",1950,92,NA,6.6,43,0,0,0,0,14.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Woman in Pink, The",1984,88,NA,7.7,11,0,0,0,0,4.5,4.5,4.5,0,4.5,64.5,"",0,0,0,0,0,0,0 -"Woman in Question, The",1950,88,NA,7.2,53,0,0,0,0,14.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Woman in Red, The",1935,68,NA,5.8,33,4.5,4.5,14.5,4.5,14.5,34.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"Woman in Red, The",1984,87,NA,5.4,1804,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Woman in White, The",1948,109,NA,6.4,129,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Woman in a Dressing Gown",1957,93,NA,6.3,27,4.5,0,0,4.5,14.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Woman in the Room, The",1983,30,NA,5.9,91,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Woman in the Window, The",1945,99,NA,7.6,853,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Woman of Affairs, A",1928,98,383000,7.2,100,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woman of Desire",1993,97,NA,3.7,130,4.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Woman of Distinction, A",1950,85,NA,6.4,28,0,4.5,0,0,14.5,24.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Woman of Experience, A",1931,74,NA,6.3,17,0,0,4.5,4.5,24.5,4.5,24.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Woman of Paris, A",1923,93,351000,7.3,351,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woman of Straw",1964,118,NA,6.6,194,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Woman of the North Country",1952,90,NA,5.5,11,0,0,0,4.5,4.5,34.5,14.5,4.5,0,14.5,"",1,0,0,1,0,0,0 -"Woman of the Sea, A",1926,75,NA,5.2,8,14.5,0,0,0,24.5,24.5,14.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Woman of the Town, The",1943,90,NA,6.3,24,4.5,0,4.5,0,4.5,45.5,24.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Woman of the Year",1942,114,NA,7.4,1220,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Woman on Top",2000,92,8000000,5.3,2094,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Woman on the Beach, The",1947,71,NA,6.6,159,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Woman on the Run",1950,77,NA,7.3,35,0,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woman to Woman",1923,82,NA,6,17,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,34.5,"",0,0,0,1,0,1,0 -"Woman's Devotion, A",1956,88,NA,5,17,0,0,4.5,24.5,14.5,14.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Woman's Face, A",1941,106,NA,7.1,153,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Woman's Secret, A",1949,84,NA,6.3,84,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Woman's Tale, A",1991,93,NA,7.4,92,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woman's Vengeance, A",1948,96,NA,7.2,42,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woman, Her Men, and Her Futon, A",1992,90,NA,4.8,64,24.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Womaneater",1957,70,NA,4.1,32,4.5,4.5,0,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Womb Raider",2003,90,NA,6.7,22,4.5,0,0,4.5,0,4.5,0,24.5,14.5,44.5,"R",0,0,0,0,0,0,0 -"Wombling Free",1977,96,NA,3.3,29,4.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Women Are Like That",1938,79,NA,5.6,24,4.5,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,0,"",0,0,0,1,0,0,0 -"Women Talking Dirty",1999,97,5000000,5.8,85,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Women Unchained",1974,82,NA,3.9,9,14.5,14.5,24.5,14.5,44.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Women Without Men",1956,70,NA,4.8,6,0,0,0,34.5,34.5,14.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Women Without Wings",2002,109,NA,3.3,7,0,0,44.5,0,14.5,24.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Women in Bondage",1943,72,NA,7.3,5,0,24.5,0,0,0,24.5,44.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Women in Cages",1971,78,NA,3.3,84,14.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Women in Defense",1941,10,NA,6.2,11,14.5,0,0,0,4.5,34.5,4.5,0,0,24.5,"",0,0,0,0,1,0,1 -"Women in Film",2001,89,NA,3,80,44.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,1,0,0,0 -"Women in Hiding",1940,22,NA,6,15,4.5,0,0,0,24.5,34.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,1 -"Women in His Life, The",1933,75,NA,5.3,14,4.5,0,0,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Women in Love",1969,131,1600000,7.2,817,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Women in Revolt",1971,97,NA,5.8,64,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Women in the Wind",1939,63,NA,5.6,15,0,0,0,14.5,24.5,4.5,34.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"Women of All Nations",1931,72,NA,6,16,14.5,14.5,0,0,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Women of the Night",2000,97,NA,2.9,53,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Women of the Prehistoric Planet",1966,90,NA,2.7,114,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Women's Prison",1955,79,NA,6.5,44,0,0,0,4.5,14.5,24.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Women, The",1939,133,NA,7.6,1780,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Won Ton Ton, the Dog Who Saved Hollywood",1976,92,NA,3.9,152,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Won't Anybody Listen",2001,73,NA,7.7,20,0,0,0,0,0,4.5,24.5,4.5,0,74.5,"",0,0,0,0,1,0,0 -"Wonder",2001,31,40000,7,16,14.5,0,4.5,0,4.5,0,0,14.5,14.5,34.5,"",0,0,0,1,0,1,1 -"Wonder Bar",1934,84,NA,6.2,104,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Wonder Boys",2000,111,35000000,7.6,15668,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,1,1,0,0,0 -"Wonder Dog",1950,7,NA,6.1,17,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Wonder Man",1945,98,NA,7.4,245,0,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Wonder Ring, The",1955,6,NA,5.8,15,14.5,0,4.5,0,14.5,14.5,24.5,4.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Wonder Women",1973,82,NA,4.4,33,14.5,14.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Wonder of It All",1974,95,NA,4.8,5,0,0,0,24.5,24.5,44.5,0,0,0,24.5,"",0,0,0,0,1,0,0 -"Wonderful Country, The",1959,98,NA,6.2,98,4.5,0,4.5,4.5,14.5,24.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Wonderful Day, A",2004,13,NA,8.5,10,0,0,0,14.5,0,0,0,44.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Wonderful Days",2003,90,NA,7,943,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,1,0,0,0,0,0 -"Wonderful Ice Cream Suit, The",1998,77,NA,5.9,156,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,24.5,"PG",0,0,1,0,0,0,0 -"Wonderful Land of Oz, The",1969,55,NA,6.2,22,4.5,4.5,4.5,0,4.5,44.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wonderful Life",1964,113,NA,4.7,46,0,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Wonderful Wizard of Oz, The",1910,10,NA,5.8,38,4.5,0,4.5,4.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,0,0,0,0,1 -"Wonderful World of Dogs, The",1990,52,NA,7,5,0,0,0,0,0,0,24.5,24.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Wonderful World of the Brothers Grimm, The",1962,135,NA,6.1,201,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wonderland",1999,108,NA,7.1,1229,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Wonderlijke Leven van Willem Parel, Het",1955,91,NA,8.6,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Wonders of China",1982,19,NA,7.6,22,0,0,0,0,0,0,34.5,24.5,14.5,24.5,"",0,0,0,0,1,0,1 -"Wonderwall",1968,85,NA,5.4,46,4.5,4.5,0,4.5,14.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Wondrous Oblivion",2003,106,NA,6.7,205,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Wong Fei-hung",1991,95,NA,7.3,2550,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",1,0,0,1,0,0,0 -"Wong Fei-hung chi saiwik hung si",1997,102,12000000,6.2,433,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Wong Fei-hung chi tit gai dau neung gung",1993,90,NA,6.6,432,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",1,0,1,0,0,0,0 -"Wong Fei-hung tsi sam: Siwong tsangba",1993,105,NA,6.7,707,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"R",1,0,0,0,0,0,0 -"Wong gok fung wan",1996,96,NA,6.9,15,14.5,4.5,4.5,0,4.5,4.5,24.5,4.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Wong gok ja 'fit' yan",1996,100,NA,6.1,17,0,0,4.5,0,14.5,24.5,14.5,14.5,0,24.5,"",1,0,0,0,0,0,0 -"Wong gok ka moon",1988,102,NA,7,495,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woo",1998,84,13000000,3.5,407,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"R",0,0,1,0,0,1,0 -"Woo yuet dik goo si",1981,90,NA,7.6,25,0,14.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wood",2000,8,NA,4.7,6,0,0,0,14.5,34.5,14.5,0,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Wood, The",1999,102,6000000,6.2,1170,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"R",0,0,1,1,0,1,0 -"Wood-Peckin'",1943,7,NA,5.8,9,0,0,14.5,0,14.5,34.5,24.5,24.5,0,0,"",0,1,1,0,0,0,1 -"Wooden Camera, The",2003,90,NA,7.2,71,0,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wooden Horse, The",1950,101,NA,6.5,139,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woodlanders, The",1997,95,NA,6.7,68,4.5,0,4.5,4.5,4.5,14.5,24.5,4.5,14.5,24.5,"PG",0,0,0,1,0,0,0 -"Woods Are Full of Cuckoos, The",1937,7,NA,6,11,0,0,0,0,44.5,24.5,14.5,0,0,4.5,"",0,1,1,0,0,0,1 -"Woodsman, The",2004,87,NA,7.2,2444,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Woodstock",1970,216,600000,7.6,2540,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,0,0,1,0,0 -"Woody Dines Out",1945,10,NA,7.3,5,0,0,0,0,0,24.5,0,84.5,0,0,"",0,1,1,0,0,0,1 -"Woody Herman & His Orchestra",1938,9,NA,6.2,9,0,0,0,0,14.5,34.5,34.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Woody Woodpecker Polka",1951,7,NA,5.9,6,0,0,0,14.5,14.5,0,34.5,0,0,34.5,"",0,1,1,0,0,0,1 -"Woolen Under Where",1963,6,NA,7.2,28,0,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Woomuk-Baemi ui sarang",1989,110,NA,8.8,14,0,0,0,0,0,0,4.5,24.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Wooryung gakshi",2002,93,NA,3.1,12,24.5,14.5,4.5,0,4.5,4.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Wooww",1999,16,NA,5.7,36,14.5,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,1,0,0,1 -"Word From the Management, A",2000,6,NA,6.9,20,4.5,0,4.5,0,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,1 -"Word Is Out",1978,124,NA,8.5,18,0,4.5,0,0,14.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Word Universe: A Journey to West Africa, The",1995,91,25000,1.8,13,14.5,0,0,0,0,0,0,24.5,34.5,24.5,"",0,0,0,0,1,0,0 -"Word Wars",2004,80,NA,7.2,146,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,24.5,"",0,0,1,0,1,0,0 -"Wordbox",1999,12,NA,4.3,17,14.5,0,14.5,4.5,14.5,0,0,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Words & Music",1931,21,NA,6,5,0,0,0,0,0,64.5,0,24.5,24.5,0,"",0,0,0,0,0,0,1 -"Words Upon the Window Pane",1994,98,NA,5,16,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Words and Music",1929,81,NA,3.1,16,24.5,14.5,14.5,4.5,0,4.5,0,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Words and Music",1948,120,2799970,5.9,148,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Words for Battle",1941,8,NA,7.8,10,0,0,0,0,0,0,24.5,45.5,24.5,14.5,"",0,0,0,0,1,0,1 -"Words of My Perfect Teacher",2003,103,NA,1.7,17,24.5,4.5,0,0,4.5,4.5,14.5,4.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Work",1915,31,NA,7,118,4.5,4.5,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,1,0,0,0,1 -"Work",1996,90,NA,6.4,6,0,0,0,0,0,34.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Work Is a 4-Letter Word",1968,93,NA,5.9,24,4.5,0,0,0,14.5,4.5,14.5,4.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Work and the Glory, The",2004,118,7500000,6.3,180,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"PG",0,0,0,1,0,1,0 -"Work and the Story, The",2003,77,103000,5.8,37,14.5,4.5,4.5,4.5,14.5,14.5,0,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Work in Progress, A",2002,8,NA,7.4,5,0,0,0,0,0,44.5,0,0,24.5,44.5,"",0,1,0,0,0,0,1 -"Workaholic",1996,90,NA,4.5,126,14.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,1,0 -"Working Girl",1988,115,NA,6.6,8934,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Working Girls",1931,77,NA,6.3,13,0,0,4.5,4.5,24.5,4.5,14.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Working Girls",1986,93,NA,6.4,179,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Working Girls, The",1974,81,NA,4.2,82,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Working Man, The",1933,78,199000,7.7,110,4.5,0,0,4.5,4.5,4.5,14.5,4.5,24.5,64.5,"",0,0,1,1,0,0,0 -"Working for Labour",1998,120,NA,8.2,5,0,0,0,0,0,0,44.5,24.5,24.5,24.5,"",0,0,0,0,1,0,0 -"Working for Peanuts",1953,7,NA,7.3,39,0,0,0,0,0,14.5,34.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Works, The",2004,93,NA,8,15,0,0,0,0,14.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,0,0 -"Workshop Junkie, The",2000,29,NA,8.3,6,0,0,0,0,0,14.5,34.5,0,0,45.5,"",0,0,1,0,0,0,1 -"World According to Garp, The",1982,136,NA,7.1,5668,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,1,0,1,0 -"World Apart, A",1988,113,NA,6.7,284,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"World Changes, The",1933,91,NA,6.5,26,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"World Gone Mad, The",1933,80,NA,5,25,0,4.5,4.5,14.5,34.5,14.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"World Gone Wild",1988,95,NA,4.5,85,4.5,4.5,14.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"World Is Full of Married Men, The",1979,107,NA,2.9,29,24.5,14.5,24.5,14.5,4.5,4.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"World Is Not Enough, The",1999,128,135000000,6.3,24205,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"World Is Watching, The",1988,59,NA,6.9,18,4.5,0,0,0,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"World Moves On, The",1934,104,NA,4.7,33,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"World Premiere",1941,71,NA,2.9,8,0,14.5,0,0,0,34.5,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"World Record",2003,10,NA,6.2,516,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,1,0,0,0,0,1 -"World Traveler",2001,103,2000000,5.4,350,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"World Without End",1956,80,NA,5.6,130,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"World Without Waves",2001,95,NA,6.3,6,14.5,0,0,34.5,0,0,0,0,14.5,34.5,"",0,0,0,0,0,0,0 -"World and Time Enough",1994,90,NA,6.4,64,4.5,4.5,0,4.5,4.5,24.5,4.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"World and the Woman, The",1916,66,NA,7.4,6,0,0,14.5,0,0,0,34.5,45.5,0,0,"",0,0,0,1,0,0,0 -"World at Their Feet, The",1970,95,NA,7,6,0,0,0,14.5,14.5,0,14.5,34.5,0,14.5,"",0,0,0,0,1,0,0 -"World at War, The",1942,66,NA,7.4,10,0,0,0,0,24.5,0,14.5,14.5,14.5,45.5,"",0,0,0,0,1,0,0 -"World for Ransom",1954,82,NA,5.4,22,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,4.5,0,"",0,0,0,1,0,0,0 -"World in His Arms, The",1952,104,NA,6.6,182,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"World in My Corner",1956,82,NA,7.4,10,0,0,0,0,14.5,24.5,24.5,14.5,0,44.5,"",0,0,0,1,0,0,0 -"World of Abbott and Costello, The",1965,75,NA,5.3,44,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,1,0,0 -"World of Comedy",1962,94,NA,7.2,33,0,0,0,4.5,4.5,34.5,24.5,4.5,14.5,4.5,"",0,0,1,0,1,0,0 -"World of Henry Orient, The",1964,106,NA,7,520,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"World of Stainboy, The",2000,5,NA,7.7,99,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,44.5,"",0,1,0,0,0,0,1 -"World of Suzie Wong, The",1960,126,NA,6.1,386,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"World of Tomorrow, The",1984,83,NA,7.5,13,0,0,0,0,0,0,34.5,34.5,0,34.5,"",0,0,0,0,1,0,0 -"World of the Drunken Master",1979,98,NA,4.5,31,0,14.5,4.5,0,14.5,4.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"World's Finest",2004,3,12000,6.7,90,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",1,0,0,0,0,0,1 -"World's Greatest Athlete, The",1973,94,NA,5.1,252,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"World's Greatest Lover, The",1977,89,NA,5.3,322,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"World's Greatest Sinner, The",1962,82,NA,3.8,64,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,45.5,"",0,0,0,1,0,0,0 -"World's Luckiest Man",1997,132,NA,5.6,18,14.5,4.5,0,0,4.5,4.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"World, the Flesh and the Devil, The",1959,95,NA,7.1,221,4.5,4.5,0,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Worm Eaters, The",1977,94,NA,2.4,26,34.5,14.5,0,4.5,4.5,4.5,14.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Worm Turns, The",1937,8,NA,7.3,42,4.5,0,0,0,4.5,14.5,45.5,14.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Wormhole, The",2002,19,NA,7.3,36,14.5,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,"",0,0,0,0,0,0,1 -"Worse",2003,13,NA,7.8,6,0,0,0,0,14.5,0,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,1 -"Worst of Faces of Death, The",1987,60,NA,2.1,34,45.5,4.5,4.5,4.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,1,0,0 -"Worstelaar, De",1970,20,NA,3.5,12,14.5,0,0,0,0,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,1 -"Worth Winning",1989,103,NA,6.3,431,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Wot a Night",1931,9,NA,6.2,12,0,0,0,24.5,4.5,24.5,14.5,14.5,0,4.5,"",0,1,1,0,0,0,1 -"Woton's Wake",1962,30,NA,5.4,9,0,0,14.5,14.5,34.5,14.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Wotta Knight",1947,6,NA,5.3,6,0,0,0,14.5,14.5,34.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"Wotta Nitemare",1939,7,NA,6.7,12,0,4.5,0,0,0,24.5,34.5,14.5,0,14.5,"",0,1,1,0,0,0,1 -"Woubi Cheri",1998,62,NA,6.8,6,0,0,0,0,14.5,0,0,34.5,14.5,34.5,"",0,0,0,0,1,0,0 -"Wounded",1997,96,NA,5.5,160,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"R",1,0,0,1,0,0,0 -"Wounded Hearts",2002,93,50000,3.6,19,34.5,4.5,0,4.5,0,0,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woundings",1998,102,NA,4.1,87,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wow",1970,94,NA,7.2,9,0,0,0,0,0,14.5,64.5,0,24.5,0,"",0,0,0,0,1,0,0 -"Wow and Flutter",2004,17,NA,9.1,14,0,0,0,0,0,4.5,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,1 -"Woyzeck",1979,74,NA,7,528,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Woyzeck",1994,93,NA,5.3,52,4.5,4.5,4.5,0,4.5,14.5,4.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Woyzecks sidste symfoni",2001,40,NA,7.3,9,14.5,0,0,0,14.5,24.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Wraith, The",1986,93,2700000,4.9,1291,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,1,0 -"Wrath of God, The",1972,111,NA,5.6,79,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wreck of the Mary Deare, The",1959,105,NA,6.5,240,4.5,0,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Wreck, a Tangle, A",2000,77,NA,5,9,0,14.5,14.5,0,0,24.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wrecking Crew, The",1969,105,NA,5.2,299,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"PG",1,0,1,1,0,0,0 -"Wrecking Crew, The",1999,80,NA,2.3,185,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Wrestled",2003,16,NA,7,14,0,0,0,0,4.5,0,24.5,4.5,24.5,34.5,"",0,0,0,1,0,0,1 -"Wrestler, The",1974,95,NA,5,43,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,34.5,"",1,0,0,1,0,0,0 -"Wrestling Ernest Hemingway",1993,123,NA,6.7,787,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Wrestling at the New York Athletic Club",1905,4,NA,5.2,7,0,0,14.5,0,24.5,24.5,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Wrestling with Alligators",1998,95,NA,4.1,38,4.5,4.5,14.5,14.5,14.5,4.5,14.5,0,4.5,14.5,"",0,0,0,1,0,0,0 -"Wright Brothers, The",1997,105,NA,3.8,12,14.5,0,4.5,0,14.5,4.5,24.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Write to Kill",1990,99,NA,4.2,21,4.5,4.5,4.5,24.5,14.5,14.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Writer's Block",2003,23,1200,7.2,29,24.5,4.5,4.5,0,0,0,0,4.5,24.5,34.5,"",0,0,1,0,0,0,1 -"Written on the Wind",1956,100,NA,7.4,971,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wrong Again",1929,20,NA,7.1,55,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,1 -"Wrong Arm of the Law, The",1963,94,NA,6.7,197,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Wrong Box, The",1966,105,NA,6.9,497,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Wrong Guy, The",1997,92,NA,6.7,591,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Wrong Guys, The",1988,86,NA,3.9,168,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"PG-13",0,0,1,0,0,0,0 -"Wrong Is Right",1982,117,NA,5.6,245,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Wrong Man, The",1956,105,1200000,7.3,1842,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Wrong Mr. Fox, The",1917,13,NA,6.6,12,0,0,4.5,0,0,44.5,45.5,0,0,0,"",0,0,1,0,0,0,1 -"Wrong Numbers",2001,75,NA,7.9,17,14.5,0,0,0,0,0,4.5,14.5,4.5,45.5,"",0,0,0,0,0,0,0 -"Wrong Trip, The",1996,8,NA,5.5,7,0,0,0,14.5,24.5,14.5,0,24.5,0,14.5,"",0,0,0,1,0,0,1 -"Wrong Way Butch",1950,10,NA,7.5,13,0,0,0,0,0,34.5,24.5,34.5,0,14.5,"",0,0,1,0,0,0,1 -"Wrong Way to Sundance",2001,83,NA,5,9,0,0,0,0,24.5,24.5,14.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Wrong World",1985,97,NA,5.7,11,4.5,0,0,0,14.5,45.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Wrongfully Accused",1998,87,NA,5.2,3258,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Wrony",1994,66,NA,7,77,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Wrzeciono czasu",1995,101,NA,6,15,4.5,14.5,0,4.5,4.5,0,24.5,4.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Wszystko moze sie przytrafic",1995,39,NA,8,6,0,0,0,0,0,0,14.5,0,45.5,34.5,"",0,0,0,0,1,0,1 -"Wszystko na sprzedaz",1969,94,NA,7.1,62,0,4.5,0,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wu Lin sheng dou shi",1992,80,NA,3.1,18,24.5,0,0,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Wu Yen",2001,123,NA,6.2,109,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Wu die",2004,125,NA,6.7,57,4.5,0,0,14.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wu dun ren shu",1982,107,NA,7.9,153,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,44.5,"",1,0,0,1,0,0,0 -"Wu gong zhou",1984,93,NA,5.9,11,0,4.5,4.5,14.5,4.5,4.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Wu jian dao",2002,101,NA,8,4065,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",1,0,0,1,0,0,0 -"Wu jian dao 2",2003,119,NA,7.3,939,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Wu jian dao 3",2003,118,NA,6.8,588,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wu jian lucheng",1999,90,NA,6.1,40,4.5,0,0,4.5,4.5,4.5,14.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Wu kui",1994,114,NA,5.7,76,4.5,4.5,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Wu long tian shi zhao ji gui",1982,80,NA,4.8,37,14.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Wu shan yun yu",1996,96,NA,7,28,0,0,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Wu shu",1993,90,NA,7.1,64,4.5,4.5,0,4.5,4.5,14.5,24.5,4.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Wu yi tan zhang Lei Luo zhuan",1991,70,NA,6.9,33,4.5,0,4.5,0,14.5,14.5,44.5,4.5,14.5,4.5,"",1,0,0,1,0,1,0 -"Wu yi tan zhang Lei Luo zhuan zhi er",1991,71,NA,7.6,9,0,0,0,0,24.5,0,24.5,45.5,0,0,"",0,0,0,0,0,0,0 -"Wuge nuzi he yigen shengzi",1991,123,NA,7.8,32,0,0,0,0,0,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Wunder von Bern, Das",2003,118,NA,7.4,822,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Wunschkonzert",1940,103,NA,6,15,24.5,0,0,4.5,4.5,14.5,24.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Wuthering Heights",1939,103,NA,7.7,2451,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Wuthering Heights",1970,104,NA,6.5,250,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Wuthering Heights",1992,105,NA,6.5,1257,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Wuya yu maque",1949,113,NA,7.2,32,0,0,0,4.5,4.5,24.5,24.5,34.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wuyande Shanqiu",1993,165,NA,8.3,10,0,0,0,0,0,0,0,44.5,44.5,24.5,"",0,0,0,1,0,0,0 -"Wuye xiongjing",1999,87,NA,3.1,8,34.5,14.5,0,24.5,14.5,0,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Wyatt Earp",1994,212,63000000,6.1,5248,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Wyatt Earp: Return to Tombstone",1994,100,NA,5.5,35,4.5,0,4.5,14.5,24.5,4.5,4.5,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Wyjscie awaryjne",1982,89,NA,5.9,10,0,0,0,0,24.5,34.5,14.5,14.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Wynken, Blynken & Nod",1938,8,NA,7.5,66,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,1,0,0,0,0,1 -"Wyoming",1940,88,NA,6,20,0,0,4.5,4.5,14.5,44.5,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Wyoming",1947,84,NA,6.6,7,0,0,0,0,14.5,24.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Wyoming Bandit, The",1949,60,NA,5.7,5,0,0,24.5,24.5,0,24.5,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Wyoming Mail",1950,87,NA,5.7,11,0,0,0,0,44.5,34.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Wyoming Outlaw",1939,56,NA,4.2,40,14.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Wyspa R.O.",2001,31,NA,7.6,5,0,0,24.5,0,0,24.5,24.5,24.5,0,24.5,"",0,1,0,1,0,0,1 -"X",1963,79,250000,6.3,668,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"X",1986,94,NA,6.2,18,14.5,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"X",1996,97,NA,5.8,569,14.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,1,0,0,0,0,0 -"X",2002,100,NA,6.2,44,4.5,0,4.5,4.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"X 2000",1998,8,NA,6.2,103,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"X Dreams",1989,80,NA,6.8,5,0,0,0,0,24.5,24.5,44.5,24.5,0,0,"",0,0,0,0,0,0,0 -"X Files, The",1998,121,66000000,6.7,18314,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 -"X Is Y",1990,4,NA,4.6,37,4.5,4.5,14.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,1 -"X Marks the Spot",1944,20,NA,3,28,44.5,14.5,4.5,4.5,14.5,4.5,14.5,0,0,4.5,"",0,0,0,0,0,0,1 -"X the Unknown",1956,81,NA,6.2,216,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"X, Y",2004,90,NA,6.2,23,14.5,0,0,0,4.5,4.5,24.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"X-15",1961,107,NA,6,117,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"X-Men",2000,104,75000000,7.3,45332,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"PG-13",1,0,0,0,0,0,0 -"X-paroni",1964,85,NA,6.3,76,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"X2",2003,133,110000000,7.9,38191,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"PG-13",1,0,0,0,0,0,0 -"X: The Unheard Music",1986,84,NA,8.2,62,4.5,0,0,0,0,4.5,4.5,14.5,24.5,45.5,"",0,0,0,0,1,0,0 -"XS - la peor talla",2003,84,NA,6.2,8,14.5,0,0,0,0,34.5,34.5,0,0,14.5,"",0,0,1,0,0,0,0 -"XX Ray",1992,118,NA,8.8,8,0,0,0,0,0,0,24.5,14.5,0,64.5,"",0,0,0,0,0,0,0 -"XX/XY",2002,91,NA,6.1,657,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,1,0 -"XX: utsukushiki emono",1996,99,NA,5.2,7,0,0,0,14.5,44.5,0,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"XXL",1997,95,NA,3.8,75,14.5,14.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,0,"",0,0,1,0,0,0,0 -"XXL",2004,105,NA,3.9,10,34.5,14.5,14.5,14.5,0,14.5,24.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Xala",1975,123,NA,6.4,101,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Xanadu",1980,93,20000000,4.4,2201,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Xanda",2004,85,NA,5.9,48,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Xaver",1986,90,NA,4.3,50,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,14.5,45.5,"",0,0,1,0,0,0,0 -"Xavier",1992,100,NA,6,7,14.5,14.5,0,0,14.5,0,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Xchange",2000,110,NA,5.6,719,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Xenogenesis",1978,12,NA,3.2,38,24.5,4.5,4.5,4.5,0,14.5,14.5,4.5,4.5,34.5,"",0,0,0,0,0,0,1 -"Xerex",2003,108,NA,5.3,6,14.5,0,14.5,34.5,0,0,0,0,0,34.5,"",0,0,0,1,0,1,0 -"Xi Zang xiao zi",1992,97,NA,6,30,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Xi chu bawang",1994,177,NA,6.3,60,4.5,4.5,4.5,4.5,14.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Xi tai hou",1975,165,NA,7.5,17,4.5,0,0,0,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Xi you ji di yi bai ling yi hui zhi yue guang bao he",1994,115,NA,7.2,322,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,34.5,"",1,0,0,0,0,1,0 -"Xia dao Gao Fei",1993,96,NA,7.2,536,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Xia ri fu xing",1985,90,NA,6,213,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Xian dai hao xia zhuan",1993,97,NA,5.8,282,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Xian hun nu",1993,105,NA,7,54,4.5,0,4.5,0,0,14.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Xian si jue",1982,86,NA,7.4,242,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",1,0,0,1,0,0,0 -"Xiang Gang qi an zhi qiang jian",1993,91,NA,4.8,74,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Xiang ji mao yi yang fei",2002,94,NA,7,29,0,0,4.5,0,4.5,4.5,24.5,34.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Xiang jiang hua yue ye",1966,128,NA,7.3,7,0,0,0,14.5,0,0,24.5,44.5,14.5,0,"",0,0,0,0,0,0,0 -"Xianggang zhizao",1997,108,NA,7.5,245,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Xiangnu xiaoxiao",1986,110,NA,7.5,49,0,0,0,4.5,0,4.5,14.5,44.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Xiao Qian",1997,83,NA,6.4,176,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",1,1,1,0,0,1,0 -"Xiao Wanyi",1933,114,NA,6.6,12,0,0,0,0,4.5,14.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Xiao Wu",1997,108,NA,6.8,154,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Xiao ao jiang hu zhi dong fang bu bai",1991,110,NA,7.2,647,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"R",1,0,0,0,0,0,0 -"Xiao bai wu jin ji",2000,96,NA,7.3,25,4.5,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,"",0,1,0,1,0,1,0 -"Xiao cheng zhi chun",1948,85,NA,8.3,45,4.5,0,0,0,4.5,4.5,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Xiao cheng zhi chun",2002,112,NA,7,220,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG",0,0,0,1,0,0,0 -"Xiao ti qing",2003,100,NA,7.7,6,0,0,0,0,0,14.5,45.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Xiaoao jiang hu",1990,120,NA,7,246,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",1,0,0,0,0,1,0 -"Xiaohai bu ben",2002,108,NA,7.5,188,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Xiari nuanyangyang",2000,97,NA,8.2,56,0,0,4.5,4.5,4.5,4.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Xica da Silva",1976,107,NA,7.4,121,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Xich lo",1995,129,NA,7,981,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Xicu'l toperu",1994,12,NA,9.4,5,0,0,0,0,0,0,24.5,0,0,84.5,"",0,0,1,0,0,0,1 -"Xilu xiang",1999,118,NA,7.5,134,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Xin buliao qing",1994,105,NA,7.8,117,4.5,0,0,0,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Xin ching-wu men",1976,114,NA,5.5,175,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Xin dong",1999,115,NA,7,122,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Xin jing wu men 1991",1991,96,NA,6.9,62,0,4.5,4.5,0,4.5,14.5,44.5,14.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Xin leng xue shi san ying",1992,100,NA,5,8,0,0,0,14.5,64.5,14.5,0,14.5,0,0,"",1,0,0,1,0,0,0 -"Xin long men ke zhan",1992,103,NA,7,477,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Xin long zhong hu dou",1992,87,NA,5.1,10,14.5,0,14.5,0,24.5,14.5,14.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Xin tian long ba bu zhi tian shan tong lao",1994,96,NA,5,67,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Xin xiang",1993,97,NA,6,10,0,0,0,0,14.5,14.5,24.5,0,14.5,45.5,"",0,0,0,1,0,0,0 -"Xin zuijia paidang",1989,103,NA,5.2,37,4.5,0,4.5,14.5,24.5,24.5,14.5,4.5,0,4.5,"",1,0,1,0,0,0,0 -"Xing yuan",1999,93,NA,6.7,169,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,1,0 -"Xingfu shiguang",2001,95,NA,7.3,764,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Xinjiu Shanghai",1936,90,NA,4.4,31,0,0,74.5,0,14.5,4.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Xiong bang",1981,95,NA,6.4,21,0,14.5,4.5,0,14.5,0,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Xiong zhong",1982,81,NA,4.8,15,14.5,4.5,4.5,4.5,14.5,0,4.5,14.5,0,34.5,"",1,0,0,1,0,0,0 -"Xipolito tagma",1954,89,NA,6,13,4.5,0,0,0,4.5,4.5,34.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Xixia lu tiaotiao",1997,110,NA,5.6,22,4.5,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Xizao",1999,92,NA,7.3,1196,4.5,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"PG-13",0,0,1,1,0,0,0 -"Xtracurricular",2001,84,NA,6.8,13,14.5,4.5,0,0,4.5,0,0,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Xtro",1983,84,NA,4,311,14.5,4.5,14.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Xtro 3: Watch the Skies",1995,90,NA,2.8,141,34.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Xtro II: The Second Encounter",1990,92,NA,3.1,168,24.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Xuan lian",1993,88,NA,3.3,5,0,24.5,24.5,0,24.5,24.5,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Xun qiang",2002,120,NA,6.4,164,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"PG-13",0,0,0,0,0,0,0 -"Xuxa Abracadabra",2003,87,NA,1.9,22,74.5,4.5,0,0,0,4.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Xuxa Requebra",1999,90,NA,2.4,114,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Xuxa e os Duendes",2001,90,NA,2.1,113,64.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Xuxa e os Duendes 2 - No caminho das Fadas",2002,89,NA,1.2,146,74.5,4.5,0,0,0,4.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Xxxposed",2000,19,NA,7.9,7,0,0,0,0,0,14.5,24.5,24.5,0,24.5,"",0,0,1,0,0,0,1 -"Xypna Vassili",1969,81,NA,6.8,20,4.5,0,0,0,14.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Xypolytos prigips, O",1966,91,NA,6.9,11,0,0,4.5,14.5,4.5,4.5,4.5,24.5,0,14.5,"",0,0,1,0,0,0,0 -"Y",2000,12,NA,3.6,5,64.5,0,0,0,24.5,0,0,0,0,24.5,"",0,0,0,0,0,0,1 -"Y Mabinogi",2003,90,NA,4.7,16,0,0,0,34.5,0,14.5,24.5,14.5,4.5,14.5,"",0,1,0,0,0,0,0 -"Y Mapiwr",1995,90,NA,8.2,9,0,0,0,0,0,14.5,14.5,44.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Y decirte alguna estupidez, por ejemplo, te quiero",2000,101,NA,4.5,27,24.5,4.5,4.5,24.5,4.5,24.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Y'a toujours moyen de moyenner!",1973,92,NA,4.5,21,14.5,14.5,14.5,0,14.5,24.5,4.5,4.5,0,0,"",0,0,1,0,0,0,0 -"Ya khotela uvidet angelov",1992,83,NA,3.4,9,0,24.5,14.5,0,0,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Ya la hicimos",1994,95,NA,5.2,6,0,14.5,0,0,14.5,34.5,14.5,0,14.5,0,"",0,0,1,1,0,0,0 -"Ya lyublu tebya",2004,83,NA,8.4,79,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Ya shagayu po Moskve",1963,78,NA,8.6,79,4.5,0,0,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",0,0,1,0,0,1,0 -"Yaaba",1989,90,NA,7.5,89,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Yaadein",1964,113,NA,8.2,5,0,0,0,0,0,24.5,0,44.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Yaadon Ki Baaraat",1973,164,NA,6.8,52,4.5,4.5,0,4.5,4.5,4.5,4.5,14.5,24.5,34.5,"",1,0,0,1,0,1,0 -"Yabu no naka no kuroneko",1968,99,NA,7.4,57,4.5,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Yacht Party, The",1932,9,NA,5.2,8,0,0,0,14.5,34.5,34.5,0,0,0,14.5,"",0,0,0,0,0,0,1 -"Yadon ilaheyya",2002,100,NA,6.3,805,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Yady, ili vsemirnaya istoriya otravleniy",2001,106,NA,7.3,26,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,0,"",0,0,1,0,0,0,0 -"Yahudi",1958,170,NA,5.7,14,4.5,0,0,0,14.5,0,4.5,34.5,24.5,4.5,"",0,0,0,1,0,1,0 -"Yaju no seishun",1963,92,NA,7.9,148,0,0,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Yaksohk",1998,109,NA,7.2,25,0,0,0,0,4.5,14.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Yakusoku",1972,87,NA,7.1,5,0,0,0,0,0,24.5,0,24.5,0,64.5,"",0,0,0,0,0,0,0 -"Yakuza Way, The",1998,82,NA,3.4,14,45.5,4.5,4.5,4.5,14.5,14.5,0,0,0,0,"R",0,0,0,0,0,0,0 -"Yakuza keibatsu-shi: Rinchi - shikei!",1969,96,NA,4.6,14,0,0,14.5,4.5,34.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Yakuza no hakaba: Kuchinashi no hana",1976,97,NA,7.8,71,0,0,4.5,0,4.5,4.5,14.5,24.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Yakuza, The",1975,112,NA,6.9,550,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Yaldei Stalin",1986,95,NA,7,6,0,0,0,0,0,0,45.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Yam Daabo",1986,80,NA,6.7,5,0,24.5,0,0,0,0,64.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Yam yeung choh",1983,98,NA,6.8,20,0,0,0,4.5,0,34.5,24.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Yam yeung lo ji sing goon faat choi",1998,99,NA,6.9,7,0,0,14.5,0,24.5,14.5,24.5,0,14.5,0,"",0,0,1,0,0,0,0 -"Yama no oto",1954,96,NA,7.3,29,0,0,0,4.5,0,4.5,14.5,34.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Yamaguchi-gumi gaiden: Kyushu shinko-sakusen",1974,106,NA,6,13,0,0,4.5,14.5,14.5,14.5,34.5,0,14.5,0,"",1,0,0,1,0,0,0 -"Yamamoto san",2003,13,NA,5.5,7,0,0,0,0,24.5,14.5,24.5,0,14.5,14.5,"",0,0,1,0,0,1,1 -"Yamato Takeru",1994,105,NA,7.2,27,4.5,0,0,0,0,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yamato yo towa ni",1980,145,NA,7.7,20,0,0,0,0,0,4.5,14.5,14.5,4.5,64.5,"",0,1,0,0,0,0,0 -"Yami no karyudo",1979,137,NA,7.1,17,0,0,4.5,0,0,14.5,14.5,14.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Yan man ying hung",1987,82,NA,7.6,12,0,0,0,0,4.5,14.5,14.5,45.5,4.5,0,"",1,0,0,1,0,0,0 -"Yan sut",1985,92,NA,6.5,20,0,0,4.5,4.5,14.5,4.5,34.5,24.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Yang chi",1974,99,NA,6.9,12,4.5,4.5,0,0,4.5,0,14.5,14.5,14.5,24.5,"",1,0,1,0,0,0,0 -"Yang chun da xiong",1976,91,NA,5,45,14.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,"",1,0,0,1,0,0,0 -"Yangguang Canlan de Rizi",1994,134,NA,8.4,239,4.5,4.5,0,0,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Yangtse Incident: The Story of H.M.S. Amethyst",1957,113,NA,6.4,67,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Yank Tanks",2002,70,NA,6.6,27,0,4.5,0,0,0,14.5,14.5,44.5,4.5,14.5,"",0,0,0,0,1,0,0 -"Yank at Eton, A",1942,88,NA,5.9,40,0,4.5,4.5,0,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Yank at Oxford, A",1938,102,NA,6.7,145,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Yank in Libya, A",1942,67,NA,5.3,14,0,14.5,24.5,4.5,24.5,24.5,4.5,0,0,0,"",0,0,0,1,0,0,0 -"Yank in Viet-Nam, A",1964,80,NA,4.9,8,14.5,0,14.5,24.5,14.5,0,14.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Yank in the R.A.F., A",1941,98,NA,6.7,109,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,1,0 -"Yank on the Burma Road, A",1942,67,NA,5.9,27,14.5,0,0,4.5,14.5,24.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Yankee",1966,92,NA,3.2,10,24.5,14.5,14.5,0,0,45.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Yankee Buccaneer",1952,86,NA,6.3,20,0,0,0,4.5,24.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Yankee Dood It",1956,8,NA,6.3,23,0,0,0,14.5,14.5,14.5,4.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Yankee Doodle Bugs",1954,7,NA,6.4,45,0,4.5,4.5,4.5,4.5,14.5,24.5,4.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Yankee Doodle Daffy",1943,7,NA,6.4,110,4.5,4.5,4.5,14.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,1,1,0,0,0,1 -"Yankee Doodle Dandy",1942,126,NA,7.7,2254,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Yankee Doodle Mouse, The",1943,8,NA,7.8,57,0,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Yankee Fakir",1947,71,NA,3.6,10,0,14.5,24.5,24.5,24.5,0,14.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Yankee Pasha",1954,84,NA,6.4,38,0,0,0,14.5,4.5,24.5,14.5,24.5,4.5,14.5,"",0,0,0,0,0,1,0 -"Yankee Zulu",1993,100,NA,4.7,93,14.5,4.5,4.5,14.5,4.5,14.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yanks",1979,139,NA,6,496,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Yao a yao yao dao waipo qiao",1995,108,NA,7.2,1116,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Yao jie huang hou",1995,101,NA,5.5,26,4.5,0,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Yao shou du shi",1992,87,NA,5.4,227,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Yao ye hui lang",2003,72,NA,6.4,30,4.5,0,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Yaourts mystiques",2000,10,NA,6.1,12,0,0,4.5,0,0,44.5,24.5,4.5,14.5,0,"",0,1,1,0,0,0,1 -"Yapian zhanzheng",1997,113,NA,6,117,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Yara",1999,96,NA,6.5,34,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Yarasa",1994,78,NA,7.9,9,24.5,0,0,0,0,0,0,0,14.5,64.5,"",0,0,0,0,0,0,0 -"Yard Sale",2004,103,800000,8.6,27,4.5,0,0,0,4.5,0,4.5,14.5,14.5,45.5,"",0,0,1,0,0,1,0 -"Yard Sale, The",2002,19,NA,6.8,13,0,14.5,0,0,14.5,4.5,4.5,4.5,34.5,14.5,"",0,0,0,0,0,0,1 -"Yardbirds",1992,55,NA,7.2,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,0,0,0,1,0,0 -"Yards, The",2000,115,20000000,6.3,3386,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Yari no gonza",1986,126,NA,7.2,34,4.5,0,0,0,4.5,24.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Yaroslav Mudry",1981,156,NA,6.3,7,0,0,0,0,0,14.5,0,24.5,44.5,14.5,"",1,0,0,1,0,0,0 -"Yasaeng dongmul bohoguyeog",1996,105,NA,5.9,35,4.5,0,4.5,4.5,4.5,24.5,14.5,4.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Yasemin",1988,70,NA,7,45,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Yasha",1985,127,NA,6.2,19,0,4.5,14.5,14.5,0,14.5,34.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yashagaike",1979,123,NA,6.9,34,14.5,0,0,0,4.5,4.5,14.5,24.5,4.5,34.5,"",0,0,0,0,0,1,0 -"Yasmin",2004,87,NA,7.1,87,4.5,0,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Yat do king sing",1993,105,NA,6.2,90,4.5,0,0,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Yateem",1988,173,NA,8.6,9,0,0,0,0,0,0,34.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Yatgo ho yan",1997,88,NA,6,2637,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"PG-13",1,0,1,0,0,0,0 -"Yatsu haka-mura",1977,151,NA,6.4,23,0,0,4.5,0,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yatsu haka-mura",1996,126,NA,6.1,12,0,0,0,0,4.5,34.5,45.5,0,4.5,0,"",0,0,0,0,0,0,0 -"Yatzati L'Hapes Ahavah - Techef Ashuv",1997,55,NA,7.5,69,4.5,0,0,4.5,0,4.5,0,4.5,14.5,74.5,"",0,0,0,1,1,1,0 -"Yau ching yam shui baau",2001,99,NA,5.5,35,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"Yau doh lung fu bong",2004,95,NA,6.6,128,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Yau sau tung dong",2000,95,NA,4.5,6,14.5,0,0,34.5,0,0,14.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Yawar mallku",1969,80,NA,6.4,32,4.5,0,4.5,0,4.5,14.5,4.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Yawm al-Sadis, al-",1986,105,NA,6.2,28,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yazgi",2001,120,NA,7.3,53,4.5,0,4.5,4.5,0,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Yazi tura",2004,102,10000,8.6,95,4.5,0,0,0,4.5,4.5,4.5,4.5,24.5,45.5,"",0,0,0,1,0,0,0 -"Ydessa, les ours et etc.",2004,44,NA,7.8,6,0,0,14.5,0,0,0,0,34.5,34.5,14.5,"",0,0,0,0,1,0,1 -"Ydmygede, De",1998,79,NA,2.7,75,44.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,"",0,0,0,0,1,0,0 -"Ye ban ge sheng",1995,100,NA,6.6,98,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Ye mei gui zhi lian",1960,128,NA,8,6,0,0,0,0,0,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ye shou zhi tong",2001,109,NA,6.2,25,0,0,4.5,14.5,4.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Year My Voice Broke, The",1987,103,NA,7.2,391,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Year of Living Dangerously, The",1982,117,NA,7.1,3519,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,1,0 -"Year of Living Vicariously, The",2005,63,NA,6.7,6,0,0,0,34.5,0,0,0,64.5,0,0,"",0,0,0,0,1,0,0 -"Year of My Japanese Cousin, The",1995,70,NA,8.3,7,0,14.5,0,0,0,0,0,24.5,0,45.5,"",0,0,0,0,0,0,0 -"Year of the Bull",2003,86,NA,7.4,32,0,0,4.5,0,0,0,34.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Year of the Comet",1992,91,NA,5.2,331,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,1,0 -"Year of the Dragon",1985,134,NA,6.4,1724,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Year of the Gun",1991,111,NA,5.3,421,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Year of the Horse",1997,106,NA,6.2,328,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,24.5,"R",0,0,0,0,1,0,0 -"Year of the Mouse, The",1965,6,NA,6,19,0,4.5,4.5,14.5,14.5,14.5,14.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Year of the Yahoo!",1972,88,NA,2.7,22,24.5,4.5,4.5,4.5,4.5,14.5,0,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Year of the Yao, The",2004,88,NA,7.9,58,4.5,4.5,4.5,0,0,4.5,4.5,14.5,4.5,45.5,"PG",0,0,0,0,1,0,0 -"Yearling, The",1946,128,4000000,7.5,677,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Years of the Beast",1981,98,NA,4.8,17,4.5,4.5,4.5,0,14.5,4.5,4.5,4.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Yee do hung gaan",2002,100,NA,6.5,319,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Yeelen",1987,105,NA,7.5,189,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Yego zvali Robert",1967,93,NA,7.6,10,24.5,0,0,0,0,0,0,24.5,24.5,44.5,"",0,0,1,0,0,0,0 -"Yeh Dillagi",1994,155,NA,5.2,48,4.5,4.5,0,0,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Yeh Hai Jalwa",2002,165,NA,6.1,24,4.5,4.5,4.5,0,4.5,24.5,14.5,4.5,4.5,34.5,"",0,0,1,1,0,1,0 -"Yeh Lamhe Judaai Ke",2004,135,NA,1.8,27,45.5,24.5,0,0,4.5,4.5,0,0,0,14.5,"",0,0,0,1,0,0,0 -"Yeh Teraa Ghar Yeh Meraa Ghar",2001,175,NA,6.3,22,0,0,4.5,0,4.5,24.5,24.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Yehoshua, Yehoshua",1986,87,NA,6.9,5,0,0,0,24.5,0,0,44.5,0,0,44.5,"",0,0,1,1,0,0,0 -"Yek Dastan-e Vaghe'i",1996,140,NA,6.3,9,0,0,0,0,24.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Yellow",1996,13,NA,6,12,4.5,0,0,24.5,4.5,24.5,34.5,0,0,0,"",0,0,0,0,0,0,1 -"Yellow",1998,90,NA,5.9,97,14.5,4.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,24.5,"R",0,0,1,1,0,0,0 -"Yellow Balloon, The",1953,76,NA,7.8,23,4.5,0,0,4.5,4.5,4.5,4.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Yellow Bird",2001,30,100000,8,21,0,4.5,0,0,4.5,0,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,1 -"Yellow Cab Man, The",1950,85,NA,6.6,58,0,0,0,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Yellow Canary",1943,84,NA,5.9,49,0,0,0,4.5,24.5,34.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Yellow Canary, The",1963,93,NA,5.7,10,0,14.5,0,0,0,14.5,0,14.5,14.5,64.5,"",0,0,0,1,0,0,0 -"Yellow Card",2000,90,NA,5.2,17,4.5,4.5,4.5,14.5,4.5,24.5,14.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Yellow Dust",1936,68,NA,4.5,5,0,0,24.5,44.5,24.5,0,24.5,0,0,0,"",0,0,0,0,0,0,0 -"Yellow Hair and the Fortress of Gold",1984,93,NA,3.5,28,14.5,24.5,24.5,24.5,0,14.5,4.5,4.5,0,4.5,"",1,0,0,0,0,0,0 -"Yellow Jack",1938,83,NA,6.3,28,4.5,0,0,4.5,14.5,14.5,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Yellow Mountain, The",1954,77,NA,5.3,9,0,0,14.5,14.5,14.5,14.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Yellow Pages",1988,89,NA,4.2,31,0,4.5,24.5,14.5,14.5,4.5,4.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"Yellow Rolls-Royce, The",1964,122,NA,6.1,392,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Yellow Rose of Texas, The",1944,69,NA,6.4,16,0,0,0,0,24.5,34.5,34.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Yellow Sign, The",2001,47,NA,8.7,6,0,0,0,0,0,0,34.5,14.5,0,45.5,"",0,0,0,0,0,0,1 -"Yellow Sky",1949,95,NA,7.5,223,0,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Yellow Submarine",1968,85,NA,7,4573,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,1,1,0,0,0,0 -"Yellow Teddybears, The",1963,88,NA,4.2,19,14.5,14.5,14.5,0,14.5,24.5,4.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Yellow Ticket, The",1931,88,NA,6.3,16,4.5,0,0,14.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Yellow Tomahawk, The",1954,82,NA,6.1,19,0,0,0,4.5,14.5,34.5,24.5,4.5,14.5,0,"",0,0,0,0,0,0,0 -"Yellowbeard",1983,96,NA,5.3,1464,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Yellowknife",2002,110,NA,6,49,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Yellowneck",1955,83,NA,4,11,24.5,0,4.5,4.5,4.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Yellowstone",1936,63,NA,6,15,0,0,4.5,4.5,14.5,44.5,24.5,4.5,0,0,"",0,0,0,1,0,0,0 -"Yellowstone",1994,32,NA,6.4,24,14.5,0,4.5,4.5,24.5,4.5,24.5,4.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Yellowstone Cubs",1963,48,NA,7.8,10,0,0,0,0,0,14.5,14.5,14.5,24.5,45.5,"",0,0,0,0,0,0,1 -"Yellowstone Kelly",1959,91,NA,6,70,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yengec sepeti",1995,96,NA,7.4,21,0,0,0,14.5,0,14.5,4.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Yentl",1983,132,12000000,5.7,2030,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Yeogo goedam",1998,105,NA,5.9,187,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Yeogo goedam II",1999,97,NA,6.9,426,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,0,0,1,0 -"Yeojaneun namjaui miraeda",2004,88,NA,6.2,152,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Yeokdosan",2004,137,NA,6.7,32,0,0,0,0,4.5,4.5,44.5,14.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Yeokjeone sanda",2003,110,NA,5.7,43,0,4.5,4.5,4.5,24.5,24.5,4.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Yeonae sosheol",2002,106,NA,7.2,165,4.5,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Yeongwonhan jegug",1995,126,NA,7.2,13,0,0,0,0,4.5,14.5,24.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Yeonpung yeonga",1999,96,NA,6.9,38,0,0,0,0,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Yeoseonsaeng vs yeojeja",2004,119,NA,6.4,33,4.5,0,0,4.5,4.5,34.5,24.5,34.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Yeoseot gae ui siseon",2003,110,NA,7.2,75,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,1,0,0,0 -"Yepeto",1999,107,NA,6.7,56,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,34.5,14.5,"",0,0,0,1,0,0,0 -"Yerankyuni",1967,84,NA,6.5,6,14.5,0,0,0,0,14.5,14.5,34.5,14.5,0,"",0,0,0,1,0,0,0 -"Yerma",1985,107,NA,6.9,6,0,0,0,0,0,34.5,34.5,34.5,0,0,"",0,0,0,1,0,0,0 -"Yerma",1999,118,1670000,5.5,38,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Yermak",1996,124,NA,6,9,0,0,24.5,14.5,0,24.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Yes & No",2000,4,NA,7.8,22,0,0,4.5,0,4.5,0,24.5,14.5,34.5,14.5,"",0,1,1,0,0,0,1 -"Yes Boss",1997,163,NA,7.1,126,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,1,0 -"Yes Men, The",2003,83,NA,6.9,515,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"R",0,0,0,0,1,0,0 -"Yes Sir That's My Baby",1949,82,NA,6.3,7,0,0,0,0,0,24.5,44.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Yes Sir! Madame...",1994,75,NA,7.8,18,0,0,0,4.5,0,4.5,24.5,4.5,34.5,24.5,"",0,0,1,0,0,0,0 -"Yes and",2004,92,5000,8.5,10,14.5,0,0,0,0,0,14.5,0,34.5,45.5,"",0,0,1,0,0,0,0 -"Yes, Giorgio",1982,110,19000000,3.3,113,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Yes, My Darling Daughter",1939,86,NA,6.3,24,4.5,0,0,4.5,4.5,34.5,24.5,24.5,0,4.5,"",0,0,1,0,0,1,0 -"Yes, We Have No Bonanza",1939,16,NA,8.2,66,0,4.5,0,0,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,1 -"Yes, Yes, Nanette",1925,9,NA,4.3,19,4.5,0,4.5,14.5,24.5,34.5,4.5,0,0,4.5,"",0,0,1,0,0,0,1 -"Yesenia",1971,121,NA,5.5,11,0,0,14.5,0,0,4.5,4.5,4.5,24.5,24.5,"",0,0,0,1,0,1,0 -"Yeshchyo raz pro lyubov",1968,96,NA,6.6,11,0,4.5,0,0,0,4.5,0,44.5,4.5,24.5,"",0,0,0,1,0,1,0 -"Yeshou xingjing",1998,110,NA,6.7,193,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"",1,0,0,1,0,0,0 -"Yesil isik",2002,111,1500000,3.7,38,44.5,4.5,4.5,4.5,4.5,0,4.5,4.5,4.5,14.5,"",0,0,1,1,0,1,0 -"Yessongs",1975,70,NA,7.6,68,0,4.5,0,4.5,4.5,4.5,4.5,14.5,4.5,45.5,"",0,0,0,0,1,0,0 -"Yesterday",1981,95,NA,6.8,33,0,0,4.5,4.5,4.5,4.5,4.5,34.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Yesterday",1985,87,NA,6.5,29,0,0,0,0,4.5,0,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Yesterday",2004,96,NA,5.1,90,14.5,4.5,4.5,4.5,0,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,1,0,0,0 -"Yesterday Machine, The",1963,85,NA,2.7,11,34.5,4.5,4.5,34.5,0,0,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Yesterday's Enemy",1959,95,NA,6.9,16,0,0,0,0,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Yesterday's Hero",1979,95,NA,4.9,9,14.5,0,0,14.5,44.5,0,0,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Yesterday's Target",1996,79,NA,4.8,147,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Yeung gwong ging chaat",1999,89,NA,5.2,15,0,24.5,0,14.5,24.5,14.5,24.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Yeux clairs, Les",2005,87,NA,7.6,9,0,14.5,0,0,0,24.5,14.5,14.5,44.5,0,"",0,0,0,0,0,0,0 -"Yeux ouverts, Les",2005,6,NA,8.6,11,0,0,0,0,0,4.5,4.5,14.5,34.5,24.5,"",0,0,0,1,0,0,1 -"Yeux rouges, Les",1982,90,NA,6.2,6,0,0,0,14.5,0,34.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Yeux sans visage, Les",1959,88,NA,7.9,730,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Yeux secs, Les",2003,116,NA,7.9,21,14.5,0,0,0,0,4.5,24.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Yez rouz bishtar",1999,75,NA,6.6,16,0,0,4.5,4.5,0,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,1,0 -"Yhden miehen sota",1973,108,NA,5.9,12,0,0,0,4.5,14.5,14.5,4.5,44.5,4.5,0,"",0,0,0,1,0,0,0 -"Yi chu ji fa",1991,97,NA,6.6,18,14.5,4.5,0,0,4.5,14.5,24.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Yi dan qun ying",1989,97,NA,6.6,138,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Yi ge dou bu neng shao",1999,106,NA,7.4,1707,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Yi ge mo sheng nu ren de lai xin",2004,90,NA,6.4,67,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Yi jian zhong qing",2000,98,NA,6,49,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Yi jiang chun shui xiang dong liu",1947,190,NA,7.7,31,0,0,0,4.5,0,4.5,14.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Yi tian tu long ji zhi mo jiao jiao zhu",1993,99,NA,5.8,544,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Yi yi",2000,173,NA,7.6,2355,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Yiddish Connection",1986,97,NA,6.8,9,14.5,0,0,0,24.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Yidl Mitn Fidl",1936,92,NA,7.5,29,0,0,0,14.5,0,4.5,4.5,24.5,34.5,14.5,"",0,0,1,0,0,0,0 -"Yie mou - Yie mou",1965,84,NA,7.5,8,0,0,0,24.5,0,14.5,14.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Yield to the Night",1956,99,NA,6.3,27,4.5,0,0,0,4.5,24.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Yin",2004,7,NA,9,5,0,0,0,0,0,0,24.5,0,44.5,44.5,"",0,1,0,0,0,0,1 -"Yin ji kau",1987,93,NA,7.3,213,0,0,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,1,0 -"Yin shi nan nu",1994,123,NA,7.6,3134,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Yin yang lu",1997,98,NA,6.7,9,0,0,0,14.5,14.5,24.5,24.5,24.5,14.5,0,"",0,0,0,0,0,0,0 -"Yin zhong",1986,88,NA,4.7,11,0,0,24.5,0,14.5,0,0,24.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Ying chun ge zhi Fengbo",1973,105,NA,5.8,22,0,0,0,4.5,14.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Ying huang boon sik",1986,91,NA,7.3,2707,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Ying lun pi pa",1984,90,NA,6.7,6,14.5,0,0,0,0,45.5,0,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Ying xiong",2002,93,30000000,8.1,24128,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"PG-13",1,0,0,1,0,0,0 -"Ying xiong wei lei",1986,82,NA,5.8,173,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Ying zhao tie bu shan",1977,90,NA,6.7,68,4.5,4.5,4.5,0,0,14.5,14.5,14.5,34.5,14.5,"",1,0,0,0,0,0,0 -"Yinghung bunsik II",1987,105,NA,7.1,1364,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Yinghung bunsik III",1989,112,NA,5.7,414,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Yit huet jui keung",1997,110,NA,6,48,4.5,4.5,0,4.5,4.5,4.5,4.5,34.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Yks' tavallinen Virtanen",1959,80,NA,3.8,5,24.5,24.5,44.5,0,24.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Yo Alien",2002,95,100000,7,7,0,0,0,0,0,0,14.5,0,0,84.5,"",0,0,0,0,0,0,0 -"Yo hice a Roque III",1980,80,NA,4.6,60,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,44.5,"",0,0,1,0,0,0,0 -"Yo ho ho",1981,98,NA,7.5,8,0,0,0,14.5,14.5,0,0,14.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Yo puta",2004,76,6000000,4.3,151,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Yo soy, del Son a la Salsa",1996,100,NA,8.5,6,0,0,0,0,0,14.5,14.5,14.5,0,45.5,"",0,0,0,0,1,0,0 -"Yo, la peor de todas",1990,105,NA,7.7,121,0,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Yodelin' Kid From Pine Ridge",1937,62,NA,5,16,14.5,0,4.5,0,34.5,4.5,34.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Yogen",2004,95,NA,5.4,25,0,0,4.5,24.5,14.5,14.5,24.5,4.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Yogi's First Christmas",1980,98,NA,6.6,51,4.5,4.5,0,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,1,0,0,0,0,0 -"Yohwa Eo-eul udong",1987,90,NA,3.2,7,45.5,14.5,14.5,0,14.5,0,0,0,0,0,"",0,0,0,1,0,0,0 -"Yoidore tenshi",1948,102,NA,7.7,468,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Yojimbo",1961,75,NA,8.4,8968,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,34.5,"",1,0,0,1,0,0,0 -"Yojohan Fusuma no urabari",1973,72,NA,5.5,7,0,0,0,24.5,0,24.5,44.5,0,0,0,"",0,0,1,0,0,0,0 -"Yok mang",2002,85,NA,5.1,40,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Yokai Hanta - Hiruko",1990,89,NA,5.8,136,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Yoke's On Me, The",1944,16,NA,6.4,46,0,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,1 -"Yokiro",1983,144,NA,5.8,6,0,0,0,34.5,14.5,34.5,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Yol",1982,114,NA,7.8,543,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Yolanda and the Thief",1945,110,2443322,5.9,111,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yolngu Boy",2001,85,NA,7.7,84,4.5,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Yom Huledet Same'ach Mar Mograbi",1999,77,NA,4.2,13,0,4.5,0,44.5,0,4.5,14.5,4.5,4.5,4.5,"",0,0,0,0,1,0,0 -"Yom Yom",1998,106,NA,6,35,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Yoman Sadeh",1982,83,NA,6.3,10,0,0,0,0,24.5,0,14.5,24.5,0,45.5,"",0,0,0,0,1,0,0 -"Yomigaeri",2002,126,NA,7,79,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yong Chun",1994,93,NA,7.3,440,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Yong chuang tian xia",1990,91,NA,2.4,7,24.5,24.5,0,0,0,14.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Yoorinal",2000,6,NA,4.1,7,0,0,24.5,0,14.5,0,0,14.5,14.5,24.5,"",0,0,1,0,0,0,1 -"Yor, the Hunter from the Future",1983,88,NA,2.5,418,34.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yorick",2002,100,NA,5.8,13,34.5,4.5,4.5,0,0,4.5,0,0,0,44.5,"",0,0,0,0,0,0,0 -"Yoru ga mata kuru",1994,108,NA,5.5,10,14.5,14.5,14.5,0,0,0,24.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Yoru no onnatachi",1948,75,NA,7.8,23,0,0,4.5,0,4.5,4.5,34.5,14.5,24.5,4.5,"",0,0,0,1,0,0,0 -"Yosei Gorasu",1962,83,NA,4.9,45,14.5,0,4.5,4.5,4.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Yosemite: The Fate of Heaven",1989,58,NA,9.1,7,0,0,0,0,0,0,14.5,0,44.5,44.5,"",0,0,0,0,1,0,0 -"Yoshiwara",1937,102,NA,3.3,5,0,44.5,24.5,0,0,24.5,0,24.5,0,0,"",0,0,0,1,0,1,0 -"Yossi & Jagger",2002,67,NA,7.9,618,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"R",0,0,0,1,0,1,0 -"Yotsuya kaidan",1966,105,NA,6.9,17,0,0,0,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yottsu no koi no monogatari",1947,112,NA,8.1,5,0,0,0,0,24.5,24.5,0,0,0,64.5,"",0,0,0,1,0,0,0 -"Yotzim Kavua",1979,88,NA,4.3,82,24.5,4.5,14.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"You Are Here",2004,91,100000,5.6,5,24.5,0,0,0,0,24.5,64.5,0,0,0,"",1,0,1,1,0,0,0 -"You Are Here*",2000,92,NA,5.5,61,14.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,14.5,"R",0,0,1,1,0,0,0 -"You Are Not I",1981,50,NA,9.2,11,0,0,4.5,0,4.5,4.5,4.5,24.5,0,34.5,"",0,0,0,0,0,0,0 -"You Are What You Eat",1968,75,NA,5.4,12,24.5,4.5,4.5,0,4.5,14.5,4.5,0,0,24.5,"",0,0,0,0,1,0,0 -"You Belong to Me",1941,94,NA,5.6,26,4.5,4.5,4.5,4.5,14.5,24.5,4.5,24.5,14.5,0,"",0,0,1,0,0,1,0 -"You Better Watch Out",1980,95,750000,3.4,215,24.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"You Came Along",1945,103,NA,6.9,31,4.5,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,1,0 -"You Can Count on Me",2000,111,1200000,7.8,7630,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"R",0,0,0,1,0,0,0 -"You Can Thank Me Later",1998,110,NA,5.1,58,4.5,4.5,0,4.5,14.5,24.5,14.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"You Can't Beat Love",1937,62,NA,6.1,15,0,0,0,14.5,24.5,34.5,14.5,4.5,0,14.5,"",0,0,1,0,0,1,0 -"You Can't Buy Everything",1934,82,NA,6.8,21,0,0,0,0,4.5,14.5,44.5,24.5,4.5,0,"",0,0,0,1,0,0,0 -"You Can't Cheat an Honest Man",1939,76,NA,7.4,226,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"You Can't Escape Forever",1942,77,NA,5.8,26,0,0,0,14.5,14.5,34.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"You Can't Fool Your Wife",1940,68,NA,5.6,27,0,0,4.5,14.5,24.5,24.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"You Can't Fool a Camera",1941,10,NA,6,7,0,0,0,24.5,14.5,14.5,24.5,14.5,0,0,"",0,0,0,0,1,0,1 -"You Can't Get Away with Murder",1939,79,NA,6.1,64,0,4.5,0,4.5,14.5,34.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"You Can't Have Everything",1937,100,NA,6.7,20,4.5,0,0,0,4.5,34.5,24.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"You Can't Hurry Love",1988,92,NA,4.1,117,14.5,4.5,24.5,14.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,1,0,0,0,0 -"You Can't Run Away from It",1956,95,NA,6.2,40,4.5,0,4.5,4.5,4.5,24.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,1,0 -"You Can't Shoe a Horsefly",1940,6,NA,4.7,8,0,0,45.5,0,34.5,14.5,0,0,0,0,"",0,1,0,0,0,0,1 -"You Can't Stop the Murders",2003,99,NA,5.7,125,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,0 -"You Can't Take It with You",1938,126,1644736,7.8,2407,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,1,0 -"You Can't Win",1948,8,NA,7.1,9,0,0,0,0,0,34.5,14.5,44.5,0,14.5,"",0,0,1,0,0,0,1 -"You Can't Win 'Em All",1970,97,NA,4.8,79,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"You Don't Know Dick: Courageous Hearts of Transsexual Men",1996,75,NA,5.7,30,14.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,1,0,0 -"You Got Served",2004,95,8000000,1.9,6041,64.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"PG-13",0,0,0,1,0,0,0 -"You Gotta Be a Football Hero",1935,6,NA,7.8,12,0,0,0,0,4.5,4.5,34.5,4.5,34.5,4.5,"",0,1,1,0,0,0,1 -"You Gotta Stay Happy",1948,100,NA,5.7,78,4.5,0,4.5,4.5,24.5,14.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"You Have to Run Fast",1961,73,NA,5.5,9,0,0,0,14.5,24.5,24.5,24.5,24.5,0,0,"",0,0,0,1,0,0,0 -"You Killed Me First",1985,11,NA,5.8,40,4.5,4.5,4.5,14.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,1 -"You Know What Sailors Are",1954,89,NA,4.4,18,4.5,4.5,14.5,24.5,14.5,4.5,4.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"You Light Up My Life",1977,90,NA,4.1,135,14.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"You Might Be the Youngest",2001,17,NA,5.9,7,0,0,0,0,14.5,24.5,0,14.5,14.5,24.5,"",0,0,0,1,0,0,1 -"You Must Be Joking!",1965,100,NA,5.2,32,0,0,4.5,24.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"You Nazty Spy!",1940,18,NA,7.9,120,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,34.5,"",0,0,1,0,0,0,1 -"You Never Can Tell",1951,78,NA,6.8,97,4.5,0,0,4.5,4.5,14.5,14.5,24.5,14.5,34.5,"",0,0,1,0,0,0,0 -"You Only Live Once",1937,86,575000,7.6,364,4.5,4.5,4.5,4.5,4.5,14.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"You Only Live Twice",1967,117,9500000,6.8,8252,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"You Ought to Be in Pictures",1940,9,NA,7.5,72,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,1,1,0,0,0,1 -"You Said a Hatful!",1934,20,NA,6.5,5,0,0,0,0,24.5,24.5,24.5,24.5,24.5,0,"",0,0,0,0,0,0,1 -"You Said a Mouthful",1932,75,NA,6.4,44,0,0,4.5,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"You See Me Laughin'",2002,86,NA,7.2,23,0,0,0,4.5,4.5,4.5,14.5,14.5,24.5,34.5,"",0,0,0,0,1,0,0 -"You Seng",1993,118,NA,6.2,120,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,14.5,"",1,0,0,1,0,1,0 -"You Stupid Man",2002,95,NA,5.8,294,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,1,0 -"You Talkin' to Me?",1987,97,NA,3.9,28,14.5,24.5,14.5,14.5,14.5,4.5,4.5,0,0,14.5,"",0,0,1,0,0,0,0 -"You Try Somebody Else",1932,10,NA,5.7,15,0,0,4.5,24.5,24.5,14.5,14.5,14.5,14.5,0,"",0,1,0,0,0,0,1 -"You Were Meant for Me",1948,92,NA,6.5,18,0,0,0,4.5,14.5,14.5,14.5,24.5,24.5,14.5,"",0,0,0,0,0,0,0 -"You Were Never Duckier",1948,8,NA,7,32,0,0,0,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"You Were Never Lovelier",1942,100,NA,7.3,239,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,1,0 -"You and Me",1938,90,NA,6.9,75,0,0,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"You and Me",1975,93,NA,6,5,24.5,0,0,0,0,24.5,0,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"You and Your Five Senses",1955,8,NA,7.2,11,0,0,0,0,4.5,4.5,44.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"You and Your Senses of Smell and Taste",1955,8,NA,8,5,0,0,0,0,0,24.5,24.5,24.5,0,44.5,"",0,1,0,0,0,0,1 -"You fang chu zu",2002,123,NA,5.4,11,4.5,0,0,34.5,0,4.5,34.5,4.5,0,0,"",0,0,0,1,0,0,0 -"You for Me",1952,71,NA,5.8,23,0,0,4.5,14.5,24.5,14.5,14.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"You hua hao hao shuo",1997,93,NA,7.1,235,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"You shi tiaowu",1999,103,NA,5.1,25,4.5,4.5,24.5,0,14.5,14.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"You the Human Animal",1955,8,NA,7.3,6,0,0,0,0,0,14.5,45.5,14.5,0,14.5,"",0,1,0,0,0,0,1 -"You'll Find Out",1940,97,NA,5.6,162,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"You'll Like My Mother",1972,92,NA,5.4,65,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"You'll Never Get Rich",1941,88,NA,6.6,187,4.5,0,4.5,4.5,4.5,24.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,1,0 -"You're Darn Tootin'",1928,20,NA,7,63,0,0,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,0,1 -"You're Dead...",1999,98,NA,5.4,156,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"You're Killing Me...",2001,86,NA,5,89,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"R",0,0,1,0,0,0,0 -"You're My Everything",1949,94,NA,5.7,18,0,0,4.5,14.5,14.5,24.5,24.5,4.5,0,14.5,"",0,0,1,0,0,0,0 -"You're Never Too Young",1955,102,NA,6.2,146,4.5,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"You're Not Built That Way",1936,7,NA,4.7,8,0,14.5,14.5,14.5,24.5,14.5,24.5,0,0,0,"",0,1,1,0,0,0,1 -"You're Not So Tough",1940,65,NA,6,6,0,0,0,0,34.5,0,45.5,0,14.5,0,"",0,0,0,1,0,0,0 -"You're Only Young Once",1937,78,NA,6.7,36,0,0,0,4.5,4.5,24.5,24.5,24.5,4.5,14.5,"",0,0,1,1,0,0,0 -"You're Still Not Fooling Anybody",1997,5,NA,3.7,43,24.5,4.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,1,0,1 -"You're Telling Me!",1934,64,NA,7.8,134,0,4.5,0,0,4.5,4.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"You're Too Careless with Your Kisses",1932,7,NA,5.2,6,0,0,0,14.5,14.5,34.5,14.5,0,0,14.5,"",0,1,1,0,0,0,1 -"You're Under Arrest! The Motion Picture",1999,90,NA,6.2,13,0,0,4.5,0,24.5,4.5,24.5,14.5,14.5,4.5,"",1,1,1,0,0,0,0 -"You're a Big Boy Now",1966,96,800000,6.3,260,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,0,0 -"You're a Sap, Mr. Jap",1942,7,NA,5.7,42,4.5,4.5,4.5,4.5,14.5,4.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"You're a Sweetheart",1937,96,NA,6.1,5,0,0,0,0,24.5,64.5,0,0,0,24.5,"",0,0,0,0,0,0,0 -"You're an Education",1938,6,NA,6,9,14.5,0,0,0,0,14.5,24.5,45.5,0,0,"",0,1,1,0,0,0,1 -"You're in the Army Now",1941,79,NA,6.4,33,0,4.5,4.5,4.5,14.5,34.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"You're in the Navy Now",1951,93,NA,5.4,54,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"You've Got Mail",1998,119,65000000,6.2,20053,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"PG",0,0,1,0,0,1,0 -"You've Got to Walk It Like You Talk It or You'll Lose That Beat",1971,85,NA,2.9,18,34.5,0,0,14.5,24.5,14.5,4.5,4.5,0,14.5,"",0,0,1,1,0,0,0 -"You, John Jones",1943,11,NA,6.3,21,4.5,14.5,0,0,4.5,4.5,24.5,14.5,4.5,4.5,"",0,0,0,1,1,0,1 -"You, Me & Marley",1992,84,NA,6.5,25,4.5,4.5,0,0,14.5,14.5,4.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"You, the People",1940,21,NA,5.9,9,0,0,0,0,34.5,14.5,34.5,24.5,0,0,"",0,0,0,1,0,0,1 -"Youchai",1995,102,NA,6.6,35,4.5,0,4.5,4.5,4.5,24.5,34.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Youling renjian",2001,105,NA,6.2,76,4.5,0,4.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Youling renjian II: Gui wei ren jian",2002,93,NA,5.9,19,0,0,14.5,4.5,14.5,44.5,0,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Young Adam",2003,98,NA,6.5,1809,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Young Americans",1967,104,NA,6.9,12,0,0,0,4.5,0,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Young Americans",2004,15,40000,9.5,13,0,0,0,0,0,0,4.5,0,34.5,64.5,"",0,0,0,1,0,1,1 -"Young Americans, The",1993,104,3000000,5.6,524,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Animals, The",1968,100,NA,5.4,12,0,0,0,0,24.5,14.5,0,4.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Young Bess",1953,112,NA,6.4,217,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Bill Hickok",1940,59,NA,5.5,15,14.5,0,0,4.5,24.5,34.5,4.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Young Billy Young",1969,89,NA,5.4,66,4.5,4.5,4.5,14.5,24.5,34.5,14.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Young Black Stallion, The",2003,45,NA,4.8,97,14.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Young Blades",2001,92,NA,4.2,28,24.5,4.5,4.5,0,14.5,4.5,4.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Young Blood",1932,58,NA,4.9,5,0,0,0,44.5,44.5,24.5,0,0,0,0,"",0,0,0,0,0,0,0 -"Young Bride",1932,76,NA,5.9,39,0,4.5,4.5,4.5,4.5,14.5,44.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Buffalo Bill",1940,59,NA,5.6,9,0,0,0,14.5,24.5,45.5,0,14.5,0,0,"",0,0,0,0,0,0,0 -"Young Captives, The",1959,61,NA,5.8,6,0,0,0,14.5,0,0,34.5,0,14.5,34.5,"",0,0,0,1,0,0,0 -"Young Cassidy",1965,108,NA,6.1,135,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Connecticut Yankee in King Arthur's Court, A",1995,95,NA,3.9,67,14.5,4.5,4.5,14.5,4.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Young Daniel Boone",1950,71,NA,5.1,5,0,0,0,44.5,24.5,0,24.5,0,0,24.5,"",0,0,0,0,0,0,0 -"Young Dillinger",1965,102,NA,4.9,28,4.5,0,24.5,14.5,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Young Doctors in Love",1982,92,NA,5,792,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Young Don't Cry, The",1957,89,NA,5.9,20,0,0,4.5,4.5,14.5,14.5,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Young Dr. Kildare",1938,82,NA,6.9,45,4.5,0,0,0,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Dragons: Kung Fu Kids II",1989,91,NA,4.1,7,14.5,0,0,14.5,14.5,14.5,24.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Young Eagles",1934,228,NA,5.5,11,14.5,0,4.5,4.5,4.5,24.5,14.5,0,0,4.5,"",1,0,0,1,0,0,0 -"Young Einstein",1988,91,NA,4.6,2065,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Young Erotic Fanny Hill, The",1970,80,NA,1.9,6,14.5,0,0,0,45.5,0,0,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Young Frankenstein",1974,106,2800000,8,22281,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Young Fury",1965,80,NA,6.6,15,0,0,0,0,14.5,24.5,34.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Young Gentlemen",2004,24,30000,9.7,6,0,0,0,0,0,0,0,14.5,0,84.5,"",0,0,0,1,0,0,1 -"Young Girl and the Monsoon, The",1999,90,NA,4.8,38,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Young Graduates, The",1971,100,NA,1.8,5,24.5,0,0,0,0,24.5,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Young Guns",1988,102,13000000,6.4,8104,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Young Guns II",1990,104,NA,5.8,4316,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",1,0,1,1,0,0,0 -"Young Guns of Texas",1962,78,NA,4.5,16,14.5,0,14.5,34.5,4.5,14.5,0,4.5,0,0,"",0,0,0,0,0,0,0 -"Young Guns, The",1956,84,NA,5,13,0,0,4.5,34.5,24.5,14.5,14.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Young Ideas",1943,77,NA,5.3,9,0,0,14.5,24.5,0,24.5,14.5,14.5,0,24.5,"",0,0,1,0,0,0,0 -"Young Ironsides",1932,20,NA,6.5,7,0,0,0,14.5,14.5,24.5,0,24.5,0,14.5,"",0,0,1,0,0,0,1 -"Young Jesse James",1960,73,NA,6.4,8,0,0,0,14.5,14.5,45.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Young Lady Chatterley",1977,100,NA,4.8,167,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Young Lady Chatterley II",1985,86,NA,3.7,145,14.5,4.5,14.5,4.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Land, The",1959,89,NA,4.7,18,4.5,0,4.5,14.5,24.5,14.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Young Lions, The",1958,167,NA,7.3,1043,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Young Love",2001,80,NA,5,189,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Young Lovers, The",1954,96,NA,5.6,11,0,0,0,4.5,34.5,14.5,0,0,14.5,14.5,"",0,0,0,1,0,0,0 -"Young Lovers, The",1964,109,NA,5.6,20,14.5,4.5,0,14.5,4.5,34.5,14.5,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Young Man with Ideas",1952,84,NA,5.1,22,4.5,4.5,4.5,4.5,24.5,24.5,14.5,0,4.5,4.5,"",0,0,1,1,0,0,0 -"Young Man with a Horn",1950,112,NA,6.9,356,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Young Man's Fancy, A",1952,22,NA,2.1,16,45.5,14.5,14.5,14.5,0,4.5,0,0,0,0,"",0,0,0,0,0,0,1 -"Young Mr. Lincoln",1939,100,1500000,7.2,488,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Young Mr. Pitt, The",1942,118,NA,7,33,0,4.5,0,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Young Nurses in Love",1986,82,NA,4.2,27,14.5,14.5,14.5,14.5,4.5,14.5,14.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Young Nurses, The",1973,77,NA,4.3,9,24.5,14.5,14.5,24.5,24.5,0,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Young Ones, The",1961,108,NA,5.8,101,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Young People",1940,78,NA,5.8,52,4.5,0,0,14.5,14.5,24.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Young People Ask: How Can I Make Real Friends?",1999,65,NA,5.2,26,14.5,0,0,4.5,0,0,0,4.5,4.5,64.5,"",0,0,0,0,0,0,0 -"Young Philadelphians, The",1959,136,NA,7.1,391,4.5,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Young Playthings",1972,105,NA,6.4,7,0,0,24.5,0,14.5,0,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Young Poisoner's Handbook, The",1995,99,NA,7,954,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Young Racers, The",1963,84,150000,3.2,27,24.5,4.5,4.5,4.5,24.5,14.5,4.5,4.5,4.5,0,"",1,0,0,1,0,0,0 -"Young Runaways, The",1968,91,NA,5.4,19,0,0,14.5,14.5,14.5,24.5,14.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Young Savages, The",1961,103,NA,6.7,186,0,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Sherlock Holmes",1985,109,18000000,6.4,3001,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Young Soul Rebels",1991,105,NA,5.6,54,0,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Young Stranger, The",1957,84,350000,6.6,67,0,0,4.5,0,4.5,24.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Swingers, The",1963,71,NA,3.3,12,34.5,14.5,4.5,4.5,14.5,4.5,4.5,0,0,0,"",0,0,1,1,0,0,0 -"Young Tom Edison",1940,86,NA,6.8,138,0,4.5,0,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Unknowns, The",2000,87,NA,5.1,56,24.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,"R",0,0,0,1,0,0,0 -"Young Warriors",1983,105,NA,3.8,55,4.5,14.5,24.5,14.5,4.5,14.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Young Warriors, The",1967,93,NA,6.2,20,0,0,14.5,4.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Widow",1946,100,NA,7.3,11,0,0,0,0,0,4.5,14.5,34.5,0,34.5,"",0,0,0,1,0,0,0 -"Young Winston",1972,124,NA,6.2,227,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young Wives' Tale",1951,79,NA,5.3,19,0,0,14.5,14.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Young and Dangerous",1957,78,NA,5.6,6,0,0,0,0,14.5,14.5,14.5,0,0,45.5,"",0,0,0,1,0,0,0 -"Young and Free",1979,88,NA,2.6,8,24.5,14.5,34.5,0,24.5,0,0,0,0,0,"",0,0,0,0,0,1,0 -"Young and Innocent",1937,83,NA,7.2,894,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Young and Willing",1943,83,NA,5.8,25,0,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Young and the Brave, The",1963,84,NA,5.1,28,14.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Young and the Dead, The",2000,93,NA,6,29,4.5,4.5,0,0,14.5,4.5,24.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Young and the Hung, The",1985,111,NA,8,18,0,0,0,0,4.5,0,4.5,24.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Young at Heart",1954,117,NA,6.6,362,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,4.5,14.5,"",0,0,0,1,0,1,0 -"Young in Heart, The",1938,90,NA,7.3,52,0,0,0,0,4.5,24.5,14.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Youngblood",1978,90,NA,4.4,30,14.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,0,14.5,"",1,0,0,0,0,0,0 -"Youngblood",1986,110,NA,5.3,1602,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,"",1,0,0,1,0,1,0 -"Youngblood Hawke",1964,137,NA,5.3,53,0,0,4.5,14.5,24.5,4.5,14.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Younger Brothers, The",1949,78,NA,5.8,21,0,0,4.5,14.5,24.5,4.5,24.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Younger Generation, The",1929,75,NA,6.1,18,0,0,0,14.5,0,24.5,34.5,24.5,0,0,"",0,0,0,1,0,0,0 -"Younger and Younger",1993,99,NA,4,118,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,"",0,0,1,1,0,0,0 -"Youngest Profession, The",1943,82,NA,5.8,34,0,0,4.5,14.5,24.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Your Cheatin' Heart",1964,99,NA,6.6,98,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Your Face",1987,3,2000,7.6,111,4.5,0,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Your Friends & Neighbors",1998,100,5000000,6.4,2659,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"R",0,0,1,1,0,0,0 -"Your Hat",1932,10,NA,8,6,0,0,14.5,0,0,0,45.5,0,0,34.5,"",0,0,1,0,0,0,1 -"Your Last Act",1941,11,NA,6.6,8,0,0,0,0,0,45.5,14.5,14.5,0,24.5,"",0,0,0,0,0,0,1 -"Your Money or Your Wife",1960,91,NA,4.1,5,0,24.5,24.5,44.5,0,0,0,0,24.5,0,"",0,0,0,0,0,0,0 -"Your Studio and You",1995,17,NA,6.9,113,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,0,1 -"Your Three Minutes Are Up",1973,93,NA,6,38,4.5,0,4.5,4.5,14.5,4.5,34.5,14.5,4.5,14.5,"",0,0,1,1,0,0,0 -"Your Ticket Is No Longer Valid",1981,92,NA,4.2,21,4.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Your Witness",1950,94,NA,6.8,14,0,0,0,0,4.5,44.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Your World as I See It",1994,27,NA,2.2,18,24.5,4.5,4.5,14.5,4.5,4.5,0,4.5,4.5,24.5,"",0,0,0,0,0,0,1 -"Yours for the Asking",1936,68,NA,6.4,12,0,4.5,0,0,14.5,4.5,14.5,14.5,0,34.5,"",0,0,1,0,0,1,0 -"Yours, Mine and Ours",1968,111,2500000,6.7,806,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Yousei furorensu",1985,90,NA,7,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,1,0,0,0,0,0 -"Youth Runs Wild",1944,67,NA,3.8,33,14.5,14.5,14.5,24.5,14.5,14.5,4.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Youth in Us, The",2005,12,NA,8.1,20,4.5,0,0,0,0,0,14.5,0,24.5,64.5,"",0,0,0,1,0,0,1 -"Youyou chouchou de zou le",2001,90,NA,7.1,27,4.5,0,4.5,4.5,0,4.5,14.5,14.5,44.5,0,"",0,0,0,1,0,0,0 -"Youyuan jingmeng",2001,120,NA,6.3,42,4.5,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Yoyes",2000,104,NA,6.1,52,0,0,0,4.5,24.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Yoyo",1965,92,NA,7.8,12,0,0,0,0,0,4.5,4.5,24.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Yozhik v tumane",1975,11,NA,8.2,158,4.5,0,0,4.5,4.5,4.5,4.5,4.5,4.5,74.5,"",0,1,0,0,0,0,1 -"Ypsoma 33",1998,40,NA,6.7,6,0,0,0,0,0,45.5,34.5,14.5,0,0,"",0,0,0,0,0,0,1 -"Yrrol",1994,93,NA,5.8,410,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Yu Ming Is Ainm Dom",2003,13,NA,7.8,14,0,0,0,0,0,4.5,4.5,14.5,14.5,45.5,"",0,0,1,0,0,0,1 -"Yu guanyin",2003,110,NA,6.1,45,4.5,4.5,0,4.5,4.5,14.5,34.5,4.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Yu po tuan er zhi yu nu xia jing",1996,87,NA,5.2,60,4.5,4.5,4.5,4.5,14.5,24.5,4.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yuan Zhen-Xia yu Wei Si-Li",1986,81,NA,5.6,139,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Yuan nu",1988,106,NA,5.9,8,0,0,0,0,34.5,0,34.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Yudan taiteki",2004,110,NA,7.3,10,0,0,0,0,14.5,24.5,24.5,0,45.5,0,"",0,0,0,1,0,0,0 -"Yue guang shao nian",1993,95,NA,8.8,7,0,0,0,0,0,0,24.5,14.5,44.5,14.5,"",0,0,0,0,0,0,0 -"Yue kuai le, yue duo luo",1997,94,NA,6.5,64,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,1,0 -"Yue lok ji wong",1999,97,NA,5,6,0,0,0,0,45.5,14.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Yuen Ling-yuk",1992,126,NA,7.9,183,4.5,0,0,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,1,0 -"Yuen fan",1984,90,NA,6.5,11,0,0,0,0,14.5,4.5,34.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Yugant",1995,135,NA,7.8,5,0,0,0,0,0,0,64.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Yugoslavia: The Avoidable War",1999,165,NA,6,8,34.5,0,0,0,0,0,14.5,14.5,0,34.5,"",0,0,0,0,1,0,0 -"Yugotrip",2004,90,NA,6.6,14,0,0,0,0,4.5,24.5,24.5,24.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Yuk lui tim ding",2001,90,NA,6.6,32,4.5,0,0,0,14.5,14.5,44.5,14.5,4.5,0,"",0,0,1,0,0,0,0 -"Yuk po tuen III goon yan ngoh yiu",1998,90,NA,5.8,20,0,0,14.5,14.5,14.5,24.5,4.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Yukai",1997,112,NA,5.5,16,14.5,0,0,0,14.5,4.5,24.5,14.5,24.5,4.5,"",1,0,0,1,0,0,0 -"Yukcheui yaksok",1975,95,NA,7.3,9,0,0,0,0,24.5,0,34.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Yuke yuke nidome no shojo",1969,65,NA,7.2,103,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Yuki Yukite shingun",1987,122,NA,8.5,114,0,4.5,4.5,0,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,0,1,0,0 -"Yuki fujin ezu",1950,88,NA,6.4,16,0,0,0,0,4.5,24.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Yukiguni",1957,120,NA,6.6,21,0,0,0,4.5,4.5,4.5,14.5,34.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Yukinojo henge",1963,115,NA,7.6,152,0,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Yukoku",1966,30,NA,6.6,17,4.5,0,0,0,0,14.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,1 -"Yukon Jake",1924,20,NA,4.8,8,0,14.5,14.5,14.5,14.5,14.5,24.5,0,14.5,0,"",0,0,1,0,0,0,1 -"Yum-Yum Girls, The",1976,93,NA,3.7,19,14.5,14.5,24.5,24.5,14.5,4.5,0,4.5,0,4.5,"",0,0,1,1,0,0,0 -"Yume",1990,119,12000000,7.5,2735,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Yume miruyoni nemuritai",1986,81,NA,6.4,17,0,0,0,0,4.5,4.5,14.5,24.5,4.5,44.5,"",0,0,0,0,0,0,0 -"Yume nara samete",2002,103,NA,6.9,24,0,4.5,4.5,0,4.5,14.5,44.5,14.5,14.5,0,"",0,0,0,0,0,0,0 -"Yume no ginga",1997,90,NA,7.4,76,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,1,0 -"Yumeji",1991,128,NA,8,21,0,0,0,0,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Yun de nan fang",2003,100,NA,8.2,15,4.5,0,0,0,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Yun zhuai shou zhi lian",2000,94,NA,6.4,44,4.5,4.5,4.5,0,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Yunost Petra",1980,140,NA,6.8,8,0,0,0,0,14.5,14.5,34.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Yup Yup Man",2000,89,NA,5.2,13,0,4.5,34.5,0,4.5,34.5,4.5,0,0,4.5,"",0,0,0,1,0,0,0 -"Yuppies, i giovani di successo",1986,90,NA,3.3,38,34.5,4.5,4.5,14.5,14.5,14.5,0,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Yureiyashiki no Kyofu: Chi O Suu Ningyoo",1970,85,NA,4.9,9,0,0,14.5,14.5,14.5,14.5,14.5,14.5,0,34.5,"",0,0,0,0,0,0,0 -"Yuri",1996,113,NA,5.3,13,34.5,0,0,0,14.5,4.5,0,4.5,0,34.5,"",0,0,0,0,0,0,0 -"Yuri & Me",2003,12,NA,7,7,0,0,0,0,0,0,24.5,14.5,0,45.5,"",0,0,1,0,0,0,1 -"Yurisai",2001,100,NA,7.6,10,0,0,0,14.5,14.5,0,24.5,44.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Yurusarezaru mono",2003,149,NA,9.2,32,4.5,0,0,0,0,4.5,4.5,4.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Yuryeong",1999,110,NA,6.1,74,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Yusei oji",1959,121,NA,1.8,449,64.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Yuva",2004,160,NA,6.7,190,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Yuwakusha",1989,109,NA,7.2,8,0,0,0,0,0,14.5,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Yves Saint Laurent 5 avenue Marceau 75116 Paris",2002,85,NA,6.2,7,0,0,14.5,0,0,44.5,0,24.5,0,14.5,"",0,0,0,0,1,0,0 -"Yvonne Netter, avocate",1982,24,NA,9.1,6,0,0,0,0,0,0,0,0,64.5,34.5,"",0,0,0,0,1,0,1 -"Yvonne la nuit",1949,97,NA,6.8,5,0,0,24.5,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,1,0,0,0 -"Yyyreek!!! Kosmiczna nominacja",2002,80,NA,1.7,47,74.5,4.5,4.5,4.5,0,4.5,4.5,0,0,4.5,"",0,0,1,0,0,0,0 -"Z",1969,121,NA,8,2483,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Z miasta Lodzi",1968,18,NA,6.2,21,4.5,0,4.5,0,4.5,14.5,24.5,34.5,0,4.5,"",0,0,0,0,1,0,1 -"Z punktu widzenia nocnego portiera",1978,17,NA,6,39,4.5,4.5,4.5,0,4.5,24.5,24.5,4.5,4.5,14.5,"",0,0,0,0,1,0,1 -"Z.B. ... Otto Spalt",1988,100,NA,9,16,0,0,0,0,0,4.5,4.5,24.5,14.5,44.5,"",0,0,1,0,0,0,0 -"Z.P.G.",1972,105,NA,4.4,63,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Za dvumya zaytsami",1961,77,NA,7.1,13,0,0,0,0,0,4.5,4.5,14.5,4.5,64.5,"",0,0,1,0,0,0,0 -"Za prekrasnykh dam!",1989,71,NA,3,7,24.5,24.5,24.5,0,0,0,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Za sada bez dobrog naslova",1988,89,NA,4.7,14,4.5,0,4.5,0,24.5,24.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Za sciana",1971,70,NA,8.3,9,0,0,0,0,0,0,14.5,34.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Za spichkami",1980,100,NA,5.5,61,0,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Za srecu je potrebno troje",1985,100,NA,6.1,18,14.5,0,0,0,4.5,0,4.5,14.5,34.5,24.5,"",0,0,0,1,0,1,0 -"Za trnkovym kerem",1980,75,NA,6.4,11,0,0,0,0,14.5,24.5,24.5,14.5,0,4.5,"",0,0,0,0,0,0,0 -"Za'am V'Tehilah",1985,118,NA,5.8,9,0,0,0,0,14.5,0,14.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Za'er",2004,87,NA,7.2,11,14.5,0,0,0,14.5,0,4.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Zaak Alzheimer, De",2003,135,NA,7.7,1189,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Zaak M.P., De",1960,92,NA,6.9,9,0,14.5,0,0,24.5,14.5,0,34.5,0,24.5,"",0,0,1,0,0,1,0 -"Zaak van leven of dood, Een",1983,93,NA,5.8,6,0,0,14.5,0,14.5,34.5,14.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Zaat",1975,100,NA,1.4,442,74.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zabij mnie, glino",1989,122,NA,6.4,17,0,0,0,14.5,4.5,14.5,44.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zabil jsem Einsteina, panove",1970,95,NA,6.6,29,4.5,0,0,0,14.5,14.5,24.5,34.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Zaboravljeni",1988,98,NA,5.8,11,0,4.5,0,0,4.5,0,24.5,4.5,4.5,34.5,"",0,0,0,1,0,0,1 -"Zabou",1987,102,NA,6.3,41,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,24.5,"",1,0,0,0,0,0,0 -"Zabriskie Point",1970,95,7000000,6.4,1377,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Zabytaya melodiya dlya fleyty",1988,134,NA,7.3,82,4.5,0,4.5,4.5,4.5,4.5,24.5,34.5,14.5,14.5,"",0,0,1,1,0,1,0 -"Zacharia Farted",1998,110,NA,5.7,25,4.5,0,0,0,14.5,0,4.5,14.5,24.5,34.5,"",0,0,1,1,0,1,0 -"Zachariah",1971,93,NA,4.6,148,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Zacharias Carl Borg",2000,43,NA,7.2,12,0,0,0,0,0,0,45.5,14.5,4.5,14.5,"",0,0,0,0,0,0,1 -"Zack and Reba",1998,91,NA,4.1,83,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,0,0,1,0 -"Zaczarowany rower",1955,71,NA,7.9,5,0,0,0,0,24.5,24.5,24.5,0,24.5,24.5,"",1,0,0,1,0,0,0 -"Zadah tela",1983,99,NA,6,20,0,0,0,14.5,4.5,0,24.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Zadar! Cow from Hell",1989,89,NA,1.4,8,34.5,0,14.5,0,0,0,14.5,0,0,34.5,"",0,0,0,0,0,0,0 -"Zadnja vecerja",2001,94,NA,7.9,68,4.5,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,44.5,"",0,0,1,0,0,1,0 -"Zaduszki",1962,93,NA,6.6,5,0,0,0,0,0,24.5,44.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Zafir",2003,90,NA,6.4,14,4.5,4.5,0,4.5,0,14.5,14.5,24.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Zahrada",1968,17,NA,8.6,16,4.5,0,0,0,0,14.5,14.5,24.5,24.5,14.5,"",0,1,0,0,0,0,1 -"Zai jian Zhongguo",1974,93,NA,6.9,7,0,0,14.5,0,0,0,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Zai na hepan qingcao qing",1983,90,NA,5.2,9,0,0,0,0,34.5,24.5,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Zakasnjalo palnolunie",1996,125,NA,5,17,24.5,0,0,0,14.5,0,4.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Zakazane piosenki",1947,97,NA,6.6,19,0,0,0,0,14.5,4.5,34.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Zakka West",2003,75,NA,6.6,7,14.5,14.5,0,14.5,0,0,0,0,14.5,44.5,"",0,0,0,1,0,1,0 -"Zaklete rewiry",1975,94,NA,7.2,26,0,0,0,4.5,0,4.5,14.5,44.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Zakmes, Het",1992,90,NA,6.2,119,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Zakochani",2000,104,NA,5.9,21,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zakonnyy brak",1985,93,NA,7.1,9,0,0,0,0,14.5,14.5,24.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Zamach",1959,83,NA,6,10,0,0,0,0,14.5,45.5,0,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Zaman",1983,90,NA,6.5,45,4.5,0,4.5,0,4.5,14.5,24.5,24.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zamboni Man",2004,14,NA,4.6,9,0,0,0,34.5,14.5,0,14.5,0,24.5,24.5,"",0,0,0,0,0,0,1 -"Zamok",1994,120,NA,6,31,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Zampo y yo",1966,105,NA,5.2,7,0,14.5,0,14.5,44.5,24.5,0,0,0,0,"",0,0,0,1,0,0,0 -"Zamri, umri, voskresni!",1989,105,NA,7.5,134,0,0,4.5,4.5,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Zan Boko",1988,95,NA,7.4,9,0,0,0,14.5,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Zancos, Los",1984,100,NA,7.5,48,4.5,0,0,4.5,14.5,4.5,14.5,44.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Zandalee",1991,100,NA,4,563,4.5,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Zandy's Bride",1974,116,NA,5.4,103,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zangiku monogatari",1939,148,NA,8.2,199,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Zanjeer",1973,145,NA,7.5,100,0,0,4.5,0,4.5,4.5,14.5,14.5,34.5,34.5,"",1,0,0,1,0,0,0 -"Zanna Bianca",1973,102,NA,5.4,49,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zanna Bianca e il cacciatore solitario",1975,87,NA,4.9,5,44.5,0,0,0,44.5,0,0,0,0,24.5,"",0,0,0,1,0,0,0 -"Zanzibar",1940,70,NA,6.6,5,0,0,0,0,0,44.5,24.5,44.5,0,0,"",0,0,0,0,0,0,0 -"Zanzibar",1989,95,NA,6.5,7,0,0,0,0,44.5,0,14.5,24.5,14.5,0,"",0,0,0,1,0,0,0 -"Zao Chun Er Yue",1963,120,NA,6,15,0,0,0,4.5,4.5,0,4.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Zapatista",1999,56,NA,5.1,25,4.5,4.5,4.5,0,24.5,4.5,4.5,4.5,14.5,24.5,"",0,0,0,0,1,0,0 -"Zapatos viejos",1993,90,NA,4.5,13,24.5,4.5,4.5,0,4.5,0,0,14.5,0,34.5,"",0,0,1,1,0,0,0 -"Zapis zbrodni",1974,92,NA,8.3,6,0,0,0,0,0,0,0,34.5,0,64.5,"",0,0,0,0,0,0,0 -"Zappa",1983,103,NA,7.6,242,4.5,4.5,4.5,4.5,4.5,4.5,14.5,34.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Zapped!",1982,98,NA,3.8,1113,14.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Zapping",1999,96,NA,4.3,27,4.5,0,14.5,14.5,24.5,24.5,14.5,0,0,0,"",0,0,1,1,0,0,0 -"Zar Gul",1995,140,1700000,6.8,6,14.5,0,0,0,34.5,0,0,0,0,45.5,"",0,0,0,0,0,0,0 -"Zarak",1956,99,NA,4.2,31,4.5,0,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,"",1,0,0,0,0,1,0 -"Zardoz",1974,105,1000000,5.4,2862,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zarkorr! The Invader",1996,80,NA,2.1,77,34.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,0,14.5,"PG",0,0,0,0,0,0,0 -"Zarte Haut in schwarzer Seide",1961,83,NA,5.2,12,0,0,0,14.5,44.5,4.5,14.5,14.5,0,0,"",0,0,0,1,0,0,0 -"Zasadil dedek repu",1945,10,NA,6.6,5,0,0,0,24.5,0,24.5,24.5,44.5,0,0,"",0,1,0,0,0,0,1 -"Zaseda",1969,80,NA,6.4,19,0,0,0,0,4.5,4.5,14.5,24.5,4.5,44.5,"",0,0,0,1,0,0,0 -"Zashchitnik Sedov",1988,46,NA,6.1,10,0,0,0,0,24.5,0,0,14.5,45.5,24.5,"",0,0,0,1,0,0,0 -"Zateryannyy v Sibiri",1991,110,NA,6.3,31,0,4.5,4.5,4.5,4.5,4.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Zatoichi Jigoku tabi",1965,87,NA,7.8,89,0,0,0,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Zatoichi chikemuri kaido",1967,87,NA,7.4,71,0,0,4.5,4.5,4.5,4.5,24.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Zatoichi kyojo tabi",1963,86,NA,7.1,83,0,4.5,0,0,4.5,14.5,34.5,24.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Zatoichi no uta ga kikoeru",1966,83,NA,7,49,0,0,0,4.5,4.5,14.5,34.5,24.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Zatoichi sakate giri",1965,88,NA,6.8,52,0,0,0,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"",1,0,0,1,0,0,0 -"Zatoichi sekisho yaburi",1964,86,NA,6.9,49,0,0,0,4.5,4.5,4.5,34.5,34.5,14.5,14.5,"",1,0,0,1,0,0,0 -"Zatoichi tekka tabi",1967,93,NA,7.1,60,4.5,0,0,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Zatvornik",2001,90,NA,3.4,6,14.5,0,14.5,0,34.5,14.5,14.5,0,0,0,"",0,0,0,0,0,0,0 -"Zauberberg, Der",1982,153,NA,5.7,71,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Zauberbuch, Das",1996,85,NA,7.6,5,0,0,0,0,24.5,0,44.5,0,24.5,24.5,"",0,0,0,0,0,0,0 -"Zaveshchaniye professora Douelya",1984,91,NA,5.2,6,0,0,0,14.5,0,14.5,64.5,0,0,0,"",0,0,0,0,0,0,0 -"Zavist bogov",2000,135,NA,6.4,33,0,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Zavtra byla voyna",1987,89,NA,7.4,39,0,0,0,0,4.5,0,24.5,14.5,24.5,44.5,"",0,0,0,1,0,0,0 -"Zavtrak s vidom na Elbrus",1993,75,NA,5.5,7,0,0,0,14.5,14.5,14.5,0,0,0,45.5,"",0,0,0,1,0,1,0 -"Zawja al-thaniya, al-",1967,105,NA,8.1,9,0,0,0,0,0,0,24.5,14.5,24.5,44.5,"",0,0,0,0,0,0,0 -"Zaychik",1964,87,NA,6.2,6,14.5,0,0,0,0,14.5,34.5,34.5,0,0,"",0,0,1,0,0,0,0 -"Zaymyomsya lyubovyu",2002,86,NA,5.6,41,4.5,4.5,14.5,4.5,4.5,14.5,34.5,4.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Zaza",1923,66,NA,6,5,0,0,0,0,24.5,44.5,0,44.5,0,0,"",0,0,0,1,0,1,0 -"Zaza",1939,83,NA,6.2,13,0,0,4.5,0,24.5,14.5,24.5,24.5,0,4.5,"",0,0,0,1,0,0,0 -"Zazdrosc i medycyna",1973,100,NA,6.3,8,0,0,0,0,14.5,14.5,14.5,45.5,0,14.5,"",0,0,0,1,0,0,0 -"Zbogum na dvadesetiot vek",1998,83,NA,6.7,36,4.5,0,4.5,4.5,14.5,4.5,4.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Zbrodnia i kara",2001,30,NA,6.9,10,0,0,0,0,14.5,24.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,1 -"Zbrodniarz i panna",1963,80,NA,6.9,7,0,0,0,0,14.5,0,45.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Zdivocela zeme",1997,114,NA,6.3,7,0,0,0,24.5,0,14.5,44.5,0,14.5,0,"",0,0,0,0,0,0,0 -"Ze film",2005,105,NA,5.7,11,0,14.5,0,0,0,24.5,4.5,34.5,0,4.5,"",0,0,1,0,0,0,0 -"Ze soboty na nedeli",1931,69,NA,7.6,5,0,0,0,0,0,0,44.5,24.5,44.5,0,"",0,0,0,0,0,0,0 -"Zea",1981,5,NA,8,9,0,0,0,0,0,14.5,24.5,14.5,14.5,44.5,"",0,0,0,0,0,0,1 -"Zeb vs. Paprika",1924,20,NA,5.2,6,0,0,0,0,34.5,34.5,0,0,14.5,14.5,"",0,0,1,0,0,0,1 -"Zebra Force",1976,86,NA,5,23,4.5,4.5,14.5,14.5,24.5,4.5,14.5,0,4.5,14.5,"",1,0,0,0,0,0,0 -"Zebra Killer, The",1974,92,NA,6.7,10,14.5,0,0,24.5,14.5,14.5,24.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Zebra in the Kitchen",1965,92,NA,4.3,42,4.5,4.5,14.5,14.5,24.5,14.5,4.5,0,4.5,4.5,"",0,0,1,0,0,0,0 -"Zebracka opera",1991,94,NA,6.6,18,0,0,4.5,0,4.5,24.5,24.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Zebrahead",1992,100,NA,5.9,311,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Zebraman",2004,115,NA,7.1,309,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Zed & Two Noughts, A",1985,115,NA,7.1,976,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Zeder",1983,89,NA,5.8,199,14.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zee and Co.",1972,110,NA,4.6,102,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Zee die denkt, De",2000,100,NA,7,97,4.5,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Zeemansvrouwen",1930,85,NA,7,13,0,0,0,4.5,4.5,14.5,44.5,0,4.5,14.5,"",0,0,0,0,0,0,0 -"Zegen",1987,124,NA,5.9,20,0,0,4.5,14.5,14.5,24.5,24.5,14.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Zehnte Jahr, Das",1995,100,NA,6.8,5,0,0,24.5,0,0,24.5,24.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Zehnte Sommer, Der",2003,98,NA,8.3,9,0,0,0,0,14.5,14.5,14.5,34.5,34.5,0,"",0,0,1,1,0,0,0 -"Zeiramu",1991,92,NA,6.8,93,4.5,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,14.5,"",1,1,1,0,0,0,0 -"Zeisters",1986,78,NA,1.8,118,64.5,14.5,4.5,4.5,0,4.5,4.5,0,4.5,24.5,"",0,0,1,0,0,0,0 -"Zeit mit Kathrin, Die",1999,96,NA,4.4,17,4.5,14.5,0,14.5,14.5,4.5,4.5,14.5,24.5,4.5,"",0,0,0,0,1,0,0 -"Zeitaku na hone",2001,107,NA,5.2,6,14.5,0,14.5,14.5,0,0,14.5,34.5,0,0,"",0,0,0,0,0,0,0 -"Zeke",2004,14,NA,8.1,8,0,0,0,0,0,14.5,24.5,24.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Zelary",2003,150,NA,7.5,388,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"R",0,0,0,1,0,1,0 -"Zelda",1974,85,NA,3.9,7,14.5,14.5,14.5,0,0,0,24.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Zelig",1983,79,NA,7.6,4829,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Zelly and Me",1988,87,NA,5.5,126,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Zemaljski dani teku",1979,87,NA,5.8,5,24.5,0,0,0,24.5,0,44.5,0,24.5,0,"",0,0,0,0,0,0,0 -"Zemlja istine, ljubavi i slobode",2000,72,NA,7.9,28,0,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Zemlya",1930,73,NA,7.8,317,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Zemsta",2002,100,NA,6.7,130,14.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Zen Noir",2004,71,NA,7.1,11,0,0,0,4.5,4.5,14.5,24.5,4.5,14.5,4.5,"",0,0,1,1,0,0,0 -"Zen Tale, A",2000,11,NA,5.6,7,0,0,0,0,44.5,0,44.5,0,0,14.5,"",0,0,1,0,0,0,1 -"Zen and the Art of Landscaping",2001,17,NA,7.8,102,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,1 -"Zena s krajolikom",1989,75,NA,7.2,11,0,0,0,0,0,24.5,4.5,4.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Zendan-e zanan",2002,106,NA,6.8,52,4.5,0,0,4.5,4.5,24.5,24.5,14.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Zendegi dar meh",1999,28,NA,4.6,15,24.5,0,4.5,0,34.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,1,0,1 -"Zendegi va digar hich",1991,91,NA,8.1,254,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,1,0,0 -"Zenith",2001,60,NA,9.1,11,4.5,0,0,0,0,0,0,0,4.5,84.5,"",0,0,0,0,1,0,0 -"Zenobia",1939,74,NA,5.9,46,0,0,4.5,4.5,24.5,34.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Zephyr",2003,28,28000,7.7,15,4.5,4.5,0,0,0,4.5,45.5,14.5,0,14.5,"",0,0,0,0,0,0,1 -"Zeppelin",1971,97,NA,5.6,189,4.5,4.5,4.5,14.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Zeppelin",1981,78,NA,5,14,0,14.5,14.5,4.5,14.5,14.5,4.5,4.5,0,24.5,"",0,0,0,1,0,0,0 -"Zeppelin 'Hindenburg', The",1936,7,NA,6,11,0,0,0,0,4.5,64.5,14.5,0,0,4.5,"",0,0,0,0,1,0,1 -"Zeppelin Passou por Aqui, O",1993,18,NA,2.9,5,44.5,0,44.5,0,0,0,0,24.5,0,0,"",0,0,0,0,0,0,1 -"Zerbrochene Krug, Der",1937,86,NA,6.8,20,0,0,4.5,0,14.5,0,24.5,4.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Zerkalo",1975,108,NA,7.6,1639,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,1,0,0,0 -"Zerkalo dlya geroya",1987,139,NA,9,26,0,0,0,0,0,0,14.5,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Zero",2000,20,0,8.1,24,24.5,0,0,0,0,4.5,0,0,4.5,64.5,"",0,0,0,0,0,0,1 -"Zero Boys, The",1986,89,NA,4,94,14.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Zero Day",2003,92,NA,7.8,224,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,0,1,0,0,0 -"Zero Effect",1998,116,5000000,7,4820,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"R",0,0,1,0,0,0,0 -"Zero Hour!",1957,81,NA,6.6,73,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Zero Patience",1993,95,NA,6.3,148,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Zero Tolerance",1994,88,NA,4,103,4.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Zero Woman 2",1995,99,NA,4.9,51,4.5,14.5,14.5,4.5,14.5,4.5,24.5,4.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Zero Zero",2001,5,NA,7.6,5,0,0,0,0,0,44.5,0,44.5,0,24.5,"",0,0,1,0,0,0,1 -"Zero to Sixty",1978,101,NA,4.7,21,4.5,0,0,24.5,14.5,4.5,14.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Zeroka no onna: Akai wappa",1974,82,NA,6.2,26,4.5,0,4.5,4.5,14.5,34.5,14.5,14.5,0,14.5,"",0,0,0,1,0,0,0 -"Zeros, The",2001,91,NA,8.3,12,14.5,0,0,0,0,4.5,0,4.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Zerosen moyu",1984,100,NA,5.8,14,0,0,24.5,0,0,14.5,24.5,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Zert",1969,80,NA,6.9,66,4.5,0,0,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Zessho",1975,94,NA,7.1,18,0,0,0,0,14.5,0,4.5,24.5,34.5,24.5,"",0,0,0,0,0,0,0 -"Zeta One",1969,84,NA,4.2,48,14.5,4.5,4.5,14.5,24.5,14.5,4.5,0,0,4.5,"",0,0,0,0,0,0,0 -"Zeus and Roxanne",1997,98,NA,5,404,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,"PG",0,0,0,0,0,0,0 -"Zevende hemel, De",1993,94,NA,4.6,46,14.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,0,4.5,"",0,0,1,0,0,1,0 -"Zeyaret el-Sayed el-Rais",1994,115,NA,4.1,6,0,0,14.5,14.5,0,0,14.5,0,34.5,14.5,"",0,0,0,0,0,0,0 -"Zeyda and the Hitman",2004,87,NA,5.2,14,0,4.5,4.5,0,4.5,24.5,24.5,4.5,0,24.5,"",0,0,1,0,0,0,0 -"Zezowate szczescie",1960,95,NA,8.3,57,0,0,0,0,0,4.5,14.5,24.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Zhan long",1988,85,NA,2.1,12,24.5,34.5,4.5,0,0,4.5,0,0,14.5,4.5,"",0,0,0,0,0,0,0 -"Zhan shen chuan shuo",1993,83,NA,6.5,201,4.5,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"",1,0,0,0,0,1,0 -"Zhan shen tan",1973,100,NA,5.7,14,0,4.5,0,0,14.5,4.5,24.5,14.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Zhantai",2000,185,NA,7.6,227,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Zhao Le",1993,97,NA,5.8,20,0,14.5,0,0,4.5,14.5,14.5,14.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Zhao xiansheng",1998,89,NA,6.2,10,0,0,0,0,14.5,24.5,24.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Zhdi menya",1943,90,NA,8.8,6,0,0,0,0,0,0,14.5,14.5,34.5,34.5,"",0,0,0,0,0,0,0 -"Zheleznaya pyata oligarkhii",1998,75,NA,4.8,37,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",0,0,1,0,0,0,0 -"Zhen xin hua",1999,100,NA,4,44,4.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,34.5,"",0,0,1,1,0,1,0 -"Zhena kerosinshchika",1988,101,NA,6.1,8,0,0,0,0,14.5,0,0,0,14.5,74.5,"",0,0,0,1,0,0,0 -"Zhenatyy kholostyak",1983,87,NA,5.2,9,0,0,14.5,14.5,14.5,0,14.5,14.5,24.5,24.5,"",0,0,1,0,0,0,0 -"Zheng gu zhuan jia",1991,110,NA,6.7,106,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,1,0,0,1,0 -"Zheng hun qi shi",1998,104,NA,7.1,127,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Zhenikh iz Mayami",1994,82,NA,3.5,8,24.5,14.5,24.5,0,0,0,14.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Zhenitba",1977,99,NA,7.4,8,0,0,0,0,0,14.5,14.5,34.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Zhenitba Balzaminova",1964,90,NA,8.6,21,0,0,0,0,4.5,0,4.5,14.5,24.5,34.5,"",0,0,1,0,0,0,0 -"Zhenshchin obizhat ne rekomenduyetsya",2000,86,NA,3,5,24.5,0,64.5,0,0,0,24.5,0,0,0,"",0,0,0,1,0,0,0 -"Zhenshchina i chetvero yeyo muzhchin",1984,91,NA,8.4,7,14.5,0,0,0,0,0,0,14.5,0,74.5,"",0,0,0,1,0,0,0 -"Zhenskaya sobstvennost",1999,89,NA,7.2,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,0,0,1,0,1,0 -"Zhenya, Zhenechka i 'Katyusha'",1967,85,NA,8.9,27,0,0,0,0,4.5,0,14.5,14.5,24.5,44.5,"",0,0,1,0,0,1,0 -"Zhertva vechernyaya",1987,20,NA,7.7,11,0,0,0,0,14.5,0,0,14.5,0,64.5,"",0,0,0,0,0,0,1 -"Zhestokiy romans",1984,145,NA,8.2,220,4.5,4.5,4.5,0,4.5,4.5,14.5,14.5,14.5,44.5,"",0,0,0,1,0,1,0 -"Zhi fa xian feng",1986,85,NA,5.8,86,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Zhi fa zhe",1981,93,NA,2.8,17,24.5,14.5,14.5,24.5,4.5,0,4.5,4.5,0,0,"",0,0,0,0,0,0,0 -"Zhi fen shuang xiong",1990,99,NA,6.9,24,0,0,0,14.5,0,4.5,24.5,24.5,24.5,14.5,"",1,0,1,0,0,0,0 -"Zhi he cang shi zhi gong shen",1989,100,NA,6.6,6,0,0,14.5,0,34.5,0,0,34.5,0,14.5,"",0,0,0,0,0,0,0 -"Zhi shi huo tui",1993,94,NA,5.1,12,4.5,4.5,0,4.5,24.5,4.5,14.5,14.5,0,4.5,"",0,0,1,0,0,0,0 -"Zhi zun te jing",1992,91,NA,6.2,5,24.5,0,0,0,44.5,0,0,0,0,44.5,"",1,0,0,0,0,0,0 -"Zhi zun wu shang",1989,127,NA,6.5,35,0,0,4.5,4.5,14.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Zhifu",2003,94,NA,5.6,21,4.5,0,0,4.5,14.5,44.5,4.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Zhivago: Behind the Camera with David Lean",1965,10,NA,6.1,18,0,0,0,0,24.5,34.5,24.5,4.5,4.5,0,"",0,0,0,0,1,0,1 -"Zhivoy srez",1980,20,NA,5.4,6,0,0,0,0,14.5,0,0,0,0,84.5,"",0,0,0,1,0,0,1 -"Zhivye i myortvye",1963,201,NA,7.2,16,0,0,0,0,14.5,4.5,14.5,4.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Zhivyot takoy paren",1964,101,NA,8,21,0,0,0,0,0,4.5,14.5,4.5,44.5,24.5,"",0,0,1,0,0,1,0 -"Zhizn i udivitelnye priklyucheniya Robinzona Kruzo",1972,92,NA,5.3,14,0,0,4.5,14.5,4.5,34.5,14.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zhizn po limitu",1989,75,NA,7,5,0,0,0,0,0,64.5,24.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Zhizn s idiotom",1993,65,NA,7.7,16,0,0,0,4.5,0,14.5,14.5,34.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Zhizn za zhizn",1916,66,NA,8.9,50,0,0,0,4.5,0,4.5,4.5,14.5,34.5,44.5,"",0,0,0,0,0,0,0 -"Zhizn' zabavami polna",2003,98,NA,4.8,7,0,24.5,24.5,0,0,14.5,0,24.5,0,0,"",0,0,0,1,0,0,0 -"Zhong Nan Hai bao biao",1994,92,NA,5.9,658,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Zhong Ri nan bei he",1988,106,NA,6,5,24.5,0,0,0,24.5,24.5,0,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Zhong an zu",1993,103,NA,6.6,478,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Zhong hua ying xiong",1999,115,NA,5.6,364,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",1,0,0,1,0,0,0 -"Zhong hua zhan shi",1987,91,NA,6.6,108,4.5,4.5,4.5,4.5,4.5,24.5,34.5,24.5,4.5,4.5,"R",0,0,0,0,0,0,0 -"Zhong kui niang zi",1968,105,NA,7.8,15,0,0,0,0,0,4.5,24.5,44.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Zhong yuan biao ju",1976,89,NA,7.1,7,0,0,0,0,0,14.5,24.5,44.5,0,14.5,"",1,0,0,1,0,0,0 -"Zhou Yu de huo che",2002,97,NA,6.3,189,4.5,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,"PG-13",0,0,0,1,0,1,0 -"Zhou mo qing ren",1995,98,NA,6.4,6,0,0,0,0,0,45.5,45.5,0,0,0,"",0,0,0,0,0,0,0 -"Zhrebiyat",1993,210,NA,5.8,6,0,0,0,0,14.5,34.5,0,0,0,45.5,"",0,0,0,1,0,0,0 -"Zhu Fu",1956,100,NA,5.6,16,0,4.5,0,14.5,14.5,4.5,14.5,14.5,14.5,4.5,"",0,0,0,0,0,0,0 -"Zhu ba da lian meng",2002,97,NA,5.3,20,4.5,0,14.5,14.5,4.5,24.5,24.5,0,4.5,14.5,"",0,0,1,0,0,0,0 -"Zhu zai xie lei",1979,92,NA,5.7,9,14.5,0,24.5,14.5,0,14.5,24.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Zhuang dao zheng",1980,97,NA,9,7,0,0,0,0,0,0,24.5,24.5,0,44.5,"",1,0,1,0,0,0,0 -"Zhui ming qiang",1973,96,NA,6.3,46,4.5,4.5,0,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Zhui ri",1991,91,NA,6.8,21,0,0,0,4.5,4.5,24.5,24.5,24.5,0,4.5,"",1,0,0,1,0,0,0 -"Zhyoltyy karlik",2001,100,NA,7.8,14,4.5,4.5,0,0,0,14.5,4.5,4.5,44.5,14.5,"",0,0,1,0,0,0,0 -"Zi hudie",2003,127,NA,5.7,133,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,1,0,0,0 -"Zico",2002,86,NA,6.7,7,0,14.5,0,14.5,0,14.5,0,0,24.5,24.5,"",0,0,0,0,1,0,0 -"Zie 37 Stagen",1997,23,NA,1.7,13,24.5,4.5,0,0,0,0,0,4.5,34.5,34.5,"",0,0,0,0,0,0,1 -"Ziegfeld Follies",1946,110,3240816,6.5,335,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Ziegfeld Girl",1941,132,NA,6.7,258,4.5,4.5,4.5,4.5,4.5,24.5,34.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Ziel:gerichtet",2003,17,NA,8.2,6,14.5,0,0,0,0,0,0,0,34.5,45.5,"",0,0,0,0,0,0,1 -"Ziemassvetku jampadracis",1996,72,NA,7.5,10,0,0,0,0,0,24.5,14.5,24.5,24.5,34.5,"",0,0,0,0,0,0,0 -"Ziemia obiecana",1975,138,NA,8.3,197,4.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,45.5,"",0,0,0,1,0,0,0 -"Zig Zag",1999,87,NA,5,15,4.5,14.5,14.5,0,14.5,34.5,0,4.5,0,14.5,"",0,0,0,1,0,0,0 -"Zig Zag Story",1983,100,NA,6.4,40,4.5,0,4.5,4.5,4.5,4.5,14.5,14.5,34.5,34.5,"",0,0,1,1,0,0,0 -"ZigZag",2002,101,NA,6,278,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,4.5,4.5,"R",0,0,0,1,0,0,0 -"Ziggy Stardust and the Spiders from Mars",1973,90,NA,6.4,360,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,34.5,"",0,0,0,0,1,0,0 -"Zigrail",1995,78,NA,6.5,28,0,4.5,4.5,0,4.5,24.5,14.5,14.5,24.5,14.5,"",0,0,0,0,0,0,0 -"Zigzag",1970,105,NA,6,51,0,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Zigzag udachi",1968,88,NA,6.9,41,4.5,0,0,0,4.5,4.5,24.5,24.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Zihron Devarim",1995,110,NA,5.5,11,0,4.5,0,14.5,14.5,14.5,14.5,4.5,0,4.5,"",0,0,0,1,0,0,0 -"Zikina dinastija",1985,95,NA,6.3,28,4.5,14.5,0,0,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Zilch",2002,7,NA,6.8,5,24.5,0,0,0,24.5,0,0,24.5,0,44.5,"",0,0,1,0,0,0,1 -"Ziletky",1994,108,NA,3.6,18,14.5,0,0,0,4.5,14.5,14.5,24.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Ziliara",1968,96,NA,5.4,6,0,14.5,0,0,0,14.5,64.5,0,0,0,"",0,0,1,0,0,0,0 -"Ziliarogatos, O",1956,85,NA,6.8,24,0,0,0,0,4.5,4.5,24.5,14.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Zimmer 13",1964,82,NA,6.4,25,0,0,4.5,4.5,14.5,24.5,44.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Zimmer Feri",1998,97,500000,6.3,61,14.5,4.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,34.5,"",0,0,1,0,0,0,0 -"Zimmer, Das",2000,71,NA,4.5,14,4.5,4.5,24.5,0,0,14.5,4.5,4.5,4.5,24.5,"",0,0,0,1,0,0,0 -"Zimmerspringbrunnen, Der",2001,94,NA,6.6,35,0,0,4.5,14.5,4.5,24.5,14.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Zimniy vecher v Gagrakh",1985,88,NA,6.8,46,0,0,4.5,4.5,4.5,4.5,24.5,14.5,24.5,14.5,"",0,0,1,1,0,1,0 -"Zimnyaya vishnya",1985,91,NA,6.3,17,0,0,4.5,0,14.5,14.5,14.5,34.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Zimnyaya vishnya 2",1990,96,NA,6.5,6,0,0,0,14.5,0,14.5,64.5,0,0,0,"",0,0,0,0,0,1,0 -"Zimovanje u Jakobsfeldu",1975,108,NA,7,7,0,0,0,0,0,0,74.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Zinat",1994,87,NA,6.2,9,14.5,0,0,0,14.5,44.5,14.5,14.5,14.5,0,"",0,0,0,1,0,0,0 -"Zinda Laash",1967,103,NA,6.1,21,0,0,0,14.5,4.5,24.5,14.5,4.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Zingo",1998,92,NA,6.2,274,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Zinker, Der",1963,93,NA,6.1,64,0,4.5,4.5,4.5,14.5,24.5,24.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zio di Brooklyn, Lo",1995,98,NA,5.4,52,14.5,4.5,4.5,0,4.5,4.5,14.5,14.5,4.5,34.5,"",0,0,0,0,0,0,0 -"Zio indegno, Lo",1989,105,NA,6.6,24,0,4.5,0,4.5,14.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Zion Canyon: Treasure of the Gods",1996,40,NA,7.1,17,0,4.5,4.5,0,14.5,0,4.5,44.5,14.5,14.5,"",0,0,0,0,1,0,1 -"Zip 'N Snort",1961,6,NA,7,31,0,0,4.5,0,14.5,4.5,34.5,14.5,14.5,14.5,"",0,1,1,0,0,0,1 -"Zip Zip Hooray!",1965,6,NA,6.5,25,0,0,4.5,14.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Zipperface",1992,90,NA,1.9,55,44.5,14.5,4.5,4.5,4.5,4.5,4.5,0,0,14.5,"",0,0,0,0,0,0,0 -"Zipping Along",1953,7,NA,6.7,62,4.5,0,4.5,4.5,4.5,14.5,34.5,34.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Zir-e noor-e maah",2001,96,NA,7.5,37,0,0,0,4.5,4.5,14.5,14.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Zir-e poost-e shahr",2001,92,NA,7.9,83,0,4.5,4.5,0,4.5,4.5,14.5,24.5,24.5,34.5,"",0,0,0,1,0,0,0 -"Zire darakhatan zeyton",1994,103,NA,7,451,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Ziri",2001,120,NA,6.6,15,0,0,0,4.5,14.5,0,44.5,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Zirkus Palestina",1998,83,NA,5.4,25,4.5,4.5,0,4.5,24.5,14.5,14.5,14.5,14.5,4.5,"",0,0,0,1,0,0,0 -"Ziteitai epigontos gabros",1971,90,NA,5.7,5,0,0,0,0,24.5,44.5,24.5,0,0,24.5,"",0,0,1,0,0,0,0 -"Ziteitai pseftis",1961,82,NA,7.4,16,0,0,0,0,0,4.5,14.5,44.5,14.5,14.5,"",0,0,1,0,0,0,0 -"Zithervirtuose, Der",1934,10,NA,5.4,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,1 -"Ziti hui mie",2001,60,NA,8.3,7,14.5,0,0,0,0,0,0,14.5,14.5,45.5,"",0,0,0,0,0,0,0 -"Zitlover",2000,11,NA,6.3,13,0,0,0,0,14.5,4.5,24.5,14.5,14.5,24.5,"",0,1,1,0,0,0,1 -"Zits",1988,96,NA,4.8,12,4.5,0,4.5,34.5,4.5,4.5,0,0,0,34.5,"",0,0,0,0,0,0,0 -"Ziveti kao sav normalan svet",1982,90,NA,6.5,11,0,0,4.5,0,0,14.5,34.5,14.5,0,14.5,"",0,0,0,0,0,0,0 -"Zivi bili pa vidjeli",1979,100,NA,7,7,0,0,0,24.5,0,14.5,14.5,14.5,0,24.5,"",0,0,0,1,0,0,0 -"Zivot a neobycejna dobrodruzstvi vojaka Ivana Conkina",1994,114,NA,7.2,98,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Zivot je cudo",2004,155,8000000,7.8,844,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,24.5,"",0,0,1,1,0,1,0 -"Zivot je lep",1985,104,NA,6.9,37,0,0,0,4.5,0,14.5,4.5,24.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Zivot sa stricem",1988,116,NA,7,15,0,4.5,4.5,0,0,4.5,4.5,24.5,24.5,24.5,"",0,0,0,0,0,0,0 -"Ziyu fengbao",1999,112,NA,6.4,200,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Zizanie, La",1978,97,NA,5.5,242,4.5,4.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Zlatna pracka",1967,91,NA,8.3,5,0,0,0,44.5,0,0,24.5,0,0,44.5,"",0,0,1,0,0,0,0 -"Zlom",2002,70,NA,4.8,6,14.5,0,14.5,0,14.5,14.5,14.5,0,0,14.5,"",0,0,0,1,0,0,0 -"Zlote runo",1998,81,NA,5.6,11,0,4.5,0,0,44.5,14.5,4.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Zmeinyy istochnik",1997,87,NA,6.3,5,0,0,0,0,0,44.5,24.5,24.5,24.5,0,"",0,0,0,0,0,1,0 -"Zmey",2002,75,NA,5.4,25,14.5,4.5,14.5,14.5,14.5,4.5,14.5,14.5,0,4.5,"",0,0,0,1,0,0,0 -"Zmeyelov",1985,97,NA,5.4,8,0,0,0,0,34.5,14.5,14.5,24.5,0,14.5,"",0,0,0,1,0,0,0 -"Zmory",1979,111,NA,7.2,14,4.5,0,0,0,14.5,4.5,14.5,44.5,0,14.5,"",0,0,0,0,0,0,0 -"Zmruz oczy",2002,88,NA,7.2,165,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Zoando na TV",1999,90,NA,6.4,57,14.5,4.5,4.5,4.5,14.5,4.5,14.5,4.5,4.5,24.5,"",0,0,0,0,0,0,0 -"Zodiac Killer, The",1971,87,NA,3.9,36,14.5,14.5,4.5,4.5,34.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Zoe",2001,90,NA,6,31,14.5,4.5,0,0,4.5,4.5,4.5,4.5,14.5,34.5,"",1,0,0,1,0,0,0 -"Zoeken naar Eileen",1987,98,NA,6.4,116,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,14.5,4.5,"",0,0,0,1,0,1,0 -"Zoff",1971,86,NA,4.8,5,0,0,0,24.5,0,0,0,24.5,64.5,0,"",0,0,0,0,0,0,0 -"Zohar",1993,116,800000,5.9,26,0,0,4.5,4.5,4.5,4.5,4.5,24.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Zoku Sugata Sanshiro",1945,83,NA,6.4,50,4.5,4.5,4.5,4.5,14.5,24.5,34.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Zoku Zatoichi monogatari",1962,72,NA,7.4,120,0,4.5,0,4.5,0,4.5,34.5,24.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Zoku otoko wa tsurai yo",1969,93,NA,8,7,0,0,0,0,0,14.5,24.5,14.5,14.5,24.5,"",0,0,1,0,0,0,0 -"Zoku shinobi no mono",1963,93,NA,7.1,9,0,0,0,0,0,24.5,14.5,34.5,24.5,14.5,"",1,0,0,1,0,0,0 -"Zolotaya mina",1977,139,NA,7.4,7,0,0,0,14.5,0,0,0,84.5,0,0,"",0,0,0,0,0,0,0 -"Zoloto",1992,100,NA,4.7,18,24.5,0,0,4.5,4.5,14.5,4.5,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Zolotoy klyuchik",1939,70,NA,8.4,7,0,0,0,0,14.5,0,24.5,0,0,45.5,"",0,0,0,0,0,0,0 -"Zolotoy telyonok",1968,174,NA,8.4,89,0,0,0,4.5,4.5,4.5,4.5,14.5,24.5,45.5,"",0,0,1,0,0,0,0 -"Zolotye roga",1972,65,NA,7.2,7,0,0,0,0,0,14.5,74.5,14.5,0,0,"",0,0,0,0,0,0,0 -"Zoltar From Zoron",1998,15,NA,6.7,19,0,14.5,4.5,0,4.5,14.5,34.5,14.5,14.5,4.5,"",0,0,0,1,0,0,1 -"Zombi 1",1995,15,NA,6.5,13,24.5,0,0,0,4.5,0,14.5,14.5,14.5,24.5,"",0,0,0,0,0,0,1 -"Zombi 2",1979,89,NA,6.2,2188,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,4.5,14.5,"R",0,0,0,0,0,0,0 -"Zombi 3",1988,72,NA,4.7,411,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,14.5,"R",1,0,0,0,0,0,0 -"Zombi Holocaust",1980,81,NA,5,467,4.5,4.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zombi de Cap-Rouge, Le",1997,81,NA,2.7,10,34.5,14.5,24.5,0,0,0,14.5,0,0,34.5,"",1,0,0,0,0,0,0 -"Zombie Cop",1991,90,NA,2.1,17,45.5,0,14.5,0,0,0,0,4.5,0,24.5,"",0,0,0,0,0,0,0 -"Zombie High",1987,93,NA,3.8,130,14.5,14.5,14.5,14.5,4.5,14.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zombie Island Massacre",1984,95,NA,2.3,118,44.5,14.5,14.5,4.5,4.5,4.5,4.5,0,4.5,4.5,"",0,0,0,0,0,0,0 -"Zombie Nightmare",1986,89,NA,1.8,263,44.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zombie ja Kummitusjuna",1991,88,NA,7.3,158,4.5,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Zombies",1964,84,NA,2.4,101,24.5,24.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zombies of Mora Tau",1957,70,NA,3.6,43,14.5,4.5,14.5,14.5,14.5,4.5,4.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zombies of the Stratosphere",1952,167,176357,4.4,49,4.5,14.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",1,0,0,0,0,0,0 -"Zombies on Broadway",1945,69,NA,4.6,76,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Zona Zamfirova",2002,97,NA,6.9,165,4.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,1,1,0,0,0 -"Zona dla Australijczyka",1964,84,NA,5.9,17,0,4.5,0,4.5,14.5,44.5,14.5,14.5,0,14.5,"",0,0,1,0,0,1,0 -"Zone 39",1996,95,NA,4.6,59,14.5,4.5,4.5,24.5,14.5,14.5,4.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zone Troopers",1986,86,NA,5,126,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zone rouge",1986,110,NA,5.2,33,14.5,0,0,4.5,4.5,14.5,24.5,14.5,14.5,4.5,"",1,0,0,0,0,0,0 -"Zone, The",1996,95,NA,4.1,54,4.5,14.5,4.5,24.5,4.5,14.5,4.5,4.5,4.5,14.5,"",1,0,0,1,0,0,0 -"Zong heng si hai",1991,103,NA,6.8,966,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"",1,0,1,0,0,0,0 -"Zong heng tian xia",1992,84,NA,4.5,33,14.5,4.5,4.5,14.5,44.5,4.5,4.5,4.5,4.5,4.5,"",1,0,0,0,0,0,0 -"Zontik dlya novobrachnykh",1986,89,NA,7.8,5,0,0,0,24.5,0,0,24.5,24.5,0,44.5,"",0,0,0,1,0,1,0 -"Zonzon",1998,102,NA,6,93,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Zoo",1993,130,NA,7.8,15,4.5,4.5,0,0,0,0,24.5,34.5,4.5,24.5,"",0,0,0,0,1,0,0 -"Zoo",1999,90,NA,5.1,27,0,4.5,0,24.5,0,0,4.5,4.5,4.5,45.5,"",0,0,1,0,0,0,0 -"Zoo Baby",1964,59,NA,5.4,6,0,14.5,0,0,64.5,0,14.5,0,0,0,"",0,0,0,1,0,0,0 -"Zoo Gang, The",1985,96,NA,6.3,54,4.5,0,4.5,4.5,4.5,14.5,24.5,14.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Zoo Radio",1990,90,100000,4.6,13,14.5,14.5,14.5,4.5,14.5,14.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"Zoo in Budapest",1933,83,NA,6.8,56,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"",0,0,0,0,0,1,0 -"Zookeeper, The",2001,108,6000000,7.7,633,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Zoolander",2001,89,28000000,6.1,18277,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"PG-13",0,0,1,0,0,0,0 -"Zoom - It's Always About Getting Closer",2000,101,NA,7.1,31,14.5,0,4.5,4.5,4.5,4.5,14.5,4.5,4.5,24.5,"",0,0,1,1,0,0,0 -"Zoom and Bored",1957,6,NA,6.6,60,4.5,0,4.5,14.5,4.5,14.5,34.5,24.5,4.5,4.5,"",0,1,1,0,0,0,1 -"Zoom at the Top",1962,6,NA,6.3,29,4.5,0,0,14.5,4.5,14.5,24.5,24.5,0,14.5,"",0,1,1,0,0,0,1 -"Zoot Cat, The",1944,7,NA,6.6,47,4.5,0,4.5,4.5,4.5,4.5,34.5,14.5,4.5,14.5,"",0,1,1,0,0,0,1 -"Zoot Suit",1981,103,NA,6.1,242,4.5,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,0,0 -"Zora la vampira",2000,105,NA,4.8,47,14.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,4.5,"",0,0,1,0,0,0,0 -"Zorn's Lemma",1970,60,NA,7.1,30,4.5,0,0,14.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Zorrita: Passion's Avenger",2000,73,NA,2.4,19,24.5,24.5,14.5,4.5,14.5,4.5,4.5,0,0,14.5,"R",0,0,1,0,0,0,0 -"Zorro",1975,87,NA,6,351,4.5,4.5,4.5,4.5,4.5,24.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zorro Rides Again",1937,212,NA,6.8,27,4.5,0,0,14.5,0,4.5,24.5,4.5,4.5,34.5,"",1,0,0,0,0,0,0 -"Zorro Rides Again",1959,69,NA,6.9,8,0,0,0,14.5,0,14.5,34.5,14.5,0,24.5,"",0,0,0,0,0,0,0 -"Zorro contro Maciste",1963,86,NA,5.2,19,14.5,4.5,14.5,4.5,14.5,4.5,4.5,14.5,0,24.5,"",1,0,0,1,0,0,0 -"Zorro e i tre moschiettieri",1963,101,NA,5.4,9,14.5,24.5,34.5,0,14.5,14.5,0,14.5,0,0,"",1,0,0,1,0,0,0 -"Zorro's Black Whip",1944,211,NA,5.7,28,0,4.5,4.5,4.5,4.5,14.5,34.5,24.5,0,4.5,"",0,0,0,0,0,0,0 -"Zorro's Fighting Legion",1939,212,NA,7.7,77,4.5,0,0,4.5,4.5,4.5,4.5,14.5,14.5,44.5,"",0,0,0,0,0,0,0 -"Zorro, the Gay Blade",1981,93,NA,5.6,890,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Zotz!",1962,87,NA,5.5,99,4.5,4.5,4.5,4.5,14.5,14.5,24.5,4.5,4.5,24.5,"",0,0,1,0,0,0,0 -"Zou dao di",2001,87,NA,6,18,0,0,14.5,0,14.5,24.5,24.5,0,14.5,14.5,"",0,0,0,0,0,0,0 -"Zouhou qiang",2002,84,NA,6.3,31,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,14.5,14.5,"",1,0,0,0,0,0,0 -"Zouzou",1934,92,NA,6.5,64,4.5,4.5,4.5,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,0,0,0,1,0 -"Zozos, Les",1973,111,NA,6.5,12,0,0,0,14.5,0,4.5,44.5,14.5,4.5,4.5,"",0,0,0,0,0,0,0 -"Zsiguli",2004,81,NA,7.8,12,24.5,0,0,0,0,0,24.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Zu",1998,10,NA,3.8,7,0,0,24.5,0,14.5,0,24.5,0,14.5,14.5,"",0,0,0,0,0,0,1 -"Zu neuen Ufern",1937,106,NA,6.6,32,0,0,0,4.5,4.5,14.5,14.5,34.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Zubeidaa",2001,153,NA,6.6,89,0,0,4.5,4.5,4.5,14.5,14.5,14.5,14.5,24.5,"",0,0,0,1,0,1,0 -"Zucchero, miele e peperoncino",1980,110,NA,4.9,16,14.5,0,0,4.5,0,34.5,14.5,0,14.5,14.5,"",0,0,1,0,0,0,0 -"Zuckerbaby",1985,86,NA,6.7,181,4.5,4.5,4.5,4.5,4.5,14.5,34.5,24.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Zui ai",1986,100,NA,6.5,12,4.5,0,0,0,0,4.5,34.5,4.5,14.5,24.5,"",0,0,0,0,0,0,0 -"Zui jia nu xu",1988,88,NA,4.8,9,0,0,34.5,0,14.5,34.5,14.5,14.5,0,0,"",0,0,1,0,0,0,0 -"Zui jia sun you",1988,94,NA,2.9,12,24.5,0,4.5,4.5,0,4.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Zui jia zei pai dang",1988,96,NA,6.2,8,24.5,0,0,0,0,0,14.5,34.5,14.5,14.5,"",0,0,0,0,0,0,0 -"Zuiden, Het",2004,87,NA,5.3,101,14.5,4.5,4.5,4.5,4.5,4.5,14.5,14.5,4.5,4.5,"",0,0,0,1,0,0,0 -"Zuijia paidang daxian shentong",1983,100,NA,6.7,104,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,14.5,"",1,0,1,0,0,0,0 -"Zuijia paidang zhi nuhuang miling",1984,82,NA,5.2,99,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Zuijia paidang zhi qianli jiu chaipo",1986,86,NA,6.3,65,0,4.5,4.5,4.5,14.5,14.5,14.5,24.5,4.5,4.5,"",1,0,1,0,0,0,0 -"Zulu",1964,138,NA,7.7,5049,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Zulu 9",2001,13,NA,7.9,12,4.5,0,0,4.5,0,0,14.5,34.5,34.5,0,"",0,0,0,0,0,0,1 -"Zulu Dawn",1979,98,NA,6.1,575,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Zuotian",2001,112,NA,6.7,172,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,14.5,"R",0,0,0,1,0,0,0 -"Zuppa di pesce",1994,102,NA,5.4,17,0,0,14.5,14.5,4.5,14.5,14.5,14.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zurdo",2003,110,NA,7.5,43,4.5,4.5,4.5,0,0,4.5,24.5,14.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Zurek",2003,72,NA,6.7,54,4.5,4.5,0,4.5,4.5,24.5,24.5,24.5,4.5,4.5,"",0,0,1,1,0,0,0 -"Zus & zo",2001,100,NA,6.7,502,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,4.5,4.5,"",0,0,1,1,0,1,0 -"Zusje",1995,91,NA,7.5,606,4.5,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,1,0,0,0 -"Zusjes Kriegel, De",2004,85,NA,4.3,26,14.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Zvenenje v glavi",2002,90,NA,6.6,31,0,0,4.5,4.5,4.5,4.5,14.5,44.5,4.5,14.5,"",0,0,0,0,0,0,0 -"Zvenigora",1928,109,NA,6.9,30,0,0,4.5,4.5,4.5,14.5,4.5,34.5,14.5,24.5,"",0,0,0,1,0,0,0 -"Zvezda",2002,97,1300000,7.5,168,4.5,4.5,4.5,4.5,4.5,14.5,24.5,14.5,14.5,24.5,"",1,0,0,1,0,0,0 -"Zvezda i smert Khoakina Muryety",1982,86,NA,5.6,5,0,0,0,0,44.5,24.5,0,44.5,0,0,"",0,0,0,1,0,0,0 -"Zvezda plenitelnogo schastya",1975,167,NA,6.5,54,0,0,0,4.5,4.5,4.5,14.5,14.5,14.5,34.5,"",0,0,0,1,0,1,0 -"Zwaarmoedige verhalen voor bij de centrale verwarming",1975,95,NA,5,27,14.5,0,0,4.5,14.5,14.5,14.5,14.5,14.5,24.5,"",0,0,1,1,0,0,0 -"Zware jongens",1984,104,NA,5.7,49,0,4.5,4.5,14.5,14.5,24.5,24.5,14.5,0,14.5,"",0,0,1,0,0,0,0 -"Zwarte meteoor, De",2000,107,NA,6.4,63,0,0,4.5,4.5,4.5,24.5,24.5,14.5,4.5,14.5,"",0,0,0,1,0,0,0 -"Zwarte ruiter, De",1983,93,NA,4.9,13,4.5,0,4.5,4.5,34.5,34.5,0,0,0,4.5,"",0,0,0,0,0,0,0 -"Zwei Frauen",1989,104,NA,6.7,71,4.5,0,0,4.5,14.5,4.5,14.5,14.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Zwei Kumpel in Tirol",1978,79,NA,2.6,8,24.5,14.5,0,14.5,45.5,0,0,0,0,0,"",0,0,1,0,0,0,0 -"Zwei Nasen tanken Super",1984,95,NA,3.1,164,24.5,14.5,14.5,4.5,4.5,4.5,4.5,4.5,4.5,14.5,"",0,0,1,0,0,0,0 -"Zwei blaue Augen",1955,96,NA,6.7,6,0,0,0,0,0,14.5,34.5,45.5,0,0,"",0,0,0,1,0,0,0 -"Zwei in einem Boot",1999,70,NA,6.3,5,0,0,0,0,24.5,44.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Zweite Erwachen der Christa Klages, Das",1978,92,NA,7.2,30,0,4.5,0,4.5,0,24.5,4.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Zweite Hand, Die",1997,136,NA,7.4,5,24.5,0,0,0,0,0,0,24.5,44.5,24.5,"",0,0,0,0,0,0,0 -"Zwillinge vom Zillertal, Die",1957,94,NA,3.7,7,0,14.5,14.5,24.5,0,24.5,14.5,0,0,0,"",0,0,1,0,0,0,0 -"Zwischen Tag und Nacht",2004,88,NA,6.6,7,0,0,0,0,24.5,14.5,24.5,24.5,0,0,"",0,0,0,0,0,0,0 -"Zwischen Zeit und Ewigkeit",1956,83,NA,6.3,11,0,0,0,0,4.5,34.5,0,4.5,24.5,14.5,"",0,0,0,1,0,0,0 -"Zwischen gestern und morgen",1947,107,NA,6.3,21,0,0,0,4.5,4.5,24.5,14.5,34.5,0,14.5,"",0,0,0,1,0,0,0 -"Zwischen vier und sechs",1998,6,NA,4.2,7,0,24.5,0,0,0,0,14.5,44.5,14.5,0,"",0,0,0,0,0,0,1 -"Zwischengleis",1978,109,NA,8,17,0,0,0,0,14.5,0,0,24.5,44.5,14.5,"",0,0,0,1,0,0,0 -"Zwischensaison",1992,95,NA,6.5,27,0,4.5,0,0,4.5,4.5,14.5,24.5,24.5,14.5,"",0,0,1,0,0,0,0 -"Zwoele zomeravond, Een",1982,95,NA,6.4,13,0,0,0,0,0,34.5,24.5,4.5,24.5,4.5,"",0,0,0,0,0,0,0 -"Zwolnieni z zycia",1992,90,NA,6.9,9,0,0,0,0,14.5,0,44.5,24.5,0,24.5,"",0,0,0,0,0,0,0 -"Zycie jako smiertelna choroba przenoszona droga plciowa",2000,99,NA,7,97,4.5,0,0,4.5,4.5,4.5,34.5,24.5,14.5,14.5,"",0,0,0,1,0,0,0 -"Zycie rodzinne",1971,88,NA,6,14,0,4.5,0,0,24.5,14.5,4.5,4.5,34.5,4.5,"",0,0,0,1,0,0,0 -"Zycie wewnetrzne",1987,86,NA,6.5,8,14.5,0,0,0,0,24.5,0,34.5,0,24.5,"",0,0,0,0,0,0,0 -"Zycie za zycie",1991,90,NA,5.1,10,0,0,14.5,14.5,24.5,0,0,24.5,14.5,34.5,"",0,0,0,0,0,0,0 -"Zyciorys",1975,46,NA,3.6,5,24.5,0,0,24.5,0,0,24.5,0,0,44.5,"",0,0,0,1,0,0,0 -"Zyklus von Kleinigkeiten",1999,86,NA,6,5,0,0,44.5,0,0,0,44.5,0,0,24.5,"",0,0,0,1,0,0,0 -"Zyosyuu syukeininn Maria",1995,75,NA,3.7,19,14.5,4.5,14.5,14.5,14.5,14.5,14.5,4.5,4.5,0,"R",0,0,0,0,0,0,0 -"Zywot Mateusza",1967,80,NA,5.4,31,4.5,4.5,4.5,4.5,4.5,0,4.5,14.5,4.5,34.5,"",0,0,0,1,0,0,0 -"Zzikhimyeon jukneunda",2000,94,NA,4.7,45,14.5,4.5,4.5,24.5,24.5,14.5,4.5,4.5,0,4.5,"",0,0,0,0,0,0,0 -"Zzim",1998,101,NA,4.5,14,14.5,4.5,24.5,4.5,14.5,24.5,0,4.5,4.5,0,"",0,0,0,0,0,0,0 -"Zzyzx",2005,90,1000000,8,10,24.5,0,0,0,0,0,0,0,24.5,64.5,"",0,0,0,0,0,0,0 -"alaska.de",2000,89,NA,6.2,186,4.5,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,"",0,0,0,1,0,0,0 -"barefootin'",1987,3,NA,5.7,6,0,0,0,14.5,45.5,0,34.5,0,0,0,"",0,1,0,0,0,0,1 -"deadend.com",2002,120,NA,6.9,53,64.5,4.5,0,4.5,4.5,0,4.5,4.5,4.5,4.5,"",0,0,0,1,0,0,0 -"e-Dreams",2001,94,NA,6.8,86,4.5,0,0,4.5,4.5,14.5,14.5,34.5,4.5,14.5,"",0,0,0,0,1,0,0 -"eMale",2001,17,NA,7.3,15,0,0,0,4.5,4.5,4.5,0,24.5,24.5,24.5,"",0,0,1,0,0,0,1 -"eRATicate",2003,9,NA,6,5,0,0,0,0,0,44.5,0,0,24.5,44.5,"",0,0,1,0,0,0,1 -"eXXXorcismos",2002,78,NA,4.2,11,34.5,0,0,0,0,4.5,0,14.5,4.5,24.5,"",0,0,0,1,0,0,0 -"eXistenZ",1999,97,NA,6.7,14742,4.5,4.5,4.5,4.5,4.5,14.5,24.5,24.5,14.5,4.5,"R",0,0,0,1,0,0,0 -"f2point8",2002,20,NA,5,13,4.5,0,4.5,4.5,14.5,0,14.5,4.5,14.5,24.5,"",0,0,0,0,0,0,1 -"f8",2001,13,NA,7.6,7,0,0,0,0,0,24.5,14.5,24.5,24.5,0,"",0,1,0,0,0,0,1 -"pURe kILLjoy",1998,87,NA,5.2,6,0,14.5,14.5,14.5,0,34.5,0,0,0,14.5,"",0,0,0,0,0,0,0 -"sIDney",2002,15,NA,7,8,14.5,0,0,14.5,0,0,24.5,14.5,14.5,24.5,"",1,0,0,0,0,0,1 -"tom thumb",1958,98,NA,6.5,274,4.5,4.5,4.5,4.5,14.5,14.5,24.5,14.5,4.5,4.5,"",0,1,0,0,0,0,0 -"www.XXX.com",2003,105,NA,1.1,12,45.5,0,0,0,0,0,24.5,0,0,24.5,"",0,0,0,1,0,1,0 -"www.hellssoapopera.com",1999,100,NA,6.6,5,24.5,0,24.5,0,0,0,0,0,24.5,44.5,"",0,0,0,0,0,0,0 -"xXx",2002,132,85000000,5.5,18514,4.5,4.5,4.5,4.5,14.5,14.5,14.5,14.5,4.5,4.5,"PG-13",1,0,0,0,0,0,0 -"xXx: State of the Union",2005,101,87000000,3.9,1584,24.5,4.5,4.5,4.5,4.5,14.5,4.5,4.5,4.5,14.5,"PG-13",1,0,0,0,0,0,0 diff --git a/data/movies.rda b/data/movies.rda deleted file mode 100644 index da3d5d110a..0000000000 Binary files a/data/movies.rda and /dev/null differ diff --git a/inst/staticdocs/index.r b/inst/staticdocs/index.r index 93122c7659..41824852a2 100644 --- a/inst/staticdocs/index.r +++ b/inst/staticdocs/index.r @@ -148,7 +148,6 @@ sd_section("Data", "diamonds", "economics", "midwest", - "movies", "mpg", "msleep", "presidential", diff --git a/man/aes_colour_fill_alpha.Rd b/man/aes_colour_fill_alpha.Rd index 7e52234bd3..6ffe7f5965 100644 --- a/man/aes_colour_fill_alpha.Rd +++ b/man/aes_colour_fill_alpha.Rd @@ -30,9 +30,9 @@ k <- ggplot(mtcars, aes(factor(cyl), fill = factor(vs))) k + geom_bar() # Fill aesthetic can also be used with a continuous variable -m <- ggplot(movies, aes(x = rating)) -m + geom_histogram() -m + geom_histogram(aes(fill = ..count..)) +m <- ggplot(faithfuld, aes(waiting, eruptions)) +m + geom_raster() +m + geom_raster(aes(fill = density)) # Some geoms don't use both aesthetics (i.e. geom_point or geom_line) b <- ggplot(economics, aes(x = date, y = unemploy)) diff --git a/man/coord_polar.Rd b/man/coord_polar.Rd index b7c87a742f..1b0bb54829 100644 --- a/man/coord_polar.Rd +++ b/man/coord_polar.Rd @@ -51,6 +51,7 @@ ggplot(df, aes(x = "", y = value, fill = variable)) + labs(title = "Pac man") # Windrose + doughnut plot +if (require("ggplot2movies")) { movies$rrating <- cut_interval(movies$rating, length = 1) movies$budgetq <- cut_number(movies$budget, 4) @@ -62,4 +63,5 @@ doh + geom_bar(width = 1) + coord_polar() doh + geom_bar(width = 0.9, position = "fill") + coord_polar(theta = "y") } } +} diff --git a/man/geom_blank.Rd b/man/geom_blank.Rd index ba4c5fd8b3..38820d7d1a 100644 --- a/man/geom_blank.Rd +++ b/man/geom_blank.Rd @@ -46,7 +46,7 @@ The blank geom draws nothing, but can be a useful way of ensuring common scales between different plots. } \examples{ -ggplot(movies, aes(length, rating)) + geom_blank() +ggplot(mtcars, aes(wt, mpg)) + geom_blank() # Nothing to see here! # Take the following scatter plot diff --git a/man/geom_boxplot.Rd b/man/geom_boxplot.Rd index 873e233d5a..366e41efd6 100644 --- a/man/geom_boxplot.Rd +++ b/man/geom_boxplot.Rd @@ -116,6 +116,7 @@ p + geom_boxplot(fill = "grey80", colour = "#3366FF") # Scale transformations occur before the boxplot statistics are computed. # Coordinate transformations occur afterwards. Observe the effect on the # number of outliers. +if (require("ggplot2movies")) { library(plyr) # to access round_any m <- ggplot(movies, aes(y = votes, x = rating, group = round_any(rating, 0.5))) @@ -131,6 +132,7 @@ ggplot(movies, aes(year, budget)) + ggplot(movies, aes(year, budget)) + geom_boxplot(aes(group=round_any(year, 10, floor))) +} # Using precomputed statistics # generate sample data @@ -145,7 +147,6 @@ b + geom_boxplot(aes(fill = X1), stat = "identity") p + geom_boxplot(varwidth = TRUE) # Update the defaults for the outliers by changing the defaults for geom_point - p <- ggplot(mtcars, aes(factor(cyl), mpg)) p + geom_boxplot() diff --git a/man/geom_histogram.Rd b/man/geom_histogram.Rd index 61c1fdf2ed..b640f6715a 100644 --- a/man/geom_histogram.Rd +++ b/man/geom_histogram.Rd @@ -56,7 +56,7 @@ may need to look at a few to uncover the full story behind your data. \Sexpr[results=rd,stage=build]{ggplot2:::rd_aesthetics("geom", "histogram")} } \examples{ -\donttest{ +if (require("ggplot2movies")) { set.seed(5689) movies <- movies[sample(nrow(movies), 1000), ] # Basic example diff --git a/man/geom_line.Rd b/man/geom_line.Rd index 5704169693..001c795161 100644 --- a/man/geom_line.Rd +++ b/man/geom_line.Rd @@ -50,6 +50,7 @@ Connect observations, ordered by x value. } \examples{ # Summarise number of movie ratings by year of movie +if (require("ggplot2movies")) { mry <- do.call(rbind, by(movies, round(movies$rating), function(df) { nums <- tapply(df$length, df$year, length) data.frame(rating=round(df$rating[1]), year = as.numeric(names(nums)), number=as.vector(nums)) @@ -68,6 +69,7 @@ p + geom_line(aes(size = rating)) + scale_size(range = c(0.1, 3)) # Set aesthetics to fixed value p + geom_line(colour = "red", size = 1) +} # Using a time series ggplot(economics, aes(date, pop)) + geom_line() diff --git a/man/geom_path.Rd b/man/geom_path.Rd index fdfbc9e90b..b5ccbb6a0e 100644 --- a/man/geom_path.Rd +++ b/man/geom_path.Rd @@ -64,6 +64,7 @@ Connect observations in original order \examples{ \donttest{ # Generate data +if (require("ggplot2movies")) { library(plyr) myear <- ddply(movies, .(year), colwise(mean, .(length, rating))) p <- ggplot(myear, aes(length, rating)) @@ -78,6 +79,7 @@ p + geom_path(aes(size = year)) + scale_size(range = c(1, 3)) # Set aesthetics to fixed value p + geom_path(colour = "green") +} # Control line join parameters df <- data.frame(x = 1:3, y = c(4, 1, 9)) diff --git a/man/geom_ribbon.Rd b/man/geom_ribbon.Rd index e6ce314e4a..4069e0ce21 100644 --- a/man/geom_ribbon.Rd +++ b/man/geom_ribbon.Rd @@ -72,14 +72,6 @@ h + geom_ribbon(aes(ymin=level-1, ymax=level+1)) + geom_line(aes(y=level)) huron[huron$year > 1900 & huron$year < 1910, "level"] <- NA h <- ggplot(huron, aes(x=year)) h + geom_ribbon(aes(ymin=level-1, ymax=level+1)) + geom_line(aes(y=level)) - -# Another data set, with multiple y's for each x -m <- ggplot(movies, aes(y=votes, x=year)) -(m <- m + geom_point()) - -# The default summary isn't that useful -m + stat_summary(geom="ribbon", fun.ymin="min", fun.ymax="max") -m + stat_summary(geom="ribbon", fun.data="median_hilow") } } \seealso{ diff --git a/man/geom_violin.Rd b/man/geom_violin.Rd index a87ef2d31f..1dd80b7fde 100644 --- a/man/geom_violin.Rd +++ b/man/geom_violin.Rd @@ -88,6 +88,7 @@ p + geom_violin(aes(fill = factor(am))) p + geom_violin(fill = "grey80", colour = "#3366FF") # Scales vs. coordinate transforms ------- +if (require("ggplot2movies")) { # Scale transformations occur before the density statistics are computed. # Coordinate transformations occur afterwards. Observe the effect on the # number of outliers. @@ -106,4 +107,5 @@ ggplot(movies, aes(year, budget)) + geom_violin(aes(group = round_any(year, 10, floor))) } } +} diff --git a/man/ggsave.Rd b/man/ggsave.Rd index 6410b59627..705388dc61 100644 --- a/man/ggsave.Rd +++ b/man/ggsave.Rd @@ -44,16 +44,16 @@ extension. } \examples{ \dontrun{ -ggplot(movies, aes(rating)) + geom_histogram(binwidth = 0.1) +ggplot(mtcars, aes(mpg, wt)) + geom_point() -ggsave("ratings.pdf") -ggsave("ratings.png") +ggsave("mtcars.pdf") +ggsave("mtcars.png") -ggsave("ratings.pdf", width = 4, height = 4) -ggsave("ratings.pdf", width = 20, height = 20, units = "cm") +ggsave("mtcars.pdf", width = 4, height = 4) +ggsave("mtcars.pdf", width = 20, height = 20, units = "cm") -unlink("ratings.pdf") -unlink("ratings.png") +unlink("mtcars.pdf") +unlink("mtcars.png") # specify device when saving to a file with unknown extension # (for example a server supplied temporary file) diff --git a/man/movies.Rd b/man/movies.Rd deleted file mode 100644 index 83aa137633..0000000000 --- a/man/movies.Rd +++ /dev/null @@ -1,41 +0,0 @@ -% Generated by roxygen2 (4.1.1): do not edit by hand -% Please edit documentation in R/ggplot2.r -\docType{data} -\name{movies} -\alias{movies} -\title{Movie information and user ratings from IMDB.com.} -\format{A data frame with 28819 rows and 24 variables -\itemize{ - \item title. Title of the movie. - \item year. Year of release. - \item budget. Total budget (if known) in US dollars - \item length. Length in minutes. - \item rating. Average IMDB user rating. - \item votes. Number of IMDB users who rated this movie. - \item r1-10. Multiplying by ten gives percentile (to nearest 10\%) of - users who rated this movie a 1. - \item mpaa. MPAA rating. - \item action, animation, comedy, drama, documentary, romance, short. - Binary variables representing if movie was classified as belonging to that genre. -}} -\usage{ -movies -} -\description{ -The internet movie database, \url{http://imdb.com/}, is a website devoted -to collecting movie data supplied by studios and fans. It claims to be the -biggest movie database on the web and is run by amazon. More about -information imdb.com can be found online, -\url{http://imdb.com/help/show_leaf?about}, including information about -the data collection process, -\url{http://imdb.com/help/show_leaf?infosource}. -} -\details{ -Movies were selected for inclusion if they had a known length and had been -rated by at least one imdb user. -} -\references{ -\url{http://had.co.nz/data/movies/} -} -\keyword{datasets} - diff --git a/man/scale_continuous.Rd b/man/scale_continuous.Rd index ce53fb0614..8fef946f94 100644 --- a/man/scale_continuous.Rd +++ b/man/scale_continuous.Rd @@ -98,6 +98,7 @@ that set the \code{trans} argument to commonly used transformations. } \examples{ \donttest{ +if (require(ggplot2movies)) { m <- ggplot(subset(movies, votes > 1000), aes(rating, votes)) + geom_point(na.rm = TRUE) m @@ -160,6 +161,7 @@ ggplot(movies, aes(rating, votes)) + scale_y_log10() } } +} \seealso{ Other position scales: \code{\link{scale_x_datetime}}, \code{\link{scale_y_datetime}}; diff --git a/man/stat_bin.Rd b/man/stat_bin.Rd index aa99ef98fc..033221dc71 100644 --- a/man/stat_bin.Rd +++ b/man/stat_bin.Rd @@ -72,19 +72,16 @@ base + stat_bin(binwidth = 1, drop = FALSE, right = FALSE, col = "black") # If right = TRUE, and intervals are of the form (a, b] base + stat_bin(binwidth = 1, drop = FALSE, right = TRUE, col = "black") -m <- ggplot(movies, aes(x=rating)) -m + stat_bin() -m + stat_bin(binwidth=0.1) -m + stat_bin(breaks=seq(4,6, by=0.1)) +d <- ggplot(diamonds, aes(carat)) +d + stat_bin() +d + stat_bin(binwidth = 0.1) +d + stat_bin(breaks=seq(0, 2, by = 0.01)) # See geom_histogram for more histogram examples # To create a unit area histogram, use aes(y = ..density..) -(linehist <- m + stat_bin(aes(y = ..density..), binwidth=0.1, - geom="line", position="identity")) -linehist + stat_density(colour="blue", fill=NA) - -# Also works with categorical variables -ggplot(movies, aes(x=mpaa)) + stat_bin() +linehist <- d + geom_freqpoly(aes(y = ..density..), binwidth = 0.1) +linehist +linehist + stat_density(colour = "blue", fill = NA) } } diff --git a/man/stat_density.Rd b/man/stat_density.Rd index e285fff0f5..03394e9361 100644 --- a/man/stat_density.Rd +++ b/man/stat_density.Rd @@ -65,6 +65,7 @@ data.frame with additional columns: } \examples{ \donttest{ +if (require("ggplot2movies")) { m <- ggplot(movies, aes(x = rating)) m + geom_density() @@ -130,6 +131,7 @@ m + geom_density(fill=NA) m + geom_density(fill=NA) + aes(y = ..count..) } } +} \seealso{ \code{\link{stat_bin}} for the histogram } diff --git a/man/stat_quantile.Rd b/man/stat_quantile.Rd index 9b5852f0a5..a020a51d18 100644 --- a/man/stat_quantile.Rd +++ b/man/stat_quantile.Rd @@ -58,6 +58,7 @@ Continuous quantiles. } \examples{ \donttest{ +if (require("ggplot2movies")) { msamp <- movies[sample(nrow(movies), 1000), ] m <- ggplot(msamp, aes(year, rating)) + geom_point() m + stat_quantile() @@ -84,4 +85,5 @@ m + stat_quantile(aes(colour = ..quantile..), quantiles = q10) + m + stat_quantile(colour = "red", size = 2, linetype = 2) } } +} diff --git a/man/stat_summary.Rd b/man/stat_summary.Rd index 0a1d06475a..44f1bd6b48 100644 --- a/man/stat_summary.Rd +++ b/man/stat_summary.Rd @@ -124,6 +124,7 @@ m <- ggplot(mpg2, aes(x=cyl, y=hwy)) + xlab("cyl") m # An example with highly skewed distributions: +if (require("ggplot2movies")) { set.seed(596) mov <- movies[sample(nrow(movies), 1000), ] m2 <- ggplot(mov, aes(x= factor(round(rating)), y=votes)) + geom_point() @@ -145,6 +146,7 @@ m2 + scale_y_log10() m2 + coord_trans(y="log10") } } +} \seealso{ \code{\link{geom_errorbar}}, \code{\link{geom_pointrange}}, \code{\link{geom_linerange}}, \code{\link{geom_crossbar}} for geoms to diff --git a/man/translate_qplot_lattice.Rd b/man/translate_qplot_lattice.Rd index 5ec44f523a..8869f540ba 100644 --- a/man/translate_qplot_lattice.Rd +++ b/man/translate_qplot_lattice.Rd @@ -12,6 +12,7 @@ to more complicated situations. \dontrun{ library(lattice) +if (require("ggplot2movies")) { xyplot(rating ~ year, data=movies) qplot(year, rating, data=movies) @@ -38,6 +39,7 @@ qplot(mpg, wt, data = mtcars, geom = c("point","smooth")) xyplot(wt ~ mpg, mtcars, type = c("p","r")) qplot(mpg, wt, data = mtcars, geom = c("point","smooth"), method = "lm") +} # The capabilities for scale manipulations are similar in both ggplot2 and # lattice, although the syntax is a little different.